From fdf91daf9ba581a4c95b9502ec9864d49ec91a10 Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Fri, 27 May 2022 17:50:36 +0000 Subject: [PATCH 01/49] Add a list of downstream repos, and script to update --- revdep/get_urls.R | 26 ++++++++++++++++++++ revdep/reverse-imports-urls | 48 +++++++++++++++++++++++++++++++++++++ 2 files changed, 74 insertions(+) create mode 100755 revdep/get_urls.R create mode 100644 revdep/reverse-imports-urls diff --git a/revdep/get_urls.R b/revdep/get_urls.R new file mode 100755 index 000000000..89fd05bb5 --- /dev/null +++ b/revdep/get_urls.R @@ -0,0 +1,26 @@ +#!/usr/bin/Rscript +# Script to get URL keys from CRAN +# of packags that Suggest or Import lintr +library(xml2) + +cran_db = as.data.frame(available.packages()) +lintr_re = "(^|\\s)lintr(,|\\s+\\(|$)" +lintr_pkg = cran_db[ + with(cran_db, grepl(lintr_re, Suggests) | grepl(lintr_re, Imports)), + "Package" +] + +urls = vector("list", length(lintr_pkg)) +url_fmt = "https://cran.r-project.org/web/packages/%s/index.html" +for (ii in seq_along(urls)) { + # simple retry mechanism + read_pkg = function() xml2::read_html(sprintf(url_fmt, lintr_pkg[ii])) + cran_pg = tryCatch(read_pkg(), error = function(cond) { message("Sleepy... 😴"); Sys.sleep(60); read_pkg() }) + urls[[ii]] <- xml2::xml_find_chr(cran_pg, "string(//tr[td[starts-with(text(), 'URL')]]/td/a)") + Sys.sleep(1) +} + +urls = unlist(urls) +urls = grep("^https?://github", urls, value = TRUE) + +writeLines(urls, "reverse-imports-urls") diff --git a/revdep/reverse-imports-urls b/revdep/reverse-imports-urls new file mode 100644 index 000000000..8b849e1b1 --- /dev/null +++ b/revdep/reverse-imports-urls @@ -0,0 +1,48 @@ +http://github.com/soodoku/abbyyR +https://github.com/kapsner/BiasCorrector +https://github.com/mplatzer/BTYDplus#readme +https://github.com/zachmayer/caretEnsemble +https://github.com/bfgray3/cattonum +https://github.com/joundso/cleaR +https://github.com/lifebit-ai/cloudos +https://github.com/DARTH-git/dampack +https://github.com/nik01010/dashboardthemes +https://github.com/dirmeier/datastructures +https://github.com/paulhendricks/describer +https://github.com/dirmeier/diffusr +https://github.com/russHyde/dupree +https://github.com/jakubnowicki/fixtuRes +https://github.com/mi2-warsaw/FSelectorRcpp +https://github.com/hafen/geofacet +https://github.com/jbaileyh/geogrid +https://github.com/thomas-neitmann/ggcharts +https://github.com/sinhrks/ggfortify +https://github.com/ehrlinger/ggRandomForests +https://github.com/jrnold/ggthemes +https://github.com/rich-iannone/i18n +https://github.com/REditorSupport/languageserver/ +https://github.com/philips-software/latrend +https://github.com/mlflow/mlflow +https://github.com/mlr-org/mlrCPO +https://github.com/wahani/modules +https://github.com/Dschaykib/newsmd +https://github.com/thijsjanzen/nLTT +https://github.com/nik01010/openbankeR +https://github.com/openml/openml-r +https://github.com/alan-turing-institute/PosteriorBootstrap/ +https://github.com/jumpingrivers/prettyB/ +https://github.com/MazamaScience/PWFSLSmoke +https://github.com/kapsner/rBiasCorrection +https://github.com/kloppen/rde +https://github.com/rOpenStats/RSQL +https://github.com/sagiegurari/scriptexec +https://github.com/SwissClinicalTrialOrganisation/secuTrialR +https://github.com/stencila/schema#readme +https://github.com/UCLATALL/supernova +https://github.com/donlelef/tsviz +http://github.com/soodoku/tuber +https://github.com/themains/virustotal +https://github.com/bearloga/WikidataQueryServiceR +https://github.com/mbertolacci/WoodburyMatrix +https://github.com/dmlc/xgboost + From 71e1e44b068cb988d4a1c306728dfe2edbe320ae Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Fri, 27 May 2022 17:54:07 +0000 Subject: [PATCH 02/49] readability --- revdep/get_urls.R | 7 ++++++- 1 file changed, 6 insertions(+), 1 deletion(-) diff --git a/revdep/get_urls.R b/revdep/get_urls.R index 89fd05bb5..0f2fe1cd0 100755 --- a/revdep/get_urls.R +++ b/revdep/get_urls.R @@ -15,7 +15,12 @@ url_fmt = "https://cran.r-project.org/web/packages/%s/index.html" for (ii in seq_along(urls)) { # simple retry mechanism read_pkg = function() xml2::read_html(sprintf(url_fmt, lintr_pkg[ii])) - cran_pg = tryCatch(read_pkg(), error = function(cond) { message("Sleepy... 😴"); Sys.sleep(60); read_pkg() }) + retry_read = function(cond) { + message("Sleepy... 😴") + Sys.sleep(60) + read_pkg() + } + cran_pg = tryCatch(read_pkg(), error = retry_read) urls[[ii]] <- xml2::xml_find_chr(cran_pg, "string(//tr[td[starts-with(text(), 'URL')]]/td/a)") Sys.sleep(1) } From 03274b19b46d7620c819bf6766d4c2e255e89b39 Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Fri, 27 May 2022 18:02:06 +0000 Subject: [PATCH 03/49] more readability --- revdep/get_urls.R | 27 +++++++++++++++++---------- 1 file changed, 17 insertions(+), 10 deletions(-) diff --git a/revdep/get_urls.R b/revdep/get_urls.R index 0f2fe1cd0..4a9fcc4b2 100755 --- a/revdep/get_urls.R +++ b/revdep/get_urls.R @@ -10,19 +10,26 @@ lintr_pkg = cran_db[ "Package" ] -urls = vector("list", length(lintr_pkg)) +# simple retry mechanism url_fmt = "https://cran.r-project.org/web/packages/%s/index.html" -for (ii in seq_along(urls)) { - # simple retry mechanism - read_pkg = function() xml2::read_html(sprintf(url_fmt, lintr_pkg[ii])) - retry_read = function(cond) { +retry_read = function(pkg, initial_sleep = 1, retry_sleep = 60) { + url = sprintf(url_fmt, pkg) + retry = function(cond) { message("Sleepy... 😴") - Sys.sleep(60) - read_pkg() + Sys.sleep(retry_sleep) + xml2::read_html(url) } - cran_pg = tryCatch(read_pkg(), error = retry_read) - urls[[ii]] <- xml2::xml_find_chr(cran_pg, "string(//tr[td[starts-with(text(), 'URL')]]/td/a)") - Sys.sleep(1) + Sys.sleep(initial_sleep) + tryCatch(xml2::read_html(url), error = retry) +} + +urls = vector("list", length(lintr_pkg)) +url_xpath = "string(//tr[td[starts-with(text(), 'URL')]]/td/a)" +# for loop makes debugging easier +for (ii in seq_along(urls)) { + urls[[ii]] <- lintr_pkg[[ii]] %>% + retry_read() %>% + xml2::xml_find_chr(cran_pg, url_xpath) } urls = unlist(urls) From 6e9fce1114da2254e717481900d37d3aaef40adc Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Sun, 29 May 2022 17:02:33 +0000 Subject: [PATCH 04/49] switch to read from DCF; improve regex; improve matching --- revdep/get_urls.R | 37 ++++++++++------- revdep/reverse-imports-urls | 83 +++++++++++++++++++++++-------------- 2 files changed, 74 insertions(+), 46 deletions(-) diff --git a/revdep/get_urls.R b/revdep/get_urls.R index 4a9fcc4b2..a2c9c1f9b 100755 --- a/revdep/get_urls.R +++ b/revdep/get_urls.R @@ -1,38 +1,47 @@ #!/usr/bin/Rscript # Script to get URL keys from CRAN # of packags that Suggest or Import lintr -library(xml2) cran_db = as.data.frame(available.packages()) -lintr_re = "(^|\\s)lintr(,|\\s+\\(|$)" +lintr_re = "\\blintr\\b" lintr_pkg = cran_db[ with(cran_db, grepl(lintr_re, Suggests) | grepl(lintr_re, Imports)), "Package" ] # simple retry mechanism -url_fmt = "https://cran.r-project.org/web/packages/%s/index.html" -retry_read = function(pkg, initial_sleep = 1, retry_sleep = 60) { - url = sprintf(url_fmt, pkg) +desc_url_fmt = "https://cran.r-project.org/web/packages/%s/DESCRIPTION" +extract_url = function(pkg, initial_sleep = 1, retry_sleep = 60) { + desc_url = sprintf(desc_url_fmt, pkg) retry = function(cond) { message("Sleepy... 😴") Sys.sleep(retry_sleep) - xml2::read_html(url) + url(desc_url, open = "r") } Sys.sleep(initial_sleep) - tryCatch(xml2::read_html(url), error = retry) + url_conn = tryCatch(url(desc_url, open = "r"), error = retry, warning = retry) + pkg_data = read.dcf(url_conn, "URL") + drop(pkg_data) } -urls = vector("list", length(lintr_pkg)) -url_xpath = "string(//tr[td[starts-with(text(), 'URL')]]/td/a)" +extract_github_repo = function(urls) { + matches = gregexpr("https?://git(hub|lab).com/[a-zA-Z0-9_-]+/[a-zA-Z0-9._-]+", urls) + starts = sapply(matches, `[[`, 1L) + matched = starts > 0L + + urls = urls[matched] + starts = starts[matched] + matches = matches[matched] + + unname(substr(urls, starts, starts + sapply(matches, attr, "match.length") - 1L)) +} + +urls = character(length(lintr_pkg)) # for loop makes debugging easier for (ii in seq_along(urls)) { - urls[[ii]] <- lintr_pkg[[ii]] %>% - retry_read() %>% - xml2::xml_find_chr(cran_pg, url_xpath) + urls[ii] <- extract_url(lintr_pkg[ii]) } -urls = unlist(urls) -urls = grep("^https?://github", urls, value = TRUE) +urls = sort(extract_github_repo(urls[!is.na(urls)])) writeLines(urls, "reverse-imports-urls") diff --git a/revdep/reverse-imports-urls b/revdep/reverse-imports-urls index 8b849e1b1..79eee4d85 100644 --- a/revdep/reverse-imports-urls +++ b/revdep/reverse-imports-urls @@ -1,48 +1,67 @@ http://github.com/soodoku/abbyyR -https://github.com/kapsner/BiasCorrector -https://github.com/mplatzer/BTYDplus#readme -https://github.com/zachmayer/caretEnsemble +http://github.com/soodoku/tuber +https://github.com/alan-turing-institute/PosteriorBootstrap +https://github.com/bearloga/WikidataQueryServiceR https://github.com/bfgray3/cattonum -https://github.com/joundso/cleaR -https://github.com/lifebit-ai/cloudos +https://github.com/bokeh/rbokeh +https://github.com/Crunch-io/rcrunch https://github.com/DARTH-git/dampack -https://github.com/nik01010/dashboardthemes https://github.com/dirmeier/datastructures -https://github.com/paulhendricks/describer https://github.com/dirmeier/diffusr -https://github.com/russHyde/dupree -https://github.com/jakubnowicki/fixtuRes -https://github.com/mi2-warsaw/FSelectorRcpp +https://github.com/dmlc/xgboost +https://github.com/donlelef/tsviz +https://github.com/Dschaykib/newsmd +https://github.com/ehrlinger/ggRandomForests https://github.com/hafen/geofacet +https://github.com/ilarischeinin/rasterpdf +https://github.com/jakubnowicki/fixtuRes https://github.com/jbaileyh/geogrid -https://github.com/thomas-neitmann/ggcharts -https://github.com/sinhrks/ggfortify -https://github.com/ehrlinger/ggRandomForests +https://github.com/joundso/cleaR https://github.com/jrnold/ggthemes -https://github.com/rich-iannone/i18n -https://github.com/REditorSupport/languageserver/ -https://github.com/philips-software/latrend +https://github.com/jumpingrivers/prettyB +https://github.com/kapsner/BiasCorrector +https://github.com/kapsner/rBiasCorrection +https://github.com/kloppen/rde +https://github.com/lifebit-ai/cloudos +https://github.com/lorenzwalthert/precommit +https://github.com/MazamaScience/PWFSLSmoke +https://github.com/mbertolacci/WoodburyMatrix +https://github.com/mi2-warsaw/FSelectorRcpp https://github.com/mlflow/mlflow +https://github.com/mlr-org/mlr https://github.com/mlr-org/mlrCPO -https://github.com/wahani/modules -https://github.com/Dschaykib/newsmd -https://github.com/thijsjanzen/nLTT +https://github.com/mplatzer/BTYDplus +https://github.com/mwaldstein/edgarWebR +https://github.com/nik01010/dashboardthemes https://github.com/nik01010/openbankeR https://github.com/openml/openml-r -https://github.com/alan-turing-institute/PosteriorBootstrap/ -https://github.com/jumpingrivers/prettyB/ -https://github.com/MazamaScience/PWFSLSmoke -https://github.com/kapsner/rBiasCorrection -https://github.com/kloppen/rde +https://github.com/paulhendricks/describer +https://github.com/philips-software/latrend +https://github.com/r-dbi/DBItest +https://github.com/REditorSupport/languageserver +https://github.com/rexyai/RestRserve +https://github.com/rich-iannone/i18n +https://github.com/r-lib/devtools +https://github.com/r-lib/lifecycle +https://github.com/ropensci/babette +https://github.com/ropensci/beautier +https://github.com/ropensci/dittodb +https://github.com/ropensci/osfr +https://github.com/ropensci/roadoi +https://github.com/ropensci/unifir https://github.com/rOpenStats/RSQL +https://github.com/rstudio/connectwidgets +https://github.com/russHyde/dupree https://github.com/sagiegurari/scriptexec +https://github.com/sinhrks/ggfortify +https://github.com/stencila/schema https://github.com/SwissClinicalTrialOrganisation/secuTrialR -https://github.com/stencila/schema#readme -https://github.com/UCLATALL/supernova -https://github.com/donlelef/tsviz -http://github.com/soodoku/tuber https://github.com/themains/virustotal -https://github.com/bearloga/WikidataQueryServiceR -https://github.com/mbertolacci/WoodburyMatrix -https://github.com/dmlc/xgboost - +https://github.com/thijsjanzen/nLTT +https://github.com/thomas-neitmann/ggcharts +https://github.com/UCLATALL/supernova +https://github.com/wahani/modules +https://github.com/zachmayer/caretEnsemble +https://github.com/zzawadz/DepthProc +https://gitlab.com/fvafrcu/fakemake +https://gitlab.com/fvafrCU/packager From 51cbff21641f5bc84fba52f7aaddbfa373e13609 Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Sun, 29 May 2022 17:03:44 +0000 Subject: [PATCH 05/49] move to .dev --- {revdep => .dev}/get_urls.R | 0 {revdep => .dev}/reverse-imports-urls | 0 2 files changed, 0 insertions(+), 0 deletions(-) rename {revdep => .dev}/get_urls.R (100%) rename {revdep => .dev}/reverse-imports-urls (100%) diff --git a/revdep/get_urls.R b/.dev/get_urls.R similarity index 100% rename from revdep/get_urls.R rename to .dev/get_urls.R diff --git a/revdep/reverse-imports-urls b/.dev/reverse-imports-urls similarity index 100% rename from revdep/reverse-imports-urls rename to .dev/reverse-imports-urls From 2e6916dcd36258a5b3b4120e1ea37f68abf52892 Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Sun, 29 May 2022 23:19:34 +0000 Subject: [PATCH 06/49] use regexpr, also save repo-less packages --- .dev/get_urls.R | 25 ++++++++++++++----------- 1 file changed, 14 insertions(+), 11 deletions(-) diff --git a/.dev/get_urls.R b/.dev/get_urls.R index a2c9c1f9b..1fefa679c 100755 --- a/.dev/get_urls.R +++ b/.dev/get_urls.R @@ -25,15 +25,16 @@ extract_url = function(pkg, initial_sleep = 1, retry_sleep = 60) { } extract_github_repo = function(urls) { - matches = gregexpr("https?://git(hub|lab).com/[a-zA-Z0-9_-]+/[a-zA-Z0-9._-]+", urls) - starts = sapply(matches, `[[`, 1L) - matched = starts > 0L - - urls = urls[matched] - starts = starts[matched] - matches = matches[matched] - - unname(substr(urls, starts, starts + sapply(matches, attr, "match.length") - 1L)) + matches = regexpr("https?://git(hub|lab).com/[a-zA-Z0-9_-]+/[a-zA-Z0-9._-]+", urls) + matched = !is.na(matches) & matches > 0L + + out = character(length(urls)) + out[matched] = substr( + urls[matched], + matches[matched], + matches[matched] + attr(matches, "match.length")[matched] - 1L + ) + out } urls = character(length(lintr_pkg)) @@ -42,6 +43,8 @@ for (ii in seq_along(urls)) { urls[ii] <- extract_url(lintr_pkg[ii]) } -urls = sort(extract_github_repo(urls[!is.na(urls)])) +git_urls = extract_github_repo(urls) +unmatched <- is.na(git_urls) -writeLines(urls, "reverse-imports-urls") +writeLines(lintr_pkg[unmatched], "reverse-imports-no-repos") +writeLines(sort(git_urls[!unmatched]), "reverse-imports-repos") From 9f3fbbc0c3205b00bd2fea54df53ecd9486893cc Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Sun, 29 May 2022 23:21:34 +0000 Subject: [PATCH 07/49] <- for assignment --- .dev/get_urls.R | 32 ++++++++++++++++---------------- 1 file changed, 16 insertions(+), 16 deletions(-) diff --git a/.dev/get_urls.R b/.dev/get_urls.R index 1fefa679c..a2e8209f2 100755 --- a/.dev/get_urls.R +++ b/.dev/get_urls.R @@ -2,34 +2,34 @@ # Script to get URL keys from CRAN # of packags that Suggest or Import lintr -cran_db = as.data.frame(available.packages()) -lintr_re = "\\blintr\\b" -lintr_pkg = cran_db[ +cran_db <- as.data.frame(available.packages()) +lintr_re <- "\\blintr\\b" +lintr_pkg <- cran_db[ with(cran_db, grepl(lintr_re, Suggests) | grepl(lintr_re, Imports)), "Package" ] # simple retry mechanism -desc_url_fmt = "https://cran.r-project.org/web/packages/%s/DESCRIPTION" -extract_url = function(pkg, initial_sleep = 1, retry_sleep = 60) { - desc_url = sprintf(desc_url_fmt, pkg) - retry = function(cond) { +desc_url_fmt <- "https://cran.r-project.org/web/packages/%s/DESCRIPTION" +extract_url <- function(pkg, initial_sleep = 1, retry_sleep = 60) { + desc_url <- sprintf(desc_url_fmt, pkg) + retry <- function(cond) { message("Sleepy... 😴") Sys.sleep(retry_sleep) url(desc_url, open = "r") } Sys.sleep(initial_sleep) - url_conn = tryCatch(url(desc_url, open = "r"), error = retry, warning = retry) - pkg_data = read.dcf(url_conn, "URL") + url_conn <- tryCatch(url(desc_url, open = "r"), error = retry, warning = retry) + pkg_data <- read.dcf(url_conn, "URL") drop(pkg_data) } -extract_github_repo = function(urls) { - matches = regexpr("https?://git(hub|lab).com/[a-zA-Z0-9_-]+/[a-zA-Z0-9._-]+", urls) - matched = !is.na(matches) & matches > 0L +extract_github_repo <- function(urls) { + matches <- regexpr("https?://git(hub|lab).com/[a-zA-Z0-9_-]+/[a-zA-Z0-9._-]+", urls) + matched <- !is.na(matches) & matches > 0L - out = character(length(urls)) - out[matched] = substr( + out <- character(length(urls)) + out[matched] <- substr( urls[matched], matches[matched], matches[matched] + attr(matches, "match.length")[matched] - 1L @@ -37,13 +37,13 @@ extract_github_repo = function(urls) { out } -urls = character(length(lintr_pkg)) +urls <- character(length(lintr_pkg)) # for loop makes debugging easier for (ii in seq_along(urls)) { urls[ii] <- extract_url(lintr_pkg[ii]) } -git_urls = extract_github_repo(urls) +git_urls <- extract_github_repo(urls) unmatched <- is.na(git_urls) writeLines(lintr_pkg[unmatched], "reverse-imports-no-repos") From f9b43c0f2924f9d42eaa0e6dd2a82a13e4888dfe Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Sun, 29 May 2022 23:32:41 +0000 Subject: [PATCH 08/49] debug --- .dev/get_urls.R | 8 ++++---- 1 file changed, 4 insertions(+), 4 deletions(-) diff --git a/.dev/get_urls.R b/.dev/get_urls.R index a2e8209f2..838eed4be 100755 --- a/.dev/get_urls.R +++ b/.dev/get_urls.R @@ -2,7 +2,7 @@ # Script to get URL keys from CRAN # of packags that Suggest or Import lintr -cran_db <- as.data.frame(available.packages()) +cran_db <- as.data.frame(available.packages(), stringsAsFactors = FALSE) lintr_re <- "\\blintr\\b" lintr_pkg <- cran_db[ with(cran_db, grepl(lintr_re, Suggests) | grepl(lintr_re, Imports)), @@ -44,7 +44,7 @@ for (ii in seq_along(urls)) { } git_urls <- extract_github_repo(urls) -unmatched <- is.na(git_urls) +matched <- nzchar(git_urls) -writeLines(lintr_pkg[unmatched], "reverse-imports-no-repos") -writeLines(sort(git_urls[!unmatched]), "reverse-imports-repos") +writeLines(lintr_pkg[!matched], "reverse-imports-no-repos") +writeLines(sort(git_urls[matched]), "reverse-imports-repos") From d53fc2f620edc254b9c5832862d7302cf070abe2 Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Mon, 30 May 2022 01:43:28 +0000 Subject: [PATCH 09/49] output of new approach --- .dev/reverse-imports-no-repos | 25 +++++++++++++++++++ ...rse-imports-urls => reverse-imports-repos} | 0 2 files changed, 25 insertions(+) create mode 100644 .dev/reverse-imports-no-repos rename .dev/{reverse-imports-urls => reverse-imports-repos} (100%) diff --git a/.dev/reverse-imports-no-repos b/.dev/reverse-imports-no-repos new file mode 100644 index 000000000..fde168b84 --- /dev/null +++ b/.dev/reverse-imports-no-repos @@ -0,0 +1,25 @@ +adaptalint +admiral +autoharp +aws.alexa +biolink +ConNEcT +dat +DataFakeR +datarobot +DominoDataCapture +epigraphdb +fstcore +healthcareai +jpmesh +NHSRplotthedots +physiology +Plasmidprofiler +rnrfa +SamplerCompare +semantic.dashboard +shiny.info +shiny.semantic +smerc +TDA +wavefunction diff --git a/.dev/reverse-imports-urls b/.dev/reverse-imports-repos similarity index 100% rename from .dev/reverse-imports-urls rename to .dev/reverse-imports-repos From d18b7482f073277c52b596d1784ebda607c5aadf Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Mon, 30 May 2022 01:45:30 +0000 Subject: [PATCH 10/49] sort no-repos output --- .dev/get_urls.R | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/.dev/get_urls.R b/.dev/get_urls.R index 838eed4be..d3736d54e 100755 --- a/.dev/get_urls.R +++ b/.dev/get_urls.R @@ -46,5 +46,5 @@ for (ii in seq_along(urls)) { git_urls <- extract_github_repo(urls) matched <- nzchar(git_urls) -writeLines(lintr_pkg[!matched], "reverse-imports-no-repos") +writeLines(sort(lintr_pkg[!matched]), "reverse-imports-no-repos") writeLines(sort(git_urls[matched]), "reverse-imports-repos") From 9de86f05dee4bdf5b034fbf76c4d7ccdebf01587 Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Mon, 30 May 2022 17:03:07 +0000 Subject: [PATCH 11/49] use BugReports as a backup --- .dev/get_urls.R | 7 ++++--- 1 file changed, 4 insertions(+), 3 deletions(-) diff --git a/.dev/get_urls.R b/.dev/get_urls.R index d3736d54e..749846a71 100755 --- a/.dev/get_urls.R +++ b/.dev/get_urls.R @@ -20,13 +20,14 @@ extract_url <- function(pkg, initial_sleep = 1, retry_sleep = 60) { } Sys.sleep(initial_sleep) url_conn <- tryCatch(url(desc_url, open = "r"), error = retry, warning = retry) - pkg_data <- read.dcf(url_conn, "URL") - drop(pkg_data) + pkg_data <- read.dcf(url_conn, c("URL", "BugReports")) + # NB: NA --> "NA", which is fine -- no matches below + toString(pkg_data) } extract_github_repo <- function(urls) { matches <- regexpr("https?://git(hub|lab).com/[a-zA-Z0-9_-]+/[a-zA-Z0-9._-]+", urls) - matched <- !is.na(matches) & matches > 0L + matched <- matches > 0L out <- character(length(urls)) out[matched] <- substr( From 30249f5b07551992f726798c7b844cad25176c1b Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Mon, 30 May 2022 17:14:34 +0000 Subject: [PATCH 12/49] output of including BugReports (+11 hits) --- .dev/reverse-imports-no-repos | 11 ----------- .dev/reverse-imports-repos | 11 +++++++++++ 2 files changed, 11 insertions(+), 11 deletions(-) diff --git a/.dev/reverse-imports-no-repos b/.dev/reverse-imports-no-repos index fde168b84..633069cf8 100644 --- a/.dev/reverse-imports-no-repos +++ b/.dev/reverse-imports-no-repos @@ -4,22 +4,11 @@ autoharp aws.alexa biolink ConNEcT -dat DataFakeR datarobot DominoDataCapture -epigraphdb -fstcore -healthcareai -jpmesh NHSRplotthedots -physiology Plasmidprofiler -rnrfa SamplerCompare -semantic.dashboard -shiny.info -shiny.semantic -smerc TDA wavefunction diff --git a/.dev/reverse-imports-repos b/.dev/reverse-imports-repos index 79eee4d85..899592e6d 100644 --- a/.dev/reverse-imports-repos +++ b/.dev/reverse-imports-repos @@ -1,10 +1,14 @@ http://github.com/soodoku/abbyyR http://github.com/soodoku/tuber https://github.com/alan-turing-institute/PosteriorBootstrap +https://github.com/Appsilon/semantic.dashboard +https://github.com/Appsilon/shiny.info +https://github.com/Appsilon/shiny.semantic https://github.com/bearloga/WikidataQueryServiceR https://github.com/bfgray3/cattonum https://github.com/bokeh/rbokeh https://github.com/Crunch-io/rcrunch +https://github.com/cvitolo/rnrfa https://github.com/DARTH-git/dampack https://github.com/dirmeier/datastructures https://github.com/dirmeier/diffusr @@ -12,10 +16,14 @@ https://github.com/dmlc/xgboost https://github.com/donlelef/tsviz https://github.com/Dschaykib/newsmd https://github.com/ehrlinger/ggRandomForests +https://github.com/fstpackage/fst https://github.com/hafen/geofacet +https://github.com/HealthCatalyst/healthcareai-r https://github.com/ilarischeinin/rasterpdf +https://github.com/jackwasey/physiology https://github.com/jakubnowicki/fixtuRes https://github.com/jbaileyh/geogrid +https://github.com/jfrench/smerc https://github.com/joundso/cleaR https://github.com/jrnold/ggthemes https://github.com/jumpingrivers/prettyB @@ -31,6 +39,7 @@ https://github.com/mlflow/mlflow https://github.com/mlr-org/mlr https://github.com/mlr-org/mlrCPO https://github.com/mplatzer/BTYDplus +https://github.com/MRCIEU/epigraphdb-r https://github.com/mwaldstein/edgarWebR https://github.com/nik01010/dashboardthemes https://github.com/nik01010/openbankeR @@ -60,6 +69,8 @@ https://github.com/themains/virustotal https://github.com/thijsjanzen/nLTT https://github.com/thomas-neitmann/ggcharts https://github.com/UCLATALL/supernova +https://github.com/uribo/jpmesh +https://github.com/wahani/dat https://github.com/wahani/modules https://github.com/zachmayer/caretEnsemble https://github.com/zzawadz/DepthProc From 5edd089d22ca875b4effe1ef73c2540551ebbf97 Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Mon, 30 May 2022 17:15:15 +0000 Subject: [PATCH 13/49] better naming --- .dev/{get_urls.R => get_reverse_import_repos.R} | 0 1 file changed, 0 insertions(+), 0 deletions(-) rename .dev/{get_urls.R => get_reverse_import_repos.R} (100%) diff --git a/.dev/get_urls.R b/.dev/get_reverse_import_repos.R similarity index 100% rename from .dev/get_urls.R rename to .dev/get_reverse_import_repos.R From b4bb0cb46bcecc8e80a9dee4a719b3063f5e7f65 Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Mon, 30 May 2022 17:26:52 +0000 Subject: [PATCH 14/49] stub of file tracking manual repos --- .dev/reverse-import-extra-repos | 3 +++ 1 file changed, 3 insertions(+) create mode 100644 .dev/reverse-import-extra-repos diff --git a/.dev/reverse-import-extra-repos b/.dev/reverse-import-extra-repos new file mode 100644 index 000000000..de348928e --- /dev/null +++ b/.dev/reverse-import-extra-repos @@ -0,0 +1,3 @@ +# This file tracks manually-supplied GitHub repos for packages +# where {lintr} is not in Suggests or Imports +https://github.com/microsoft/LightGBM From 6624268a04d7dcad79edfab8fa208654d934faec Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Mon, 30 May 2022 17:48:17 +0000 Subject: [PATCH 15/49] include maintainers alongside unmatched packages --- .dev/get_reverse_import_repos.R | 21 +++++++++++++++++---- .dev/reverse-imports-no-repos | 29 +++++++++++++++-------------- 2 files changed, 32 insertions(+), 18 deletions(-) diff --git a/.dev/get_reverse_import_repos.R b/.dev/get_reverse_import_repos.R index 749846a71..6464d3563 100755 --- a/.dev/get_reverse_import_repos.R +++ b/.dev/get_reverse_import_repos.R @@ -11,7 +11,7 @@ lintr_pkg <- cran_db[ # simple retry mechanism desc_url_fmt <- "https://cran.r-project.org/web/packages/%s/DESCRIPTION" -extract_url <- function(pkg, initial_sleep = 1, retry_sleep = 60) { +extract_desc_fields <- function(pkg, keys, initial_sleep = 1, retry_sleep = 60) { desc_url <- sprintf(desc_url_fmt, pkg) retry <- function(cond) { message("Sleepy... 😴") @@ -20,7 +20,9 @@ extract_url <- function(pkg, initial_sleep = 1, retry_sleep = 60) { } Sys.sleep(initial_sleep) url_conn <- tryCatch(url(desc_url, open = "r"), error = retry, warning = retry) - pkg_data <- read.dcf(url_conn, c("URL", "BugReports")) + on.exit(close(url_conn)) + + pkg_data <- read.dcf(url_conn, keys) # NB: NA --> "NA", which is fine -- no matches below toString(pkg_data) } @@ -41,11 +43,22 @@ extract_github_repo <- function(urls) { urls <- character(length(lintr_pkg)) # for loop makes debugging easier for (ii in seq_along(urls)) { - urls[ii] <- extract_url(lintr_pkg[ii]) + urls[ii] <- extract_desc_fields(lintr_pkg[ii], c("URL", "BugReports")) } git_urls <- extract_github_repo(urls) matched <- nzchar(git_urls) -writeLines(sort(lintr_pkg[!matched]), "reverse-imports-no-repos") +no_repo_pkg <- sort(lintr_pkg[!matched]) +maintainer <- character(length(no_repo_pkg)) +for (ii in seq_along(no_repo_pkg)) { + maintainer[ii] <- extract_desc_fields(no_repo_pkg[ii], "Maintainer") +} +maintainer <- gsub(".*<(.*)>$", "\\1", maintainer) + +write.csv( + data.frame(package = no_repo_pkg, maintainer), + "reverse-imports-no-repos", + row.names = FALSE, quote = FALSE +) writeLines(sort(git_urls[matched]), "reverse-imports-repos") diff --git a/.dev/reverse-imports-no-repos b/.dev/reverse-imports-no-repos index 633069cf8..ca0a826d6 100644 --- a/.dev/reverse-imports-no-repos +++ b/.dev/reverse-imports-no-repos @@ -1,14 +1,15 @@ -adaptalint -admiral -autoharp -aws.alexa -biolink -ConNEcT -DataFakeR -datarobot -DominoDataCapture -NHSRplotthedots -Plasmidprofiler -SamplerCompare -TDA -wavefunction +package,maintainer +adaptalint,conway.max1@gmail.com +admiral,thomas.neitmann@roche.com +autoharp,vik.gopal@nus.edu.sg +aws.alexa,gsood07@gmail.com +biolink,aaron@wolen.com +ConNEcT,nadja.bodner@kuleuven.be +DataFakeR,krystian8207@gmail.com +datarobot,api-maintainer@datarobot.com +DominoDataCapture,vivekananda.tadala@dominodatalab.com +NHSRplotthedots,christopher.reading1@nhs.net +Plasmidprofiler,adrian.zetner@phac-aspc.gc.ca +SamplerCompare,madeleineth@gmail.com +TDA,jisu.kim@inria.fr +wavefunction,madeleine@empirical.com From cb57789461d326ee70f459daed10fb03895920f1 Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Tue, 31 May 2022 22:05:17 -0700 Subject: [PATCH 16/49] s for consistency --- .dev/{reverse-import-extra-repos => reverse-imports-extra-repos} | 0 1 file changed, 0 insertions(+), 0 deletions(-) rename .dev/{reverse-import-extra-repos => reverse-imports-extra-repos} (100%) diff --git a/.dev/reverse-import-extra-repos b/.dev/reverse-imports-extra-repos similarity index 100% rename from .dev/reverse-import-extra-repos rename to .dev/reverse-imports-extra-repos From a33e8060f087cf7ca80447ac81198ce8961b74ba Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Tue, 31 May 2022 22:23:25 -0700 Subject: [PATCH 17/49] use revdep as a prefix for related files --- .dev/{reverse-imports-extra-repos => revdep-extra-repos} | 0 .dev/{reverse-imports-no-repos => revdep-no-repos} | 0 .dev/{reverse-imports-repos => revdep-repos} | 0 .dev/{get_reverse_import_repos.R => revdep_get_repos.R} | 0 4 files changed, 0 insertions(+), 0 deletions(-) rename .dev/{reverse-imports-extra-repos => revdep-extra-repos} (100%) rename .dev/{reverse-imports-no-repos => revdep-no-repos} (100%) rename .dev/{reverse-imports-repos => revdep-repos} (100%) rename .dev/{get_reverse_import_repos.R => revdep_get_repos.R} (100%) diff --git a/.dev/reverse-imports-extra-repos b/.dev/revdep-extra-repos similarity index 100% rename from .dev/reverse-imports-extra-repos rename to .dev/revdep-extra-repos diff --git a/.dev/reverse-imports-no-repos b/.dev/revdep-no-repos similarity index 100% rename from .dev/reverse-imports-no-repos rename to .dev/revdep-no-repos diff --git a/.dev/reverse-imports-repos b/.dev/revdep-repos similarity index 100% rename from .dev/reverse-imports-repos rename to .dev/revdep-repos diff --git a/.dev/get_reverse_import_repos.R b/.dev/revdep_get_repos.R similarity index 100% rename from .dev/get_reverse_import_repos.R rename to .dev/revdep_get_repos.R From 800efcae83f02386f2ac82edce47ed8afc01aa45 Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Tue, 31 May 2022 22:24:57 -0700 Subject: [PATCH 18/49] add commented-out .gitignore for editing in web later --- .dev/.gitignore | 4 ++++ 1 file changed, 4 insertions(+) create mode 100644 .dev/.gitignore diff --git a/.dev/.gitignore b/.dev/.gitignore new file mode 100644 index 000000000..5b5fcee28 --- /dev/null +++ b/.dev/.gitignore @@ -0,0 +1,4 @@ +# these are artefacts, so skip storing them on .git. +# moreover, revdep-no-repos contains e-mail addresses +#revdep-repos +#revdep-no-repos From 552fc71802da2f9a6abbb2d30f384b4fcf243677 Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Tue, 31 May 2022 23:27:49 -0700 Subject: [PATCH 19/49] first version of script to compare versions --- .dev/revdep_compare_releases.R | 74 ++++++++++++++++++++++++++++++++++ .gitignore | 1 + 2 files changed, 75 insertions(+) create mode 100644 .dev/revdep_compare_releases.R diff --git a/.dev/revdep_compare_releases.R b/.dev/revdep_compare_releases.R new file mode 100644 index 000000000..63496668d --- /dev/null +++ b/.dev/revdep_compare_releases.R @@ -0,0 +1,74 @@ +#!/usr/bin/env Rscript +library(withr) +library(pkgload) + +dev_dir <- getwd() +old_branch <- system2("git", c("rev-parse", "--abbrev-ref", "HEAD"), stdout = TRUE) +old_release <- "v2.0.1" +main <- "main" + +all_repos <- c(readLines("revdep-repos"), readLines("revdep-extra-repos")) +all_repos <- grep("^#", all_repos, invert = TRUE, value = TRUE) + +setup <- function(version) { + system2("git", c("checkout", "--quiet", version)) + pkgload::load_all() + out_dir <- file.path(dev_dir, "revdep_comparison", version) + dir.create(out_dir, recursive = TRUE, showWarnings = FALSE) + out_dir +} + +find_r_package_below <- function(top_dir) { + withr::local_dir(top_dir) + # most common case: we land in the package directory + if (file.exists("DESCRIPTION")) { + return(top_dir) + } + # could also do well with breadth-first search, but this code is simpler + desc_file <- list.files(top_dir, full.names = TRUE, recursive = TRUE, pattern = "^DESCRIPTION$") + if (length(desc_file) == 0L) { + stop("Could not find any DESCRIPTION below ", top_dir) + } else if (length(desc_file) > 1L) { + stop("Could not uniquely identify an R package in ", top_dir, ". Found these: ", toString(desc_file)) + } + dirname(desc_file) +} + +clone_and_lint <- function(repo) { + repo_dir <- withr::local_tempdir(basename(repo)) + # gert::git_clone() doesn't support shallow clones -- gert#101 + system2( + "git", + c("clone", "--depth=1", "--quiet", repo, repo_dir) + ) + withr::local_dir(find_r_package_below(repo_dir)) + package <- read.dcf("DESCRIPTION", "Package") + + warnings <- character() + withCallingHandlers( + tryCatch( + { + lints <- lintr::lint_package() + utils::write.csv(as.data.frame(lints), file.path(out_dir, paste0(package, ".csv"))) + }, + error = function(cond) { + writeLines(conditionMessage(cond), file.path(out_dir, paste0(package, ".failure"))) + } + ), + warning = function(cond) { + warnings <<- c(warnings, conditionMessage(cond)) + invokeRestart("muffleWarning") + } + ) + if (length(warnings) > 0L) { + writeLines(warnings, file.path(out_dir, paste0(package, ".warnings"))) + } +} + +out_dir <- setup(main) +for (repo in all_repos) clone_and_lint(repo) + +out_dir <- setup(old_release) +for (repo in all_repos) clone_and_lint(repo) + +system2("git", c("checkout", "--quiet", old_branch)) diff --git a/.gitignore b/.gitignore index d0a672955..a9cb6b97b 100644 --- a/.gitignore +++ b/.gitignore @@ -16,5 +16,6 @@ lintr_*.tar.gz testthat-problems.rds .dev/*.csv +.dev/revdep_comparison docs inst/doc From c9fb6efa4eb5b74c802745c9d1c2cd209e740026 Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Tue, 31 May 2022 23:28:48 -0700 Subject: [PATCH 20/49] executable --- .dev/revdep_compare_releases.R | 1 + 1 file changed, 1 insertion(+) mode change 100644 => 100755 .dev/revdep_compare_releases.R diff --git a/.dev/revdep_compare_releases.R b/.dev/revdep_compare_releases.R old mode 100644 new mode 100755 index 63496668d..1ebcfe0cc --- a/.dev/revdep_compare_releases.R +++ b/.dev/revdep_compare_releases.R @@ -35,6 +35,7 @@ find_r_package_below <- function(top_dir) { } clone_and_lint <- function(repo) { + message("Cloning repo ", repo, " and running lint_package()...") repo_dir <- withr::local_tempdir(basename(repo)) # gert::git_clone() doesn't support shallow clones -- gert#101 system2( From f779490b49194a71d81894ced5536c678167b488 Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Wed, 1 Jun 2022 21:48:41 -0700 Subject: [PATCH 21/49] fix regex for commas_linter not to hang on certain files --- R/commas_linter.R | 11 +++++++++-- 1 file changed, 9 insertions(+), 2 deletions(-) diff --git a/R/commas_linter.R b/R/commas_linter.R index d64208d7a..28299d485 100644 --- a/R/commas_linter.R +++ b/R/commas_linter.R @@ -9,10 +9,17 @@ #' @importFrom utils head #' @export commas_linter <- function() { + # conditions are in carefully-chosen order for performance -- + # an expression like c(a,b,c,....) with many elements can have + # a huge number of preceding-siblings and the performance of + # preceding-sibling::*[1][not(self::OP-COMMA)] is terrible. + # This approach exits early on most nodes ('and' condition) + # to avoid this. See #1340. xpath_before <- " //OP-COMMA[ - @line1 = preceding-sibling::*[1][not(self::OP-COMMA or self::EQ_SUB)]/@line1 and - @col1 != preceding-sibling::*[1]/@col2 + 1 + @col1 != preceding-sibling::*[1]/@col2 + 1 and + @line1 = preceding-sibling::*[1]/@line1 and + not(preceding-sibling::*[1][self::OP-COMMA or self::EQ_SUB]) ]" xpath_after <- "//OP-COMMA[@line1 = following-sibling::*[1]/@line1 and @col1 = following-sibling::*[1]/@col1 - 1]" From 5f52f9f77e4426efbbc628ee2e4b6bf3e7110066 Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Thu, 2 Jun 2022 00:38:16 -0700 Subject: [PATCH 22/49] fix paren_body_linter as well --- R/paren_body_linter.R | 41 +++++++++++++++++++++-------------------- 1 file changed, 21 insertions(+), 20 deletions(-) diff --git a/R/paren_body_linter.R b/R/paren_body_linter.R index 7dfa51ef5..4063215bb 100644 --- a/R/paren_body_linter.R +++ b/R/paren_body_linter.R @@ -8,32 +8,33 @@ #' #' @export paren_body_linter <- function() { - xpath <- paste( - "//expr[", - "@line1 = preceding-sibling::FUNCTION/@line1", - "|", - "preceding-sibling::IF/@line1", - "|", - "preceding-sibling::WHILE/@line1", - "|", - "preceding-sibling::OP-LAMBDA/@line1", - "and", - "@col1 = preceding-sibling::OP-RIGHT-PAREN/@col1 + 1", - "]", - "|", - "//expr[", - "@line1 = preceding-sibling::forcond/@line1", - "and", - "@col1 = preceding-sibling::forcond/OP-RIGHT-PAREN/@col1 + 1", - "]" - ) + # careful to do recursive search to the less common OP-RIGHT-PAREN + # and forcond nodes (vs. //expr) for performance -- there can + # be O(100K) nodes but in all but pathological examples, + # these other nodes will only be a small fraction of this amount. + # note also that only has one following-sibling::expr. + xpath <- "//OP-RIGHT-PAREN[ + @col1 = following-sibling::expr/@col1 - 1 + ]/following-sibling::expr[ + @line1 = preceding-sibling::FUNCTION/@line1 + or @line1 = preceding-sibling::IF/@line1 + or @line1 = preceding-sibling::WHILE/@line1 + or @line1 = preceding-sibling::OP-LAMBDA/@line1 + ] + | + //forcond[ + @line1 = following-sibling::expr/@line1 + and OP-RIGHT-PAREN/@col1 = following-sibling::expr/@col1 - 1 + ]/following-sibling::expr + " Linter(function(source_expression) { if (!is_lint_level(source_expression, "expression")) { return(list()) } - matched_expressions <- xml2::xml_find_all(source_expression$xml_parsed_content, xpath) + xml <- source_expression$xml_parsed_content + matched_expressions <- xml2::xml_find_all(xml, xpath) xml_nodes_to_lints( matched_expressions, From 0c8a5edd42ec67cc9ec3a7e8a7dce53966199a1b Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Sat, 4 Jun 2022 14:12:33 -0700 Subject: [PATCH 23/49] add timings, start to add analysis --- .dev/revdep_compare_releases.R | 40 +++++++++++++++++++++++++++++++--- 1 file changed, 37 insertions(+), 3 deletions(-) diff --git a/.dev/revdep_compare_releases.R b/.dev/revdep_compare_releases.R index 1ebcfe0cc..f408910e6 100755 --- a/.dev/revdep_compare_releases.R +++ b/.dev/revdep_compare_releases.R @@ -1,6 +1,7 @@ #!/usr/bin/env Rscript library(withr) library(pkgload) +library(data.table) dev_dir <- getwd() old_branch <- system2("git", c("rev-parse", "--abbrev-ref", "HEAD"), stdout = TRUE) @@ -10,14 +11,25 @@ main <- "main" all_repos <- c(readLines("revdep-repos"), readLines("revdep-extra-repos")) all_repos <- grep("^#", all_repos, invert = TRUE, value = TRUE) +lint_timings <- new.env() +lint_timings$repo_timing <- vector("list", length(all_repos)) +names(lint_timings$repo_timing) <- all_repos + setup <- function(version) { + message("Checking out & loading ", version) system2("git", c("checkout", "--quiet", version)) - pkgload::load_all() + pkgload::load_all(quiet = TRUE) out_dir <- file.path(dev_dir, "revdep_comparison", version) dir.create(out_dir, recursive = TRUE, showWarnings = FALSE) + message("Cloning repos and running lint_package()...") out_dir } +cleanup <- function(version) { + lint_timings[[version]] <- lint_timings$repo_timing + lint_timings$repo_timing <- NULL +} + find_r_package_below <- function(top_dir) { withr::local_dir(top_dir) # most common case: we land in the package directory @@ -35,7 +47,7 @@ find_r_package_below <- function(top_dir) { } clone_and_lint <- function(repo) { - message("Cloning repo ", repo, " and running lint_package()...") + message(" * ", repo) repo_dir <- withr::local_tempdir(basename(repo)) # gert::git_clone() doesn't support shallow clones -- gert#101 system2( @@ -45,12 +57,18 @@ clone_and_lint <- function(repo) { withr::local_dir(find_r_package_below(repo_dir)) package <- read.dcf("DESCRIPTION", "Package") + start_time <- proc.time() + on.exit(lint_timings$repo_timing[[repo]] <- proc.time() - start_time) warnings <- character() withCallingHandlers( tryCatch( { lints <- lintr::lint_package() - utils::write.csv(as.data.frame(lints), file.path(out_dir, paste0(package, ".csv"))) + utils::write.csv( + as.data.frame(lints), + file.path(out_dir, paste0(package, ".csv")), + row.names = FALSE + ) }, error = function(cond) { writeLines(conditionMessage(cond), file.path(out_dir, paste0(package, ".failure"))) @@ -66,10 +84,26 @@ clone_and_lint <- function(repo) { } } +load_lints <- function(version, filter_errors = TRUE) { + csv_files <- list.files(file.path(dev_dir, "revdep_comparison", version), pattern = "\\.csv$", full.names = TRUE) + names(csv_files) <- gsub("\\.csv$", "", basename(csv_files)) + lints <- data.table::rbindlist(lapply(csv_files, utils::read.csv), idcol = "repo") + if (filter_errors) lints <- lints[, if (!any(type == "error")) .SD, by = .(repo, filename)] + lints +} + out_dir <- setup(main) for (repo in all_repos) clone_and_lint(repo) +cleanup(main) out_dir <- setup(old_release) for (repo in all_repos) clone_and_lint(repo) +cleanup(old_release) system2("git", c("checkout", "--quiet", old_branch)) + +main_lints <- load_lints(main) +old_lints <- load_lints(old_release) + +main_lints[!old_lints, on = c("repo", "filename", "line_number")] +old_lints[!main_lints, on = c("repo", "filename", "line_number")] From 64f93d1a8d9c690772a43818ea800864b2b9eeb4 Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Sat, 4 Jun 2022 18:24:08 -0700 Subject: [PATCH 24/49] flow for installing required packages --- .dev/revdep_compare_releases.R | 9 +++++++++ .dev/revdep_get_repos.R | 2 ++ 2 files changed, 11 insertions(+) diff --git a/.dev/revdep_compare_releases.R b/.dev/revdep_compare_releases.R index f408910e6..d499c3b1b 100755 --- a/.dev/revdep_compare_releases.R +++ b/.dev/revdep_compare_releases.R @@ -3,6 +3,13 @@ library(withr) library(pkgload) library(data.table) +new_packages <- setdiff(readLines("revdep-packages"), rownames(installed.packages())) +install.packages(new_packages, repos = "https://cran.rstudio.com") +failed_install <- setdiff(new_packages, rownames(installed.packages())) +if (length(failed_install) > 0L) { + warning("Failed to install some dependencies; please install these packages manually: ", toString(failed_install)) +} + dev_dir <- getwd() old_branch <- system2("git", c("rev-parse", "--abbrev-ref", "HEAD"), stdout = TRUE) old_release <- "v2.0.1" @@ -57,6 +64,8 @@ clone_and_lint <- function(repo) { withr::local_dir(find_r_package_below(repo_dir)) package <- read.dcf("DESCRIPTION", "Package") + # if (package %in% failed_install) return() + start_time <- proc.time() on.exit(lint_timings$repo_timing[[repo]] <- proc.time() - start_time) warnings <- character() diff --git a/.dev/revdep_get_repos.R b/.dev/revdep_get_repos.R index 6464d3563..e423ebb9c 100755 --- a/.dev/revdep_get_repos.R +++ b/.dev/revdep_get_repos.R @@ -9,6 +9,8 @@ lintr_pkg <- cran_db[ "Package" ] +writeLines(lintr_pkg, "revdep-packages") + # simple retry mechanism desc_url_fmt <- "https://cran.r-project.org/web/packages/%s/DESCRIPTION" extract_desc_fields <- function(pkg, keys, initial_sleep = 1, retry_sleep = 60) { From 3cb098241bcb8a24e2bba6685a36375115095670 Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Sat, 4 Jun 2022 18:25:30 -0700 Subject: [PATCH 25/49] new list of packages --- .dev/revdep-packages | 106 +++++++++++++++++++++++++++++++++++++++++++ 1 file changed, 106 insertions(+) create mode 100644 .dev/revdep-packages diff --git a/.dev/revdep-packages b/.dev/revdep-packages new file mode 100644 index 000000000..96185dd39 --- /dev/null +++ b/.dev/revdep-packages @@ -0,0 +1,106 @@ +abbyyR +adaptalint +admiral +autoharp +aws.alexa +babette +beautier +BiasCorrector +biolink +BTYDplus +caretEnsemble +cattonum +cleaR +cloudos +cmstatr +ConNEcT +connectwidgets +crunch +dampack +dashboardthemes +dat +DataFakeR +datarobot +datastructures +DBItest +DepthProc +describer +devtools +diffusr +dittodb +DIZtools +DIZutils +DominoDataCapture +DQAgui +dupree +dyn.log +edgarWebR +emayili +epigraphdb +fakemake +fixtuRes +FSelectorRcpp +fst +fstcore +geofacet +geogrid +ggcharts +ggfortify +ggRandomForests +ggthemes +healthcareai +i18n +INSPECTumours +jpmesh +languageserver +latrend +lifecycle +mlflow +mlr +mlrCPO +modules +newsmd +NHSRplotthedots +nLTT +openbankeR +OpenML +osfr +packager +physiology +Plasmidprofiler +PosteriorBootstrap +precommit +prettyB +PWFSLSmoke +rasterpdf +rBiasCorrection +rbokeh +rde +rdomains +requiRements +RestRserve +rhino +rnrfa +roadoi +RSQL +SamplerCompare +scriptexec +secuTrialR +semantic.dashboard +shiny.info +shiny.react +shiny.semantic +smerc +stencilaschema +supernova +TDA +tsviz +tuber +unifir +upsetjs +urlshorteneR +virustotal +wavefunction +WikidataQueryServiceR +WoodburyMatrix +xgboost From 1eb6115b89f7c4e6224929503ca4a0d81a52f4ae Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Sat, 4 Jun 2022 18:25:41 -0700 Subject: [PATCH 26/49] debugging --- .dev/revdep_compare_releases.R | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/.dev/revdep_compare_releases.R b/.dev/revdep_compare_releases.R index d499c3b1b..de9c6ce7b 100755 --- a/.dev/revdep_compare_releases.R +++ b/.dev/revdep_compare_releases.R @@ -15,7 +15,7 @@ old_branch <- system2("git", c("rev-parse", "--abbrev-ref", "HEAD"), stdout = TR old_release <- "v2.0.1" main <- "main" -all_repos <- c(readLines("revdep-repos"), readLines("revdep-extra-repos")) +all_repos <- c(readLines("revdep-repos"), readLines("revdep-extra-repos"))[1:10] all_repos <- grep("^#", all_repos, invert = TRUE, value = TRUE) lint_timings <- new.env() From 1bf0085e091197059f676d33ac1009185356e81f Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Sat, 4 Jun 2022 18:43:33 -0700 Subject: [PATCH 27/49] better state reset --- .dev/revdep_compare_releases.R | 9 +++++---- 1 file changed, 5 insertions(+), 4 deletions(-) diff --git a/.dev/revdep_compare_releases.R b/.dev/revdep_compare_releases.R index de9c6ce7b..c6013d024 100755 --- a/.dev/revdep_compare_releases.R +++ b/.dev/revdep_compare_releases.R @@ -11,11 +11,11 @@ if (length(failed_install) > 0L) { } dev_dir <- getwd() -old_branch <- system2("git", c("rev-parse", "--abbrev-ref", "HEAD"), stdout = TRUE) +dev_branch <- system2("git", c("rev-parse", "--abbrev-ref", "HEAD"), stdout = TRUE) old_release <- "v2.0.1" main <- "main" -all_repos <- c(readLines("revdep-repos"), readLines("revdep-extra-repos"))[1:10] +all_repos <- c(readLines("revdep-repos"), readLines("revdep-extra-repos")) all_repos <- grep("^#", all_repos, invert = TRUE, value = TRUE) lint_timings <- new.env() @@ -35,6 +35,9 @@ setup <- function(version) { cleanup <- function(version) { lint_timings[[version]] <- lint_timings$repo_timing lint_timings$repo_timing <- NULL + + setwd(dev_dir) + system2("git", c("checkout", "--quiet", dev_branch)) } find_r_package_below <- function(top_dir) { @@ -109,8 +112,6 @@ out_dir <- setup(old_release) for (repo in all_repos) clone_and_lint(repo) cleanup(old_release) -system2("git", c("checkout", "--quiet", old_branch)) - main_lints <- load_lints(main) old_lints <- load_lints(old_release) From 553743b30a2b51a673793e1c8265a93cdb6d3732 Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Sun, 5 Jun 2022 01:25:56 -0700 Subject: [PATCH 28/49] first pass at post-analysis insights --- .dev/revdep_compare_releases.R | 141 +++++++++++++++++++++++++++++++-- 1 file changed, 134 insertions(+), 7 deletions(-) diff --git a/.dev/revdep_compare_releases.R b/.dev/revdep_compare_releases.R index c6013d024..68b76190e 100755 --- a/.dev/revdep_compare_releases.R +++ b/.dev/revdep_compare_releases.R @@ -22,11 +22,15 @@ lint_timings <- new.env() lint_timings$repo_timing <- vector("list", length(all_repos)) names(lint_timings$repo_timing) <- all_repos +# ---- Helpers ---- + +result_path <- function(...) file.path(dev_dir, "revdep_comparison", ...) + setup <- function(version) { message("Checking out & loading ", version) system2("git", c("checkout", "--quiet", version)) pkgload::load_all(quiet = TRUE) - out_dir <- file.path(dev_dir, "revdep_comparison", version) + out_dir <- result_path(version) dir.create(out_dir, recursive = TRUE, showWarnings = FALSE) message("Cloning repos and running lint_package()...") out_dir @@ -97,13 +101,79 @@ clone_and_lint <- function(repo) { } load_lints <- function(version, filter_errors = TRUE) { - csv_files <- list.files(file.path(dev_dir, "revdep_comparison", version), pattern = "\\.csv$", full.names = TRUE) + csv_files <- list.files(result_path(version), pattern = "\\.csv$", full.names = TRUE) names(csv_files) <- gsub("\\.csv$", "", basename(csv_files)) lints <- data.table::rbindlist(lapply(csv_files, utils::read.csv), idcol = "repo") if (filter_errors) lints <- lints[, if (!any(type == "error")) .SD, by = .(repo, filename)] lints } +as.data.table.proc_time <- function(x) { + data.table(user = x[[1L]], system = x[[2L]], elapsed = x[[3L]]) +} + +match_and_strip <- function(x, pattern) gsub(pattern, "", grep(pattern, x, value = TRUE)) + +summarize_failures <- function(version, failures) { + files <- result_path(version, failures) + packages <- gsub("\\.failures$", "", failures) + + package_failures <- sapply(files, function(x) paste(unique(readLines(x)), collapse = " ||| ")) + + paste(sprintf(" %s: %s", packages, package_failures), collapse = "\n") +} + +summarize_lint_delta <- function(new, old) { + new_version <- new$version[1L] + old_version <- old$version[1L] + + new_error_files <- new[type == "error", .(. = TRUE), by = .(package, filename)] + old_error_files <- new[type == "error", .(. = TRUE), by = .(package, filename)] + + all_error_files <- merge( + new_error_files, old_error_files, + by = c("package", "filename"), suffixes = c("new", "old"), + all = TRUE + ) + if (anyNA(all_error_files)) { + if (anyNA(all_error_files$.new)) { + all_error_files[ + is.na(.new), + message("Linting failed ", old_version, " but not ", new_version, ": ", toString(filename)) + ] + } + if (anyNA(all_error_files$.old)) { + all_error_files[ + is.na(.old), + message("Linting failed ", new_version, " but not ", old_version, ": ", toString(filename)) + ] + } + } + new <- new[!all_error_files, on = c("package", "filename")] + old <- old[!all_error_files, on = c("package", "filename")] + + new_only <- new[!old, on = c("package", "filename", "line_number")] + new_only[, version := NULL] + + old_only <- old[!new, on = c("package", "filename", "line_number")] + old_only[, version := NULL] + + withr::local_options(datatable.print.nrows = Inf) + + message("Count of lints found on ", new_version, " but not on ", old_version, ": ", nrow(new_only)) + message("Count of these by linter:") + print(new_only[, .N, by = linter][order(-N)]) + message("Sample of <=10 hits from each linter:") + print(new_only[sample(.N), head(.SD, 10L), by = linter][, .(package, filename, linter, line)]) + + message("Count of lints found on ", old_version, " but not on ", new_version, ": ", nrow(old_only)) + message("Count of these by linter:") + print(old_only[, .N, by = linter][order(-N)]) + message("Sample of <=10 hits from each linter:") + print(old_only[sample(.N), head(.SD, 10L), by = linter][, .(package, filename, linter, line)]) +} + +# ---- Main linting execution ---- out_dir <- setup(main) for (repo in all_repos) clone_and_lint(repo) cleanup(main) @@ -112,8 +182,65 @@ out_dir <- setup(old_release) for (repo in all_repos) clone_and_lint(repo) cleanup(old_release) -main_lints <- load_lints(main) -old_lints <- load_lints(old_release) - -main_lints[!old_lints, on = c("repo", "filename", "line_number")] -old_lints[!main_lints, on = c("repo", "filename", "line_number")] +# ---- Success comparison ---- +main_results <- list.files(result_path(main), full.names = TRUE) +old_results <- list.files(result_path(old_release), full.names = TRUE) + +main_only <- setdiff(basename(main_results), basename(old_results)) +old_only <- setdiff(basename(old_results), basename(main_results)) +shared <- intersect(basename(main_results), basename(old_results)) + +message("The following packages warned on ", main, " only: ") +message(" ", toString(match_and_strip(main_only, "\\.warnings$")), "\n") +message("The following packages warned on ", old_release, " only: ") +message(" ", toString(match_and_strip(old_only, "\\.warnings$")), "\n") +message("The following packages warned on both branches: ") +message(" ", toString(match_and_strip(shared, "\\.warnings$")), "\n") + +main_only <- grep("warnings$", main_only, invert = TRUE, value = TRUE) +old_only <- grep("warnings$", old_only, invert = TRUE, value = TRUE) +shared <- grep("warnings$", shared, invert = TRUE, value = TRUE) + +message("The following packages failed on ", main, " only: ") +message(summarize_failures(main, grep("\\.failure", main_only, value = TRUE))) +message("The following packages failed on ", old_release, " only: ") +message(summarize_failures(old_release, grep("\\.failure", old_only, value = TRUE))) +message("The following packages failed on both branches:\n ", toString(match_and_strip(shared, "\\.failure")), "\n") + +shared <- grep("csv$", shared, value = TRUE) + +# ---- Lint output comparison ---- +main_lints <- rbindlist(lapply(setNames(result_path(main, shared), shared), utils::read.csv), idcol = "package") +main_lints[, version := main] +main_lints[, package := gsub("\\.csv$", "", package)] +old_lints <- rbindlist(lapply(setNames(result_path(old_release, shared), shared), utils::read.csv), idcol = "package") +old_lints[, version := old_release] +old_lints[, package := gsub("\\.csv$", "", package)] + +summarize_lint_delta(main_lints, old_lints) + +# ---- Timing comparison ---- +main_timings <- data.table::rbindlist(lapply(lint_timings[[main]], as.data.table), idcol = "repo") +old_timings <- data.table::rbindlist(lapply(lint_timings[[old_release]], as.data.table), idcol = "repo") + +message("Comparison of total time to run lint_packages() across all repos:") +message(sprintf( + " %.0fm to run on %s, %.0fm to run on %s", + main_timings[, sum(elapsed)], main, old_timings[, sum(elapsed)], old_release +)) + +message("Comparison of time to run lint_package() on each repo (new - old; negative -> faster)") +main_timings[ + old_timings, + on = "repo", + .( + repo, + new = x.elapsed, + old = i.elapsed, + delta = x.elapsed - i.elapsed, + delta_pct = 100 * (x.elapsed - i.elapsed) / i.elapsed + ) +][ + order(delta), + { print(.SD); quantile(delta, 0:10/10) } +] From 7ee7f8ea107cf22d11120ad03b6624dd50f9907f Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Sun, 5 Jun 2022 10:37:17 -0700 Subject: [PATCH 29/49] prepare handling of CRAN-only package --- .dev/revdep-no-repos | 29 ++++++++++++++--------------- .dev/revdep_compare_releases.R | 6 +++++- .dev/revdep_get_repos.R | 15 ++------------- 3 files changed, 21 insertions(+), 29 deletions(-) diff --git a/.dev/revdep-no-repos b/.dev/revdep-no-repos index ca0a826d6..211699a0a 100644 --- a/.dev/revdep-no-repos +++ b/.dev/revdep-no-repos @@ -1,15 +1,14 @@ -package,maintainer -adaptalint,conway.max1@gmail.com -admiral,thomas.neitmann@roche.com -autoharp,vik.gopal@nus.edu.sg -aws.alexa,gsood07@gmail.com -biolink,aaron@wolen.com -ConNEcT,nadja.bodner@kuleuven.be -DataFakeR,krystian8207@gmail.com -datarobot,api-maintainer@datarobot.com -DominoDataCapture,vivekananda.tadala@dominodatalab.com -NHSRplotthedots,christopher.reading1@nhs.net -Plasmidprofiler,adrian.zetner@phac-aspc.gc.ca -SamplerCompare,madeleineth@gmail.com -TDA,jisu.kim@inria.fr -wavefunction,madeleine@empirical.com +https://github.com/cran/adaptalint +https://github.com/cran/admiral +https://github.com/cran/autoharp +https://github.com/cran/aws.alexa +https://github.com/cran/biolink +https://github.com/cran/ConNEcT +https://github.com/cran/DataFakeR +https://github.com/cran/datarobot +https://github.com/cran/DominoDataCapture +https://github.com/cran/NHSRplotthedots +https://github.com/cran/Plasmidprofiler +https://github.com/cran/SamplerCompare +https://github.com/cran/TDA +https://github.com/cran/wavefunction diff --git a/.dev/revdep_compare_releases.R b/.dev/revdep_compare_releases.R index 68b76190e..077c7e272 100755 --- a/.dev/revdep_compare_releases.R +++ b/.dev/revdep_compare_releases.R @@ -15,7 +15,11 @@ dev_branch <- system2("git", c("rev-parse", "--abbrev-ref", "HEAD"), stdout = TR old_release <- "v2.0.1" main <- "main" -all_repos <- c(readLines("revdep-repos"), readLines("revdep-extra-repos")) +all_repos <- c( + readLines("revdep-repos"), + readLines("revdep-extra-repos"), + readLines("revdep-no-repos") +) all_repos <- grep("^#", all_repos, invert = TRUE, value = TRUE) lint_timings <- new.env() diff --git a/.dev/revdep_get_repos.R b/.dev/revdep_get_repos.R index e423ebb9c..9dcff86ab 100755 --- a/.dev/revdep_get_repos.R +++ b/.dev/revdep_get_repos.R @@ -51,16 +51,5 @@ for (ii in seq_along(urls)) { git_urls <- extract_github_repo(urls) matched <- nzchar(git_urls) -no_repo_pkg <- sort(lintr_pkg[!matched]) -maintainer <- character(length(no_repo_pkg)) -for (ii in seq_along(no_repo_pkg)) { - maintainer[ii] <- extract_desc_fields(no_repo_pkg[ii], "Maintainer") -} -maintainer <- gsub(".*<(.*)>$", "\\1", maintainer) - -write.csv( - data.frame(package = no_repo_pkg, maintainer), - "reverse-imports-no-repos", - row.names = FALSE, quote = FALSE -) -writeLines(sort(git_urls[matched]), "reverse-imports-repos") +writeLines(file.path("https://github.com/cran", sort(lintr_pkg[!matched])), "revdep-no-repos") +writeLines(sort(git_urls[matched]), "revdep-repos") From 8dab66a10bb9d261559c6e564731a27b01fde76d Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Sun, 5 Jun 2022 11:09:12 -0700 Subject: [PATCH 30/49] use CSV to keep package<->repo mapping --- .dev/revdep-extra-repos | 3 +- .dev/revdep-no-repos | 29 +++--- .dev/revdep-repos | 157 +++++++++++++++++---------------- .dev/revdep_compare_releases.R | 7 ++ .dev/revdep_get_repos.R | 12 ++- 5 files changed, 113 insertions(+), 95 deletions(-) diff --git a/.dev/revdep-extra-repos b/.dev/revdep-extra-repos index de348928e..15e0b2a53 100644 --- a/.dev/revdep-extra-repos +++ b/.dev/revdep-extra-repos @@ -1,3 +1,4 @@ # This file tracks manually-supplied GitHub repos for packages # where {lintr} is not in Suggests or Imports -https://github.com/microsoft/LightGBM +package,repo +lightgbm,https://github.com/microsoft/LightGBM diff --git a/.dev/revdep-no-repos b/.dev/revdep-no-repos index 211699a0a..708abff58 100644 --- a/.dev/revdep-no-repos +++ b/.dev/revdep-no-repos @@ -1,14 +1,15 @@ -https://github.com/cran/adaptalint -https://github.com/cran/admiral -https://github.com/cran/autoharp -https://github.com/cran/aws.alexa -https://github.com/cran/biolink -https://github.com/cran/ConNEcT -https://github.com/cran/DataFakeR -https://github.com/cran/datarobot -https://github.com/cran/DominoDataCapture -https://github.com/cran/NHSRplotthedots -https://github.com/cran/Plasmidprofiler -https://github.com/cran/SamplerCompare -https://github.com/cran/TDA -https://github.com/cran/wavefunction +package,repo +adaptalint,https://github.com/cran/adaptalint +admiral,https://github.com/cran/admiral +autoharp,https://github.com/cran/autoharp +aws.alexa,https://github.com/cran/aws.alexa +biolink,https://github.com/cran/biolink +ConNEcT,https://github.com/cran/ConNEcT +DataFakeR,https://github.com/cran/DataFakeR +datarobot,https://github.com/cran/datarobot +DominoDataCapture,https://github.com/cran/DominoDataCapture +NHSRplotthedots,https://github.com/cran/NHSRplotthedots +Plasmidprofiler,https://github.com/cran/Plasmidprofiler +SamplerCompare,https://github.com/cran/SamplerCompare +TDA,https://github.com/cran/TDA +wavefunction,https://github.com/cran/wavefunction diff --git a/.dev/revdep-repos b/.dev/revdep-repos index 899592e6d..1ff507d5e 100644 --- a/.dev/revdep-repos +++ b/.dev/revdep-repos @@ -1,78 +1,79 @@ -http://github.com/soodoku/abbyyR -http://github.com/soodoku/tuber -https://github.com/alan-turing-institute/PosteriorBootstrap -https://github.com/Appsilon/semantic.dashboard -https://github.com/Appsilon/shiny.info -https://github.com/Appsilon/shiny.semantic -https://github.com/bearloga/WikidataQueryServiceR -https://github.com/bfgray3/cattonum -https://github.com/bokeh/rbokeh -https://github.com/Crunch-io/rcrunch -https://github.com/cvitolo/rnrfa -https://github.com/DARTH-git/dampack -https://github.com/dirmeier/datastructures -https://github.com/dirmeier/diffusr -https://github.com/dmlc/xgboost -https://github.com/donlelef/tsviz -https://github.com/Dschaykib/newsmd -https://github.com/ehrlinger/ggRandomForests -https://github.com/fstpackage/fst -https://github.com/hafen/geofacet -https://github.com/HealthCatalyst/healthcareai-r -https://github.com/ilarischeinin/rasterpdf -https://github.com/jackwasey/physiology -https://github.com/jakubnowicki/fixtuRes -https://github.com/jbaileyh/geogrid -https://github.com/jfrench/smerc -https://github.com/joundso/cleaR -https://github.com/jrnold/ggthemes -https://github.com/jumpingrivers/prettyB -https://github.com/kapsner/BiasCorrector -https://github.com/kapsner/rBiasCorrection -https://github.com/kloppen/rde -https://github.com/lifebit-ai/cloudos -https://github.com/lorenzwalthert/precommit -https://github.com/MazamaScience/PWFSLSmoke -https://github.com/mbertolacci/WoodburyMatrix -https://github.com/mi2-warsaw/FSelectorRcpp -https://github.com/mlflow/mlflow -https://github.com/mlr-org/mlr -https://github.com/mlr-org/mlrCPO -https://github.com/mplatzer/BTYDplus -https://github.com/MRCIEU/epigraphdb-r -https://github.com/mwaldstein/edgarWebR -https://github.com/nik01010/dashboardthemes -https://github.com/nik01010/openbankeR -https://github.com/openml/openml-r -https://github.com/paulhendricks/describer -https://github.com/philips-software/latrend -https://github.com/r-dbi/DBItest -https://github.com/REditorSupport/languageserver -https://github.com/rexyai/RestRserve -https://github.com/rich-iannone/i18n -https://github.com/r-lib/devtools -https://github.com/r-lib/lifecycle -https://github.com/ropensci/babette -https://github.com/ropensci/beautier -https://github.com/ropensci/dittodb -https://github.com/ropensci/osfr -https://github.com/ropensci/roadoi -https://github.com/ropensci/unifir -https://github.com/rOpenStats/RSQL -https://github.com/rstudio/connectwidgets -https://github.com/russHyde/dupree -https://github.com/sagiegurari/scriptexec -https://github.com/sinhrks/ggfortify -https://github.com/stencila/schema -https://github.com/SwissClinicalTrialOrganisation/secuTrialR -https://github.com/themains/virustotal -https://github.com/thijsjanzen/nLTT -https://github.com/thomas-neitmann/ggcharts -https://github.com/UCLATALL/supernova -https://github.com/uribo/jpmesh -https://github.com/wahani/dat -https://github.com/wahani/modules -https://github.com/zachmayer/caretEnsemble -https://github.com/zzawadz/DepthProc -https://gitlab.com/fvafrcu/fakemake -https://gitlab.com/fvafrCU/packager +package,repo +BTYDplus,https://github.com/mplatzer/BTYDplus +BiasCorrector,https://github.com/kapsner/BiasCorrector +DBItest,https://github.com/r-dbi/DBItest +DepthProc,https://github.com/zzawadz/DepthProc +FSelectorRcpp,https://github.com/mi2-warsaw/FSelectorRcpp +OpenML,https://github.com/openml/openml-r +PWFSLSmoke,https://github.com/MazamaScience/PWFSLSmoke +PosteriorBootstrap,https://github.com/alan-turing-institute/PosteriorBootstrap +RSQL,https://github.com/rOpenStats/RSQL +RestRserve,https://github.com/rexyai/RestRserve +WikidataQueryServiceR,https://github.com/bearloga/WikidataQueryServiceR +WoodburyMatrix,https://github.com/mbertolacci/WoodburyMatrix +abbyyR,http://github.com/soodoku/abbyyR +babette,https://github.com/ropensci/babette +beautier,https://github.com/ropensci/beautier +caretEnsemble,https://github.com/zachmayer/caretEnsemble +cattonum,https://github.com/bfgray3/cattonum +cleaR,https://github.com/joundso/cleaR +cloudos,https://github.com/lifebit-ai/cloudos +connectwidgets,https://github.com/rstudio/connectwidgets +crunch,https://github.com/Crunch-io/rcrunch +dampack,https://github.com/DARTH-git/dampack +dashboardthemes,https://github.com/nik01010/dashboardthemes +dat,https://github.com/wahani/dat +datastructures,https://github.com/dirmeier/datastructures +describer,https://github.com/paulhendricks/describer +devtools,https://github.com/r-lib/devtools +diffusr,https://github.com/dirmeier/diffusr +dittodb,https://github.com/ropensci/dittodb +dupree,https://github.com/russHyde/dupree +edgarWebR,https://github.com/mwaldstein/edgarWebR +epigraphdb,https://github.com/MRCIEU/epigraphdb-r +fakemake,https://gitlab.com/fvafrcu/fakemake +fixtuRes,https://github.com/jakubnowicki/fixtuRes +fst,https://github.com/fstpackage/fst +geofacet,https://github.com/hafen/geofacet +geogrid,https://github.com/jbaileyh/geogrid +ggRandomForests,https://github.com/ehrlinger/ggRandomForests +ggcharts,https://github.com/thomas-neitmann/ggcharts +ggfortify,https://github.com/sinhrks/ggfortify +ggthemes,https://github.com/jrnold/ggthemes +healthcareai,https://github.com/HealthCatalyst/healthcareai-r +i18n,https://github.com/rich-iannone/i18n +jpmesh,https://github.com/uribo/jpmesh +languageserver,https://github.com/REditorSupport/languageserver +latrend,https://github.com/philips-software/latrend +lifecycle,https://github.com/r-lib/lifecycle +mlflow,https://github.com/mlflow/mlflow +mlr,https://github.com/mlr-org/mlr +mlrCPO,https://github.com/mlr-org/mlrCPO +modules,https://github.com/wahani/modules +nLTT,https://github.com/thijsjanzen/nLTT +newsmd,https://github.com/Dschaykib/newsmd +openbankeR,https://github.com/nik01010/openbankeR +osfr,https://github.com/ropensci/osfr +packager,https://gitlab.com/fvafrCU/packager +physiology,https://github.com/jackwasey/physiology +precommit,https://github.com/lorenzwalthert/precommit +prettyB,https://github.com/jumpingrivers/prettyB +rBiasCorrection,https://github.com/kapsner/rBiasCorrection +rasterpdf,https://github.com/ilarischeinin/rasterpdf +rbokeh,https://github.com/bokeh/rbokeh +rde,https://github.com/kloppen/rde +rnrfa,https://github.com/cvitolo/rnrfa +roadoi,https://github.com/ropensci/roadoi +scriptexec,https://github.com/sagiegurari/scriptexec +secuTrialR,https://github.com/SwissClinicalTrialOrganisation/secuTrialR +semantic.dashboard,https://github.com/Appsilon/semantic.dashboard +shiny.info,https://github.com/Appsilon/shiny.info +shiny.semantic,https://github.com/Appsilon/shiny.semantic +smerc,https://github.com/jfrench/smerc +stencilaschema,https://github.com/stencila/schema +supernova,https://github.com/UCLATALL/supernova +tsviz,https://github.com/donlelef/tsviz +tuber,http://github.com/soodoku/tuber +unifir,https://github.com/ropensci/unifir +virustotal,https://github.com/themains/virustotal +xgboost,https://github.com/dmlc/xgboost diff --git a/.dev/revdep_compare_releases.R b/.dev/revdep_compare_releases.R index 077c7e272..f6616a253 100755 --- a/.dev/revdep_compare_releases.R +++ b/.dev/revdep_compare_releases.R @@ -3,6 +3,11 @@ library(withr) library(pkgload) library(data.table) +repo_data <- rbind( + utils::read.csv("revdep-repos"), + utils::read.csv("revdep-extra-repos", skip = 2L), + utils::read.csv("revdep-no-repos") +) new_packages <- setdiff(readLines("revdep-packages"), rownames(installed.packages())) install.packages(new_packages, repos = "https://cran.rstudio.com") failed_install <- setdiff(new_packages, rownames(installed.packages())) @@ -248,3 +253,5 @@ main_timings[ order(delta), { print(.SD); quantile(delta, 0:10/10) } ] + +# ---- Prepare e-mails for maintainers ---- diff --git a/.dev/revdep_get_repos.R b/.dev/revdep_get_repos.R index 9dcff86ab..6950da398 100755 --- a/.dev/revdep_get_repos.R +++ b/.dev/revdep_get_repos.R @@ -51,5 +51,13 @@ for (ii in seq_along(urls)) { git_urls <- extract_github_repo(urls) matched <- nzchar(git_urls) -writeLines(file.path("https://github.com/cran", sort(lintr_pkg[!matched])), "revdep-no-repos") -writeLines(sort(git_urls[matched]), "revdep-repos") +utils::write.csv( + data.frame(package = lintr_pkg[!matched], repo = file.path("https://github.com/cran", lintr_pkg[!matched])), + "revdep-no-repos", + row.names = FALSE, quote = FALSE +) +utils::write.csv( + data.frame(package = lintr_pkg[matched], repo = git_urls[matched]), + "revdep-no-repos", + row.names = FALSE, quote = FALSE +) From 3b057841ca4b6c2476b25a1af1f768e946586e0b Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Sun, 5 Jun 2022 12:42:15 -0700 Subject: [PATCH 31/49] incorporate metadata table used to store all metadata --- .dev/revdep-packages | 106 --------------------------------- .dev/revdep_compare_releases.R | 56 +++++++---------- .dev/revdep_get_repos.R | 2 - 3 files changed, 21 insertions(+), 143 deletions(-) delete mode 100644 .dev/revdep-packages diff --git a/.dev/revdep-packages b/.dev/revdep-packages deleted file mode 100644 index 96185dd39..000000000 --- a/.dev/revdep-packages +++ /dev/null @@ -1,106 +0,0 @@ -abbyyR -adaptalint -admiral -autoharp -aws.alexa -babette -beautier -BiasCorrector -biolink -BTYDplus -caretEnsemble -cattonum -cleaR -cloudos -cmstatr -ConNEcT -connectwidgets -crunch -dampack -dashboardthemes -dat -DataFakeR -datarobot -datastructures -DBItest -DepthProc -describer -devtools -diffusr -dittodb -DIZtools -DIZutils -DominoDataCapture -DQAgui -dupree -dyn.log -edgarWebR -emayili -epigraphdb -fakemake -fixtuRes -FSelectorRcpp -fst -fstcore -geofacet -geogrid -ggcharts -ggfortify -ggRandomForests -ggthemes -healthcareai -i18n -INSPECTumours -jpmesh -languageserver -latrend -lifecycle -mlflow -mlr -mlrCPO -modules -newsmd -NHSRplotthedots -nLTT -openbankeR -OpenML -osfr -packager -physiology -Plasmidprofiler -PosteriorBootstrap -precommit -prettyB -PWFSLSmoke -rasterpdf -rBiasCorrection -rbokeh -rde -rdomains -requiRements -RestRserve -rhino -rnrfa -roadoi -RSQL -SamplerCompare -scriptexec -secuTrialR -semantic.dashboard -shiny.info -shiny.react -shiny.semantic -smerc -stencilaschema -supernova -TDA -tsviz -tuber -unifir -upsetjs -urlshorteneR -virustotal -wavefunction -WikidataQueryServiceR -WoodburyMatrix -xgboost diff --git a/.dev/revdep_compare_releases.R b/.dev/revdep_compare_releases.R index f6616a253..98637407b 100755 --- a/.dev/revdep_compare_releases.R +++ b/.dev/revdep_compare_releases.R @@ -4,15 +4,17 @@ library(pkgload) library(data.table) repo_data <- rbind( - utils::read.csv("revdep-repos"), - utils::read.csv("revdep-extra-repos", skip = 2L), - utils::read.csv("revdep-no-repos") + data.table::fread("revdep-repos"), + data.table::fread("revdep-extra-repos", skip = 2L), + data.table::fread("revdep-no-repos") ) -new_packages <- setdiff(readLines("revdep-packages"), rownames(installed.packages())) +setkey(repo_data, repo) + +new_packages <- setdiff(repo_data$package, rownames(installed.packages())) install.packages(new_packages, repos = "https://cran.rstudio.com") failed_install <- setdiff(new_packages, rownames(installed.packages())) if (length(failed_install) > 0L) { - warning("Failed to install some dependencies; please install these packages manually: ", toString(failed_install)) + stop("Failed to install some dependencies; please install these packages manually: ", toString(failed_install)) } dev_dir <- getwd() @@ -20,19 +22,13 @@ dev_branch <- system2("git", c("rev-parse", "--abbrev-ref", "HEAD"), stdout = TR old_release <- "v2.0.1" main <- "main" -all_repos <- c( - readLines("revdep-repos"), - readLines("revdep-extra-repos"), - readLines("revdep-no-repos") -) -all_repos <- grep("^#", all_repos, invert = TRUE, value = TRUE) +all_repos <- repo_data$repo lint_timings <- new.env() lint_timings$repo_timing <- vector("list", length(all_repos)) names(lint_timings$repo_timing) <- all_repos # ---- Helpers ---- - result_path <- function(...) file.path(dev_dir, "revdep_comparison", ...) setup <- function(version) { @@ -46,8 +42,8 @@ setup <- function(version) { } cleanup <- function(version) { - lint_timings[[version]] <- lint_timings$repo_timing - lint_timings$repo_timing <- NULL + repo_data[, paste0("elapsed_", version) := elapsed] + repo_data[, elapsed := NULL] setwd(dev_dir) system2("git", c("checkout", "--quiet", dev_branch)) @@ -69,21 +65,19 @@ find_r_package_below <- function(top_dir) { dirname(desc_file) } -clone_and_lint <- function(repo) { - message(" * ", repo) - repo_dir <- withr::local_tempdir(basename(repo)) +clone_and_lint <- function(repo_url) { + message(" * ", repo_url) + repo_dir <- withr::local_tempdir(basename(repo_url)) # gert::git_clone() doesn't support shallow clones -- gert#101 system2( "git", - c("clone", "--depth=1", "--quiet", repo, repo_dir) + c("clone", "--depth=1", "--quiet", repo_url, repo_dir) ) withr::local_dir(find_r_package_below(repo_dir)) package <- read.dcf("DESCRIPTION", "Package") - # if (package %in% failed_install) return() - start_time <- proc.time() - on.exit(lint_timings$repo_timing[[repo]] <- proc.time() - start_time) + on.exit(repo_data[.(repo_url), elapsed := (proc.time() - start_time)["elapsed"]]) warnings <- character() withCallingHandlers( tryCatch( @@ -229,27 +223,19 @@ old_lints[, package := gsub("\\.csv$", "", package)] summarize_lint_delta(main_lints, old_lints) # ---- Timing comparison ---- -main_timings <- data.table::rbindlist(lapply(lint_timings[[main]], as.data.table), idcol = "repo") -old_timings <- data.table::rbindlist(lapply(lint_timings[[old_release]], as.data.table), idcol = "repo") +elapsed_main <- repo_data[[paste0("elapsed_", main)]] +elapsed_old <- repo_data[[paste0("elapsed_", old_release)]] message("Comparison of total time to run lint_packages() across all repos:") message(sprintf( " %.0fm to run on %s, %.0fm to run on %s", - main_timings[, sum(elapsed)], main, old_timings[, sum(elapsed)], old_release + sum(elapsed_main), main, sum(elapsed_old), old_release )) +repo_data[, delta := elapsed_main - elapsed_old] +repo_data[, delta_pct := 100 * delta / elapsed_old] message("Comparison of time to run lint_package() on each repo (new - old; negative -> faster)") -main_timings[ - old_timings, - on = "repo", - .( - repo, - new = x.elapsed, - old = i.elapsed, - delta = x.elapsed - i.elapsed, - delta_pct = 100 * (x.elapsed - i.elapsed) / i.elapsed - ) -][ +repo_data[ order(delta), { print(.SD); quantile(delta, 0:10/10) } ] diff --git a/.dev/revdep_get_repos.R b/.dev/revdep_get_repos.R index 6950da398..7be967a3d 100755 --- a/.dev/revdep_get_repos.R +++ b/.dev/revdep_get_repos.R @@ -9,8 +9,6 @@ lintr_pkg <- cran_db[ "Package" ] -writeLines(lintr_pkg, "revdep-packages") - # simple retry mechanism desc_url_fmt <- "https://cran.r-project.org/web/packages/%s/DESCRIPTION" extract_desc_fields <- function(pkg, keys, initial_sleep = 1, retry_sleep = 60) { From e4e908158d7f5be8f1cbe16c780a19f42cd3efe2 Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Sun, 5 Jun 2022 13:25:00 -0700 Subject: [PATCH 32/49] add a first pass at an e-mail template --- .dev/revdep-email-template | 26 ++++++++++++++++++++++++++ 1 file changed, 26 insertions(+) create mode 100644 .dev/revdep-email-template diff --git a/.dev/revdep-email-template b/.dev/revdep-email-template new file mode 100644 index 000000000..032f8e5a0 --- /dev/null +++ b/.dev/revdep-email-template @@ -0,0 +1,26 @@ +Hello {maintainer}! Thank you for using {{lintr}} in your package {package}! + +{{lintr}} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() using the CRAN version {old_release} and +the current version in development (commit hash {main_hash}). We do this ourselves because of {{lintr}}'s +position as a developer tool -- normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took {old_duration}s on CRAN vs. {main_duration}s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using {old_release} + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using {old_release} + * Change in linting state: one or two .csv files containing the lints found using one version of {{lintr}}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {{lintr}}. + +Thanks again! +{{lintr}} development team + From b6b7b40433385ec797d1016356efdebebe89807a Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Sun, 5 Jun 2022 14:07:40 -0700 Subject: [PATCH 33/49] first pass at generating e-mails --- .dev/revdep-email-template | 15 ++++---- .dev/revdep_compare_releases.R | 62 ++++++++++++++++++++++++++++++++++ 2 files changed, 71 insertions(+), 6 deletions(-) diff --git a/.dev/revdep-email-template b/.dev/revdep-email-template index 032f8e5a0..7452d30bc 100644 --- a/.dev/revdep-email-template +++ b/.dev/revdep-email-template @@ -1,19 +1,22 @@ -Hello {maintainer}! Thank you for using {{lintr}} in your package {package}! +Hello {maintainer}! Thank you for using {{lintr}} in your package {{{package}}}! {{lintr}} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview of the upcoming improvements and bug fixes. -We checked the results of running lint_package() using the CRAN version {old_release} and -the current version in development (commit hash {main_hash}). We do this ourselves because of {{lintr}}'s -position as a developer tool -- normal CRAN revdep checking is not as helpful for detecting breakages. +We checked the results of running lint_package() on your package as found at {repo_url} (hash: {git_hash}) using +the CRAN version {old_release} and the current version in development (commit hash {main_hash}). +We do this ourselves because of {{lintr}}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. On your package, lint_package() took {old_duration}s on CRAN vs. {main_duration}s in our latest version. This includes applying your .lintr config if one is available. I am also attaching the following, if they exist: - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using {old_release} - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using {old_release} + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using {old_release} + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using {old_release} * Change in linting state: one or two .csv files containing the lints found using one version of {{lintr}}, but not the other We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when diff --git a/.dev/revdep_compare_releases.R b/.dev/revdep_compare_releases.R index 98637407b..a68b028b6 100755 --- a/.dev/revdep_compare_releases.R +++ b/.dev/revdep_compare_releases.R @@ -2,6 +2,7 @@ library(withr) library(pkgload) library(data.table) +library(glue) repo_data <- rbind( data.table::fread("revdep-repos"), @@ -29,6 +30,8 @@ lint_timings$repo_timing <- vector("list", length(all_repos)) names(lint_timings$repo_timing) <- all_repos # ---- Helpers ---- +get_hash <- function() system2("git", c("rev-parse", "HEAD"), stdout = TRUE) + result_path <- function(...) file.path(dev_dir, "revdep_comparison", ...) setup <- function(version) { @@ -74,6 +77,7 @@ clone_and_lint <- function(repo_url) { c("clone", "--depth=1", "--quiet", repo_url, repo_dir) ) withr::local_dir(find_r_package_below(repo_dir)) + repo_data[.(repo_url), git_hash := get_hash()] package <- read.dcf("DESCRIPTION", "Package") start_time <- proc.time() @@ -178,6 +182,7 @@ summarize_lint_delta <- function(new, old) { # ---- Main linting execution ---- out_dir <- setup(main) +main_hash <- get_hash() for (repo in all_repos) clone_and_lint(repo) cleanup(main) @@ -241,3 +246,60 @@ repo_data[ ] # ---- Prepare e-mails for maintainers ---- +email_dir <- file.path(dev_dir, "revdep_emails") +dir.create(email_dir, showWarnings = FALSE) +email_template <- readChar("revdep-email-template", file.size("revdep-email-template")) +for (ii in seq_len(nrow(repo_data))) { + package <- repo_data$package[ii] + repo_url <- repo_data$repo[ii] + git_hash <- repo_data$git_hash[ii] + + maintainer_email <- utils::maintainer(package) + maintainer <- sub(" <.*$", "", maintainer_email) + email <- gsub("^[^<]*<|>$", "", maintainer_email) + + main_duration <- round(elapsed_main[ii]) + old_duration <- round(elapsed_old[ii]) + + dir.create(file.path(email_dir, package), showWarnings = FALSE) + writeLines(glue::glue(email_template), file.path(email_dir, package, "email-body")) + + attachments_dir <- file.path(email_dir, package, "attachments") + dir.create(attachments_dir, showWarnings = FALSE) + failure_file <- result_path(main, paste0(package, ".failure")) + if (failure_file %in% main_results) { + if (paste0(package, ".failure") %in% basename(old_results)) next + + file.copy(failure_file, file.path(attachments_dir, basename(failure_file))) + } + + warning_file <- result_path(main, paste0(package, ".warnings")) + if (warning_file %in% main_results) { + old_warning_file <- result_path(old_release, paste0(package, ".warnings")) + if (old_warning_file %in% old_results) { + new_warnings <- setdiff(readLines(warning_file), readLines(old_warning_file)) + writeLines(new_warnings, file.path(attachments_dir, basename(warning_file))) + } else { + file.copy(warning_file, file.path(attachments_dir, basename(warning_file))) + } + } + + PKG = package + main_only_lints <- main_lints[package == PKG][!old_lints, on = c("package", "filename", "line_number")] + if (nrow(main_only_lints) > 0L) { + utils::write.csv( + main_only_lints[c("filename", "line_number", "column_number", "type", "message", "line", "linter")], + file.path(attachments_dir, "lints_in_devel_not_cran.csv"), + row.names = FALSE + ) + } + + old_only_lints <- old_lints[package == PKG][!main_lints, on = c("package", "filename", "line_number")] + if (nrow(old_only_lints) > 0L) { + utils::write.csv( + old_only_lints[c("filename", "line_number", "column_number", "type", "message", "line", "linter")], + file.path(attachments_dir, "lints_in_cran_not_devel.csv"), + row.names = FALSE + ) + } +} From 676244a815416675bbcece937768007a743c4f53 Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Sun, 5 Jun 2022 14:07:52 -0700 Subject: [PATCH 34/49] add e-mails (to be reverted) --- .../BTYDplus/attachments/BTYDplus.warnings | 2 + .../attachments/lints_in_cran_not_devel.csv | 11 + .../attachments/lints_in_devel_not_cran.csv | 227 + .dev/revdep_emails/BTYDplus/email-body | 27 + .../attachments/BiasCorrector.warnings | 1 + .../attachments/lints_in_devel_not_cran.csv | 33 + .dev/revdep_emails/BiasCorrector/email-body | 27 + .dev/revdep_emails/ConNEcT/email-body | 27 + .dev/revdep_emails/DBItest/email-body | 27 + .dev/revdep_emails/DataFakeR/email-body | 27 + .../DepthProc/attachments/DepthProc.failure | 1 + .dev/revdep_emails/DepthProc/email-body | 27 + .../DominoDataCapture/email-body | 27 + .../attachments/FSelectorRcpp.warnings | 1 + .../attachments/lints_in_cran_not_devel.csv | 5 + .../attachments/lints_in_devel_not_cran.csv | 68 + .dev/revdep_emails/FSelectorRcpp/email-body | 27 + .dev/revdep_emails/NHSRplotthedots/email-body | 27 + .../attachments/lints_in_cran_not_devel.csv | 3 + .../attachments/lints_in_devel_not_cran.csv | 82 + .dev/revdep_emails/OpenML/email-body | 27 + .../attachments/PWFSLSmoke.warnings | 2 + .../attachments/lints_in_cran_not_devel.csv | 3 + .../attachments/lints_in_devel_not_cran.csv | 219 + .dev/revdep_emails/PWFSLSmoke/email-body | 27 + .dev/revdep_emails/Plasmidprofiler/email-body | 27 + .../attachments/lints_in_devel_not_cran.csv | 24 + .../PosteriorBootstrap/email-body | 27 + .../RSQL/attachments/RSQL.warnings | 2 + .../attachments/lints_in_devel_not_cran.csv | 25 + .dev/revdep_emails/RSQL/email-body | 27 + .../RestRserve/attachments/RestRserve.failure | 1 + .../attachments/RestRserve.warnings | 1 + .dev/revdep_emails/RestRserve/email-body | 27 + .dev/revdep_emails/SamplerCompare/email-body | 27 + .dev/revdep_emails/TDA/email-body | 27 + .../WikidataQueryServiceR.warnings | 2 + .../WikidataQueryServiceR/email-body | 27 + .../attachments/WoodburyMatrix.warnings | 1 + .dev/revdep_emails/WoodburyMatrix/email-body | 27 + .dev/revdep_emails/abbyyR/email-body | 27 + .dev/revdep_emails/adaptalint/email-body | 27 + .dev/revdep_emails/admiral/email-body | 27 + .dev/revdep_emails/autoharp/email-body | 27 + .dev/revdep_emails/aws.alexa/email-body | 27 + .../attachments/lints_in_devel_not_cran.csv | 5 + .dev/revdep_emails/babette/email-body | 27 + .../attachments/lints_in_devel_not_cran.csv | 3 + .dev/revdep_emails/beautier/email-body | 27 + .dev/revdep_emails/biolink/email-body | 27 + .../attachments/lints_in_cran_not_devel.csv | 8 + .../attachments/lints_in_devel_not_cran.csv | 114 + .dev/revdep_emails/caretEnsemble/email-body | 27 + .../cattonum/attachments/cattonum.warnings | 1 + .../attachments/lints_in_cran_not_devel.csv | 2 + .dev/revdep_emails/cattonum/email-body | 27 + .../cleaR/attachments/cleaR.warnings | 1 + .../attachments/lints_in_devel_not_cran.csv | 29 + .dev/revdep_emails/cleaR/email-body | 27 + .../attachments/lints_in_cran_not_devel.csv | 19 + .../attachments/lints_in_devel_not_cran.csv | 25 + .dev/revdep_emails/cloudos/email-body | 27 + .../attachments/lints_in_devel_not_cran.csv | 9 + .dev/revdep_emails/connectwidgets/email-body | 27 + .../crunch/attachments/crunch.warnings | 2 + .../attachments/lints_in_cran_not_devel.csv | 2 + .../attachments/lints_in_devel_not_cran.csv | 765 + .dev/revdep_emails/crunch/email-body | 27 + .../dampack/attachments/dampack.warnings | 2 + .../attachments/lints_in_devel_not_cran.csv | 331 + .dev/revdep_emails/dampack/email-body | 27 + .../attachments/dashboardthemes.warnings | 263 + .../attachments/lints_in_devel_not_cran.csv | 3 + .dev/revdep_emails/dashboardthemes/email-body | 27 + .../attachments/lints_in_cran_not_devel.csv | 7 + .../attachments/lints_in_devel_not_cran.csv | 44 + .dev/revdep_emails/dat/email-body | 27 + .dev/revdep_emails/datarobot/email-body | 27 + .../attachments/datastructures.failure | 1 + .dev/revdep_emails/datastructures/email-body | 27 + .../attachments/lints_in_cran_not_devel.csv | 2 + .dev/revdep_emails/describer/email-body | 27 + .dev/revdep_emails/devtools/email-body | 27 + .../diffusr/attachments/diffusr.failure | 1 + .dev/revdep_emails/diffusr/email-body | 27 + .../dittodb/attachments/dittodb.warnings | 1 + .../attachments/lints_in_devel_not_cran.csv | 728 + .dev/revdep_emails/dittodb/email-body | 27 + .../dupree/attachments/dupree.warnings | 1 + .dev/revdep_emails/dupree/email-body | 27 + .../edgarWebR/attachments/edgarWebR.warnings | 2 + .../attachments/lints_in_devel_not_cran.csv | 19916 ++++++++++++++++ .dev/revdep_emails/edgarWebR/email-body | 27 + .../attachments/epigraphdb.warnings | 1 + .dev/revdep_emails/epigraphdb/email-body | 27 + .../attachments/lints_in_cran_not_devel.csv | 2 + .../attachments/lints_in_devel_not_cran.csv | 2 + .dev/revdep_emails/fakemake/email-body | 27 + .../fixtuRes/attachments/fixtuRes.warnings | 1 + .../attachments/lints_in_devel_not_cran.csv | 3 + .dev/revdep_emails/fixtuRes/email-body | 27 + .../attachments/lints_in_devel_not_cran.csv | 12 + .dev/revdep_emails/fst/email-body | 27 + .dev/revdep_emails/geofacet/email-body | 27 + .dev/revdep_emails/geogrid/email-body | 27 + .../attachments/lints_in_cran_not_devel.csv | 12 + .../attachments/lints_in_devel_not_cran.csv | 357 + .dev/revdep_emails/ggRandomForests/email-body | 27 + .../ggcharts/attachments/ggcharts.warnings | 1 + .../attachments/lints_in_cran_not_devel.csv | 3 + .../attachments/lints_in_devel_not_cran.csv | 5 + .dev/revdep_emails/ggcharts/email-body | 27 + .../attachments/lints_in_cran_not_devel.csv | 118 + .../attachments/lints_in_devel_not_cran.csv | 190 + .dev/revdep_emails/ggfortify/email-body | 27 + .../ggthemes/attachments/ggthemes.warnings | 2 + .../attachments/lints_in_cran_not_devel.csv | 2 + .../attachments/lints_in_devel_not_cran.csv | 48 + .dev/revdep_emails/ggthemes/email-body | 27 + .../attachments/healthcareai.warnings | 2 + .../attachments/lints_in_devel_not_cran.csv | 149 + .dev/revdep_emails/healthcareai/email-body | 27 + .../attachments/lints_in_devel_not_cran.csv | 345 + .dev/revdep_emails/i18n/email-body | 27 + .../jpmesh/attachments/jpmesh.warnings | 1 + .../attachments/lints_in_devel_not_cran.csv | 3 + .dev/revdep_emails/jpmesh/email-body | 27 + .../attachments/languageserver.warnings | 2 + .dev/revdep_emails/languageserver/email-body | 27 + .../attachments/lints_in_cran_not_devel.csv | 35 + .../attachments/lints_in_devel_not_cran.csv | 331 + .dev/revdep_emails/latrend/email-body | 27 + .../attachments/lints_in_cran_not_devel.csv | 5 + .../attachments/lints_in_devel_not_cran.csv | 24 + .dev/revdep_emails/lifecycle/email-body | 27 + .../attachments/lints_in_cran_not_devel.csv | 14 + .../attachments/lints_in_devel_not_cran.csv | 67 + .dev/revdep_emails/lightgbm/email-body | 27 + .../attachments/lints_in_cran_not_devel.csv | 3 + .../attachments/lints_in_devel_not_cran.csv | 12 + .../mlflow/attachments/mlflow.warnings | 2 + .dev/revdep_emails/mlflow/email-body | 27 + .../attachments/lints_in_cran_not_devel.csv | 152 + .../attachments/lints_in_devel_not_cran.csv | 791 + .../mlr/attachments/mlr.warnings | 2 + .dev/revdep_emails/mlr/email-body | 27 + .../attachments/lints_in_cran_not_devel.csv | 4 + .../attachments/lints_in_devel_not_cran.csv | 441 + .dev/revdep_emails/mlrCPO/email-body | 27 + .../attachments/lints_in_devel_not_cran.csv | 12 + .../modules/attachments/modules.warnings | 1 + .dev/revdep_emails/modules/email-body | 27 + .../attachments/lints_in_devel_not_cran.csv | 2 + .dev/revdep_emails/nLTT/email-body | 27 + .dev/revdep_emails/newsmd/email-body | 27 + .../attachments/openbankeR.warnings | 68 + .dev/revdep_emails/openbankeR/email-body | 27 + .../attachments/lints_in_devel_not_cran.csv | 8 + .../osfr/attachments/osfr.warnings | 1 + .dev/revdep_emails/osfr/email-body | 27 + .../attachments/lints_in_cran_not_devel.csv | 5 + .../attachments/lints_in_devel_not_cran.csv | 29 + .../packager/attachments/packager.warnings | 1 + .dev/revdep_emails/packager/email-body | 27 + .../attachments/lints_in_devel_not_cran.csv | 58 + .../attachments/physiology.warnings | 2 + .dev/revdep_emails/physiology/email-body | 27 + .../attachments/lints_in_cran_not_devel.csv | 8 + .../attachments/lints_in_devel_not_cran.csv | 17 + .dev/revdep_emails/precommit/email-body | 27 + .../attachments/lints_in_devel_not_cran.csv | 23 + .../prettyB/attachments/prettyB.warnings | 1 + .dev/revdep_emails/prettyB/email-body | 27 + .../attachments/lints_in_devel_not_cran.csv | 110 + .../attachments/rBiasCorrection.warnings | 1 + .dev/revdep_emails/rBiasCorrection/email-body | 27 + .dev/revdep_emails/rasterpdf/email-body | 27 + .dev/revdep_emails/rbokeh/email-body | 27 + .../attachments/lints_in_devel_not_cran.csv | 12 + .dev/revdep_emails/rde/email-body | 27 + .../attachments/lints_in_devel_not_cran.csv | 65 + .dev/revdep_emails/rnrfa/email-body | 27 + .dev/revdep_emails/roadoi/email-body | 27 + .../attachments/scriptexec.warnings | 1 + .dev/revdep_emails/scriptexec/email-body | 27 + .../attachments/lints_in_cran_not_devel.csv | 17 + .../attachments/lints_in_devel_not_cran.csv | 41 + .dev/revdep_emails/secuTrialR/email-body | 27 + .../attachments/lints_in_cran_not_devel.csv | 5 + .../attachments/lints_in_devel_not_cran.csv | 8 + .../semantic.dashboard/email-body | 27 + .../attachments/lints_in_cran_not_devel.csv | 3 + .../attachments/lints_in_devel_not_cran.csv | 3 + .dev/revdep_emails/shiny.info/email-body | 27 + .../attachments/lints_in_cran_not_devel.csv | 30 + .../attachments/lints_in_devel_not_cran.csv | 24 + .dev/revdep_emails/shiny.semantic/email-body | 27 + .../attachments/lints_in_devel_not_cran.csv | 93 + .dev/revdep_emails/smerc/email-body | 27 + .../attachments/lints_in_devel_not_cran.csv | 3 + .../attachments/stencilaschema.warnings | 1 + .dev/revdep_emails/stencilaschema/email-body | 27 + .../attachments/lints_in_devel_not_cran.csv | 4 + .../supernova/attachments/supernova.warnings | 1 + .dev/revdep_emails/supernova/email-body | 27 + .../attachments/lints_in_cran_not_devel.csv | 2 + .../attachments/lints_in_devel_not_cran.csv | 2 + .../tsviz/attachments/tsviz.warnings | 1 + .dev/revdep_emails/tsviz/email-body | 27 + .../tuber/attachments/tuber.failure | 1 + .../tuber/attachments/tuber.warnings | 1 + .dev/revdep_emails/tuber/email-body | 27 + .../attachments/lints_in_cran_not_devel.csv | 5 + .../attachments/lints_in_devel_not_cran.csv | 8 + .dev/revdep_emails/unifir/email-body | 27 + .dev/revdep_emails/virustotal/email-body | 27 + .dev/revdep_emails/wavefunction/email-body | 27 + .../attachments/lints_in_cran_not_devel.csv | 29 + .../attachments/lints_in_devel_not_cran.csv | 367 + .dev/revdep_emails/xgboost/email-body | 27 + 220 files changed, 29730 insertions(+) create mode 100644 .dev/revdep_emails/BTYDplus/attachments/BTYDplus.warnings create mode 100644 .dev/revdep_emails/BTYDplus/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/BTYDplus/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/BTYDplus/email-body create mode 100644 .dev/revdep_emails/BiasCorrector/attachments/BiasCorrector.warnings create mode 100644 .dev/revdep_emails/BiasCorrector/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/BiasCorrector/email-body create mode 100644 .dev/revdep_emails/ConNEcT/email-body create mode 100644 .dev/revdep_emails/DBItest/email-body create mode 100644 .dev/revdep_emails/DataFakeR/email-body create mode 100644 .dev/revdep_emails/DepthProc/attachments/DepthProc.failure create mode 100644 .dev/revdep_emails/DepthProc/email-body create mode 100644 .dev/revdep_emails/DominoDataCapture/email-body create mode 100644 .dev/revdep_emails/FSelectorRcpp/attachments/FSelectorRcpp.warnings create mode 100644 .dev/revdep_emails/FSelectorRcpp/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/FSelectorRcpp/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/FSelectorRcpp/email-body create mode 100644 .dev/revdep_emails/NHSRplotthedots/email-body create mode 100644 .dev/revdep_emails/OpenML/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/OpenML/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/OpenML/email-body create mode 100644 .dev/revdep_emails/PWFSLSmoke/attachments/PWFSLSmoke.warnings create mode 100644 .dev/revdep_emails/PWFSLSmoke/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/PWFSLSmoke/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/PWFSLSmoke/email-body create mode 100644 .dev/revdep_emails/Plasmidprofiler/email-body create mode 100644 .dev/revdep_emails/PosteriorBootstrap/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/PosteriorBootstrap/email-body create mode 100644 .dev/revdep_emails/RSQL/attachments/RSQL.warnings create mode 100644 .dev/revdep_emails/RSQL/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/RSQL/email-body create mode 100644 .dev/revdep_emails/RestRserve/attachments/RestRserve.failure create mode 100644 .dev/revdep_emails/RestRserve/attachments/RestRserve.warnings create mode 100644 .dev/revdep_emails/RestRserve/email-body create mode 100644 .dev/revdep_emails/SamplerCompare/email-body create mode 100644 .dev/revdep_emails/TDA/email-body create mode 100644 .dev/revdep_emails/WikidataQueryServiceR/attachments/WikidataQueryServiceR.warnings create mode 100644 .dev/revdep_emails/WikidataQueryServiceR/email-body create mode 100644 .dev/revdep_emails/WoodburyMatrix/attachments/WoodburyMatrix.warnings create mode 100644 .dev/revdep_emails/WoodburyMatrix/email-body create mode 100644 .dev/revdep_emails/abbyyR/email-body create mode 100644 .dev/revdep_emails/adaptalint/email-body create mode 100644 .dev/revdep_emails/admiral/email-body create mode 100644 .dev/revdep_emails/autoharp/email-body create mode 100644 .dev/revdep_emails/aws.alexa/email-body create mode 100644 .dev/revdep_emails/babette/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/babette/email-body create mode 100644 .dev/revdep_emails/beautier/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/beautier/email-body create mode 100644 .dev/revdep_emails/biolink/email-body create mode 100644 .dev/revdep_emails/caretEnsemble/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/caretEnsemble/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/caretEnsemble/email-body create mode 100644 .dev/revdep_emails/cattonum/attachments/cattonum.warnings create mode 100644 .dev/revdep_emails/cattonum/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/cattonum/email-body create mode 100644 .dev/revdep_emails/cleaR/attachments/cleaR.warnings create mode 100644 .dev/revdep_emails/cleaR/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/cleaR/email-body create mode 100644 .dev/revdep_emails/cloudos/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/cloudos/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/cloudos/email-body create mode 100644 .dev/revdep_emails/connectwidgets/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/connectwidgets/email-body create mode 100644 .dev/revdep_emails/crunch/attachments/crunch.warnings create mode 100644 .dev/revdep_emails/crunch/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/crunch/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/crunch/email-body create mode 100644 .dev/revdep_emails/dampack/attachments/dampack.warnings create mode 100644 .dev/revdep_emails/dampack/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/dampack/email-body create mode 100644 .dev/revdep_emails/dashboardthemes/attachments/dashboardthemes.warnings create mode 100644 .dev/revdep_emails/dashboardthemes/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/dashboardthemes/email-body create mode 100644 .dev/revdep_emails/dat/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/dat/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/dat/email-body create mode 100644 .dev/revdep_emails/datarobot/email-body create mode 100644 .dev/revdep_emails/datastructures/attachments/datastructures.failure create mode 100644 .dev/revdep_emails/datastructures/email-body create mode 100644 .dev/revdep_emails/describer/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/describer/email-body create mode 100644 .dev/revdep_emails/devtools/email-body create mode 100644 .dev/revdep_emails/diffusr/attachments/diffusr.failure create mode 100644 .dev/revdep_emails/diffusr/email-body create mode 100644 .dev/revdep_emails/dittodb/attachments/dittodb.warnings create mode 100644 .dev/revdep_emails/dittodb/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/dittodb/email-body create mode 100644 .dev/revdep_emails/dupree/attachments/dupree.warnings create mode 100644 .dev/revdep_emails/dupree/email-body create mode 100644 .dev/revdep_emails/edgarWebR/attachments/edgarWebR.warnings create mode 100644 .dev/revdep_emails/edgarWebR/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/edgarWebR/email-body create mode 100644 .dev/revdep_emails/epigraphdb/attachments/epigraphdb.warnings create mode 100644 .dev/revdep_emails/epigraphdb/email-body create mode 100644 .dev/revdep_emails/fakemake/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/fakemake/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/fakemake/email-body create mode 100644 .dev/revdep_emails/fixtuRes/attachments/fixtuRes.warnings create mode 100644 .dev/revdep_emails/fixtuRes/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/fixtuRes/email-body create mode 100644 .dev/revdep_emails/fst/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/fst/email-body create mode 100644 .dev/revdep_emails/geofacet/email-body create mode 100644 .dev/revdep_emails/geogrid/email-body create mode 100644 .dev/revdep_emails/ggRandomForests/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/ggRandomForests/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/ggRandomForests/email-body create mode 100644 .dev/revdep_emails/ggcharts/attachments/ggcharts.warnings create mode 100644 .dev/revdep_emails/ggcharts/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/ggcharts/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/ggcharts/email-body create mode 100644 .dev/revdep_emails/ggfortify/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/ggfortify/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/ggfortify/email-body create mode 100644 .dev/revdep_emails/ggthemes/attachments/ggthemes.warnings create mode 100644 .dev/revdep_emails/ggthemes/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/ggthemes/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/ggthemes/email-body create mode 100644 .dev/revdep_emails/healthcareai/attachments/healthcareai.warnings create mode 100644 .dev/revdep_emails/healthcareai/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/healthcareai/email-body create mode 100644 .dev/revdep_emails/i18n/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/i18n/email-body create mode 100644 .dev/revdep_emails/jpmesh/attachments/jpmesh.warnings create mode 100644 .dev/revdep_emails/jpmesh/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/jpmesh/email-body create mode 100644 .dev/revdep_emails/languageserver/attachments/languageserver.warnings create mode 100644 .dev/revdep_emails/languageserver/email-body create mode 100644 .dev/revdep_emails/latrend/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/latrend/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/latrend/email-body create mode 100644 .dev/revdep_emails/lifecycle/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/lifecycle/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/lifecycle/email-body create mode 100644 .dev/revdep_emails/lightgbm/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/lightgbm/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/lightgbm/email-body create mode 100644 .dev/revdep_emails/mlflow/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/mlflow/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/mlflow/attachments/mlflow.warnings create mode 100644 .dev/revdep_emails/mlflow/email-body create mode 100644 .dev/revdep_emails/mlr/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/mlr/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/mlr/attachments/mlr.warnings create mode 100644 .dev/revdep_emails/mlr/email-body create mode 100644 .dev/revdep_emails/mlrCPO/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/mlrCPO/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/mlrCPO/email-body create mode 100644 .dev/revdep_emails/modules/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/modules/attachments/modules.warnings create mode 100644 .dev/revdep_emails/modules/email-body create mode 100644 .dev/revdep_emails/nLTT/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/nLTT/email-body create mode 100644 .dev/revdep_emails/newsmd/email-body create mode 100644 .dev/revdep_emails/openbankeR/attachments/openbankeR.warnings create mode 100644 .dev/revdep_emails/openbankeR/email-body create mode 100644 .dev/revdep_emails/osfr/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/osfr/attachments/osfr.warnings create mode 100644 .dev/revdep_emails/osfr/email-body create mode 100644 .dev/revdep_emails/packager/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/packager/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/packager/attachments/packager.warnings create mode 100644 .dev/revdep_emails/packager/email-body create mode 100644 .dev/revdep_emails/physiology/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/physiology/attachments/physiology.warnings create mode 100644 .dev/revdep_emails/physiology/email-body create mode 100644 .dev/revdep_emails/precommit/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/precommit/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/precommit/email-body create mode 100644 .dev/revdep_emails/prettyB/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/prettyB/attachments/prettyB.warnings create mode 100644 .dev/revdep_emails/prettyB/email-body create mode 100644 .dev/revdep_emails/rBiasCorrection/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/rBiasCorrection/attachments/rBiasCorrection.warnings create mode 100644 .dev/revdep_emails/rBiasCorrection/email-body create mode 100644 .dev/revdep_emails/rasterpdf/email-body create mode 100644 .dev/revdep_emails/rbokeh/email-body create mode 100644 .dev/revdep_emails/rde/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/rde/email-body create mode 100644 .dev/revdep_emails/rnrfa/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/rnrfa/email-body create mode 100644 .dev/revdep_emails/roadoi/email-body create mode 100644 .dev/revdep_emails/scriptexec/attachments/scriptexec.warnings create mode 100644 .dev/revdep_emails/scriptexec/email-body create mode 100644 .dev/revdep_emails/secuTrialR/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/secuTrialR/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/secuTrialR/email-body create mode 100644 .dev/revdep_emails/semantic.dashboard/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/semantic.dashboard/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/semantic.dashboard/email-body create mode 100644 .dev/revdep_emails/shiny.info/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/shiny.info/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/shiny.info/email-body create mode 100644 .dev/revdep_emails/shiny.semantic/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/shiny.semantic/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/shiny.semantic/email-body create mode 100644 .dev/revdep_emails/smerc/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/smerc/email-body create mode 100644 .dev/revdep_emails/stencilaschema/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/stencilaschema/attachments/stencilaschema.warnings create mode 100644 .dev/revdep_emails/stencilaschema/email-body create mode 100644 .dev/revdep_emails/supernova/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/supernova/attachments/supernova.warnings create mode 100644 .dev/revdep_emails/supernova/email-body create mode 100644 .dev/revdep_emails/tsviz/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/tsviz/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/tsviz/attachments/tsviz.warnings create mode 100644 .dev/revdep_emails/tsviz/email-body create mode 100644 .dev/revdep_emails/tuber/attachments/tuber.failure create mode 100644 .dev/revdep_emails/tuber/attachments/tuber.warnings create mode 100644 .dev/revdep_emails/tuber/email-body create mode 100644 .dev/revdep_emails/unifir/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/unifir/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/unifir/email-body create mode 100644 .dev/revdep_emails/virustotal/email-body create mode 100644 .dev/revdep_emails/wavefunction/email-body create mode 100644 .dev/revdep_emails/xgboost/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/xgboost/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/xgboost/email-body diff --git a/.dev/revdep_emails/BTYDplus/attachments/BTYDplus.warnings b/.dev/revdep_emails/BTYDplus/attachments/BTYDplus.warnings new file mode 100644 index 000000000..2043731ef --- /dev/null +++ b/.dev/revdep_emails/BTYDplus/attachments/BTYDplus.warnings @@ -0,0 +1,2 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Trying to remove β€˜multiple_dots_linter’ and β€˜camel_case_linter’, which are not in `defaults`. diff --git a/.dev/revdep_emails/BTYDplus/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/BTYDplus/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..ec2a8edb8 --- /dev/null +++ b/.dev/revdep_emails/BTYDplus/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,11 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/helpers.R",72,13,"style","Variable and function name style should be snake_case."," elog_dt[, N := .N, by = ""cust""]","object_name_linter" +"R/helpers.R",399,26,"style","Variable and function name style should be snake_case."," grid <- grid[is.na(N), N := 0L]","object_name_linter" +"tests/testthat/test-bg-cnbd-k.R",76,7,"style","Variable and function name style should be snake_case."," cbs$x.est32 <- bgcnbd.ConditionalExpectedTransactions(params, 32, cbs$x, cbs$t.x, cbs$T.cal)","object_name_linter" +"tests/testthat/test-bg-cnbd-k.R",77,7,"style","Variable and function name style should be snake_case."," cbs$x.est64 <- bgcnbd.ConditionalExpectedTransactions(params, 64, cbs$x, cbs$t.x, cbs$T.cal)","object_name_linter" +"tests/testthat/test-mbg-cnbd-k.R",28,7,"style","Variable and function name style should be snake_case."," cbs$x.est <- mbgcnbd.ConditionalExpectedTransactions(params, cbs$T.star, cbs$x, cbs$t.x, cbs$T.cal)","object_name_linter" +"tests/testthat/test-mbg-cnbd-k.R",67,9,"style","Variable and function name style should be snake_case."," cbs$x.est <- mbgcnbd.ConditionalExpectedTransactions(params, cbs$T.star, cbs$x, cbs$t.x, cbs$T.cal)","object_name_linter" +"tests/testthat/test-nbd.R",18,7,"style","Variable and function name style should be snake_case."," cbs$x.est <- nbd.ConditionalExpectedTransactions(params, cbs$T.star, cbs$x, cbs$T.cal)","object_name_linter" +"tests/testthat/test-pareto-ggg-mcmc.R",49,7,"style","Variable and function name style should be snake_case."," cbs$x.est <- apply(xstar, 2, mean)","object_name_linter" +"tests/testthat/test-pareto-nbd-abe.R",76,7,"style","Variable and function name style should be snake_case."," cbs$x.est <- apply(xstar, 2, mean)","object_name_linter" +"tests/testthat/test-pareto-nbd-mcmc.R",79,7,"style","Variable and function name style should be snake_case."," cbs$x.est <- apply(xstar, 2, mean)","object_name_linter" diff --git a/.dev/revdep_emails/BTYDplus/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/BTYDplus/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..fb5385eb6 --- /dev/null +++ b/.dev/revdep_emails/BTYDplus/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,227 @@ +"filename","line_number","column_number","type","message","line","linter" +"demo/cdnow.R",3,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog <- read.csv(system.file(""data/cdnowElog.csv"", package = ""BTYD""),","object_name_linter" +"demo/cdnow.R",6,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog$date <- as.Date(as.character(cdnowElog$date), format = ""%Y%m%d"")","object_name_linter" +"demo/cdnow.R",22,2,"style","Variable and function name style should be snake_case or symbols.","(params.nbd <- nbd.EstimateParameters(cbs))","object_name_linter" +"demo/cdnow.R",38,2,"style","Variable and function name style should be snake_case or symbols.","(params.mbgcnbd <- mbgcnbd.EstimateParameters(cbs))","object_name_linter" +"demo/cdnow.R",65,1,"style","Variable and function name style should be snake_case or symbols.","params.pnbd <- BTYD::pnbd.EstimateParameters(cbs) # estimate Pareto/NBD","object_name_linter" +"demo/cdnow.R",66,1,"style","Variable and function name style should be snake_case or symbols.","params.bgcnbd <- bgcnbd.EstimateParameters(cbs) # estimate BG/CNBD-k","object_name_linter" +"demo/cdnow.R",111,33,"style","Put spaces around all infix operators."," ""BIAS"" = function(a, f) sum(f)/sum(a) - 1)","infix_spaces_linter" +"demo/cdnow.R",137,1,"style","Variable and function name style should be snake_case or symbols.","spend.params <- BTYD::spend.EstimateParameters(cbs$sales.avg, cbs$x + 1)","object_name_linter" +"demo/mbg-cnbd-k.R",14,2,"style","Variable and function name style should be snake_case or symbols.","(k.est <- estimateRegularity(groceryElog))","object_name_linter" +"demo/mbg-cnbd-k.R",24,2,"style","Variable and function name style should be snake_case or symbols.","(params.mbgcnbd <- mbgcnbd.EstimateParameters(cbs))","object_name_linter" +"demo/mbg-cnbd-k.R",51,1,"style","Variable and function name style should be snake_case or symbols.","params.nbd <- nbd.EstimateParameters(cbs) # estimate NBD","object_name_linter" +"demo/mbg-cnbd-k.R",52,1,"style","Variable and function name style should be snake_case or symbols.","params.pnbd <- BTYD::pnbd.EstimateParameters(cbs) # estimate Pareto/NBD","object_name_linter" +"demo/mbg-cnbd-k.R",53,1,"style","Variable and function name style should be snake_case or symbols.","params.bgnbd <- BTYD::bgnbd.EstimateParameters(cbs) # estimate BG/NBD","object_name_linter" +"demo/mbg-cnbd-k.R",54,1,"style","Variable and function name style should be snake_case or symbols.","params.mbgnbd <- mbgnbd.EstimateParameters(cbs) # estimate MBG/NBD","object_name_linter" +"demo/mbg-cnbd-k.R",79,33,"style","Put spaces around all infix operators."," ""BIAS"" = function(a, f) sum(f)/sum(a) - 1)","infix_spaces_linter" +"demo/mbg-cnbd-k.R",107,1,"style","Variable and function name style should be snake_case or symbols.","T.tot <- max(cbs$T.cal+cbs$T.star)","object_name_linter" +"demo/mbg-cnbd-k.R",107,23,"style","Put spaces around all infix operators.","T.tot <- max(cbs$T.cal+cbs$T.star)","infix_spaces_linter" +"demo/pareto-abe.R",3,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog <- read.csv(system.file(""data/cdnowElog.csv"", package = ""BTYD""),","object_name_linter" +"demo/pareto-abe.R",6,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog$date <- as.Date(as.character(cdnowElog$date), format = ""%Y%m%d"")","object_name_linter" +"demo/pareto-abe.R",18,1,"style","Variable and function name style should be snake_case or symbols.","draws.m1 <- abe.mcmc.DrawParameters(","object_name_linter" +"demo/pareto-abe.R",34,1,"style","Variable and function name style should be snake_case or symbols.","draws.m2 <- abe.mcmc.DrawParameters(","object_name_linter" +"demo/pareto-abe.R",52,1,"style","Variable and function name style should be snake_case or symbols.","xstar.m1.draws <- mcmc.DrawFutureTransactions(cbs, draws.m1, T.star = cbs$T.star)","object_name_linter" +"demo/pareto-abe.R",53,1,"style","Variable and function name style should be snake_case or symbols.","xstar.m2.draws <- mcmc.DrawFutureTransactions(cbs, draws.m2, T.star = cbs$T.star)","object_name_linter" +"demo/pareto-ggg.R",16,1,"style","Variable and function name style should be snake_case or symbols.","pnbd.draws <- pnbd.mcmc.DrawParameters(cal.cbs = cbs, mc.cores = 1)","object_name_linter" +"demo/pareto-ggg.R",20,1,"style","Variable and function name style should be snake_case or symbols.","pggg.draws <- pggg.mcmc.DrawParameters(cal.cbs = cbs,","object_name_linter" +"demo/pareto-ggg.R",24,25,"style","Put spaces around all infix operators.","round(rbind(`Pareto/GGG`= summary(pggg.draws$level_2)$quantiles[, ""50%""],","infix_spaces_linter" +"demo/pareto-ggg.R",41,1,"style","Variable and function name style should be snake_case or symbols.","xstar.pnbd.draws <- mcmc.DrawFutureTransactions(cbs, pnbd.draws, T.star = cbs$T.star, sample_size = 400)","object_name_linter" +"demo/pareto-ggg.R",42,1,"style","Variable and function name style should be snake_case or symbols.","xstar.pggg.draws <- mcmc.DrawFutureTransactions(cbs, pggg.draws, T.star = cbs$T.star, sample_size = 400)","object_name_linter" +"demo/pareto-ggg.R",59,20,"style","Put spaces around all infix operators.","(lift <- 1 - mae[1]/mae[2])","infix_spaces_linter" +"R/helpers.R",58,32,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!""date"" %in% names(elog) & !""t"" %in% names(elog))","vector_logic_linter" +"R/helpers.R",179,3,"style","Variable and function name style should be snake_case or symbols."," T.0 <- min(elog_dt$t)","object_name_linter" +"R/helpers.R",181,5,"style","Variable and function name style should be snake_case or symbols."," T.cal <- max(elog_dt$t)","object_name_linter" +"R/helpers.R",183,5,"style","Variable and function name style should be snake_case or symbols."," T.cal <- as.numeric(as.Date(T.cal))","object_name_linter" +"R/helpers.R",186,5,"style","Variable and function name style should be snake_case or symbols."," T.tot <- max(elog_dt$t)","object_name_linter" +"R/helpers.R",188,5,"style","Variable and function name style should be snake_case or symbols."," T.tot <- as.numeric(as.Date(T.tot))","object_name_linter" +"R/helpers.R",293,32,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (""sales"" %in% names(elog) & !is.numeric(elog$sales)) stop(""`sales` field must be numeric"")","vector_logic_linter" +"R/helpers.R",295,23,"style","Variable and function name style should be snake_case or symbols."," if (is.null(T.cal)) T.cal <- max(elog$date)","object_name_linter" +"R/helpers.R",296,23,"style","Variable and function name style should be snake_case or symbols."," if (is.null(T.tot)) T.tot <- max(elog$date)","object_name_linter" +"R/helpers.R",297,28,"style","Variable and function name style should be snake_case or symbols."," if (is.character(T.cal)) T.cal <- if (class(elog$date)[1] == ""Date"") as.Date(T.cal) else as.POSIXct(T.cal)","object_name_linter" +"R/helpers.R",298,28,"style","Variable and function name style should be snake_case or symbols."," if (is.character(T.tot)) T.tot <- if (class(elog$date)[1] == ""Date"") as.Date(T.tot) else as.POSIXct(T.tot)","object_name_linter" +"R/helpers.R",299,22,"style","Variable and function name style should be snake_case or symbols."," if (T.tot < T.cal) T.tot <- T.cal","object_name_linter" +"R/helpers.R",460,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(legend) & length(legend) == 2) {","vector_logic_linter" +"R/helpers.R",475,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(x) != length(actual) | length(x) != length(expected) |","vector_logic_linter" +"R/helpers.R",475,67,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(x) != length(actual) | length(x) != length(expected) |","vector_logic_linter" +"R/helpers.R",476,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !is.numeric(x) | !is.numeric(actual) | !is.numeric(expected) |","vector_logic_linter" +"R/helpers.R",476,44,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !is.numeric(x) | !is.numeric(actual) | !is.numeric(expected) |","vector_logic_linter" +"R/helpers.R",476,68,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !is.numeric(x) | !is.numeric(actual) | !is.numeric(expected) |","vector_logic_linter" +"R/helpers.R",477,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," any(x < 0) | any(actual < 0) | any(expected < 0))","vector_logic_linter" +"R/helpers.R",477,36,"warning","Conditional expressions require scalar logical operators (&& and ||)"," any(x < 0) | any(actual < 0) | any(expected < 0))","vector_logic_linter" +"R/helpers.R",488,3,"style","Variable and function name style should be snake_case or symbols."," col.names <- paste(rep(""freq"", length(censor + 1)), (0:censor), sep = ""."")","object_name_linter" +"R/helpers.R",489,3,"style","Variable and function name style should be snake_case or symbols."," col.names[censor + 1] <- paste0(col.names[censor + 1], ""+"")","object_name_linter" +"R/helpers.R",496,7,"style","Variable and function name style should be snake_case or symbols."," x.labels[censor + 1] <- paste0(censor, ""+"")","object_name_linter" +"R/helpers.R",518,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(t.x) != length(actual) | length(t.x) != length(expected) |","vector_logic_linter" +"R/helpers.R",518,71,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(t.x) != length(actual) | length(t.x) != length(expected) |","vector_logic_linter" +"R/helpers.R",519,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !is.numeric(t.x) | !is.numeric(actual) | !is.numeric(expected) |","vector_logic_linter" +"R/helpers.R",519,46,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !is.numeric(t.x) | !is.numeric(actual) | !is.numeric(expected) |","vector_logic_linter" +"R/helpers.R",519,70,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !is.numeric(t.x) | !is.numeric(actual) | !is.numeric(expected) |","vector_logic_linter" +"R/helpers.R",520,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," any(t.x < 0) | any(actual < 0) | any(expected < 0))","vector_logic_linter" +"R/helpers.R",520,38,"warning","Conditional expressions require scalar logical operators (&& and ||)"," any(t.x < 0) | any(actual < 0) | any(expected < 0))","vector_logic_linter" +"R/mbg-cnbd-k.R",78,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(k) & !""litt"" %in% colnames(cal.cbs))","vector_logic_linter" +"R/mbg-cnbd-k.R",96,7,"style","Variable and function name style should be snake_case or symbols."," LL[k] <- xbgcnbd.cbs.LL(params = params[[k]], cal.cbs = cal.cbs, dropout_at_zero = dropout_at_zero)","object_name_linter" +"R/mbg-cnbd-k.R",107,5,"style","Variable and function name style should be snake_case or symbols."," cal.cbs[, ""litt""] <- 0","object_name_linter" +"R/mbg-cnbd-k.R",116,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (trace > 0 & count %% trace == 0) {","vector_logic_linter" +"R/mbg-cnbd-k.R",129,3,"style","Variable and function name style should be snake_case or symbols."," estimated.params[estimated.params > max.param.value] <- max.param.value","object_name_linter" +"R/mbg-cnbd-k.R",131,9,"style","Variable and function name style should be snake_case or symbols."," names(estimated.params) <- c(""k"", ""r"", ""alpha"", ""a"", ""b"")","object_name_linter" +"R/mbg-cnbd-k.R",191,12,"style","Variable and function name style should be snake_case or symbols."," tryCatch(T.cal <- cal.cbs$T.cal,","object_name_linter" +"R/mbg-cnbd-k.R",194,13,"style","Any function spanning multiple lines should use curly braces."," error = function(e) stop(""cal.cbs must have a column for "",","brace_linter" +"R/mbg-cnbd-k.R",204,3,"style","Variable and function name style should be snake_case or symbols."," max.length <- max(length(x), length(t.x), length(T.cal))","object_name_linter" +"R/mbg-cnbd-k.R",214,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (params[1] != floor(params[1]) | params[1] < 1)","vector_logic_linter" +"R/mbg-cnbd-k.R",224,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = max.length)","object_name_linter" +"R/mbg-cnbd-k.R",293,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (params[1] != floor(params[1]) | params[1] < 1)","vector_logic_linter" +"R/mbg-cnbd-k.R",412,3,"style","Variable and function name style should be snake_case or symbols."," max.length <- max(length(x), length(t.x), length(T.cal))","object_name_linter" +"R/mbg-cnbd-k.R",420,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (params[1] != floor(params[1]) | params[1] < 1)","vector_logic_linter" +"R/mbg-cnbd-k.R",430,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = max.length)","object_name_linter" +"R/mbg-cnbd-k.R",501,3,"style","Variable and function name style should be snake_case or symbols."," max.length <- max(length(T.star), length(x), length(t.x), length(T.cal))","object_name_linter" +"R/mbg-cnbd-k.R",511,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (params[1] != floor(params[1]) | params[1] < 1)","vector_logic_linter" +"R/mbg-cnbd-k.R",523,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = max.length)","object_name_linter" +"R/mbg-cnbd-k.R",524,3,"style","Variable and function name style should be snake_case or symbols."," T.star <- rep(T.star, length.out = max.length)","object_name_linter" +"R/mbg-cnbd-k.R",565,5,"style","Variable and function name style should be snake_case or symbols."," sum.cal <- sum(xbgcnbd.Expectation(params = params, t = T.cal, dropout_at_zero = dropout_at_zero))","object_name_linter" +"R/mbg-cnbd-k.R",566,5,"style","Variable and function name style should be snake_case or symbols."," sum.tot <- sum(xbgcnbd.Expectation(params = params, t = T.cal + T.star, dropout_at_zero = dropout_at_zero))","object_name_linter" +"R/mbg-cnbd-k.R",628,12,"style","Variable and function name style should be snake_case or symbols."," tryCatch(T.cal <- cal.cbs$T.cal,","object_name_linter" +"R/mbg-cnbd-k.R",1016,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (params[1] != floor(params[1]) | params[1] < 1)","vector_logic_linter" +"R/mbg-cnbd-k.R",1027,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = n)","object_name_linter" +"R/mbg-cnbd-k.R",1028,3,"style","Variable and function name style should be snake_case or symbols."," T.zero <- T.cal.fix - T.cal","object_name_linter" +"R/mbg-cnbd-k.R",1029,3,"style","Variable and function name style should be snake_case or symbols."," date.zero <- as.POSIXct(date.zero)","object_name_linter" +"R/mbg-cnbd-k.R",1058,3,"style","Variable and function name style should be snake_case or symbols."," date.cal <- date.zero + T.cal.fix * 3600 * 24 * 7","object_name_linter" +"R/mbg-cnbd-k.R",1059,3,"style","Variable and function name style should be snake_case or symbols."," date.tot <- date.cal + T.star * 3600 * 24 * 7","object_name_linter" +"R/mcmc.R",67,5,"style","Variable and function name style should be snake_case or symbols."," T.star <- rep(T.star, nr_of_cust)","object_name_linter" +"R/mcmc.R",109,7,"style","Variable and function name style should be snake_case or symbols."," x.stars[draw, cust] <- sum(cumsum(itts) < minT)","object_name_linter" +"R/mcmc.R",114,7,"style","Variable and function name style should be snake_case or symbols."," x.stars[!alive, cust] <- 0","object_name_linter" +"R/mcmc.R",154,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (burnin < start(draws$level_2) | burnin > end(draws$level_2))","vector_logic_linter" +"R/mcmc.R",183,86,"style","Use FALSE instead of the symbol F."," plot(spls.x, spls.y, typ = ""b"", xlim = c(0, 1), ylim = c(0, 1), frame = 0, axes = F,","T_and_F_symbol_linter" +"R/mcmc.R",364,11,"style","Variable and function name style should be snake_case or symbols."," names(uEs) <- unique(t)","object_name_linter" +"R/nbd.R",30,3,"style","Variable and function name style should be snake_case or symbols."," estimated.params[estimated.params > max.param.value] <- max.param.value","object_name_linter" +"R/nbd.R",31,9,"style","Variable and function name style should be snake_case or symbols."," names(estimated.params) <- c(""r"", ""alpha"")","object_name_linter" +"R/nbd.R",53,12,"style","Variable and function name style should be snake_case or symbols."," tryCatch(T.cal <- cal.cbs$T.cal,","object_name_linter" +"R/nbd.R",70,3,"style","Variable and function name style should be snake_case or symbols."," max.length <- max(length(x), length(T.cal))","object_name_linter" +"R/nbd.R",81,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = max.length)","object_name_linter" +"R/nbd.R",116,3,"style","Variable and function name style should be snake_case or symbols."," max.length <- max(length(T.star), length(x), length(T.cal))","object_name_linter" +"R/nbd.R",130,3,"style","Variable and function name style should be snake_case or symbols."," T.star <- rep(T.star, length.out = max.length)","object_name_linter" +"R/nbd.R",132,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = max.length)","object_name_linter" +"R/nbd.R",164,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = n)","object_name_linter" +"R/nbd.R",165,3,"style","Variable and function name style should be snake_case or symbols."," T.zero <- T.cal.fix - T.cal","object_name_linter" +"R/nbd.R",166,3,"style","Variable and function name style should be snake_case or symbols."," date.zero <- as.POSIXct(date.zero)","object_name_linter" +"R/nbd.R",188,3,"style","Variable and function name style should be snake_case or symbols."," date.cal <- date.zero + T.cal.fix * 3600 * 24 * 7","object_name_linter" +"R/nbd.R",189,3,"style","Variable and function name style should be snake_case or symbols."," date.tot <- date.cal + T.star * 3600 * 24 * 7","object_name_linter" +"R/pareto-ggg-mcmc.R",300,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = n)","object_name_linter" +"R/pareto-ggg-mcmc.R",301,3,"style","Variable and function name style should be snake_case or symbols."," T.zero <- T.cal.fix - T.cal","object_name_linter" +"R/pareto-ggg-mcmc.R",302,3,"style","Variable and function name style should be snake_case or symbols."," date.zero <- as.POSIXct(date.zero)","object_name_linter" +"R/pareto-ggg-mcmc.R",348,3,"style","Variable and function name style should be snake_case or symbols."," date.cal <- date.zero + T.cal.fix * 3600 * 24 * 7","object_name_linter" +"R/pareto-ggg-mcmc.R",349,3,"style","Variable and function name style should be snake_case or symbols."," date.tot <- date.cal + T.star * 3600 * 24 * 7","object_name_linter" +"R/pareto-nbd-abe.R",228,3,"style","Variable and function name style should be snake_case or symbols."," cal.cbs[, ""intercept""] <- 1","object_name_linter" +"R/pareto-nbd-abe.R",283,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = n)","object_name_linter" +"R/pareto-nbd-abe.R",284,3,"style","Variable and function name style should be snake_case or symbols."," T.zero <- T.cal.fix - T.cal","object_name_linter" +"R/pareto-nbd-abe.R",285,3,"style","Variable and function name style should be snake_case or symbols."," date.zero <- as.POSIXct(date.zero)","object_name_linter" +"R/pareto-nbd-abe.R",297,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(colnames(covars)) & ncol(covars) > 1)","vector_logic_linter" +"R/pareto-nbd-abe.R",340,3,"style","Variable and function name style should be snake_case or symbols."," date.cal <- date.zero + T.cal.fix * 3600 * 24 * 7","object_name_linter" +"R/pareto-nbd-abe.R",341,3,"style","Variable and function name style should be snake_case or symbols."," date.tot <- date.cal + T.star * 3600 * 24 * 7","object_name_linter" +"R/pareto-nbd-mcmc.R",74,5,"style","Variable and function name style should be snake_case or symbols."," T.cal <- data$T.cal","object_name_linter" +"tests/testthat/test-bg-cnbd-k.R",9,3,"style","Variable and function name style should be snake_case or symbols."," date.zero <- ""2010-01-01""","object_name_linter" +"tests/testthat/test-elog2cbs.R",11,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- Sys.Date() + 21","object_name_linter" +"tests/testthat/test-elog2cbs.R",12,3,"style","Variable and function name style should be snake_case or symbols."," T.tot <- Sys.Date() + 30","object_name_linter" +"tests/testthat/test-pareto-nbd-abe.R",67,52,"style","Use TRUE instead of the symbol T."," expect_equal(matrix(est[1:6], ncol = 2, byrow = T), params$beta, tolerance = 0.05)","T_and_F_symbol_linter" +"tests/testthat/test-pareto-nbd-mcmc.R",8,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- c(26, 26, 28.5, 52, 52)","object_name_linter" +"tests/testthat/test-pareto-nbd-mcmc.R",9,3,"style","Variable and function name style should be snake_case or symbols."," T.star <- 52","object_name_linter" +"tests/testthat/test-pareto-nbd-mcmc.R",10,3,"style","Variable and function name style should be snake_case or symbols."," date.zero <- ""2010-01-01""","object_name_linter" +"tests/testthat/test-pareto-nbd-mcmc.R",24,3,"style","Variable and function name style should be snake_case or symbols."," date.zero <- min(sim_elog$date)","object_name_linter" +"tests/testthat/test-pareto-nbd-mcmc.R",40,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(52, n)","object_name_linter" +"tests/testthat/test-pareto-nbd-mcmc.R",43,3,"style","Variable and function name style should be snake_case or symbols."," T.cal[n] <- 52","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",76,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog <- read.csv(system.file(""data/cdnowElog.csv"", package = ""BTYD""),","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",79,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog$date <- as.Date(as.character(cdnowElog$date), format = ""%Y%m%d"")","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",132,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS <- elog2cbs(groceryElog, T.cal = ""2006-12-31"")","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",145,2,"style","Variable and function name style should be snake_case or symbols.","(k.wheat <- estimateRegularity(groceryElog, method = ""wheat"", ","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",145,62,"style","Trailing whitespace is superfluous.","(k.wheat <- estimateRegularity(groceryElog, method = ""wheat"", ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",147,2,"style","Variable and function name style should be snake_case or symbols.","(k.mle <- estimateRegularity(groceryElog, method = ""mle"", ","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",147,58,"style","Trailing whitespace is superfluous.","(k.mle <- estimateRegularity(groceryElog, method = ""mle"", ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",168,3,"style","Variable and function name style should be snake_case or symbols."," groceryCBS <- elog2cbs(groceryElog, T.cal = ""2006-12-31"")","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",171,7,"style","Variable and function name style should be snake_case or symbols.","round(params.nbd <- nbd.EstimateParameters(groceryCBS), 3)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",181,62,"style","Trailing whitespace is superfluous.","# calculate expected future transactions for customers who've ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",183,1,"style","Variable and function name style should be snake_case or symbols.","est5.nbd <- nbd.ConditionalExpectedTransactions(params.nbd, ","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",183,60,"style","Trailing whitespace is superfluous.","est5.nbd <- nbd.ConditionalExpectedTransactions(params.nbd, ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",192,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$xstar.nbd <- nbd.ConditionalExpectedTransactions(","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",193,54,"style","Trailing whitespace is superfluous."," params = params.nbd, T.star = 52, ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",196,57,"style","Trailing whitespace is superfluous.","rbind(`Actuals` = c(`Holdout` = sum(groceryCBS$x.star)), ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",212,3,"style","Variable and function name style should be snake_case or symbols."," groceryCBS <- elog2cbs(groceryElog, T.cal = ""2006-12-31"")","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",215,1,"style","Variable and function name style should be snake_case or symbols.","params.pnbd <- BTYD::pnbd.EstimateParameters(groceryCBS[, c(""x"", ""t.x"", ""T.cal"")])","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",216,7,"style","Variable and function name style should be snake_case or symbols.","names(params.pnbd) <- c(""r"", ""alpha"", ""s"", ""beta"")","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",227,62,"style","Trailing whitespace is superfluous.","# calculate expected future transactions for customers who've ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",230,1,"style","Variable and function name style should be snake_case or symbols.","est5.pnbd <- BTYD::pnbd.ConditionalExpectedTransactions(params.pnbd, ","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",230,69,"style","Trailing whitespace is superfluous.","est5.pnbd <- BTYD::pnbd.ConditionalExpectedTransactions(params.pnbd, ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",239,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$xstar.pnbd <- BTYD::pnbd.ConditionalExpectedTransactions(","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",240,56,"style","Trailing whitespace is superfluous."," params = params.pnbd, T.star = 52, ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",244,60,"style","Trailing whitespace is superfluous.","rbind(`Actuals` = c(`Holdout` = sum(groceryCBS$x.star)), ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",251,65,"style","Trailing whitespace is superfluous.","# P(alive) for customers who've had 1 to 5 transactions in first ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",253,1,"style","Variable and function name style should be snake_case or symbols.","palive.pnbd <- BTYD::pnbd.PAlive(params.pnbd, ","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",253,46,"style","Trailing whitespace is superfluous.","palive.pnbd <- BTYD::pnbd.PAlive(params.pnbd, ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",256,45,"style","Put spaces around all infix operators."," cat(""x ="", i, "":"", sprintf(""%5.2f %%"", 100*palive.pnbd[i]), ""\n"")","infix_spaces_linter" +"vignettes/BTYDplus-HowTo.Rmd",270,3,"style","Variable and function name style should be snake_case or symbols."," groceryCBS <- elog2cbs(groceryElog, T.cal = ""2006-12-31"")","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",273,1,"style","Variable and function name style should be snake_case or symbols.","params.bgnbd <- BTYD::bgnbd.EstimateParameters(groceryCBS) # BG/NBD","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",273,64,"style","Commented code should be removed.","params.bgnbd <- BTYD::bgnbd.EstimateParameters(groceryCBS) # BG/NBD","commented_code_linter" +"vignettes/BTYDplus-HowTo.Rmd",274,1,"style","Variable and function name style should be snake_case or symbols.","params.bgcnbd <- bgcnbd.EstimateParameters(groceryCBS) # BG/CNBD-k","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",274,64,"style","Commented code should be removed.","params.bgcnbd <- bgcnbd.EstimateParameters(groceryCBS) # BG/CNBD-k","commented_code_linter" +"vignettes/BTYDplus-HowTo.Rmd",275,1,"style","Variable and function name style should be snake_case or symbols.","params.mbgnbd <- mbgnbd.EstimateParameters(groceryCBS) # MBG/NBD","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",275,64,"style","Commented code should be removed.","params.mbgnbd <- mbgnbd.EstimateParameters(groceryCBS) # MBG/NBD","commented_code_linter" +"vignettes/BTYDplus-HowTo.Rmd",276,1,"style","Variable and function name style should be snake_case or symbols.","params.mbgcnbd <- mbgcnbd.EstimateParameters(groceryCBS) # MBG/CNBD-k","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",276,64,"style","Commented code should be removed.","params.mbgcnbd <- mbgcnbd.EstimateParameters(groceryCBS) # MBG/CNBD-k","commented_code_linter" +"vignettes/BTYDplus-HowTo.Rmd",277,25,"style","Variable and function name style should be snake_case or symbols.","row <- function(params, LL) { ","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",277,30,"style","Trailing whitespace is superfluous.","row <- function(params, LL) { ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",281,45,"style","Trailing whitespace is superfluous.","rbind(`BG/NBD` = row(c(1, params.bgnbd), ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",283,40,"style","Trailing whitespace is superfluous."," `BG/CNBD-k` = row(params.bgcnbd, ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",285,40,"style","Trailing whitespace is superfluous."," `MBG/NBD` = row(params.mbgnbd, ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",287,41,"style","Trailing whitespace is superfluous."," `MBG/CNBD-k` = row(params.mbgcnbd, ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",294,62,"style","Trailing whitespace is superfluous.","# calculate expected future transactions for customers who've ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",297,1,"style","Variable and function name style should be snake_case or symbols.","est5.mbgcnbd <- mbgcnbd.ConditionalExpectedTransactions(params.mbgcnbd,","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",305,65,"style","Trailing whitespace is superfluous.","# P(alive) for customers who've had 1 to 5 transactions in first ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",307,1,"style","Variable and function name style should be snake_case or symbols.","palive.mbgcnbd <- mbgcnbd.PAlive(params.mbgcnbd, ","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",307,49,"style","Trailing whitespace is superfluous.","palive.mbgcnbd <- mbgcnbd.PAlive(params.mbgcnbd, ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",310,45,"style","Put spaces around all infix operators."," cat(""x ="", i, "":"", sprintf(""%5.2f %%"", 100*palive.mbgcnbd[i]), ""\n"")","infix_spaces_linter" +"vignettes/BTYDplus-HowTo.Rmd",318,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$xstar.mbgcnbd <- mbgcnbd.ConditionalExpectedTransactions(","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",320,64,"style","Trailing whitespace is superfluous."," x = groceryCBS$x, t.x = groceryCBS$t.x, ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",342,24,"style","Put spaces around all infix operators."," stopifnot(length(act)==length(est))","infix_spaces_linter" +"vignettes/BTYDplus-HowTo.Rmd",343,14,"style","Put spaces around all infix operators."," sum(abs(act-est)) / length(act)","infix_spaces_linter" +"vignettes/BTYDplus-HowTo.Rmd",345,1,"style","Variable and function name style should be snake_case or symbols.","mae.nbd <- mae(groceryCBS$x.star, groceryCBS$xstar.nbd)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",346,1,"style","Variable and function name style should be snake_case or symbols.","mae.pnbd <- mae(groceryCBS$x.star, groceryCBS$xstar.pnbd)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",347,1,"style","Variable and function name style should be snake_case or symbols.","mae.mbgcnbd <- mae(groceryCBS$x.star, groceryCBS$xstar.mbgcnbd)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",352,60,"style","Put spaces around all infix operators.","cat(""Lift in MAE for MBG/CNBD-k vs. Pareto/NBD:"", round(100*lift, 1), ""%"")","infix_spaces_linter" +"vignettes/BTYDplus-HowTo.Rmd",372,3,"style","Variable and function name style should be snake_case or symbols."," groceryCBS <- elog2cbs(groceryElog, T.cal = ""2006-12-31"")","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",375,1,"style","Variable and function name style should be snake_case or symbols.","pnbd.draws <- pnbd.mcmc.DrawParameters(groceryCBS)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",377,1,"style","Variable and function name style should be snake_case or symbols.","pnbd.xstar.draws <- mcmc.DrawFutureTransactions(groceryCBS, pnbd.draws)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",379,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$xstar.pnbd.hb <- apply(pnbd.xstar.draws, 2, mean)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",380,3,"style","Commented code should be removed.","# P(active)","commented_code_linter" +"vignettes/BTYDplus-HowTo.Rmd",381,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$pactive.pnbd.hb <- mcmc.PActive(pnbd.xstar.draws)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",382,3,"style","Commented code should be removed.","# P(alive)","commented_code_linter" +"vignettes/BTYDplus-HowTo.Rmd",383,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$palive.pnbd.hb <- mcmc.PAlive(pnbd.draws)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",397,68,"style","Trailing whitespace is superfluous.","# convert cohort-level draws from coda::mcmc.list to a matrix, with ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",399,1,"style","Variable and function name style should be snake_case or symbols.","cohort.draws <- pnbd.draws$level_2","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",428,1,"style","Variable and function name style should be snake_case or symbols.","customer4.draws <- pnbd.draws$level_1[[customer4]]","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",463,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog <- read.csv(","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",467,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog$date <- as.Date(as.character(cdnowElog$date), ","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",467,56,"style","Trailing whitespace is superfluous.","cdnowElog$date <- as.Date(as.character(cdnowElog$date), ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",470,1,"style","Variable and function name style should be snake_case or symbols.","cdnowCbs <- elog2cbs(cdnowElog, ","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",470,32,"style","Trailing whitespace is superfluous.","cdnowCbs <- elog2cbs(cdnowElog, ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",474,1,"style","Variable and function name style should be snake_case or symbols.","draws.m1 <- abe.mcmc.DrawParameters(cdnowCbs, ","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",474,46,"style","Trailing whitespace is superfluous.","draws.m1 <- abe.mcmc.DrawParameters(cdnowCbs, ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",488,1,"style","Variable and function name style should be snake_case or symbols.","cdnowCbs <- merge(cdnowCbs, first, by = ""cust"")","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",491,1,"style","Variable and function name style should be snake_case or symbols.","draws.m2 <- abe.mcmc.DrawParameters(cdnowCbs, ","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",491,46,"style","Trailing whitespace is superfluous.","draws.m2 <- abe.mcmc.DrawParameters(cdnowCbs, ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",518,3,"style","Variable and function name style should be snake_case or symbols."," groceryCBS <- elog2cbs(groceryElog, T.cal = ""2006-12-31"")","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",521,1,"style","Variable and function name style should be snake_case or symbols.","pggg.draws <- pggg.mcmc.DrawParameters(groceryCBS) # ~2mins on 2015 MacBook Pro","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",523,1,"style","Variable and function name style should be snake_case or symbols.","pggg.xstar.draws <- mcmc.DrawFutureTransactions(groceryCBS, pggg.draws)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",525,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$xstar.pggg <- apply(pggg.xstar.draws, 2, mean)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",526,3,"style","Commented code should be removed.","# P(active)","commented_code_linter" +"vignettes/BTYDplus-HowTo.Rmd",527,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$pactive.pggg <- mcmc.PActive(pggg.xstar.draws)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",528,3,"style","Commented code should be removed.","# P(alive)","commented_code_linter" +"vignettes/BTYDplus-HowTo.Rmd",529,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$palive.pggg <- mcmc.PAlive(pggg.draws)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",531,42,"style","Trailing whitespace is superfluous.","head(groceryCBS[, c(""x"", ""t.x"", ""x.star"", ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",543,39,"style","Trailing whitespace is superfluous.","#> t gamma r alpha s beta ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",544,39,"style","Trailing whitespace is superfluous.","#> 1.695 0.373 0.948 5.243 0.432 4.348 ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",550,36,"style","Trailing whitespace is superfluous.","#> k lambda mu tau z ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",551,37,"style","Trailing whitespace is superfluous.","#> 3.892 0.160 0.065 69.546 0.316 ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",572,24,"style","Put spaces around all infix operators."," stopifnot(length(act)==length(est))","infix_spaces_linter" +"vignettes/BTYDplus-HowTo.Rmd",573,14,"style","Put spaces around all infix operators."," sum(abs(act-est)) / length(act)","infix_spaces_linter" +"vignettes/BTYDplus-HowTo.Rmd",575,1,"style","Variable and function name style should be snake_case or symbols.","mae.pggg <- mae(groceryCBS$x.star, groceryCBS$xstar.pggg)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",576,1,"style","Variable and function name style should be snake_case or symbols.","mae.mbgcnbd <- mae(groceryCBS$x.star, groceryCBS$xstar.mbgcnbd)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",577,1,"style","Variable and function name style should be snake_case or symbols.","mae.pnbd.hb <- mae(groceryCBS$x.star, groceryCBS$xstar.pnbd.hb)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",587,30,"style","Put spaces around all infix operators.","cat(""Lift in MAE:"", round(100*lift, 1), ""%"")","infix_spaces_linter" diff --git a/.dev/revdep_emails/BTYDplus/email-body b/.dev/revdep_emails/BTYDplus/email-body new file mode 100644 index 000000000..259805876 --- /dev/null +++ b/.dev/revdep_emails/BTYDplus/email-body @@ -0,0 +1,27 @@ +Hello Michael Platzer! Thank you for using {lintr} in your package {BTYDplus}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/mplatzer/BTYDplus using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 39s on CRAN vs. 28s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/BiasCorrector/attachments/BiasCorrector.warnings b/.dev/revdep_emails/BiasCorrector/attachments/BiasCorrector.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/BiasCorrector/attachments/BiasCorrector.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/BiasCorrector/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/BiasCorrector/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..85c6be2eb --- /dev/null +++ b/.dev/revdep_emails/BiasCorrector/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,33 @@ +"filename","line_number","column_number","type","message","line","linter" +"data-raw/devstuffs.R",11,81,"style","Lines should not be more than 80 characters."," person(""Lorenz A."", ""Kapsner"", email = ""lorenz.kapsner@gmail.com"", role = c(""cre"", ""aut"", ""cph""),","line_length_linter" +"data-raw/devstuffs.R",21,81,"style","Lines should not be more than 80 characters.","my_desc$set(Title = ""A GUI to Correct Measurement Bias in DNA Methylation Analyses"")","line_length_linter" +"data-raw/devstuffs.R",24,81,"style","Lines should not be more than 80 characters."," ""A GUI to correct measurement bias in DNA methylation analyses. The 'BiasCorrector' package "",","line_length_linter" +"data-raw/devstuffs.R",25,81,"style","Lines should not be more than 80 characters."," ""just wraps the functions implemented in the 'R' package 'rBiasCorrection' into a "",","line_length_linter" +"data-raw/devstuffs.R",43,2,"style","Commented code should be removed.","#usethis::use_gpl3_license(name = ""Lorenz Kapsner"")","commented_code_linter" +"data-raw/devstuffs.R",49,81,"style","Lines should not be more than 80 characters.","# https://cran.r-project.org/web/packages/data.table/vignettes/datatable-importing.html","line_length_linter" +"data-raw/devstuffs.R",63,3,"style","Commented code should be removed.","# tag <- ""development""","commented_code_linter" +"data-raw/devstuffs.R",64,3,"style","Commented code should be removed.","# devtools::install_github(repo = ""kapsner/rBiasCorrection"", ref = tag, upgrade = ""always"")","commented_code_linter" +"data-raw/devstuffs.R",64,81,"style","Lines should not be more than 80 characters.","# devtools::install_github(repo = ""kapsner/rBiasCorrection"", ref = tag, upgrade = ""always"")","line_length_linter" +"data-raw/devstuffs.R",65,3,"style","Commented code should be removed.","# # https://cran.r-project.org/web/packages/devtools/vignettes/dependencies.html","commented_code_linter" +"data-raw/devstuffs.R",66,3,"style","Commented code should be removed.","# desc::desc_set_remotes(paste0(""github::kapsner/rBiasCorrection@"", tag), file = usethis::proj_get())","commented_code_linter" +"data-raw/devstuffs.R",66,81,"style","Lines should not be more than 80 characters.","# desc::desc_set_remotes(paste0(""github::kapsner/rBiasCorrection@"", tag), file = usethis::proj_get())","line_length_linter" +"data-raw/devstuffs.R",100,3,"style","Commented code should be removed.","# BiasCorrection(experimental = ""../19_PCR-bias/data/example_data/type1/example_data_type1_experimentaldata.csv"", calibration = ""../19_PCR-bias/data/example_data/type1/example_data_type1_calibrationdata.csv"", samplelocusname = ""Test"")","commented_code_linter" +"data-raw/devstuffs.R",100,81,"style","Lines should not be more than 80 characters.","# BiasCorrection(experimental = ""../19_PCR-bias/data/example_data/type1/example_data_type1_experimentaldata.csv"", calibration = ""../19_PCR-bias/data/example_data/type1/example_data_type1_calibrationdata.csv"", samplelocusname = ""Test"")","line_length_linter" +"data-raw/devstuffs.R",101,3,"style","Commented code should be removed.","# covr::package_coverage()","commented_code_linter" +"data-raw/devstuffs.R",102,3,"style","Commented code should be removed.","# lintr::lint_package()","commented_code_linter" +"inst/application/server.R",20,20,"style","Use FALSE instead of the symbol F."," exp_filereq = F,","T_and_F_symbol_linter" +"inst/application/server.R",28,21,"style","Use TRUE instead of the symbol T."," modal_closed = T,","T_and_F_symbol_linter" +"inst/application/server.R",104,25,"style","Use TRUE instead of the symbol T."," rv$modal_closed <- T","T_and_F_symbol_linter" +"inst/application/server.R",250,30,"style","Use TRUE instead of the symbol T."," startExpanded = T,","T_and_F_symbol_linter" +"inst/application/server.R",255,27,"style","Use TRUE instead of the symbol T."," selected = T","T_and_F_symbol_linter" +"inst/application/server.R",316,30,"style","Use FALSE instead of the symbol F."," startExpanded = F,","T_and_F_symbol_linter" +"inst/application/server.R",321,27,"style","Use TRUE instead of the symbol T."," selected = T","T_and_F_symbol_linter" +"inst/application/server.R",372,30,"style","Use FALSE instead of the symbol F."," startExpanded = F,","T_and_F_symbol_linter" +"inst/application/server.R",377,27,"style","Use TRUE instead of the symbol T."," selected = T","T_and_F_symbol_linter" +"inst/application/server.R",451,30,"style","Use FALSE instead of the symbol F."," startExpanded = F,","T_and_F_symbol_linter" +"inst/application/server.R",502,30,"style","Use FALSE instead of the symbol F."," startExpanded = F,","T_and_F_symbol_linter" +"R/app_utils.R",19,23,"style","Use FALSE instead of the symbol F."," rv$modal_closed <- F","T_and_F_symbol_linter" +"R/moduleFileupload.R",71,24,"style","Use TRUE instead of the symbol T."," rv$exp_filereq <- T","T_and_F_symbol_linter" +"R/moduleFileupload.R",134,30,"style","Use TRUE instead of the symbol T."," rv$exp_filereq <- T","T_and_F_symbol_linter" +"R/moduleFileupload.R",165,30,"style","Use TRUE instead of the symbol T."," rv$exp_filereq <- T","T_and_F_symbol_linter" +"R/type2Files.R",33,47,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (rv$calibr_steps[, min(get(""step""))] < 0 |","vector_logic_linter" diff --git a/.dev/revdep_emails/BiasCorrector/email-body b/.dev/revdep_emails/BiasCorrector/email-body new file mode 100644 index 000000000..d7f328aba --- /dev/null +++ b/.dev/revdep_emails/BiasCorrector/email-body @@ -0,0 +1,27 @@ +Hello Lorenz A. Kapsner! Thank you for using {lintr} in your package {BiasCorrector}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/kapsner/BiasCorrector using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 27s on CRAN vs. 9s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/ConNEcT/email-body b/.dev/revdep_emails/ConNEcT/email-body new file mode 100644 index 000000000..6af09e93c --- /dev/null +++ b/.dev/revdep_emails/ConNEcT/email-body @@ -0,0 +1,27 @@ +Hello Nadja Bodner! Thank you for using {lintr} in your package {ConNEcT}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cran/ConNEcT using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took NAs on CRAN vs. NAs in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/DBItest/email-body b/.dev/revdep_emails/DBItest/email-body new file mode 100644 index 000000000..20f6fa5e9 --- /dev/null +++ b/.dev/revdep_emails/DBItest/email-body @@ -0,0 +1,27 @@ +Hello Kirill MΓΌller! Thank you for using {lintr} in your package {DBItest}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/r-dbi/DBItest using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 0s on CRAN vs. 0s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/DataFakeR/email-body b/.dev/revdep_emails/DataFakeR/email-body new file mode 100644 index 000000000..397ada326 --- /dev/null +++ b/.dev/revdep_emails/DataFakeR/email-body @@ -0,0 +1,27 @@ +Hello Krystian Igras! Thank you for using {lintr} in your package {DataFakeR}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cran/DataFakeR using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took NAs on CRAN vs. NAs in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/DepthProc/attachments/DepthProc.failure b/.dev/revdep_emails/DepthProc/attachments/DepthProc.failure new file mode 100644 index 000000000..c3d4a1db0 --- /dev/null +++ b/.dev/revdep_emails/DepthProc/attachments/DepthProc.failure @@ -0,0 +1 @@ +object 'absolute_paths_linter' not found diff --git a/.dev/revdep_emails/DepthProc/email-body b/.dev/revdep_emails/DepthProc/email-body new file mode 100644 index 000000000..fa7afca20 --- /dev/null +++ b/.dev/revdep_emails/DepthProc/email-body @@ -0,0 +1,27 @@ +Hello Zygmunt Zawadzki! Thank you for using {lintr} in your package {DepthProc}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/zzawadz/DepthProc using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 12s on CRAN vs. 0s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/DominoDataCapture/email-body b/.dev/revdep_emails/DominoDataCapture/email-body new file mode 100644 index 000000000..455d437af --- /dev/null +++ b/.dev/revdep_emails/DominoDataCapture/email-body @@ -0,0 +1,27 @@ +Hello Vivekananda Tadala! Thank you for using {lintr} in your package {DominoDataCapture}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cran/DominoDataCapture using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took NAs on CRAN vs. NAs in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/FSelectorRcpp/attachments/FSelectorRcpp.warnings b/.dev/revdep_emails/FSelectorRcpp/attachments/FSelectorRcpp.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/FSelectorRcpp/attachments/FSelectorRcpp.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/FSelectorRcpp/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/FSelectorRcpp/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..4269c64e0 --- /dev/null +++ b/.dev/revdep_emails/FSelectorRcpp/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,5 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/discretize_transform.R",47,1,"style","Variable and function names should not be longer than 30 characters.","discretize_transform.FsDiscretizeTransformer <-","object_length_linter" +"R/discretize.R",183,1,"style","Variable and function name style should be snake_case.","discretize.data.frame <- function(x, y,","object_name_linter" +"R/relief.R",82,13,"style","Place a space before left parenthesis, except in a function call."," next()","spaces_left_parentheses_linter" +"R/relief.R",85,13,"style","Place a space before left parenthesis, except in a function call."," next()","spaces_left_parentheses_linter" diff --git a/.dev/revdep_emails/FSelectorRcpp/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/FSelectorRcpp/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..1c3604445 --- /dev/null +++ b/.dev/revdep_emails/FSelectorRcpp/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,68 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/benchmarks/bench-cutOff.R",18,10,"style","Variable and function name style should be snake_case or symbols.","rownames(testDataFrame) <- paste0(""row_"", 1:100000)","object_name_linter" +"inst/benchmarks/bench-discretise.R",16,25,"style","Put spaces around all infix operators.","system.time(Discretize(y~x))","infix_spaces_linter" +"inst/benchmarks/bench-discretise.R",19,55,"style","Put spaces around all infix operators.","all(fs_discretize(x, y) + 1 == as.numeric(Discretize(y~x)[, 1]))","infix_spaces_linter" +"inst/benchmarks/bench-discretise.R",21,44,"style","Put spaces around all infix operators.","microbenchmark::microbenchmark(Discretize(y~x), fs_discretize(x, y))","infix_spaces_linter" +"R/discretize_transform.R",71,14,"style","Variable and function name style should be snake_case or symbols."," attr(data, ""fsSplitPointsList"") <- splitPoints","object_name_linter" +"R/discretize_transform.R",99,7,"style","Any function spanning multiple lines should use curly braces."," function(x, y)","brace_linter" +"R/discretize.R",136,17,"style","Variable and function name style should be snake_case or symbols."," attr(res, ""SplitValues"") <- control$breaks","object_name_linter" +"R/discretize.R",155,7,"style","Variable and function name style should be snake_case or symbols."," splitPointsList[[col]] <- splitVals","object_name_linter" +"R/discretize.R",164,7,"style","Variable and function name style should be snake_case or symbols."," splitPointsList[[col]] <- NA","object_name_linter" +"R/discretize.R",174,14,"style","Variable and function name style should be snake_case or symbols."," attr(data, ""fsSplitPointsList"") <- c(","object_name_linter" +"R/utils.R",154,5,"style","Variable and function name style should be snake_case or symbols."," toSub[withBrackets] <- gsub(pattern = ""]]"", replacement = """",","object_name_linter" +"R/utils.R",156,5,"style","Variable and function name style should be snake_case or symbols."," toSub[withBrackets] <- strsplit(x = toSub[withBrackets], split = ""[["",","object_name_linter" +"R/utils.R",158,5,"style","Variable and function name style should be snake_case or symbols."," toSub[withBrackets] <- lapply(toSub[withBrackets], get_colname)","object_name_linter" +"R/utils.R",159,5,"style","Variable and function name style should be snake_case or symbols."," toSub[-withBrackets] <- gsub(pattern = "".*\\$"", replacement = """",","object_name_linter" +"tests/testthat/test-cutoff.R",9,14,"style","Variable and function name style should be snake_case or symbols."," rownames(testDataFrame) <- testDataFrame[[1]]","object_name_linter" +"tests/testthat/test-discretize.R",264,28,"style","Put spaces around all infix operators."," expect_error(discretize(y~., dt, discIntegers = FALSE))","infix_spaces_linter" +"tests/testthat/test-na.R",11,5,"style","Variable and function name style should be snake_case or symbols."," dtIris[1, 1] <- NA","object_name_linter" +"tests/testthat/test-na.R",12,5,"style","Variable and function name style should be snake_case or symbols."," dtIris[2, 2] <- NA","object_name_linter" +"tests/testthat/test-na.R",13,5,"style","Variable and function name style should be snake_case or symbols."," dtIris[3, 5] <- NA","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",18,1,"style","Variable and function name style should be snake_case or symbols.","is.pkg <- all(c(""RTCGA.rnaseq"", ""microbenchmark"", ""RWeka"", ""pkgdown"") %in% rownames(installed.packages()))","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",19,3,"style","Place a space before left parenthesis, except in a function call.","if(!is.pkg) {","spaces_left_parentheses_linter" +"vignettes/benchmarks_discretize.Rmd",23,3,"style","Place a space before left parenthesis, except in a function call.","if(is.pkg && !pkgdown::in_pkgdown()) {","spaces_left_parentheses_linter" +"vignettes/benchmarks_discretize.Rmd",24,3,"style","Variable and function name style should be snake_case or symbols."," is.pkg <- FALSE","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",28,20,"style","Trailing whitespace is superfluous."," paste(sep = """", ","trailing_whitespace_linter" +"vignettes/benchmarks_discretize.Rmd",39,1,"style","Variable and function name style should be snake_case or symbols.","fig.path <- if(pkgdown::in_pkgdown()) {","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",39,15,"style","Place a space before left parenthesis, except in a function call.","fig.path <- if(pkgdown::in_pkgdown()) {","spaces_left_parentheses_linter" +"vignettes/benchmarks_discretize.Rmd",47,19,"style","Trailing whitespace is superfluous."," fig.width = 8, ","trailing_whitespace_linter" +"vignettes/benchmarks_discretize.Rmd",102,1,"style","Variable and function name style should be snake_case or symbols.","BRCA.rnaseq <- RTCGA.rnaseq::BRCA.rnaseq","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",103,1,"style","Variable and function name style should be snake_case or symbols.","BRCA.rnaseq$bcr_patient_barcode <- ","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",103,35,"style","Trailing whitespace is superfluous.","BRCA.rnaseq$bcr_patient_barcode <- ","trailing_whitespace_linter" +"vignettes/benchmarks_discretize.Rmd",105,7,"style","Variable and function name style should be snake_case or symbols.","names(BRCA.rnaseq) <- gsub(pattern = ""?"", replacement = ""q"",","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",107,7,"style","Variable and function name style should be snake_case or symbols.","names(BRCA.rnaseq) <- gsub(pattern = ""[[:punct:]]"", replacement = ""_"",","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",122,22,"style","Variable and function name style should be snake_case or symbols.","names_by <- function(nameBy, vecBy) {","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",122,30,"style","Variable and function name style should be snake_case or symbols.","names_by <- function(nameBy, vecBy) {","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",127,22,"style","Trailing whitespace is superfluous."," }), ","trailing_whitespace_linter" +"vignettes/benchmarks_discretize.Rmd",131,28,"style","Variable and function name style should be snake_case or symbols.","get_times <- function(fun, vecRows, vecCols, nTimes) {","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",131,37,"style","Variable and function name style should be snake_case or symbols.","get_times <- function(fun, vecRows, vecCols, nTimes) {","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",131,46,"style","Variable and function name style should be snake_case or symbols.","get_times <- function(fun, vecRows, vecCols, nTimes) {","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",132,3,"style","Variable and function name style should be snake_case or symbols."," forRows <- pblapply(vecRows, function(nRows) {","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",132,41,"style","Variable and function name style should be snake_case or symbols."," forRows <- pblapply(vecRows, function(nRows) {","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",133,5,"style","Variable and function name style should be snake_case or symbols."," forCols <- pblapply(vecCols + 1, function(nCols) {","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",133,47,"style","Variable and function name style should be snake_case or symbols."," forCols <- pblapply(vecCols + 1, function(nCols) {","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",138,5,"style","Variable and function name style should be snake_case or symbols."," colsNames <- names_by(nameBy = ""columns_"", vecBy = vecCols)","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",141,3,"style","Variable and function name style should be snake_case or symbols."," rowsNames <- names_by(nameBy = ""rows_"", vecBy = vecRows)","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",167,18,"style","Variable and function name style should be snake_case or symbols."," function(setOfCols) {","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",195,3,"style","Variable and function name style should be snake_case or symbols."," yUnit <- gsub(pattern = ""time"",","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",198,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/get_started.Rmd",38,18,"style","Only use double-quotes.","install.packages('FSelectorRcpp') # stable release version on CRAN","single_quotes_linter" +"vignettes/get_started.Rmd",39,26,"style","Only use double-quotes.","devtools::install_github('mi2-warsaw/FSelectorRcpp') # dev version","single_quotes_linter" +"vignettes/get_started.Rmd",70,8,"style","Trailing whitespace is superfluous."," ) %>% ","trailing_whitespace_linter" +"vignettes/get_started.Rmd",73,8,"style","Trailing whitespace is superfluous."," ) %>% ","trailing_whitespace_linter" +"vignettes/get_started.Rmd",74,67,"style","Trailing whitespace is superfluous."," to_formula( # Create a new formula object with ","trailing_whitespace_linter" +"vignettes/get_started.Rmd",76,22,"style","Trailing whitespace is superfluous."," class = ""Species"" ","trailing_whitespace_linter" +"vignettes/get_started.Rmd",80,17,"style","Trailing whitespace is superfluous."," data = iris, ","trailing_whitespace_linter" +"vignettes/get_started.Rmd",81,24,"style","Trailing whitespace is superfluous."," family = ""binomial"" ","trailing_whitespace_linter" +"vignettes/get_started.Rmd",83,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/get_started.Rmd",89,1,"style","Variable and function name style should be snake_case or symbols.","evaluator_R2_lm <- # Create a scorer function.","object_name_linter" +"vignettes/get_started.Rmd",93,16,"style","Trailing whitespace is superfluous."," dependent = ","trailing_whitespace_linter" +"vignettes/get_started.Rmd",98,78,"style","Trailing whitespace is superfluous."," to_formula( # This is the score to use to choose between considered ","trailing_whitespace_linter" +"vignettes/get_started.Rmd",107,15,"style","Trailing whitespace is superfluous."," attributes = ","trailing_whitespace_linter" +"vignettes/get_started.Rmd",109,87,"style","Trailing whitespace is superfluous."," fun = evaluator_R2_lm, # And it calculates the score of a subset that depends on the ","trailing_whitespace_linter" +"vignettes/get_started.Rmd",111,68,"style","Trailing whitespace is superfluous."," mode = ""exhaustive"", # exhaustive - means to check all possible ","trailing_whitespace_linter" +"vignettes/get_started.Rmd",112,59,"style","Trailing whitespace is superfluous."," sizes = # attributes' subset combinations ","trailing_whitespace_linter" +"vignettes/get_started.Rmd",113,5,"warning","1:length(...) is likely to be wrong in the empty edge case. Use seq_along() instead."," 1:length(attributes) # of sizes passed in sizes.","seq_linter" +"vignettes/integer-variables.Rmd",63,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/integer-variables.Rmd",70,35,"style","Commas should always have a space after.","can_discretize(as.integer(c(rep(1,10), rep(2, 10))))","commas_linter" +"vignettes/integer-variables.Rmd",78,26,"style","Commas should always have a space after."," z = as.integer(c(rep(1,10), rep(2, 10)))","commas_linter" diff --git a/.dev/revdep_emails/FSelectorRcpp/email-body b/.dev/revdep_emails/FSelectorRcpp/email-body new file mode 100644 index 000000000..2ff56a6f9 --- /dev/null +++ b/.dev/revdep_emails/FSelectorRcpp/email-body @@ -0,0 +1,27 @@ +Hello Zygmunt Zawadzki! Thank you for using {lintr} in your package {FSelectorRcpp}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/mi2-warsaw/FSelectorRcpp using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 20s on CRAN vs. 13s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/NHSRplotthedots/email-body b/.dev/revdep_emails/NHSRplotthedots/email-body new file mode 100644 index 000000000..def19ebec --- /dev/null +++ b/.dev/revdep_emails/NHSRplotthedots/email-body @@ -0,0 +1,27 @@ +Hello Christopher Reading! Thank you for using {lintr} in your package {NHSRplotthedots}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cran/NHSRplotthedots using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took NAs on CRAN vs. NAs in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/OpenML/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/OpenML/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..848f53f4a --- /dev/null +++ b/.dev/revdep_emails/OpenML/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,3 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/uploadOMLFlow.R",79,52,"style","There should be a space between right parenthesis and an opening curly brace.","# if (!(is.null(sourcefile) || is.na(sourcefile))){","paren_brace_linter" +"R/uploadOMLFlow.R",110,39,"style","There should be a space between right parenthesis and an opening curly brace.","# createLearnerSourcefile = function(x){","paren_brace_linter" diff --git a/.dev/revdep_emails/OpenML/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/OpenML/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..f9a790b5d --- /dev/null +++ b/.dev/revdep_emails/OpenML/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,82 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/chunkOMLlist.R",21,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(args$limit) | !is.null(args$offset))","vector_logic_linter" +"R/config_helpers.R",45,32,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nchar(conf$apikey) != 32 & conf$apikey %nin% c("""", ""PLEASE CHANGE ME""))","vector_logic_linter" +"R/convertOMLDataSetToMlr.R",44,3,"style","Variable and function name style should be snake_case or symbols."," drop.levels = TRUE,","object_name_linter" +"R/convertOMLDataSetToMlr.R",62,42,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (any(!is.na(desc$ignore.attribute)) & ignore.flagged.attributes) {","vector_logic_linter" +"R/convertOMLDataSetToMlr.R",114,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.factor(target) | is.logical(target))","vector_logic_linter" +"R/convertOMLRunToBMR.R",62,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (all(!conf.cols.intergish) & pred.class == ""PredictionClassif"") {","vector_logic_linter" +"R/convertOMLTaskToMlr.R",32,3,"style","Variable and function name style should be snake_case or symbols."," drop.levels = TRUE,","object_name_linter" +"R/downloadOMLObject.R",40,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (f[[xml.ind]]$found & !overwrite) {","vector_logic_linter" +"R/downloadOMLObject.R",72,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(source.url) & !is.null(binary.url)) {","vector_logic_linter" +"R/downloadOMLObject.R",102,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(url) & length(url) != 0) {","vector_logic_linter" +"R/downloadOMLObject.R",103,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (f[[file.ind]]$found & !overwrite) {","vector_logic_linter" +"R/getCachedOMLDataSetStatus.R",31,51,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (any(cached.ds$status == ""deactivated"") > 0L & show.warnings) {","vector_logic_linter" +"R/OMLFlow_Class.R",99,3,"style","Variable and function name style should be snake_case or symbols."," source.url = NA_character_,","object_name_linter" +"R/OMLFlow_Class.R",101,3,"style","Variable and function name style should be snake_case or symbols."," source.format = NA_character_,","object_name_linter" +"R/OMLFlow_Class.R",103,3,"style","Variable and function name style should be snake_case or symbols."," source.md5 = NA_character_,","object_name_linter" +"R/OMLFlow_Class.R",105,3,"style","Variable and function name style should be snake_case or symbols."," source.path = NA_character_,","object_name_linter" +"R/OMLStudy_Class.R",41,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(flow.id) | !is.null(run.id))","vector_logic_linter" +"R/tagOMLObject.R",18,15,"style","Any function spanning multiple lines should use curly braces."," lapply(ids, function(id)","brace_linter" +"R/tagOMLObject.R",26,15,"style","Any function spanning multiple lines should use curly braces."," lapply(ids, function(id)","brace_linter" +"R/uploadOMLFlow.R",61,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(x$object) & !testFile(binaryfile)) {","vector_logic_linter" +"R/uploadOMLFlow.R",66,3,"style","Either both or neither branch in `if`/`else` should use curly braces."," if (testFile(binaryfile)) {","brace_linter" +"R/uploadOMLRun.R",60,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(flow$object) & !is.null(bmr)) {","vector_logic_linter" +"tests/testthat/helper_testthat.R",17,18,"warning","no visible global function definition for β€˜getBMRMeasures’"," expect_equal(getBMRMeasures(bmr)[[j]], bmr$measures[[j]])","object_usage_linter" +"tests/testthat/helper_testthat.R",18,18,"warning","no visible global function definition for β€˜getBMRMeasureIds’"," expect_equal(getBMRMeasureIds(bmr)[[j]], bmr$measures[[j]]$id)","object_usage_linter" +"tests/testthat/helper_with.r",11,3,"warning","no visible global function definition for β€˜with_reset_config’"," with_reset_config({","object_usage_linter" +"tests/testthat/helper_with.r",19,3,"warning","no visible global function definition for β€˜with_reset_config’"," with_reset_config({","object_usage_linter" +"tests/testthat/helper_with.r",29,3,"warning","no visible global function definition for β€˜with_reset_config’"," with_reset_config({","object_usage_linter" +"tests/testthat/helper_with.r",36,3,"warning","no visible global function definition for β€˜with_reset_config’"," with_reset_config({","object_usage_linter" +"vignettes/OpenML.Rmd",16,3,"style","Commented code should be removed.","# library(""knitr"")","commented_code_linter" +"vignettes/OpenML.Rmd",17,3,"style","Commented code should be removed.","# opts_chunk$set(cache = TRUE)","commented_code_linter" +"vignettes/OpenML.Rmd",19,58,"style","Trailing whitespace is superfluous.","setOMLConfig(apikey = ""c1994bdb7ecb3c6f3c8f3b35f4b47f1f"", ","trailing_whitespace_linter" +"vignettes/OpenML.Rmd",82,6,"style","Use <-, not =, for assignment.","task = getOMLTask(task.id = 1L)","assignment_linter" +"vignettes/OpenML.Rmd",99,5,"style","Use <-, not =, for assignment.","lrn = makeLearner(""classif.randomForest"")","assignment_linter" +"vignettes/OpenML.Rmd",103,1,"style","Variable and function name style should be snake_case or symbols.","flow.id = uploadOMLFlow(lrn)","object_name_linter" +"vignettes/OpenML.Rmd",103,9,"style","Use <-, not =, for assignment.","flow.id = uploadOMLFlow(lrn)","assignment_linter" +"vignettes/OpenML.Rmd",105,1,"style","Variable and function name style should be snake_case or symbols.","run.mlr = runTaskMlr(task, lrn)","object_name_linter" +"vignettes/OpenML.Rmd",105,9,"style","Use <-, not =, for assignment.","run.mlr = runTaskMlr(task, lrn)","assignment_linter" +"vignettes/OpenML.Rmd",106,1,"style","Variable and function name style should be snake_case or symbols.","run.id = uploadOMLRun(run.mlr)","object_name_linter" +"vignettes/OpenML.Rmd",106,8,"style","Use <-, not =, for assignment.","run.id = uploadOMLRun(run.mlr)","assignment_linter" +"vignettes/OpenML.Rmd",136,7,"style","Use <-, not =, for assignment.","apikey=c1994bdb7ecb3c6f3c8f3b35f4b47f1f","assignment_linter" +"vignettes/OpenML.Rmd",136,7,"style","Put spaces around all infix operators.","apikey=c1994bdb7ecb3c6f3c8f3b35f4b47f1f","infix_spaces_linter" +"vignettes/OpenML.Rmd",188,10,"style","Use <-, not =, for assignment.","datasets = listOMLDataSets() # returns active data sets","assignment_linter" +"vignettes/OpenML.Rmd",226,7,"style","Use <-, not =, for assignment.","tasks = listOMLTasks()","assignment_linter" +"vignettes/OpenML.Rmd",246,81,"style","Lines should not be more than 80 characters.","head(subset(tasks, task.type == ""Supervised Classification"" & data.id == 61L)[, 1:5])","line_length_linter" +"vignettes/OpenML.Rmd",252,7,"style","Use <-, not =, for assignment.","flows = listOMLFlows()","assignment_linter" +"vignettes/OpenML.Rmd",263,6,"style","Use <-, not =, for assignment.","runs = listOMLRuns(task.id = 59L) # must be specified with the task, setup and/or implementation ID","assignment_linter" +"vignettes/OpenML.Rmd",263,81,"style","Lines should not be more than 80 characters.","runs = listOMLRuns(task.id = 59L) # must be specified with the task, setup and/or implementation ID","line_length_linter" +"vignettes/OpenML.Rmd",266,1,"style","Variable and function name style should be snake_case or symbols.","run.results = listOMLRunEvaluations(task.id = 59L)","object_name_linter" +"vignettes/OpenML.Rmd",266,13,"style","Use <-, not =, for assignment.","run.results = listOMLRunEvaluations(task.id = 59L)","assignment_linter" +"vignettes/OpenML.Rmd",287,1,"style","Variable and function name style should be snake_case or symbols.","iris.data = getOMLDataSet(data.id = 61L) # the iris data set has the data set ID 61","object_name_linter" +"vignettes/OpenML.Rmd",287,11,"style","Use <-, not =, for assignment.","iris.data = getOMLDataSet(data.id = 61L) # the iris data set has the data set ID 61","assignment_linter" +"vignettes/OpenML.Rmd",287,81,"style","Lines should not be more than 80 characters.","iris.data = getOMLDataSet(data.id = 61L) # the iris data set has the data set ID 61","line_length_linter" +"vignettes/OpenML.Rmd",293,6,"style","Use <-, not =, for assignment.","task = getOMLTask(task.id = 59L)","assignment_linter" +"vignettes/OpenML.Rmd",309,1,"style","Variable and function name style should be snake_case or symbols.","iris.data = task$input$data.set$data","object_name_linter" +"vignettes/OpenML.Rmd",309,11,"style","Use <-, not =, for assignment.","iris.data = task$input$data.set$data","assignment_linter" +"vignettes/OpenML.Rmd",316,6,"style","Use <-, not =, for assignment.","flow = getOMLFlow(flow.id = 2700L)","assignment_linter" +"vignettes/OpenML.Rmd",325,1,"style","Variable and function name style should be snake_case or symbols.","task.list = listOMLRuns(task.id = 59L)","object_name_linter" +"vignettes/OpenML.Rmd",325,11,"style","Use <-, not =, for assignment.","task.list = listOMLRuns(task.id = 59L)","assignment_linter" +"vignettes/OpenML.Rmd",327,5,"style","Use <-, not =, for assignment.","run = getOMLRun(run.id = 524027L)","assignment_linter" +"vignettes/OpenML.Rmd",355,6,"style","Use <-, not =, for assignment.","task = getOMLTask(task.id = 59L)","assignment_linter" +"vignettes/OpenML.Rmd",357,5,"style","Use <-, not =, for assignment.","lrn = makeLearner(""classif.rpart"")","assignment_linter" +"vignettes/OpenML.Rmd",358,1,"style","Variable and function name style should be snake_case or symbols.","run.mlr = runTaskMlr(task, lrn)","object_name_linter" +"vignettes/OpenML.Rmd",358,9,"style","Use <-, not =, for assignment.","run.mlr = runTaskMlr(task, lrn)","assignment_linter" +"vignettes/OpenML.Rmd",380,5,"style","Use <-, not =, for assignment.","dsc = ""Daily air quality measurements in New York, May to September 1973.","assignment_linter" +"vignettes/OpenML.Rmd",382,5,"style","Use <-, not =, for assignment.","cit = ""Chambers, J. M., Cleveland, W. S., Kleiner, B. and Tukey, P. A. (1983)","assignment_linter" +"vignettes/OpenML.Rmd",385,6,"style","Use <-, not =, for assignment.","desc = makeOMLDataSetDescription(name = ""airquality"",","assignment_linter" +"vignettes/OpenML.Rmd",387,81,"style","Lines should not be more than 80 characters."," creator = ""New York State Department of Conservation (ozone data) and the National","line_length_linter" +"vignettes/OpenML.Rmd",392,81,"style","Lines should not be more than 80 characters."," url = ""https://stat.ethz.ch/R-manual/R-devel/library/datasets/html/00Index.html"",","line_length_linter" +"vignettes/OpenML.Rmd",397,1,"style","Variable and function name style should be snake_case or symbols.","air.data = makeOMLDataSet(desc = desc,","object_name_linter" +"vignettes/OpenML.Rmd",397,10,"style","Use <-, not =, for assignment.","air.data = makeOMLDataSet(desc = desc,","assignment_linter" +"vignettes/OpenML.Rmd",406,2,"style","Commented code should be removed.","#dataset.id = uploadOMLDataSet(air.data)","commented_code_linter" +"vignettes/OpenML.Rmd",420,5,"style","Use <-, not =, for assignment.","lrn = makeLearner(""classif.randomForest"")","assignment_linter" +"vignettes/OpenML.Rmd",421,1,"style","Variable and function name style should be snake_case or symbols.","flow.id = uploadOMLFlow(lrn)","object_name_linter" +"vignettes/OpenML.Rmd",421,9,"style","Use <-, not =, for assignment.","flow.id = uploadOMLFlow(lrn)","assignment_linter" +"vignettes/OpenML.Rmd",432,10,"style","Use <-, not =, for assignment.","learners = list(","assignment_linter" +"vignettes/OpenML.Rmd",437,1,"style","Variable and function name style should be snake_case or symbols.","task.ids = c(57, 59, 2382)","object_name_linter" +"vignettes/OpenML.Rmd",437,10,"style","Use <-, not =, for assignment.","task.ids = c(57, 59, 2382)","assignment_linter" +"vignettes/OpenML.Rmd",440,10,"style","Use <-, not =, for assignment."," task = getOMLTask(id)","assignment_linter" +"vignettes/OpenML.Rmd",441,9,"style","Use <-, not =, for assignment."," res = runTaskMlr(task, lrn)$run","assignment_linter" +"vignettes/OpenML.Rmd",442,5,"style","Variable and function name style should be snake_case or symbols."," run.id = uploadOMLRun(res) # upload results","object_name_linter" +"vignettes/OpenML.Rmd",442,12,"style","Use <-, not =, for assignment."," run.id = uploadOMLRun(res) # upload results","assignment_linter" diff --git a/.dev/revdep_emails/OpenML/email-body b/.dev/revdep_emails/OpenML/email-body new file mode 100644 index 000000000..c4b9fe6d7 --- /dev/null +++ b/.dev/revdep_emails/OpenML/email-body @@ -0,0 +1,27 @@ +Hello Giuseppe Casalicchio! Thank you for using {lintr} in your package {OpenML}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/openml/openml-r using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 66s on CRAN vs. 42s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/PWFSLSmoke/attachments/PWFSLSmoke.warnings b/.dev/revdep_emails/PWFSLSmoke/attachments/PWFSLSmoke.warnings new file mode 100644 index 000000000..be09e01a7 --- /dev/null +++ b/.dev/revdep_emails/PWFSLSmoke/attachments/PWFSLSmoke.warnings @@ -0,0 +1,2 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Trying to remove β€˜todo_comment_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/PWFSLSmoke/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/PWFSLSmoke/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..13c26c4df --- /dev/null +++ b/.dev/revdep_emails/PWFSLSmoke/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,3 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/addMarker.R",91,24,"style","Place a space before left parenthesis, except in a function call."," top <- newXY$newY[-(seq_along(latitude))]","spaces_left_parentheses_linter" +"R/addMarker.R",93,26,"style","Place a space before left parenthesis, except in a function call."," right <- newXY$newX[-(seq_along(longitude))]","spaces_left_parentheses_linter" diff --git a/.dev/revdep_emails/PWFSLSmoke/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/PWFSLSmoke/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..7ee01cd92 --- /dev/null +++ b/.dev/revdep_emails/PWFSLSmoke/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,219 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/addShadedBackground.R",21,39,"style","Put spaces around all infix operators."," breaks=stats::quantile(param, na.rm = TRUE),","infix_spaces_linter" +"R/airsis_load.R",10,29,"style","Put spaces around all infix operators.","airsis_load <- function(year=2017,","infix_spaces_linter" +"R/createEmptyMetaDataframe.R",26,42,"style","Put spaces around all infix operators.","createEmptyMetaDataframe <- function(rows=0) {","infix_spaces_linter" +"R/epa_load.R",12,7,"style","Put spaces around all infix operators."," year=strftime(lubridate::now(tzone = ""UTC""), ""%Y"", tz = ""UTC""),","infix_spaces_linter" +"R/monitor_aqi.R",81,46,"style","Put spaces around all infix operators.",".assignBreakpointsTable <- function(parameter=""pm25"") {","infix_spaces_linter" +"R/monitor_asDataframe.R",54,42,"style","Put spaces around all infix operators."," monitorID=NULL,","infix_spaces_linter" +"R/monitor_asDataframe.R",55,45,"style","Put spaces around all infix operators."," extraColumns=NULL,","infix_spaces_linter" +"R/monitor_asDataframe.R",56,44,"style","Put spaces around all infix operators."," metaColumns=NULL,","infix_spaces_linter" +"R/monitor_asDataframe.R",57,37,"style","Put spaces around all infix operators."," tlim=NULL) {","infix_spaces_linter" +"R/monitor_collapse.R",111,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ( !is.null(longitude) & !is.null(latitude) ) {","vector_logic_linter" +"R/monitor_dailyStatistic.R",98,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (hoursAfter > 0 & hoursAfter <= 1) dayNum <- dayNum + 1","vector_logic_linter" +"R/monitor_dailyStatistic.R",103,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (hoursAfter > 0 & hoursAfter <= 1) dayNum <- dayNum + 1","vector_logic_linter" +"R/monitor_dailyThreshold.R",68,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (hoursAfter > 0 & hoursAfter <= 1) dayNum <- dayNum + 1","vector_logic_linter" +"R/monitor_dailyThreshold.R",71,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (hoursAfter > 0 & hoursAfter <= 1) dayNum <- dayNum + 1","vector_logic_linter" +"R/monitor_getCurrentStatus.R",367,3,"warning","local variable β€˜get_nAvg’ assigned but may not be used"," get_nAvg <- function(monitorDataColumn, timeIndex, n) {","object_usage_linter" +"R/monitor_getCurrentStatus.R",437,3,"warning","local variable β€˜get_previousDayAvg’ assigned but may not be used"," get_previousDayAvg <- function(ws_data, timezone, endTimeUTC) {","object_usage_linter" +"R/monitor_loadAnnual.R",128,7,"warning","local variable β€˜result’ assigned but may not be used"," result <- try({","object_usage_linter" +"R/monitor_performance.R",58,9,"style","Put spaces around all infix operators."," metric=NULL,","infix_spaces_linter" +"R/monitor_performanceMap.R",190,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ( showLegend & !is.null(colorBy) ) {","vector_logic_linter" +"R/monitor_print.R",111,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/monitor_writeCurrentStatusGeoJSON.R",106,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(propertyNames) & length(propertyNames) == length(properties))","vector_logic_linter" +"R/PWFSLSmoke-deprecated.R",96,12,"style","Put spaces around all infix operators."," monitorID=NULL,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",97,7,"style","Put spaces around all infix operators."," tlim=NULL,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",98,7,"style","Put spaces around all infix operators."," ylim=NULL,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",99,11,"style","Put spaces around all infix operators."," aqiLines=TRUE,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",100,14,"style","Put spaces around all infix operators."," shadedNight=TRUE,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",101,8,"style","Put spaces around all infix operators."," title=NULL,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",233,12,"style","Put spaces around all infix operators."," monitorID=NULL,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",234,7,"style","Put spaces around all infix operators."," tlim=NULL,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",235,11,"style","Put spaces around all infix operators."," minHours=18,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",238,10,"style","Put spaces around all infix operators."," gridLwd=0.5,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",240,17,"style","Put spaces around all infix operators."," labels_x_nudge=0,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",241,17,"style","Put spaces around all infix operators."," labels_y_nudge=0,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",286,53,"style","Put spaces around all infix operators.","monitorPlot_noData <- function(ws_monitor, monitorID=NULL, cex=2.5) {","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",286,63,"style","Put spaces around all infix operators.","monitorPlot_noData <- function(ws_monitor, monitorID=NULL, cex=2.5) {","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",294,12,"style","Put spaces around all infix operators."," monitorID=NULL,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",295,8,"style","Put spaces around all infix operators."," width=3,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",296,8,"style","Put spaces around all infix operators."," align=""center"",","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",297,14,"style","Put spaces around all infix operators."," data.thresh=75,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",298,7,"style","Put spaces around all infix operators."," tlim=NULL,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",299,7,"style","Put spaces around all infix operators."," ylim=NULL,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",300,12,"style","Put spaces around all infix operators."," localTime=TRUE,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",301,14,"style","Put spaces around all infix operators."," shadedNight=FALSE,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",302,11,"style","Put spaces around all infix operators."," aqiLines=TRUE,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",303,17,"style","Put spaces around all infix operators."," gridHorizontal=FALSE,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",304,11,"style","Put spaces around all infix operators."," grid24hr=FALSE,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",305,10,"style","Put spaces around all infix operators."," grid3hr=FALSE,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",306,13,"style","Put spaces around all infix operators."," showLegend=TRUE","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",318,12,"style","Put spaces around all infix operators."," monitorID=NULL,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",319,7,"style","Put spaces around all infix operators."," tlim=NULL,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",320,12,"style","Put spaces around all infix operators."," localTime=TRUE,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",321,8,"style","Put spaces around all infix operators."," style=NULL,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",322,14,"style","Put spaces around all infix operators."," shadedNight=FALSE,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",323,6,"style","Put spaces around all infix operators."," add=FALSE,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",326,10,"style","Put spaces around all infix operators."," gridLwd=1,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",328,9,"style","Put spaces around all infix operators."," dayLwd=0,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",329,10,"style","Put spaces around all infix operators."," hourLwd=0,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",330,15,"style","Put spaces around all infix operators."," hourInterval=6,","infix_spaces_linter" +"R/skill_confusionMatrix.R",69,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ( !is.logical(predicted) | !is.logical(observed) ) {","vector_logic_linter" +"R/wrcc_load.R",10,27,"style","Put spaces around all infix operators.","wrcc_load <- function(year=2017,","infix_spaces_linter" +"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",56,80,"style","Trailing whitespace is superfluous.","monitorIDs <- c(""080310002_01"", ""080131001_01"", ""080130003_01"", ""081230006_01"", ","trailing_whitespace_linter" +"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",63,15,"style","Trailing whitespace is superfluous.","my_monitors <- ","trailing_whitespace_linter" +"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",81,15,"style","Trailing whitespace is superfluous."," my_monitors, ","trailing_whitespace_linter" +"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",82,50,"style","Trailing whitespace is superfluous."," title = ""Front Range AQIs - Feb 15 - 18, 2021"", ","trailing_whitespace_linter" +"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",102,44,"style","Only use double-quotes.","monitor_timeseriesPlot(my_monitors, type = 'l')","single_quotes_linter" +"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",103,45,"style","Only use double-quotes.","monitor_timeseriesPlot(my_monitors, style = 'aqidots', pch=16, cex = 1, add = TRUE)","single_quotes_linter" +"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",103,59,"style","Put spaces around all infix operators.","monitor_timeseriesPlot(my_monitors, style = 'aqidots', pch=16, cex = 1, add = TRUE)","infix_spaces_linter" +"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",125,75,"style","Trailing whitespace is superfluous.","# After looking at my_monitors$meta$siteName, help ggplot out by assigning ","trailing_whitespace_linter" +"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",135,6,"style","Trailing whitespace is superfluous.","gg <- ","trailing_whitespace_linter" +"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",143,32,"style","Trailing whitespace is superfluous."," stat_AQCategory(color = NA) + ","trailing_whitespace_linter" +"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",144,37,"style","Trailing whitespace is superfluous."," facet_grid(rows = vars(shortName)) ","trailing_whitespace_linter" +"vignettes/articles/Example_Save_Data_as_CSV.Rmd",40,13,"style","Trailing whitespace is superfluous.","airsis_ca <- ","trailing_whitespace_linter" +"vignettes/articles/Example_Save_Data_as_CSV.Rmd",69,12,"style","Trailing whitespace is superfluous.","Mariposa <- ","trailing_whitespace_linter" +"vignettes/articles/Example_Save_Data_as_CSV.Rmd",82,12,"style","Trailing whitespace is superfluous."," Mariposa, ","trailing_whitespace_linter" +"vignettes/articles/Example_Save_Data_as_CSV.Rmd",98,13,"style","Trailing whitespace is superfluous."," airsis_ca, ","trailing_whitespace_linter" +"vignettes/articles/Example_Save_Data_as_CSV.Rmd",107,13,"style","Trailing whitespace is superfluous."," airsis_ca, ","trailing_whitespace_linter" +"vignettes/articles/Example_Save_Data_as_CSV.Rmd",136,47,"style","Trailing whitespace is superfluous."," monitor_nowcast(includeShortTerm = TRUE) %>% ","trailing_whitespace_linter" +"vignettes/articles/Loading_Monitoring_Data.Rmd",144,101,"style","Lines should not be more than 100 characters.","AirNow_hourly <- get(load(url(""https://haze.airfire.org/monitoring/latest/RData/airnow_PM2.5_latest10.RData"")))","line_length_linter" +"vignettes/articles/Loading_Monitoring_Data.Rmd",158,13,"style","Only use double-quotes.","parameter = 'PM2.5',","single_quotes_linter" +"vignettes/articles/Loading_Monitoring_Data.Rmd",160,16,"style","Trailing whitespace is superfluous.","dataDir = NULL) ","trailing_whitespace_linter" +"vignettes/articles/Loading_Monitoring_Data.Rmd",167,13,"style","Only use double-quotes.","parameter = 'PM2.5',","single_quotes_linter" +"vignettes/articles/Loading_Monitoring_Data.Rmd",169,16,"style","Trailing whitespace is superfluous.","dataDir = NULL) ","trailing_whitespace_linter" +"vignettes/articles/Loading_Monitoring_Data.Rmd",177,13,"style","Only use double-quotes.","parameter = 'PM2.5',","single_quotes_linter" +"vignettes/articles/Loading_Monitoring_Data.Rmd",179,16,"style","Trailing whitespace is superfluous.","dataDir = NULL) ","trailing_whitespace_linter" +"vignettes/articles/Loading_Monitoring_Data.Rmd",239,28,"style","Put spaces around all infix operators."," monitor_subset(stateCodes= 'WA')","infix_spaces_linter" +"vignettes/articles/Loading_Monitoring_Data.Rmd",239,30,"style","Only use double-quotes."," monitor_subset(stateCodes= 'WA')","single_quotes_linter" +"vignettes/articles/Loading_Monitoring_Data.Rmd",242,43,"style","Only use double-quotes.","monitor_timeseriesPlot(airnow_wa, style = 'gnats')","single_quotes_linter" +"vignettes/articles/Loading_Monitoring_Data.Rmd",273,37,"style","Only use double-quotes.","monitor_timeseriesPlot(pnw, style = 'gnats')","single_quotes_linter" +"vignettes/Data_Model.Rmd",90,67,"style","Trailing whitespace is superfluous.","# NOTE: 'tlim' is interpreted as UTC unless we specify 'timezone' ","trailing_whitespace_linter" +"vignettes/Data_Model.Rmd",94,40,"style","Only use double-quotes.","WA <- monitor_subset(N_M, stateCodes = 'WA')","single_quotes_linter" +"vignettes/Data_Model.Rmd",109,44,"style","Commas should always have a space after.","all(rownames(WA$meta) == colnames(WA$data[,-1]))","commas_linter" +"vignettes/Data_Model.Rmd",140,12,"style","Only use double-quotes.","TwispID <- '530470009_01'","single_quotes_linter" +"vignettes/Data_Model.Rmd",141,15,"style","Only use double-quotes.","WinthropID <- '530470010_01'","single_quotes_linter" +"vignettes/Data_Model.Rmd",142,27,"style","Trailing whitespace is superfluous.","Methow_Valley_JulyMeans <- ","trailing_whitespace_linter" +"vignettes/Data_Model.Rmd",144,41,"style","Commas should always have a space after."," monitor_subset(monitorIDs = c(TwispID,WinthropID)) %>%","commas_linter" +"vignettes/Data_Model.Rmd",145,32,"style","Only use double-quotes."," monitor_collapse(monitorID = 'MethowValley') %>%","single_quotes_linter" +"vignettes/Data_Model.Rmd",146,22,"style","Put spaces around all infix operators."," monitor_subset(tlim=c(20150701, 20150731), timezone = 'America/Los_Angeles') %>%","infix_spaces_linter" +"vignettes/Data_Model.Rmd",146,57,"style","Only use double-quotes."," monitor_subset(tlim=c(20150701, 20150731), timezone = 'America/Los_Angeles') %>%","single_quotes_linter" +"vignettes/Data_Model.Rmd",149,34,"style","Commas should always have a space after.","Methow_Valley_JulyMeans$data[1:7,]","commas_linter" +"vignettes/Data_Model.Rmd",164,27,"style","Commas should always have a space after.","Spokane_3hr_squared$data[,-1] <- (Spokane_3hr$data[,-1])^2 # exclude the 'datetime' column","commas_linter" +"vignettes/Data_Model.Rmd",164,53,"style","Commas should always have a space after.","Spokane_3hr_squared$data[,-1] <- (Spokane_3hr$data[,-1])^2 # exclude the 'datetime' column","commas_linter" +"vignettes/Data_Model.Rmd",172,33,"style","Commas should always have a space after.","data <- Spokane_daily_3hr$data[,-1] # exclude the 'datetime' column","commas_linter" +"vignettes/Data_Model.Rmd",173,17,"style","Only use double-quotes.","cor(data, use = 'complete.obs')","single_quotes_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",54,2,"style","Commented code should be removed.","#monitor_leaflet(PacNW_24, slice = max)","commented_code_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",67,42,"style","Only use double-quotes.","monitor_timeseriesPlot(NezPerce, style = 'gnats')","single_quotes_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",90,23,"style","Commas should always have a space after.","opar <- par(mar = c(1,1,1,1))","commas_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",90,25,"style","Commas should always have a space after.","opar <- par(mar = c(1,1,1,1))","commas_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",90,27,"style","Commas should always have a space after.","opar <- par(mar = c(1,1,1,1))","commas_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",93,40,"style","Only use double-quotes."," siteName <- NezPerce$meta[monitorID, 'siteName']","single_quotes_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",95,14,"style","Trailing whitespace is superfluous."," NezPerce, ","trailing_whitespace_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",96,27,"style","Trailing whitespace is superfluous."," monitorID = monitorID, ","trailing_whitespace_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",97,21,"style","Trailing whitespace is superfluous."," main = siteName, ","trailing_whitespace_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",99,4,"style","Trailing whitespace is superfluous."," ) ","trailing_whitespace_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",110,21,"style","Commas should always have a space after.","data <- PacNW$data[,-1] # omit 'datetime' column","commas_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",112,101,"style","Lines should not be more than 100 characters.","worstAcute <- names(sort(maxPM25, decreasing = TRUE))[1:6] # monitorIDs for the six worst sites in PacNW","line_length_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",114,26,"style","Commas should always have a space after.","PacNW$meta[worstAcute[1],c('siteName','countyName','stateCode')]","commas_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",114,28,"style","Only use double-quotes.","PacNW$meta[worstAcute[1],c('siteName','countyName','stateCode')]","single_quotes_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",114,39,"style","Commas should always have a space after.","PacNW$meta[worstAcute[1],c('siteName','countyName','stateCode')]","commas_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",114,39,"style","Only use double-quotes.","PacNW$meta[worstAcute[1],c('siteName','countyName','stateCode')]","single_quotes_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",114,52,"style","Commas should always have a space after.","PacNW$meta[worstAcute[1],c('siteName','countyName','stateCode')]","commas_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",114,52,"style","Only use double-quotes.","PacNW$meta[worstAcute[1],c('siteName','countyName','stateCode')]","single_quotes_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",127,30,"style","Commas should always have a space after.","data <- PacNW_dailyAvg$data[,-1]","commas_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",128,45,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","unhealthyDays <- apply(data, 2, function(x) { sum(x >= AQI$breaks_24[4], na.rm = TRUE) })","brace_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",131,28,"style","Commas should always have a space after.","PacNW$meta[worstChronic[1],c('siteName','countyName','stateCode')]","commas_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",131,30,"style","Only use double-quotes.","PacNW$meta[worstChronic[1],c('siteName','countyName','stateCode')]","single_quotes_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",131,41,"style","Commas should always have a space after.","PacNW$meta[worstChronic[1],c('siteName','countyName','stateCode')]","commas_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",131,41,"style","Only use double-quotes.","PacNW$meta[worstChronic[1],c('siteName','countyName','stateCode')]","single_quotes_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",131,54,"style","Commas should always have a space after.","PacNW$meta[worstChronic[1],c('siteName','countyName','stateCode')]","commas_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",131,54,"style","Only use double-quotes.","PacNW$meta[worstChronic[1],c('siteName','countyName','stateCode')]","single_quotes_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",156,18,"style","Trailing whitespace is superfluous."," PacNW_dailyAvg, ","trailing_whitespace_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",158,13,"style","Only use double-quotes."," maptype = 'terrain',","single_quotes_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",159,20,"style","Trailing whitespace is superfluous."," centerLon = -118, ","trailing_whitespace_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",160,18,"style","Trailing whitespace is superfluous."," centerLat = 47, ","trailing_whitespace_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",161,11,"style","Trailing whitespace is superfluous."," zoom = 7 ","trailing_whitespace_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",163,9,"style","Only use double-quotes.","addIcon('redFlame', fireLons, fireLats, expansion = .002)","single_quotes_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",182,8,"style","Trailing whitespace is superfluous."," Omak, ","trailing_whitespace_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",184,24,"style","Trailing whitespace is superfluous."," labels_x_nudge = 0.8, ","trailing_whitespace_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",188,10,"style","Trailing whitespace is superfluous."," Kamiah, ","trailing_whitespace_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",189,7,"style","Put spaces around all infix operators."," main=""August Daily AQI -- Kamiah, ID"",","infix_spaces_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",190,24,"style","Trailing whitespace is superfluous."," labels_x_nudge = 0.8, ","trailing_whitespace_linter" +"vignettes/NowCast.Rmd",306,48,"style","Put spaces around all infix operators.","N_M <- monitor_subset(Northwest_Megafires, tlim=c(20150801,20150831),","infix_spaces_linter" +"vignettes/NowCast.Rmd",306,60,"style","Commas should always have a space after.","N_M <- monitor_subset(Northwest_Megafires, tlim=c(20150801,20150831),","commas_linter" +"vignettes/NowCast.Rmd",307,31,"style","Put spaces around all infix operators."," timezone=""America/Los_Angeles"")","infix_spaces_linter" +"vignettes/NowCast.Rmd",308,39,"style","Put spaces around all infix operators.","Omak <- monitor_subset(N_M, monitorIDs='530470013_01')","infix_spaces_linter" +"vignettes/NowCast.Rmd",308,40,"style","Only use double-quotes.","Omak <- monitor_subset(N_M, monitorIDs='530470013_01')","single_quotes_linter" +"vignettes/NowCast.Rmd",313,34,"style","Put spaces around all infix operators.","monitor_timeseriesPlot(Omak, type='l', lwd=2)","infix_spaces_linter" +"vignettes/NowCast.Rmd",313,35,"style","Only use double-quotes.","monitor_timeseriesPlot(Omak, type='l', lwd=2)","single_quotes_linter" +"vignettes/NowCast.Rmd",313,43,"style","Put spaces around all infix operators.","monitor_timeseriesPlot(Omak, type='l', lwd=2)","infix_spaces_linter" +"vignettes/NowCast.Rmd",314,41,"style","Put spaces around all infix operators.","monitor_timeseriesPlot(Omak_nowcast, add=TRUE, type='l', col='purple', lwd=2)","infix_spaces_linter" +"vignettes/NowCast.Rmd",314,52,"style","Put spaces around all infix operators.","monitor_timeseriesPlot(Omak_nowcast, add=TRUE, type='l', col='purple', lwd=2)","infix_spaces_linter" +"vignettes/NowCast.Rmd",314,53,"style","Only use double-quotes.","monitor_timeseriesPlot(Omak_nowcast, add=TRUE, type='l', col='purple', lwd=2)","single_quotes_linter" +"vignettes/NowCast.Rmd",314,61,"style","Put spaces around all infix operators.","monitor_timeseriesPlot(Omak_nowcast, add=TRUE, type='l', col='purple', lwd=2)","infix_spaces_linter" +"vignettes/NowCast.Rmd",314,62,"style","Only use double-quotes.","monitor_timeseriesPlot(Omak_nowcast, add=TRUE, type='l', col='purple', lwd=2)","single_quotes_linter" +"vignettes/NowCast.Rmd",314,75,"style","Put spaces around all infix operators.","monitor_timeseriesPlot(Omak_nowcast, add=TRUE, type='l', col='purple', lwd=2)","infix_spaces_linter" +"vignettes/NowCast.Rmd",316,17,"style","Put spaces around all infix operators.","addAQILegend(lwd=1, pch=NULL, 'topleft')","infix_spaces_linter" +"vignettes/NowCast.Rmd",316,24,"style","Put spaces around all infix operators.","addAQILegend(lwd=1, pch=NULL, 'topleft')","infix_spaces_linter" +"vignettes/NowCast.Rmd",316,31,"style","Only use double-quotes.","addAQILegend(lwd=1, pch=NULL, 'topleft')","single_quotes_linter" +"vignettes/NowCast.Rmd",317,23,"style","Put spaces around all infix operators.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","infix_spaces_linter" +"vignettes/NowCast.Rmd",317,30,"style","Put spaces around all infix operators.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","infix_spaces_linter" +"vignettes/NowCast.Rmd",317,33,"style","Only use double-quotes.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","single_quotes_linter" +"vignettes/NowCast.Rmd",317,41,"style","Commas should always have a space after.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","commas_linter" +"vignettes/NowCast.Rmd",317,41,"style","Only use double-quotes.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","single_quotes_linter" +"vignettes/NowCast.Rmd",317,58,"style","Put spaces around all infix operators.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","infix_spaces_linter" +"vignettes/NowCast.Rmd",317,61,"style","Only use double-quotes.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","single_quotes_linter" +"vignettes/NowCast.Rmd",317,70,"style","Commas should always have a space after.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","commas_linter" +"vignettes/NowCast.Rmd",317,70,"style","Only use double-quotes.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","single_quotes_linter" +"vignettes/NowCast.Rmd",332,45,"style","Put spaces around all infix operators.","Omak_2015_08_21 <- monitor_subset(Omak, tlim=c(2015082100, 2015082111))","infix_spaces_linter" +"vignettes/NowCast.Rmd",346,32,"style","Put spaces around all infix operators.","(w_star <- min(example1_values)/max(example1_values))","infix_spaces_linter" +"vignettes/NowCast.Rmd",353,12,"style","Put spaces around all infix operators.","(w <- max(1/2, w_star))","infix_spaces_linter" +"vignettes/NowCast.Rmd",370,23,"style","Put spaces around all infix operators.","(numer <- sum(w^(0:11)*example1_values))","infix_spaces_linter" +"vignettes/NowCast.Rmd",392,6,"style","Put spaces around all infix operators.","numer/denom","infix_spaces_linter" +"vignettes/NowCast.Rmd",401,34,"style","Put spaces around all infix operators.","monitor_subset(Omak_nowcast, tlim=rep(2015082111, 2))$data","infix_spaces_linter" +"vignettes/NowCast.Rmd",413,45,"style","Put spaces around all infix operators.","Omak_2015_08_24 <- monitor_subset(Omak, tlim=c(2015082412, 2015082423))","infix_spaces_linter" +"vignettes/NowCast.Rmd",436,37,"style","Put spaces around all infix operators.","w_star <- min(example2_values, na.rm=TRUE)/max(example2_values, na.rm=TRUE)","infix_spaces_linter" +"vignettes/NowCast.Rmd",436,43,"style","Put spaces around all infix operators.","w_star <- min(example2_values, na.rm=TRUE)/max(example2_values, na.rm=TRUE)","infix_spaces_linter" +"vignettes/NowCast.Rmd",436,70,"style","Put spaces around all infix operators.","w_star <- min(example2_values, na.rm=TRUE)/max(example2_values, na.rm=TRUE)","infix_spaces_linter" +"vignettes/NowCast.Rmd",437,12,"style","Put spaces around all infix operators.","(w <- max(1/2, w_star))","infix_spaces_linter" +"vignettes/NowCast.Rmd",445,29,"style","Put spaces around all infix operators.","numer <- sum(w^(validIndexes-1)*example2_values[validIndexes])","infix_spaces_linter" +"vignettes/NowCast.Rmd",445,32,"style","Put spaces around all infix operators.","numer <- sum(w^(validIndexes-1)*example2_values[validIndexes])","infix_spaces_linter" +"vignettes/NowCast.Rmd",446,29,"style","Put spaces around all infix operators.","denom <- sum(w^(validIndexes-1))","infix_spaces_linter" +"vignettes/NowCast.Rmd",447,6,"style","Put spaces around all infix operators.","numer/denom","infix_spaces_linter" +"vignettes/NowCast.Rmd",456,34,"style","Put spaces around all infix operators.","monitor_subset(Omak_nowcast, tlim=rep(2015082423, 2))$data","infix_spaces_linter" +"vignettes/NowCast.Rmd",468,57,"style","Put spaces around all infix operators.","example2_df$nowcast <- monitor_subset(Omak_nowcast, tlim=c(2015082412, 2015082423))$data$`530470013_01`","infix_spaces_linter" +"vignettes/NowCast.Rmd",468,101,"style","Lines should not be more than 100 characters.","example2_df$nowcast <- monitor_subset(Omak_nowcast, tlim=c(2015082412, 2015082423))$data$`530470013_01`","line_length_linter" +"vignettes/NowCast.Rmd",478,45,"style","Put spaces around all infix operators.","Omak_2015_08_23 <- monitor_subset(Omak, tlim=c(2015082312, 2015082323))","infix_spaces_linter" +"vignettes/NowCast.Rmd",501,37,"style","Put spaces around all infix operators.","w_star <- min(example3_values, na.rm=TRUE)/max(example3_values, na.rm=TRUE)","infix_spaces_linter" +"vignettes/NowCast.Rmd",501,43,"style","Put spaces around all infix operators.","w_star <- min(example3_values, na.rm=TRUE)/max(example3_values, na.rm=TRUE)","infix_spaces_linter" +"vignettes/NowCast.Rmd",501,70,"style","Put spaces around all infix operators.","w_star <- min(example3_values, na.rm=TRUE)/max(example3_values, na.rm=TRUE)","infix_spaces_linter" +"vignettes/NowCast.Rmd",502,12,"style","Put spaces around all infix operators.","(w <- max(1/2, w_star))","infix_spaces_linter" +"vignettes/NowCast.Rmd",510,29,"style","Put spaces around all infix operators.","numer <- sum(w^(validIndexes-1)*example3_values[validIndexes])","infix_spaces_linter" +"vignettes/NowCast.Rmd",510,32,"style","Put spaces around all infix operators.","numer <- sum(w^(validIndexes-1)*example3_values[validIndexes])","infix_spaces_linter" +"vignettes/NowCast.Rmd",511,29,"style","Put spaces around all infix operators.","denom <- sum(w^(validIndexes-1))","infix_spaces_linter" +"vignettes/NowCast.Rmd",512,6,"style","Put spaces around all infix operators.","numer/denom","infix_spaces_linter" +"vignettes/NowCast.Rmd",521,34,"style","Put spaces around all infix operators.","monitor_subset(Omak_nowcast, tlim=rep(2015082323, 2))$data","infix_spaces_linter" +"vignettes/NowCast.Rmd",532,57,"style","Put spaces around all infix operators.","example3_df$nowcast <- monitor_subset(Omak_nowcast, tlim=c(2015082312, 2015082323))$data$`530470013_01`","infix_spaces_linter" +"vignettes/NowCast.Rmd",532,101,"style","Lines should not be more than 100 characters.","example3_df$nowcast <- monitor_subset(Omak_nowcast, tlim=c(2015082312, 2015082323))$data$`530470013_01`","line_length_linter" +"vignettes/NowCast.Rmd",618,22,"style","Commas should always have a space after.","tlim <- c(2015082500,2015082523)","commas_linter" +"vignettes/NowCast.Rmd",619,50,"style","Put spaces around all infix operators.","Omak2 <- monitor_subset(Northwest_Megafires, tlim=tlim, monitorIDs = '530470013_01')","infix_spaces_linter" +"vignettes/NowCast.Rmd",619,70,"style","Only use double-quotes.","Omak2 <- monitor_subset(Northwest_Megafires, tlim=tlim, monitorIDs = '530470013_01')","single_quotes_linter" +"vignettes/NowCast.Rmd",644,49,"style","Put spaces around all infix operators.","example4_df <- monitor_subset(Omak_nowcast, tlim=tlim)$data","infix_spaces_linter" +"vignettes/NowCast.Rmd",668,37,"style","Put spaces around all infix operators.","example5_df <- data.frame(""datetime""=Omak$data$datetime,","infix_spaces_linter" +"vignettes/NowCast.Rmd",669,38,"style","Put spaces around all infix operators."," ""monitored""=Omak$data$`530470013_01`,","infix_spaces_linter" +"vignettes/NowCast.Rmd",670,32,"style","Put spaces around all infix operators."," ""aqi""=aqi$data$`530470013_01`)","infix_spaces_linter" +"vignettes/NowCast.Rmd",671,36,"style","Commas should always have a space after.","example5_df <- example5_df[500:650,]","commas_linter" +"vignettes/NowCast.Rmd",672,55,"style","Put spaces around all infix operators.","plot(example5_df$datetime, example5_df$monitored, xlab='Date', ylab='')","infix_spaces_linter" +"vignettes/NowCast.Rmd",672,56,"style","Only use double-quotes.","plot(example5_df$datetime, example5_df$monitored, xlab='Date', ylab='')","single_quotes_linter" +"vignettes/NowCast.Rmd",672,68,"style","Put spaces around all infix operators.","plot(example5_df$datetime, example5_df$monitored, xlab='Date', ylab='')","infix_spaces_linter" +"vignettes/NowCast.Rmd",672,69,"style","Only use double-quotes.","plot(example5_df$datetime, example5_df$monitored, xlab='Date', ylab='')","single_quotes_linter" +"vignettes/NowCast.Rmd",673,49,"style","Put spaces around all infix operators.","lines(example5_df$datetime, example5_df$aqi, col=""blue"")","infix_spaces_linter" +"vignettes/PWFSLSmoke.Rmd",139,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/PWFSLSmoke.Rmd",172,31,"style","Only use double-quotes."," monitor_subset(monitorIDs = '060670010_01')","single_quotes_linter" +"vignettes/PWFSLSmoke.Rmd",176,8,"style","Put spaces around all infix operators."," style='aqidots',","infix_spaces_linter" +"vignettes/PWFSLSmoke.Rmd",176,9,"style","Only use double-quotes."," style='aqidots',","single_quotes_linter" +"vignettes/PWFSLSmoke.Rmd",177,6,"style","Put spaces around all infix operators."," pch=16,","infix_spaces_linter" +"vignettes/PWFSLSmoke.Rmd",178,7,"style","Put spaces around all infix operators."," xlab=""2018""","infix_spaces_linter" +"vignettes/PWFSLSmoke.Rmd",182,17,"style","Put spaces around all infix operators.","addAQILegend(cex=0.8)","infix_spaces_linter" +"vignettes/PWFSLSmoke.Rmd",204,40,"style","Trailing whitespace is superfluous.","monitor_timeseriesPlot(Sacramento_area, ","trailing_whitespace_linter" +"vignettes/PWFSLSmoke.Rmd",205,32,"style","Only use double-quotes."," style = 'gnats',","single_quotes_linter" diff --git a/.dev/revdep_emails/PWFSLSmoke/email-body b/.dev/revdep_emails/PWFSLSmoke/email-body new file mode 100644 index 000000000..edf18a6f0 --- /dev/null +++ b/.dev/revdep_emails/PWFSLSmoke/email-body @@ -0,0 +1,27 @@ +Hello Jonathan Callahan! Thank you for using {lintr} in your package {PWFSLSmoke}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/MazamaScience/PWFSLSmoke using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 152s on CRAN vs. 99s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/Plasmidprofiler/email-body b/.dev/revdep_emails/Plasmidprofiler/email-body new file mode 100644 index 000000000..eea597fb9 --- /dev/null +++ b/.dev/revdep_emails/Plasmidprofiler/email-body @@ -0,0 +1,27 @@ +Hello Adrian Zetner! Thank you for using {lintr} in your package {Plasmidprofiler}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cran/Plasmidprofiler using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took NAs on CRAN vs. NAs in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/PosteriorBootstrap/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/PosteriorBootstrap/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..70bcbaaa1 --- /dev/null +++ b/.dev/revdep_emails/PosteriorBootstrap/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,24 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/PosteriorBootstrap.R",145,39,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(all(is.numeric(gamma_mean)) & all(is.numeric(gamma_vcov)))) {","vector_logic_linter" +"vignettes/PosteriorBootstrap.Rmd",16,12,"style","Put spaces around all infix operators."," fig.width=7,","infix_spaces_linter" +"vignettes/PosteriorBootstrap.Rmd",17,13,"style","Put spaces around all infix operators."," fig.height=3","infix_spaces_linter" +"vignettes/PosteriorBootstrap.Rmd",153,81,"style","Lines should not be more than 80 characters."," train_dat <- list(n = length(german$y), p = ncol(german$x), x = german$x, y = german$y, beta_sd = prior_sd)","line_length_linter" +"vignettes/PosteriorBootstrap.Rmd",186,81,"style","Lines should not be more than 80 characters."," anpl_sample <- PosteriorBootstrap::draw_logit_samples(x = german$x, y = german$y,","line_length_linter" +"vignettes/PosteriorBootstrap.Rmd",187,81,"style","Lines should not be more than 80 characters."," concentration = concentration,","line_length_linter" +"vignettes/PosteriorBootstrap.Rmd",188,81,"style","Lines should not be more than 80 characters."," n_bootstrap = n_bootstrap,","line_length_linter" +"vignettes/PosteriorBootstrap.Rmd",189,81,"style","Lines should not be more than 80 characters."," posterior_sample = stan_vb_sample,","line_length_linter" +"vignettes/PosteriorBootstrap.Rmd",191,81,"style","Lines should not be more than 80 characters."," show_progress = TRUE)","line_length_linter" +"vignettes/PosteriorBootstrap.Rmd",214,81,"style","Lines should not be more than 80 characters."," plot_df <- append_to_plot(plot_df, sample = anpl_samples[[toString(concentration)]],","line_length_linter" +"vignettes/PosteriorBootstrap.Rmd",239,81,"style","Lines should not be more than 80 characters."," data = dplyr::filter(plot_df, plot_df$Method != ""Bayes-Stan"")) +","line_length_linter" +"vignettes/PosteriorBootstrap.Rmd",246,62,"style","Put spaces around all infix operators."," labeller = ggplot2::label_bquote(c ~"" = ""~","infix_spaces_linter" +"vignettes/PosteriorBootstrap.Rmd",246,68,"style","Put spaces around all infix operators."," labeller = ggplot2::label_bquote(c ~"" = ""~","infix_spaces_linter" +"vignettes/PosteriorBootstrap.Rmd",301,39,"style","Do not place spaces before parentheses.","if (""Windows"" != Sys.info()[""sysname""] ) {","spaces_inside_linter" +"vignettes/PosteriorBootstrap.Rmd",311,81,"style","Lines should not be more than 80 characters."," anpl_samples <- PosteriorBootstrap::draw_logit_samples(x = german$x, y = german$y,","line_length_linter" +"vignettes/PosteriorBootstrap.Rmd",313,81,"style","Lines should not be more than 80 characters."," n_bootstrap = n_bootstrap,","line_length_linter" +"vignettes/PosteriorBootstrap.Rmd",314,81,"style","Lines should not be more than 80 characters."," gamma_mean = rep(0, ncol(german$x)),","line_length_linter" +"vignettes/PosteriorBootstrap.Rmd",315,81,"style","Lines should not be more than 80 characters."," gamma_vcov = diag(1, ncol(german$x)),","line_length_linter" +"vignettes/PosteriorBootstrap.Rmd",317,81,"style","Lines should not be more than 80 characters."," num_cores = num_cores)","line_length_linter" +"vignettes/PosteriorBootstrap.Rmd",322,81,"style","Lines should not be more than 80 characters."," speedups <- rbind(speedups, c(num_cores, n_bootstrap, one_core_duration / lap))","line_length_linter" +"vignettes/PosteriorBootstrap.Rmd",348,39,"style","Do not place spaces before parentheses.","if (""Windows"" != Sys.info()[""sysname""] ) {","spaces_inside_linter" +"vignettes/PosteriorBootstrap.Rmd",353,81,"style","Lines should not be more than 80 characters."," speedups$proportion <- (1 / speedups$speedup - 1) / (1 / speedups$Num_cores - 1)","line_length_linter" +"vignettes/PosteriorBootstrap.Rmd",355,81,"style","Lines should not be more than 80 characters."," ggplot2::qplot(proportion, data = speedups, fill = N_bootstrap, binwidth = 0.005) +","line_length_linter" diff --git a/.dev/revdep_emails/PosteriorBootstrap/email-body b/.dev/revdep_emails/PosteriorBootstrap/email-body new file mode 100644 index 000000000..1eb75b5aa --- /dev/null +++ b/.dev/revdep_emails/PosteriorBootstrap/email-body @@ -0,0 +1,27 @@ +Hello James Robinson! Thank you for using {lintr} in your package {PosteriorBootstrap}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/alan-turing-institute/PosteriorBootstrap using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 6s on CRAN vs. 5s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/RSQL/attachments/RSQL.warnings b/.dev/revdep_emails/RSQL/attachments/RSQL.warnings new file mode 100644 index 000000000..328bcbcc8 --- /dev/null +++ b/.dev/revdep_emails/RSQL/attachments/RSQL.warnings @@ -0,0 +1,2 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Trying to remove β€˜paren_brace_linter’ and β€˜function_left_parentheses’, which are not in `defaults`. diff --git a/.dev/revdep_emails/RSQL/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/RSQL/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..ce8c349d9 --- /dev/null +++ b/.dev/revdep_emails/RSQL/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,25 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/sql-lib.R",129,5,"style","`else` should come on the same line as the previous `}`."," else{","brace_linter" +"R/sql-lib.R",129,9,"style","There should be a space before an opening curly brace."," else{","brace_linter" +"R/sql-lib.R",138,42,"style","There should be a space before an opening curly brace."," setupResultClassFromDriver = function(){","brace_linter" +"R/sql-lib.R",138,42,"style","There should be a space between a right parenthesis and a body expression."," setupResultClassFromDriver = function(){","paren_body_linter" +"R/sql-lib.R",141,47,"style","There should be a space before an opening curly brace."," if (inherits(self$driver, ""SQLiteDriver"")){","brace_linter" +"R/sql-lib.R",141,47,"style","There should be a space between a right parenthesis and a body expression."," if (inherits(self$driver, ""SQLiteDriver"")){","paren_body_linter" +"R/sql-lib.R",145,43,"style","There should be a space before an opening curly brace."," if (inherits(self$driver, ""PqDriver"")){","brace_linter" +"R/sql-lib.R",145,43,"style","There should be a space between a right parenthesis and a body expression."," if (inherits(self$driver, ""PqDriver"")){","paren_body_linter" +"R/sql-lib.R",148,37,"style","There should be a space before an opening curly brace."," if (is.null(self$results.class)){","brace_linter" +"R/sql-lib.R",148,37,"style","There should be a space between a right parenthesis and a body expression."," if (is.null(self$results.class)){","paren_body_linter" +"R/sql-lib.R",412,31,"style","There should be a space before an opening curly brace."," clearLastResult = function(){","brace_linter" +"R/sql-lib.R",412,31,"style","There should be a space between a right parenthesis and a body expression."," clearLastResult = function(){","paren_body_linter" +"R/sql-lib.R",413,63,"style","There should be a space before an opening curly brace."," if (!is.null(self$results.class) & !is.null(self$last.rs)){","brace_linter" +"R/sql-lib.R",413,63,"style","There should be a space between a right parenthesis and a body expression."," if (!is.null(self$results.class) & !is.null(self$last.rs)){","paren_body_linter" +"R/sql-lib.R",414,54,"style","There should be a space before an opening curly brace."," if (inherits(self$last.rs, self$results.class)){","brace_linter" +"R/sql-lib.R",414,54,"style","There should be a space between a right parenthesis and a body expression."," if (inherits(self$last.rs, self$results.class)){","paren_body_linter" +"R/sql-lib.R",425,26,"style","There should be a space before an opening curly brace."," getSummary = function(){","brace_linter" +"R/sql-lib.R",425,26,"style","There should be a space between a right parenthesis and a body expression."," getSummary = function(){","paren_body_linter" +"R/sql-lib.R",575,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," while (!ret & i <= length(quotes_symbols)) {","vector_logic_linter" +"R/sql-lib.R",683,38,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (quotes == substr(text, 1, 1) & quotes == substr(text, nchar(text), nchar(text))) {","vector_logic_linter" +"R/sql-lib.R",906,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(where_fields) > 0 & !(length(where_fields) == 1 & nchar(where_fields[1]) ==","vector_logic_linter" +"R/sql-lib.R",906,64,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(where_fields) > 0 & !(length(where_fields) == 1 & nchar(where_fields[1]) ==","vector_logic_linter" +"R/sql-lib.R",1022,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(values_df) > 1 & !inherits(values_df, ""data.frame"")) {","vector_logic_linter" +"R/sql-lib.R",1258,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nrow(values) > 0 & nrow(values) != nrow(values_uk)) {","vector_logic_linter" diff --git a/.dev/revdep_emails/RSQL/email-body b/.dev/revdep_emails/RSQL/email-body new file mode 100644 index 000000000..8a1ce010e --- /dev/null +++ b/.dev/revdep_emails/RSQL/email-body @@ -0,0 +1,27 @@ +Hello Alejandro Baranek! Thank you for using {lintr} in your package {RSQL}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/rOpenStats/RSQL using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 6s on CRAN vs. 3s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/RestRserve/attachments/RestRserve.failure b/.dev/revdep_emails/RestRserve/attachments/RestRserve.failure new file mode 100644 index 000000000..08edf6748 --- /dev/null +++ b/.dev/revdep_emails/RestRserve/attachments/RestRserve.failure @@ -0,0 +1 @@ +`defaults` must be a named list. diff --git a/.dev/revdep_emails/RestRserve/attachments/RestRserve.warnings b/.dev/revdep_emails/RestRserve/attachments/RestRserve.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/RestRserve/attachments/RestRserve.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/RestRserve/email-body b/.dev/revdep_emails/RestRserve/email-body new file mode 100644 index 000000000..27b3c8e20 --- /dev/null +++ b/.dev/revdep_emails/RestRserve/email-body @@ -0,0 +1,27 @@ +Hello Dmitry Selivanov! Thank you for using {lintr} in your package {RestRserve}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/rexyai/RestRserve using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 23s on CRAN vs. 0s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/SamplerCompare/email-body b/.dev/revdep_emails/SamplerCompare/email-body new file mode 100644 index 000000000..78ef66965 --- /dev/null +++ b/.dev/revdep_emails/SamplerCompare/email-body @@ -0,0 +1,27 @@ +Hello Madeleine Thompson! Thank you for using {lintr} in your package {SamplerCompare}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cran/SamplerCompare using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took NAs on CRAN vs. NAs in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/TDA/email-body b/.dev/revdep_emails/TDA/email-body new file mode 100644 index 000000000..5af2fe801 --- /dev/null +++ b/.dev/revdep_emails/TDA/email-body @@ -0,0 +1,27 @@ +Hello Jisu Kim! Thank you for using {lintr} in your package {TDA}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cran/TDA using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took NAs on CRAN vs. NAs in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/WikidataQueryServiceR/attachments/WikidataQueryServiceR.warnings b/.dev/revdep_emails/WikidataQueryServiceR/attachments/WikidataQueryServiceR.warnings new file mode 100644 index 000000000..2bb977138 --- /dev/null +++ b/.dev/revdep_emails/WikidataQueryServiceR/attachments/WikidataQueryServiceR.warnings @@ -0,0 +1,2 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Trying to remove β€˜closed_curly_linter’, β€˜open_curly_linter’ and β€˜camel_case_linter’, which are not in `defaults`. diff --git a/.dev/revdep_emails/WikidataQueryServiceR/email-body b/.dev/revdep_emails/WikidataQueryServiceR/email-body new file mode 100644 index 000000000..bf8dcef9b --- /dev/null +++ b/.dev/revdep_emails/WikidataQueryServiceR/email-body @@ -0,0 +1,27 @@ +Hello Mikhail Popov! Thank you for using {lintr} in your package {WikidataQueryServiceR}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/bearloga/WikidataQueryServiceR using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 2s on CRAN vs. 1s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/WoodburyMatrix/attachments/WoodburyMatrix.warnings b/.dev/revdep_emails/WoodburyMatrix/attachments/WoodburyMatrix.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/WoodburyMatrix/attachments/WoodburyMatrix.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/WoodburyMatrix/email-body b/.dev/revdep_emails/WoodburyMatrix/email-body new file mode 100644 index 000000000..e82bd6bca --- /dev/null +++ b/.dev/revdep_emails/WoodburyMatrix/email-body @@ -0,0 +1,27 @@ +Hello Michael Bertolacci! Thank you for using {lintr} in your package {WoodburyMatrix}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/mbertolacci/WoodburyMatrix using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 5s on CRAN vs. 3s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/abbyyR/email-body b/.dev/revdep_emails/abbyyR/email-body new file mode 100644 index 000000000..ec6dd0959 --- /dev/null +++ b/.dev/revdep_emails/abbyyR/email-body @@ -0,0 +1,27 @@ +Hello Gaurav Sood! Thank you for using {lintr} in your package {abbyyR}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at http://github.com/soodoku/abbyyR using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 0s on CRAN vs. 0s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/adaptalint/email-body b/.dev/revdep_emails/adaptalint/email-body new file mode 100644 index 000000000..38ffd6003 --- /dev/null +++ b/.dev/revdep_emails/adaptalint/email-body @@ -0,0 +1,27 @@ +Hello Max Conway! Thank you for using {lintr} in your package {adaptalint}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cran/adaptalint using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took NAs on CRAN vs. NAs in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/admiral/email-body b/.dev/revdep_emails/admiral/email-body new file mode 100644 index 000000000..47d3f3ae9 --- /dev/null +++ b/.dev/revdep_emails/admiral/email-body @@ -0,0 +1,27 @@ +Hello Thomas Neitmann! Thank you for using {lintr} in your package {admiral}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cran/admiral using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took NAs on CRAN vs. NAs in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/autoharp/email-body b/.dev/revdep_emails/autoharp/email-body new file mode 100644 index 000000000..07b6f67da --- /dev/null +++ b/.dev/revdep_emails/autoharp/email-body @@ -0,0 +1,27 @@ +Hello Vik Gopal! Thank you for using {lintr} in your package {autoharp}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cran/autoharp using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took NAs on CRAN vs. NAs in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/aws.alexa/email-body b/.dev/revdep_emails/aws.alexa/email-body new file mode 100644 index 000000000..beb7aba41 --- /dev/null +++ b/.dev/revdep_emails/aws.alexa/email-body @@ -0,0 +1,27 @@ +Hello Gaurav Sood! Thank you for using {lintr} in your package {aws.alexa}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cran/aws.alexa using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took NAs on CRAN vs. NAs in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/babette/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/babette/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..1e3a63aa0 --- /dev/null +++ b/.dev/revdep_emails/babette/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,5 @@ +"filename","line_number","column_number","type","message","line","linter" +"vignettes/nested_sampling.Rmd",122,4,"style","Trailing whitespace is superfluous."," ) ","trailing_whitespace_linter" +"vignettes/step_by_step.Rmd",51,45,"style","Trailing whitespace is superfluous."," pattern = ""treelog_"", fileext = "".trees"" ","trailing_whitespace_linter" +"vignettes/step_by_step.Rmd",145,81,"style","Lines should not be more than 80 characters."," knitr::kable(head(parse_beast_tracelog_file(inference_model$mcmc$tracelog$filename)))","line_length_linter" +"vignettes/step_by_step.Rmd",161,81,"style","Lines should not be more than 80 characters."," knitr::kable(head(parse_beast_state_operators(beast2_options$output_state_filename)))","line_length_linter" diff --git a/.dev/revdep_emails/babette/email-body b/.dev/revdep_emails/babette/email-body new file mode 100644 index 000000000..1955454b4 --- /dev/null +++ b/.dev/revdep_emails/babette/email-body @@ -0,0 +1,27 @@ +Hello RichΓ¨l J.C. Bilderbeek! Thank you for using {lintr} in your package {babette}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/ropensci/babette using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 21s on CRAN vs. 14s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/beautier/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/beautier/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..f632afb05 --- /dev/null +++ b/.dev/revdep_emails/beautier/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,3 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/create_branch_rate_model_xml.R",106,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/remove_empty_lines.R",13,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" diff --git a/.dev/revdep_emails/beautier/email-body b/.dev/revdep_emails/beautier/email-body new file mode 100644 index 000000000..ea0df4f14 --- /dev/null +++ b/.dev/revdep_emails/beautier/email-body @@ -0,0 +1,27 @@ +Hello RichΓ¨l J.C. Bilderbeek! Thank you for using {lintr} in your package {beautier}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/ropensci/beautier using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 258s on CRAN vs. 144s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/biolink/email-body b/.dev/revdep_emails/biolink/email-body new file mode 100644 index 000000000..aab48ed52 --- /dev/null +++ b/.dev/revdep_emails/biolink/email-body @@ -0,0 +1,27 @@ +Hello Aaron Wolen! Thank you for using {lintr} in your package {biolink}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cran/biolink using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took NAs on CRAN vs. NAs in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/caretEnsemble/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/caretEnsemble/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..b96c5293a --- /dev/null +++ b/.dev/revdep_emails/caretEnsemble/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,8 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/caretEnsemble.R",235,12,"style","Variable and function name style should be snake_case."," object$modelType <- extractModelTypes(object$models)[1]","object_name_linter" +"R/caretEnsemble.R",355,7,"style","Variable and function name style should be snake_case."," dat$metricSD <- dat[[paste0(metricLab, ""SD"")]]","object_name_linter" +"R/caretList.R",95,7,"style","Variable and function name style should be snake_case."," x$savePredictions <- ""final""","object_name_linter" +"R/caretList.R",100,7,"style","Variable and function name style should be snake_case."," x$savePredictions <- ""final""","object_name_linter" +"tests/testthat/test-caretList.R",143,15,"style","Variable and function name style should be snake_case."," models[[1]]$modelType <- ""Bogus""","object_name_linter" +"tests/testthat/test-caretList.R",202,3,"style","There should be a space between right parenthesis and an opening curly brace."," ){","paren_brace_linter" +"tests/testthat/test-caretList.R",252,3,"style","There should be a space between right parenthesis and an opening curly brace."," ){","paren_brace_linter" diff --git a/.dev/revdep_emails/caretEnsemble/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/caretEnsemble/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..aa0425e79 --- /dev/null +++ b/.dev/revdep_emails/caretEnsemble/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,114 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/caretEnsemble.R",93,9,"style","Variable and function name style should be snake_case or symbols."," names(modRes)[2:3] <- c(metric, paste0(metric, ""SD""))","object_name_linter" +"R/caretEnsemble.R",307,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/caretEnsemble.R",325,5,"style","Variable and function name style should be snake_case or symbols."," datList[[i]] <- model$models[[i]]$trainingData","object_name_linter" +"R/caretEnsemble.R",408,3,"style","Variable and function name style should be snake_case or symbols."," wghtFrame$method <- row.names(wghtFrame)","object_name_linter" +"R/caretEnsemble.R",409,9,"style","Variable and function name style should be snake_case or symbols."," names(wghtFrame) <- c(""weights"", ""method"")","object_name_linter" +"R/caretList.R",233,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/caretList.R",238,9,"style","Variable and function name style should be snake_case or symbols."," names(modelList) <- names(tuneList)","object_name_linter" +"R/caretList.R",245,9,"style","Variable and function name style should be snake_case or symbols."," class(modelList) <- c(""caretList"")","object_name_linter" +"R/caretList.R",344,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/caretList.R",349,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/caretStack.R",67,18,"style","Put spaces around all infix operators."," object, newdata=NULL,","infix_spaces_linter" +"R/caretStack.R",68,5,"style","Put spaces around all infix operators."," se=FALSE, level=0.95,","infix_spaces_linter" +"R/caretStack.R",68,18,"style","Put spaces around all infix operators."," se=FALSE, level=0.95,","infix_spaces_linter" +"R/caretStack.R",69,17,"style","Put spaces around all infix operators."," return_weights=FALSE,","infix_spaces_linter" +"R/caretStack.R",84,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/caretStack.R",87,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/caretStack.R",110,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/helper_functions.R",61,27,"style","Compound semicolons are discouraged. Replace them by a newline."," w <- w[i <- !is.na(x)]; x <- x[i]","semicolon_linter" +"tests/testthat/test-caretList.R",49,9,"style","Variable and function name style should be snake_case or symbols."," names(tuneList) <- all_models","object_name_linter" +"tests/testthat/test-caretList.R",50,9,"style","Variable and function name style should be snake_case or symbols."," names(tuneList)[c(1, 5, 10)] <- """"","object_name_linter" +"tests/testthat/test-caretList.R",155,9,"style","Variable and function name style should be snake_case or symbols."," class(modelList) <- ""list""","object_name_linter" +"tests/testthat/test-classSelection.R",109,15,"style","Any function spanning multiple lines should use curly braces."," refactor <- function(d) factor(","brace_linter" +"tests/testthat/test-ensemble.R",141,9,"style","Variable and function name style should be snake_case or symbols."," class(nestedList) <- ""caretList""","object_name_linter" +"tests/testthat/test-ensemble.R",149,3,"style","Variable and function name style should be snake_case or symbols."," X_reg_new[2, 3] <- NA","object_name_linter" +"tests/testthat/test-ensemble.R",150,3,"style","Variable and function name style should be snake_case or symbols."," X_reg_new[25, 3] <- NA","object_name_linter" +"tests/testthat/test-ensemble.R",197,3,"style","Variable and function name style should be snake_case or symbols."," custom.rf$method <- ""custom.rf""","object_name_linter" +"tests/testthat/test-ensemble.R",200,3,"style","Variable and function name style should be snake_case or symbols."," custom.rpart$method <- ""custom.rpart""","object_name_linter" +"tests/testthat/test-ensembleMethods.R",20,9,"style","Variable and function name style should be snake_case or symbols."," class(models.subset) <- ""caretList""","object_name_linter" +"tests/testthat/test-ensembleMethods.R",36,9,"style","Variable and function name style should be snake_case or symbols."," class(models.subset) <- ""caretList""","object_name_linter" +"tests/testthat/test-ensembleMethods.R",58,9,"style","Variable and function name style should be snake_case or symbols."," class(models.subset) <- ""caretList""","object_name_linter" +"tests/testthat/test-ensembleMethods.R",93,9,"style","Variable and function name style should be snake_case or symbols."," class(models.subset) <- ""caretList""","object_name_linter" +"tests/testthat/test-ensembleMethods.R",138,9,"style","Variable and function name style should be snake_case or symbols."," class(models.subset) <- ""caretList""","object_name_linter" +"tests/testthat/test-ensembleMethods.R",181,9,"style","Variable and function name style should be snake_case or symbols."," class(models.subset) <- ""caretList""","object_name_linter" +"tests/testthat/test-ensembleMethods.R",203,14,"style","Variable and function name style should be snake_case or symbols."," attributes(mr2.tmp1) <- NULL","object_name_linter" +"tests/testthat/test-ensembleMethods.R",242,9,"style","Variable and function name style should be snake_case or symbols."," class(models.subset) <- ""caretList""","object_name_linter" +"tests/testthat/test-ensembleMethods.R",257,9,"style","Variable and function name style should be snake_case or symbols."," class(models.class2) <- ""caretList""","object_name_linter" +"tests/testthat/test-ensembleMethods.R",260,3,"style","Variable and function name style should be snake_case or symbols."," newDat[2, 2] <- NA","object_name_linter" +"tests/testthat/test-ensembleMethods.R",261,3,"style","Variable and function name style should be snake_case or symbols."," newDat[3, 3] <- NA","object_name_linter" +"tests/testthat/test-ensembleMethods.R",262,3,"style","Variable and function name style should be snake_case or symbols."," newDat[4, 4] <- NA","object_name_linter" +"tests/testthat/test-ensembleMethods.R",289,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"tests/testthat/test-ensembleMethods.R",296,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"tests/testthat/test-ensembleMethods.R",318,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"tests/testthat/test-ensembleMethods.R",325,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"vignettes/caretEnsemble-intro.Rmd",33,1,"style","Variable and function name style should be snake_case or symbols.","inTrain <- createDataPartition(y = Sonar$Class, p = .75, list = FALSE)","object_name_linter" +"vignettes/caretEnsemble-intro.Rmd",34,19,"style","Do not place spaces after square brackets.","training <- Sonar[ inTrain,]","spaces_inside_linter" +"vignettes/caretEnsemble-intro.Rmd",34,28,"style","Commas should always have a space after.","training <- Sonar[ inTrain,]","commas_linter" +"vignettes/caretEnsemble-intro.Rmd",35,27,"style","Commas should always have a space after.","testing <- Sonar[-inTrain,]","commas_linter" +"vignettes/caretEnsemble-intro.Rmd",37,9,"style","Put spaces around all infix operators."," method=""boot"",","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",38,9,"style","Put spaces around all infix operators."," number=25,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",39,18,"style","Put spaces around all infix operators."," savePredictions=""final"",","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",40,13,"style","Put spaces around all infix operators."," classProbs=TRUE,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",41,8,"style","Put spaces around all infix operators."," index=createResample(training$Class, 25),","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",42,18,"style","Put spaces around all infix operators."," summaryFunction=twoClassSummary","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",52,8,"style","Put spaces around all infix operators."," Class~., data=training,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",52,16,"style","Put spaces around all infix operators."," Class~., data=training,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",53,12,"style","Put spaces around all infix operators."," trControl=my_control,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",54,13,"style","Put spaces around all infix operators."," methodList=c(""glm"", ""rpart"")","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",60,47,"style","Put spaces around all infix operators.","p <- as.data.frame(predict(model_list, newdata=head(testing)))","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",78,8,"style","Put spaces around all infix operators."," Class~., data=training,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",78,16,"style","Put spaces around all infix operators."," Class~., data=training,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",79,12,"style","Put spaces around all infix operators."," trControl=my_control,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",80,9,"style","Put spaces around all infix operators."," metric=""ROC"",","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",81,13,"style","Put spaces around all infix operators."," methodList=c(""glm"", ""rpart""),","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",82,11,"style","Put spaces around all infix operators."," tuneList=list(","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",83,8,"style","Put spaces around all infix operators."," rf1=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=2)),","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",83,30,"style","Put spaces around all infix operators."," rf1=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=2)),","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",83,45,"style","Put spaces around all infix operators."," rf1=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=2)),","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",83,62,"style","Put spaces around all infix operators."," rf1=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=2)),","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",84,8,"style","Put spaces around all infix operators."," rf2=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=10), preProcess=""pca""),","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",84,30,"style","Put spaces around all infix operators."," rf2=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=10), preProcess=""pca""),","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",84,45,"style","Put spaces around all infix operators."," rf2=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=10), preProcess=""pca""),","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",84,62,"style","Put spaces around all infix operators."," rf2=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=10), preProcess=""pca""),","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",84,78,"style","Put spaces around all infix operators."," rf2=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=10), preProcess=""pca""),","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",84,81,"style","Lines should not be more than 80 characters."," rf2=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=10), preProcess=""pca""),","line_length_linter" +"vignettes/caretEnsemble-intro.Rmd",85,7,"style","Put spaces around all infix operators."," nn=caretModelSpec(method=""nnet"", tuneLength=2, trace=FALSE)","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",85,29,"style","Put spaces around all infix operators."," nn=caretModelSpec(method=""nnet"", tuneLength=2, trace=FALSE)","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",85,48,"style","Put spaces around all infix operators."," nn=caretModelSpec(method=""nnet"", tuneLength=2, trace=FALSE)","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",85,57,"style","Put spaces around all infix operators."," nn=caretModelSpec(method=""nnet"", tuneLength=2, trace=FALSE)","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",108,14,"style","Trailing whitespace is superfluous."," model_list, ","trailing_whitespace_linter" +"vignettes/caretEnsemble-intro.Rmd",109,9,"style","Put spaces around all infix operators."," metric=""ROC"",","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",110,12,"style","Put spaces around all infix operators."," trControl=trainControl(","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",111,11,"style","Put spaces around all infix operators."," number=2,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",112,20,"style","Put spaces around all infix operators."," summaryFunction=twoClassSummary,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",113,15,"style","Put spaces around all infix operators."," classProbs=TRUE","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",121,51,"style","Put spaces around all infix operators.","model_preds <- lapply(model_list, predict, newdata=testing, type=""prob"")","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",121,65,"style","Put spaces around all infix operators.","model_preds <- lapply(model_list, predict, newdata=testing, type=""prob"")","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",122,51,"style","Commas should always have a space after.","model_preds <- lapply(model_preds, function(x) x[,""M""])","commas_linter" +"vignettes/caretEnsemble-intro.Rmd",124,46,"style","Put spaces around all infix operators.","ens_preds <- predict(greedy_ensemble, newdata=testing, type=""prob"")","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",124,60,"style","Put spaces around all infix operators.","ens_preds <- predict(greedy_ensemble, newdata=testing, type=""prob"")","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",147,9,"style","Put spaces around all infix operators."," method=""glm"",","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",148,9,"style","Put spaces around all infix operators."," metric=""ROC"",","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",149,12,"style","Put spaces around all infix operators."," trControl=trainControl(","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",150,11,"style","Put spaces around all infix operators."," method=""boot"",","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",151,11,"style","Put spaces around all infix operators."," number=10,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",152,20,"style","Put spaces around all infix operators."," savePredictions=""final"",","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",153,15,"style","Put spaces around all infix operators."," classProbs=TRUE,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",154,20,"style","Put spaces around all infix operators."," summaryFunction=twoClassSummary","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",158,55,"style","Put spaces around all infix operators.","model_preds2$ensemble <- predict(glm_ensemble, newdata=testing, type=""prob"")","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",158,69,"style","Put spaces around all infix operators.","model_preds2$ensemble <- predict(glm_ensemble, newdata=testing, type=""prob"")","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",159,1,"style","Variable and function name style should be snake_case or symbols.","CF <- coef(glm_ensemble$ens_model$finalModel)[-1]","object_name_linter" +"vignettes/caretEnsemble-intro.Rmd",161,3,"style","Put spaces around all infix operators.","CF/sum(CF)","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",175,9,"style","Put spaces around all infix operators."," method=""gbm"",","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",176,10,"style","Put spaces around all infix operators."," verbose=FALSE,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",177,13,"style","Put spaces around all infix operators."," tuneLength=10,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",178,9,"style","Put spaces around all infix operators."," metric=""ROC"",","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",179,12,"style","Put spaces around all infix operators."," trControl=trainControl(","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",180,11,"style","Put spaces around all infix operators."," method=""boot"",","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",181,11,"style","Put spaces around all infix operators."," number=10,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",182,20,"style","Put spaces around all infix operators."," savePredictions=""final"",","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",183,15,"style","Put spaces around all infix operators."," classProbs=TRUE,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",184,20,"style","Put spaces around all infix operators."," summaryFunction=twoClassSummary","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",188,55,"style","Put spaces around all infix operators.","model_preds3$ensemble <- predict(gbm_ensemble, newdata=testing, type=""prob"")","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",188,69,"style","Put spaces around all infix operators.","model_preds3$ensemble <- predict(gbm_ensemble, newdata=testing, type=""prob"")","infix_spaces_linter" diff --git a/.dev/revdep_emails/caretEnsemble/email-body b/.dev/revdep_emails/caretEnsemble/email-body new file mode 100644 index 000000000..612602379 --- /dev/null +++ b/.dev/revdep_emails/caretEnsemble/email-body @@ -0,0 +1,27 @@ +Hello Zachary A. Deane-Mayer! Thank you for using {lintr} in your package {caretEnsemble}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/zachmayer/caretEnsemble using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 25s on CRAN vs. 15s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/cattonum/attachments/cattonum.warnings b/.dev/revdep_emails/cattonum/attachments/cattonum.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/cattonum/attachments/cattonum.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/cattonum/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/cattonum/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..2625ea5b8 --- /dev/null +++ b/.dev/revdep_emails/cattonum/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,2 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/cattonum.R",18,1,"style","Variable and function name style should be snake_case.",".onAttach <- function(libname, pkgname) {","object_name_linter" diff --git a/.dev/revdep_emails/cattonum/email-body b/.dev/revdep_emails/cattonum/email-body new file mode 100644 index 000000000..3ac067be3 --- /dev/null +++ b/.dev/revdep_emails/cattonum/email-body @@ -0,0 +1,27 @@ +Hello Bernie Gray! Thank you for using {lintr} in your package {cattonum}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/bfgray3/cattonum using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 12s on CRAN vs. 8s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/cleaR/attachments/cleaR.warnings b/.dev/revdep_emails/cleaR/attachments/cleaR.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/cleaR/attachments/cleaR.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/cleaR/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/cleaR/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..6d25f7316 --- /dev/null +++ b/.dev/revdep_emails/cleaR/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,29 @@ +"filename","line_number","column_number","type","message","line","linter" +"data-raw/devstuffs.R",57,2,"style","Commented code should be removed.","#usethis::use_gpl3_license(name = ""UniversitΓ€tsklinikum Erlangen"")","commented_code_linter" +"data-raw/devstuffs.R",61,81,"style","Lines should not be more than 80 characters.","# Listing a package in either Depends or Imports ensures that it’s installed when needed","line_length_linter" +"data-raw/devstuffs.R",63,81,"style","Lines should not be more than 80 characters.","# Loading will load code, data and any DLLs; register S3 and S4 methods; and run the .onLoad() function.","line_length_linter" +"data-raw/devstuffs.R",64,81,"style","Lines should not be more than 80 characters.","## After loading, the package is available in memory, but because it’s not in the search path,","line_length_linter" +"data-raw/devstuffs.R",66,81,"style","Lines should not be more than 80 characters.","## Confusingly, :: will also load a package automatically if it isn’t already loaded.","line_length_linter" +"data-raw/devstuffs.R",67,81,"style","Lines should not be more than 80 characters.","## It’s rare to load a package explicitly, but you can do so with requireNamespace() or loadNamespace().","line_length_linter" +"data-raw/devstuffs.R",68,81,"style","Lines should not be more than 80 characters.","# Attaching puts the package in the search path. You can’t attach a package without first loading it,","line_length_linter" +"data-raw/devstuffs.R",78,3,"style","Commented code should be removed.","# usethis::use_package(""config"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",79,3,"style","Commented code should be removed.","# usethis::use_package(""magrittr"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",80,3,"style","Commented code should be removed.","# usethis::use_package(""data.table"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",82,3,"style","Commented code should be removed.","# usethis::use_package(""Hmisc"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",84,3,"style","Commented code should be removed.","# usethis::use_package(""parsedate"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",86,3,"style","Commented code should be removed.","# usethis::use_package(""psych"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",88,3,"style","Commented code should be removed.","# usethis::use_package(""RJSONIO"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",89,3,"style","Commented code should be removed.","# usethis::use_package(""shiny"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",90,3,"style","Commented code should be removed.","# usethis::use_package(""shinyjs"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",92,3,"style","Commented code should be removed.","# usethis::use_package(""xml2"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",94,3,"style","Commented code should be removed.","# usethis::use_package(""logger"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",100,3,"style","Commented code should be removed.","# usethis::use_package(""shiny"", type = ""Suggests"")","commented_code_linter" +"data-raw/devstuffs.R",101,3,"style","Commented code should be removed.","# usethis::use_package(""shinyjs"", type = ""Suggests"")","commented_code_linter" +"data-raw/devstuffs.R",112,81,"style","Lines should not be more than 80 characters.","usethis::use_build_ignore(""## Please apply changes in `./data-raw/devstuffs.R`!"")","line_length_linter" +"data-raw/devstuffs.R",170,3,"style","Commented code should be removed.","# covr::package_coverage()","commented_code_linter" +"data-raw/devstuffs.R",173,3,"style","Commented code should be removed.","# lintr::lint_package()","commented_code_linter" +"data-raw/devstuffs.R",176,3,"style","Commented code should be removed.","# devtools::test()","commented_code_linter" +"data-raw/devstuffs.R",179,3,"style","Commented code should be removed.","# rcmdcheck::rcmdcheck()","commented_code_linter" +"data-raw/devstuffs.R",180,3,"style","Commented code should be removed.","# rcmdcheck::rcmdcheck(args = ""--no-vignettes"", build_args = ""--no-build-vignettes"")","commented_code_linter" +"data-raw/devstuffs.R",180,81,"style","Lines should not be more than 80 characters.","# rcmdcheck::rcmdcheck(args = ""--no-vignettes"", build_args = ""--no-build-vignettes"")","line_length_linter" +"data-raw/devstuffs.R",188,3,"style","Commented code should be removed.","# build|ci|docs|feat|fix|perf|refactor|test","commented_code_linter" diff --git a/.dev/revdep_emails/cleaR/email-body b/.dev/revdep_emails/cleaR/email-body new file mode 100644 index 000000000..de101ff46 --- /dev/null +++ b/.dev/revdep_emails/cleaR/email-body @@ -0,0 +1,27 @@ +Hello Jonathan M. Mang! Thank you for using {lintr} in your package {cleaR}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/joundso/cleaR using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 1s on CRAN vs. 1s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/cloudos/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/cloudos/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..69f2dd16c --- /dev/null +++ b/.dev/revdep_emails/cloudos/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,19 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/cb_cohort_extract.R",124,36,"style","Variable and function name style should be snake_case."," req_body$criteria$pagination$pageNumber <- i","object_name_linter" +"R/cb_cohort_extract.R",125,36,"style","Variable and function name style should be snake_case."," req_body$criteria$pagination$pageSize <- page_size","object_name_linter" +"R/cb_cohort_extract.R",224,33,"style","There should be a space between right parenthesis and an opening curly brace."," for (col in res$header$columns){","paren_brace_linter" +"R/cb_cohort_extract.R",301,25,"style","There should be a space between right parenthesis and an opening curly brace."," for (col in res$header){","paren_brace_linter" +"R/cb_cohort_extract.R",349,35,"style","There should be a space between right parenthesis and an opening curly brace."," for (colname in colnames(res_df)){","paren_brace_linter" +"R/cb_cohort_extract.R",426,25,"style","There should be a space between right parenthesis and an opening curly brace."," for (col in res$header){","paren_brace_linter" +"R/cb_cohort_extract.R",474,27,"style","There should be a space between right parenthesis and an opening curly brace."," for (group in datagroups){","paren_brace_linter" +"R/cb_cohort_extract.R",476,33,"style","There should be a space between right parenthesis and an opening curly brace."," for (colname in colnames(df)){","paren_brace_linter" +"R/cb_cohort_extract.R",485,37,"style","There should be a space between right parenthesis and an opening curly brace."," for (colname in colnames(final_df)){","paren_brace_linter" +"R/cb_cohorts_list.R",85,11,"style","Variable and function name style should be snake_case."," cohorts$numberOfFilters <- sapply(cohorts$phenotypeFilters, nrow)","object_name_linter" +"R/cb_filter_apply.R",10,26,"style","There should be a space between right parenthesis and an opening curly brace."," for (filter in unnested){","paren_brace_linter" +"R/cb_filter_explore.R",117,25,"style","Variable and function name style should be snake_case."," req_body$criteria$pageNumber <- i","object_name_linter" +"R/cb_filter_explore.R",118,25,"style","Variable and function name style should be snake_case."," req_body$criteria$pageSize <- page_size","object_name_linter" +"R/cb_filter_explore.R",195,1,"style","Variable and function names should not be longer than 30 characters.",".cb_get_phenotype_statistics_v1 <- function(cohort, pheno_id) {","object_length_linter" +"R/cb_filter_explore.R",199,45,"style","There should be a space between right parenthesis and an opening curly brace."," for (filter in .unnest_query(cohort@query)){","paren_brace_linter" +"R/cb_json.R",42,26,"style","There should be a space between right parenthesis and an opening curly brace."," for (filter in unnested){","paren_brace_linter" +"R/zzz.R",1,1,"style","Variable and function name style should be snake_case.",".onLoad <- function(libname, pkgname, ...) {","object_name_linter" +"R/zzz.R",5,1,"style","Variable and function name style should be snake_case.",".onAttach <- function(libname, pkgname, ...) {","object_name_linter" diff --git a/.dev/revdep_emails/cloudos/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/cloudos/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..83b188f3a --- /dev/null +++ b/.dev/revdep_emails/cloudos/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,25 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/cb_class.R",84,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/cb_cohort_extract.R",109,67,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(req_body, auto_unbox = T),","T_and_F_symbol_linter" +"R/cb_cohort_extract.R",129,71,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(req_body, auto_unbox = T),","T_and_F_symbol_linter" +"R/cb_cohort_extract.R",197,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/cb_cohort_extract.R",213,35,"style","Use TRUE instead of the symbol T."," auto_unbox = T),","T_and_F_symbol_linter" +"R/cb_cohorts_list.R",39,48,"style","Use TRUE instead of the symbol T."," res <- httr::content(r, simplifyDataFrame = T)","T_and_F_symbol_linter" +"R/cb_filter_apply.R",59,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," starting_depth > 1 &","vector_logic_linter" +"R/cb_filter_apply.R",77,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (keep_query & !identical(cohort@query, list())) {","vector_logic_linter" +"R/cb_filter_apply.R",81,3,"style","`else` should come on the same line as the previous `}`."," else if (keep_query) {","brace_linter" +"R/cb_filter_apply.R",96,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !is.null(x$operator) &","vector_logic_linter" +"R/cb_filter_apply.R",171,64,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(r_body, auto_unbox = T),","T_and_F_symbol_linter" +"R/cb_filter_apply.R",192,80,"style","Use FALSE instead of the symbol F."," no_participants <- cb_participant_count(cohort, query = query, keep_query = F)","T_and_F_symbol_linter" +"R/cb_filter_apply.R",212,64,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(r_body, auto_unbox = T),","T_and_F_symbol_linter" +"R/cb_filter_explore.R",95,67,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(req_body, auto_unbox = T),","T_and_F_symbol_linter" +"R/cb_filter_explore.R",114,16,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (iter_all & paged) {","vector_logic_linter" +"R/cb_filter_explore.R",122,71,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(req_body, auto_unbox = T),","T_and_F_symbol_linter" +"R/cb_filter_explore.R",149,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(item$children) > 0 & depth < max_depth) {","vector_logic_linter" +"R/cb_filter_explore.R",224,65,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(r_body, auto_unbox = T),","T_and_F_symbol_linter" +"R/cb_filter_explore.R",328,65,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(r_body, auto_unbox = T),","T_and_F_symbol_linter" +"R/cb_filter_explore.R",346,67,"style","Use TRUE instead of the symbol T."," r_body <- jsonlite::toJSON(list(query = query), auto_unbox = T)","T_and_F_symbol_linter" +"R/cb_plots.R",118,12,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/cb_set_columns.R",77,64,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(r_body, auto_unbox = T),","T_and_F_symbol_linter" +"R/cb_set_columns.R",112,64,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(r_body, auto_unbox = T),","T_and_F_symbol_linter" +"tests/testthat/helper.R",6,5,"style","Missing terminal newline.","# })","trailing_blank_lines_linter" diff --git a/.dev/revdep_emails/cloudos/email-body b/.dev/revdep_emails/cloudos/email-body new file mode 100644 index 000000000..b88ea514d --- /dev/null +++ b/.dev/revdep_emails/cloudos/email-body @@ -0,0 +1,27 @@ +Hello Sangram Keshari Sahu! Thank you for using {lintr} in your package {cloudos}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/lifebit-ai/cloudos using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 17s on CRAN vs. 10s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/connectwidgets/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/connectwidgets/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..f739c78e0 --- /dev/null +++ b/.dev/revdep_emails/connectwidgets/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,9 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/rmarkdown/templates/connectwidgets/skeleton/skeleton.Rmd",14,5,"style","Commented code should be removed."," # api_key = Sys.getenv(""CONNECT_API_KEY"")","commented_code_linter" +"R/connect.R",46,56,"style","Use TRUE instead of the symbol T."," jsonlite::fromJSON(results, simplifyDataFrame = T)","T_and_F_symbol_linter" +"R/theme.R",274,47,"style","Trailing semicolons are not needed."," page_btns_style[""background""] <- ""#5A5B5A"";","semicolon_linter" +"tests/testthat/setup.R",11,3,"warning","no visible global function definition for β€˜stub_request’"," stub_request(""get"", ""https://example.com/__api__/server_settings"") %>%","object_usage_linter" +"tests/testthat/setup.R",12,5,"warning","no visible global function definition for β€˜to_return’"," to_return(","object_usage_linter" +"tests/testthat/setup.R",31,3,"warning","no visible global function definition for β€˜stub_request’"," stub_request(","object_usage_linter" +"tests/testthat/setup.R",34,9,"warning","no visible global function definition for β€˜to_return’"," ) %>% to_return(","object_usage_linter" +"vignettes/using-crosstalk.Rmd",80,81,"style","Lines should not be more than 80 characters."," rsc_grid(crosstalk::SharedData$new(..2, key = ~ guid, group = ""xfilter""))","line_length_linter" diff --git a/.dev/revdep_emails/connectwidgets/email-body b/.dev/revdep_emails/connectwidgets/email-body new file mode 100644 index 000000000..ffb96660d --- /dev/null +++ b/.dev/revdep_emails/connectwidgets/email-body @@ -0,0 +1,27 @@ +Hello Brian Smith! Thank you for using {lintr} in your package {connectwidgets}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/rstudio/connectwidgets using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 15s on CRAN vs. 8s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/crunch/attachments/crunch.warnings b/.dev/revdep_emails/crunch/attachments/crunch.warnings new file mode 100644 index 000000000..7c377045e --- /dev/null +++ b/.dev/revdep_emails/crunch/attachments/crunch.warnings @@ -0,0 +1,2 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Trying to remove β€˜closed_curly_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/crunch/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/crunch/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..6b5a8ff9a --- /dev/null +++ b/.dev/revdep_emails/crunch/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,2 @@ +"filename","line_number","column_number","type","message","line","linter" +"tests/testthat/test-misc.R",203,9,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" diff --git a/.dev/revdep_emails/crunch/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/crunch/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..fbb66262f --- /dev/null +++ b/.dev/revdep_emails/crunch/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,765 @@ +"filename","line_number","column_number","type","message","line","linter" +"data-raw/SO-survey.R",1,101,"style","Lines should not be more than 100 characters.","stack_df <- read.csv(""data-raw/survey_results_public.csv"") ## This file is big and not checked into git","line_length_linter" +"R/case-variables.R",98,29,"style","Any function spanning multiple lines should use curly braces."," cases <- mapply(function(e, n) list(","brace_linter" +"R/case-variables.R",248,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(case$id) & !is.whole(case$id)) {","vector_logic_linter" +"R/case-variables.R",264,38,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(case$numeric_value) & !is.numeric(case$numeric_value)) {","vector_logic_linter" +"R/case-variables.R",267,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.logical(case$missing) | is.na(case$missing)) {","vector_logic_linter" +"R/categories.R",157,5,"warning","local variable β€˜out’ assigned but may not be used"," out <- handleMissingCategoryLookup(ix, value, strict = TRUE)","object_usage_linter" +"R/categories.R",321,9,"warning","local variable β€˜ent’ assigned but may not be used"," ent <- setEntitySlot(entity(x), ""categories"", value)","object_usage_linter" +"R/categories.R",331,9,"warning","local variable β€˜ent’ assigned but may not be used"," ent <- setEntitySlot(entity(x), ""categories"", value)","object_usage_linter" +"R/change-category-id.R",32,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(is.numeric(from) & length(from) == 1)) {","vector_logic_linter" +"R/change-category-id.R",36,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(is.numeric(to) & length(to) == 1)) {","vector_logic_linter" +"R/combine-categories.R",52,41,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (is.Categorical(variable) | is.CategoricalArray(variable)) {","vector_logic_linter" +"R/combine-categories.R",66,36,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(is.Categorical(variable) | is.CategoricalArray(variable) | is.Expr(variable))) {","vector_logic_linter" +"R/combine-categories.R",66,68,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(is.Categorical(variable) | is.CategoricalArray(variable) | is.Expr(variable))) {","vector_logic_linter" +"R/combine-categories.R",102,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(is.MR(variable) | is.Expr(variable))) {","vector_logic_linter" +"R/conditional-transform.R",99,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (type != ""categorical"" & !is.null(categories)) {","vector_logic_linter" +"R/crunch-data-frame.R",101,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(out) == 1 & drop) {","vector_logic_linter" +"R/crunch-data-frame.R",160,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (is.numeric(j) | is.logical(j)) {","vector_logic_linter" +"R/crunch-data-frame.R",248,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(value) & missing(row_inds)) {","vector_logic_linter" +"R/crunch-data-frame.R",257,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(value) == 1 & length(row_inds) > 1) {","vector_logic_linter" +"R/cube-residuals.R",142,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((dim == ""cols"" & startsWith(dim_types[2], ""mr_"")) |","vector_logic_linter" +"R/cube-residuals.R",142,59,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((dim == ""cols"" & startsWith(dim_types[2], ""mr_"")) |","vector_logic_linter" +"R/cube-residuals.R",143,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," (dim == ""rows"" & startsWith(dim_types[1], ""mr_""))) {","vector_logic_linter" +"R/cube-residuals.R",292,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(dim(values)) & identical(dim(values), as.integer(c(nrow, ncol)))) {","vector_logic_linter" +"R/expressions.R",674,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(category_order) | is.numeric(category_order)) {","vector_logic_linter" +"R/fill-variable.R",36,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(dots) == 0 & missing(fills)) {","vector_logic_linter" +"R/fill-variable.R",39,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(dots) > 0 & !missing(fills)) {","vector_logic_linter" +"R/filters.R",45,13,"warning","local variable β€˜f’ assigned but may not be used"," f <- .newFilter(i, value, catalog_url = self(x))","object_usage_linter" +"R/folders.R",57,5,"warning","local variable β€˜fns’ assigned but may not be used"," fns <- list(","object_usage_linter" +"R/folders.R",323,5,"warning","local variable β€˜out’ assigned but may not be used"," out <- lapply(seq_along(folder), function(i) {","object_usage_linter" +"R/folders.R",379,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.dataset(source) | !is.dataset(target)) {","vector_logic_linter" +"R/formula.R",247,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (is.CA(x) | is.NumericArray(x)) {","vector_logic_linter" +"R/geo.R",61,9,"warning","local variable β€˜ent’ assigned but may not be used"," ent <- setEntitySlot(entity(x), ""view"", geodata)","object_usage_linter" +"R/geo.R",135,61,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(unique(match_scores$geodatum_name)) == 1 &","vector_logic_linter" +"R/hide-variables.R",140,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" +"R/insertions.R",110,50,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.character(anchor) && (anchor == ""top"" | anchor == ""bottom"")) {","vector_logic_linter" +"R/make-array.R",221,35,"style","Any function spanning multiple lines should use curly braces."," subvarderivs <- lapply(items, function(x) createSubvarDeriv(","brace_linter" +"R/make-array.R",339,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.list(x) & !is.VarDef(x)) {","vector_logic_linter" +"R/merge-crunch-data-frame.R",120,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.data.frame(data) & all(!class(data) %in% ""CrunchDataFrame"")) {","vector_logic_linter" +"R/multitables.R",38,13,"warning","local variable β€˜f’ assigned but may not be used"," f <- newMultitable(","object_usage_linter" +"R/ordering.R",131,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.dataset(source) | !is.dataset(target)) {","vector_logic_linter" +"R/ordering.R",179,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(group) == 1 & is.character(group)) {","vector_logic_linter" +"R/project-folder.R",49,13,"warning","local variable β€˜proj’ assigned but may not be used"," proj <- do.call(","object_usage_linter" +"R/shoji-order.R",54,13,"style","Any function spanning multiple lines should use curly braces."," function(a) do.call(","brace_linter" +"R/show.R",70,19,"style","Any function spanning multiple lines should use curly braces.","showInsertions <- function(x) do.call(","brace_linter" +"R/show.R",702,9,"warning","local variable β€˜along’ assigned but may not be used"," along <- ifelse(num_unique_dims == 3, 2, num_unique_dims)","object_usage_linter" +"R/subtotals-and-headings.R",268,5,"warning","local variable β€˜ent’ assigned but may not be used"," ent <- setEntitySlot(entity(x), ""view"", bd)","object_usage_linter" +"R/subtotals-and-headings.R",284,9,"warning","local variable β€˜ent’ assigned but may not be used"," ent <- setEntitySlot(entity(x), ""view"", bd)","object_usage_linter" +"R/subtotals-and-headings.R",453,36,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (is.na(func(insert)) & !is.na(anchor(insert))) {","vector_logic_linter" +"R/subtotals-and-headings.R",730,5,"warning","local variable β€˜ent’ assigned but may not be used"," ent <- setEntitySlot(entity(x), ""view"", bd)","object_usage_linter" +"R/subtotals-and-headings.R",746,9,"warning","local variable β€˜ent’ assigned but may not be used"," ent <- setEntitySlot(entity(x), ""view"", bd)","object_usage_linter" +"R/subtotals-and-headings.R",915,36,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (is.na(func(insert)) & !is.na(anchor(insert))) {","vector_logic_linter" +"R/subvariables.R",44,36,"warning","no visible binding for global variable β€˜subvariables_catalog’"," catalog_url <- absoluteURL(tup$subvariables_catalog, base = tup@index_url)","object_usage_linter" +"R/subvariables.R",45,22,"warning","no visible binding for global variable β€˜subreferences’"," if (!is.null(tup$subreferences)) {","object_usage_linter" +"R/subvariables.R",66,34,"warning","no visible binding for global variable β€˜subvariables_catalog’"," catalog_url <- absoluteURL(x$subvariables_catalog, base = x@index_url) %||% """"","object_usage_linter" +"R/subvariables.R",67,18,"warning","no visible binding for global variable β€˜subreferences’"," subvars <- x$subreferences","object_usage_linter" +"R/summary-insertions.R",141,9,"warning","local variable β€˜args’ assigned but may not be used"," args <- ids(var_items)","object_usage_linter" +"R/summary-insertions.R",283,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(opts$after) & is.null(opts$position)) opts$position <- ""bottom""","vector_logic_linter" +"R/teams.R",40,13,"warning","local variable β€˜u’ assigned but may not be used"," u <- crPOST(self(x), body = toJSON(list(name = i)))","object_usage_linter" +"R/variable-update.R",254,13,"warning","local variable β€˜out’ assigned but may not be used"," out <- .updateVariable(x, value, filter = .dispatchFilter(i))","object_usage_linter" +"R/versions.R",60,5,"warning","local variable β€˜out’ assigned but may not be used"," out <- crPOST(u,","object_usage_linter" +"R/weight.R",157,54,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.variable(vars) || (length(vars) == 1) & !is.character(vars)) {","vector_logic_linter" +"tests/testthat/setup.R",24,2,"style","Missing terminal newline.",")","trailing_blank_lines_linter" +"tests/testthat/test-cube-subset.R",23,80,"style","Use TRUE instead of the symbol T."," replaceCharWithNumeric(dimnames, c(""cats"", ""llamas""), visible = c(T, F, T)),","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",23,83,"style","Use FALSE instead of the symbol F."," replaceCharWithNumeric(dimnames, c(""cats"", ""llamas""), visible = c(T, F, T)),","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",23,86,"style","Use TRUE instead of the symbol T."," replaceCharWithNumeric(dimnames, c(""cats"", ""llamas""), visible = c(T, F, T)),","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",50,26,"style","Use TRUE instead of the symbol T."," not_hidden <- c(T, T, F, F)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",50,29,"style","Use TRUE instead of the symbol T."," not_hidden <- c(T, T, F, F)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",50,32,"style","Use FALSE instead of the symbol F."," not_hidden <- c(T, T, F, F)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",50,35,"style","Use FALSE instead of the symbol F."," not_hidden <- c(T, T, F, F)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",56,26,"style","Use FALSE instead of the symbol F."," not_hidden <- c(F, T, F, F, T, T)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",56,29,"style","Use TRUE instead of the symbol T."," not_hidden <- c(F, T, F, F, T, T)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",56,32,"style","Use FALSE instead of the symbol F."," not_hidden <- c(F, T, F, F, T, T)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",56,35,"style","Use FALSE instead of the symbol F."," not_hidden <- c(F, T, F, F, T, T)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",56,38,"style","Use TRUE instead of the symbol T."," not_hidden <- c(F, T, F, F, T, T)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",56,41,"style","Use TRUE instead of the symbol T."," not_hidden <- c(F, T, F, F, T, T)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",62,26,"style","Use FALSE instead of the symbol F."," not_hidden <- c(F, T, T)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",62,29,"style","Use TRUE instead of the symbol T."," not_hidden <- c(F, T, T)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",62,32,"style","Use TRUE instead of the symbol T."," not_hidden <- c(F, T, T)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",69,26,"style","Use FALSE instead of the symbol F."," not_hidden <- c(F, T, T, F)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",69,29,"style","Use TRUE instead of the symbol T."," not_hidden <- c(F, T, T, F)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",69,32,"style","Use TRUE instead of the symbol T."," not_hidden <- c(F, T, T, F)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",69,35,"style","Use FALSE instead of the symbol F."," not_hidden <- c(F, T, T, F)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",72,23,"style","Use TRUE instead of the symbol T."," visible <- c(T, T, T, F)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",72,26,"style","Use TRUE instead of the symbol T."," visible <- c(T, T, T, F)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",72,29,"style","Use TRUE instead of the symbol T."," visible <- c(T, T, T, F)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",72,32,"style","Use FALSE instead of the symbol F."," visible <- c(T, T, T, F)","T_and_F_symbol_linter" +"tests/testthat/test-formula.R",57,44,"style","Put spaces around all infix operators."," formulaToQuery(mean(ds$birthyr)~1),","infix_spaces_linter" +"vignettes/abstract-categories.Rmd",51,34,"style","Put spaces around all infix operators.","income <- AbstractCategories(data=income_list)","infix_spaces_linter" +"vignettes/abstract-categories.Rmd",120,65,"style","Trailing whitespace is superfluous."," Subtotal(name = ""Generally Happy"", after = ""Somewhat Happy"", ","trailing_whitespace_linter" +"vignettes/abstract-categories.Rmd",122,52,"style","Trailing whitespace is superfluous."," Subtotal(name = ""Generally Unhappy"", after = 5, ","trailing_whitespace_linter" +"vignettes/abstract-categories.Rmd",142,101,"style","Lines should not be more than 100 characters.","feeling_insertions <- Insertions(data = lapply(feeling_subtotals, makeInsertion, var_items = feeling_cats))","line_length_linter" +"vignettes/analyze.Rmd",16,14,"style","Put spaces around all infix operators.","options(width=120)","infix_spaces_linter" +"vignettes/analyze.Rmd",31,28,"style","Put spaces around all infix operators.","tab1 <- crtabs(~ educ, data=ds)","infix_spaces_linter" +"vignettes/analyze.Rmd",41,37,"style","Put spaces around all infix operators.","tab2 <- crtabs(~ educ + gender, data=ds)","infix_spaces_linter" +"vignettes/analyze.Rmd",67,29,"style","Put spaces around all infix operators.","crtabs(~ educ + gender, data=ds)","infix_spaces_linter" +"vignettes/analyze.Rmd",76,29,"style","Put spaces around all infix operators.","crtabs(~ educ + gender, data=ds, weight=NULL)","infix_spaces_linter" +"vignettes/analyze.Rmd",76,40,"style","Put spaces around all infix operators.","crtabs(~ educ + gender, data=ds, weight=NULL)","infix_spaces_linter" +"vignettes/analyze.Rmd",98,10,"style","Put spaces around all infix operators.","round(100*prop.table(tab2, 2))","infix_spaces_linter" +"vignettes/analyze.Rmd",105,38,"style","Put spaces around all infix operators.","tab3 <- crtabs(~ imiss + gender, data=ds)","infix_spaces_linter" +"vignettes/analyze.Rmd",123,40,"style","Put spaces around all infix operators.","tab3mr <- crtabs(~ imiss + gender, data=ds)","infix_spaces_linter" +"vignettes/analyze.Rmd",139,10,"style","Put spaces around all infix operators.","round(100*prop.table(tab3mr, 2))","infix_spaces_linter" +"vignettes/analyze.Rmd",145,38,"style","Put spaces around all infix operators.","crtabs(~ imiss$imiss_f + gender, data=ds)","infix_spaces_linter" +"vignettes/analyze.Rmd",156,43,"style","Put spaces around all infix operators.","round(crtabs(~ imiss + educ + gender, data=ds))","infix_spaces_linter" +"vignettes/analyze.Rmd",172,39,"style","Put spaces around all infix operators.","crtabs(mean(age) ~ educ + gender, data=ds)","infix_spaces_linter" +"vignettes/analyze.Rmd",181,38,"style","Put spaces around all infix operators.","crtabs(min(age) ~ educ + gender, data=ds)","infix_spaces_linter" +"vignettes/analyze.Rmd",190,26,"style","Put spaces around all infix operators.","crtabs(min(age) ~ 1, data=ds)","infix_spaces_linter" +"vignettes/analyze.Rmd",208,47,"style","Put spaces around all infix operators.","round(crtabs(mean(track) ~ educ + gender, data=ds), 2)","infix_spaces_linter" +"vignettes/analyze.Rmd",221,47,"style","Put spaces around all infix operators.","round(crtabs(mean(track) ~ educ + gender, data=ds[ds$pid3 == ""Democrat"",]), 2)","infix_spaces_linter" +"vignettes/analyze.Rmd",242,28,"style","Put spaces around all infix operators.","cat(snowdenleakapp.var, sep=""\n"")","infix_spaces_linter" +"vignettes/analyze.Rmd",249,9,"style","Put spaces around all infix operators."," data=ds)","infix_spaces_linter" +"vignettes/analyze.Rmd",262,11,"style","Put spaces around all infix operators."," family=binomial(link=""logit""), data=ds)","infix_spaces_linter" +"vignettes/analyze.Rmd",262,25,"style","Put spaces around all infix operators."," family=binomial(link=""logit""), data=ds)","infix_spaces_linter" +"vignettes/analyze.Rmd",262,40,"style","Put spaces around all infix operators."," family=binomial(link=""logit""), data=ds)","infix_spaces_linter" +"vignettes/array-variables.Rmd",30,33,"style","Put spaces around all infix operators.","grep(""^imiss_"", names(ds), value=TRUE)","infix_spaces_linter" +"vignettes/array-variables.Rmd",33,47,"style","Put spaces around all infix operators.","grep(""^imiss_"", names(start_make_array), value=TRUE)","infix_spaces_linter" +"vignettes/array-variables.Rmd",42,22,"style","Put spaces around all infix operators.","cat(show_imiss_b, sep=""\n"")","infix_spaces_linter" +"vignettes/array-variables.Rmd",48,59,"style","Put spaces around all infix operators.","ds$imiss <- makeArray(ds[grep(""^imiss_"", names(ds))], name=""Issue importance"")","infix_spaces_linter" +"vignettes/array-variables.Rmd",52,20,"style","Put spaces around all infix operators.","cat(show_imiss, sep=""\n"")","infix_spaces_linter" +"vignettes/array-variables.Rmd",63,28,"style","Put spaces around all infix operators.","cat(show_imiss_subvars, sep=""\n"")","infix_spaces_linter" +"vignettes/array-variables.Rmd",72,22,"style","Put spaces around all infix operators.","cat(show_imiss_b, sep=""\n"")","infix_spaces_linter" +"vignettes/array-variables.Rmd",98,29,"style","Put spaces around all infix operators.","cat(show_imiss_subvars2, sep=""\n"")","infix_spaces_linter" +"vignettes/array-variables.Rmd",109,29,"style","Put spaces around all infix operators.","cat(show_imiss_subvars3, sep=""\n"")","infix_spaces_linter" +"vignettes/array-variables.Rmd",122,21,"style","Put spaces around all infix operators.","cat(show_boap_4, sep=""\n"")","infix_spaces_linter" +"vignettes/array-variables.Rmd",131,9,"style","Put spaces around all infix operators."," name=""Approval of Obama on issues"",","infix_spaces_linter" +"vignettes/array-variables.Rmd",132,15,"style","Put spaces around all infix operators."," selections=c(""Strongly approve"", ""Somewhat approve""))","infix_spaces_linter" +"vignettes/array-variables.Rmd",136,19,"style","Put spaces around all infix operators.","cat(show_boap, sep=""\n"")","infix_spaces_linter" +"vignettes/array-variables.Rmd",150,20,"style","Put spaces around all infix operators.","cat(show_boap2, sep=""\n"")","infix_spaces_linter" +"vignettes/array-variables.Rmd",160,20,"style","Put spaces around all infix operators.","cat(show_boap3, sep=""\n"")","infix_spaces_linter" +"vignettes/array-variables.Rmd",168,30,"style","Put spaces around all infix operators.","grep(""boap"", names(ds), value=TRUE)","infix_spaces_linter" +"vignettes/array-variables.Rmd",186,30,"style","Put spaces around all infix operators.","grep(""boap"", names(ds), value=TRUE)","infix_spaces_linter" +"vignettes/crunch.Rmd",36,76,"style","Trailing whitespace is superfluous.","# like ""update all packages from CRAN"" if it asks which packages to update, ","trailing_whitespace_linter" +"vignettes/crunch.Rmd",89,33,"style","Put spaces around all infix operators.","ds <- newDataset(SO_survey, name=""Stack Overflow Developer Survey 2017"")","infix_spaces_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Mon, 04 May 2020 21:39:23 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",3,66,"style","Trailing whitespace is superfluous."," `content-length` = ""176"", location = ""/api/datasets/c25696/"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",5,64,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",7,63,"style","Trailing whitespace is superfluous.",")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",8,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:23 GMT"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",9,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""176"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",10,62,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/c25696/"", server = ""nginx"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",11,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",12,68,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",13,61,"style","Trailing whitespace is superfluous."," `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",14,64,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = "".crunch.io"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",15,101,"style","Lines should not be more than 100 characters."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164363, class = c(""POSIXct"", ","line_length_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",15,101,"style","Trailing whitespace is superfluous."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164363, class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",16,71,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = ""token"", value = ""REDACTED""), row.names = c(NA, ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",17,101,"style","Lines should not be more than 100 characters.","-1L), class = ""data.frame""), content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",17,144,"style","Trailing whitespace is superfluous.","-1L), class = ""data.frame""), content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",19,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 3.1e-05, ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",20,73,"style","Trailing whitespace is superfluous."," connect = 3.2e-05, pretransfer = 0.000134, starttransfer = 0.000139, ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/c25696/batches/"", status_code = 202L, ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:26 GMT"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""178"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",4,101,"style","Lines should not be more than 100 characters."," location = ""/api/datasets/c25696/batches/import_batch%3Ac25696%245f5c3f13-f95f-4cbe-b60a-1a30e139cf18/"", ","line_length_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",4,113,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/c25696/batches/import_batch%3Ac25696%245f5c3f13-f95f-4cbe-b60a-1a30e139cf18/"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",5,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",7,61,"style","Trailing whitespace is superfluous."," `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",8,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",9,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:26 GMT"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",10,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",11,101,"style","Lines should not be more than 100 characters."," `content-length` = ""178"", location = ""/api/datasets/c25696/batches/import_batch%3Ac25696%245f5c3f13-f95f-4cbe-b60a-1a30e139cf18/"", ","line_length_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",11,143,"style","Trailing whitespace is superfluous."," `content-length` = ""178"", location = ""/api/datasets/c25696/batches/import_batch%3Ac25696%245f5c3f13-f95f-4cbe-b60a-1a30e139cf18/"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",12,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",13,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",14,65,"style","Trailing whitespace is superfluous."," `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",15,68,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = "".crunch.io"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",16,101,"style","Lines should not be more than 100 characters."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164366, class = c(""POSIXct"", ","line_length_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",16,105,"style","Trailing whitespace is superfluous."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164366, class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",17,75,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = ""token"", value = ""REDACTED""), row.names = c(NA, ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",18,101,"style","Lines should not be more than 100 characters."," -1L), class = ""data.frame""), content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/c25696/batches/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",18,163,"style","Trailing whitespace is superfluous."," -1L), class = ""data.frame""), content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/c25696/batches/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",20,67,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2e-05, ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",21,71,"style","Trailing whitespace is superfluous."," connect = 2.2e-05, pretransfer = 8.9e-05, starttransfer = 9.3e-05, ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Mon, 04 May 2020 21:39:26 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",3,64,"style","Trailing whitespace is superfluous."," `content-length` = ""86"", location = ""/api/sources/cec83c/"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",5,101,"style","Lines should not be more than 100 characters."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","line_length_linter" +"vignettes/crunch/0/api/sources-POST.R",5,110,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",6,69,"style","Trailing whitespace is superfluous.","""list"")), all_headers = list(list(status = 201L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",7,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:26 GMT"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",8,84,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""86"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",9,61,"style","Trailing whitespace is superfluous."," location = ""/api/sources/cec83c/"", server = ""nginx"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",10,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",11,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",12,61,"style","Trailing whitespace is superfluous."," `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",13,64,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = "".crunch.io"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",14,101,"style","Lines should not be more than 100 characters."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164366, class = c(""POSIXct"", ","line_length_linter" +"vignettes/crunch/0/api/sources-POST.R",14,101,"style","Trailing whitespace is superfluous."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164366, class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",15,71,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = ""token"", value = ""REDACTED""), row.names = c(NA, ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",16,101,"style","Lines should not be more than 100 characters.","-1L), class = ""data.frame""), content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/sources/\""}""), ","line_length_linter" +"vignettes/crunch/0/api/sources-POST.R",16,112,"style","Trailing whitespace is superfluous.","-1L), class = ""data.frame""), content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/sources/\""}""), ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",18,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.6e-05, ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",19,72,"style","Trailing whitespace is superfluous."," connect = 2.7e-05, pretransfer = 0.00014, starttransfer = 0.000145, ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",1,76,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/c25696/variables/"", status_code = 201L, ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:32 GMT"", ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",3,83,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""0"", ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",4,61,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/c25696/variables/d270c8/"", ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",5,101,"style","Lines should not be more than 100 characters."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, PATCH, POST"", ","line_length_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",5,103,"style","Trailing whitespace is superfluous."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, PATCH, POST"", ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",6,61,"style","Trailing whitespace is superfluous."," `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",7,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 201L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",8,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:32 GMT"", ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",9,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",10,89,"style","Trailing whitespace is superfluous."," `content-length` = ""0"", location = ""/api/datasets/c25696/variables/d270c8/"", ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",11,64,"style","Trailing whitespace is superfluous."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",12,101,"style","Lines should not be more than 100 characters."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","line_length_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",12,108,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",13,68,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = "".crunch.io"", ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",14,101,"style","Lines should not be more than 100 characters."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164372, class = c(""POSIXct"", ","line_length_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",14,105,"style","Trailing whitespace is superfluous."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164372, class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",15,75,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = ""token"", value = ""REDACTED""), row.names = c(NA, ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",16,101,"style","Lines should not be more than 100 characters."," -1L), class = ""data.frame""), content = charToRaw(""""), date = structure(1588628372, class = c(""POSIXct"", ","line_length_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",16,108,"style","Trailing whitespace is superfluous."," -1L), class = ""data.frame""), content = charToRaw(""""), date = structure(1588628372, class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",17,77,"style","Trailing whitespace is superfluous."," ""POSIXt""), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.8e-05, ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",18,72,"style","Trailing whitespace is superfluous."," connect = 2.9e-05, pretransfer = 9.8e-05, starttransfer = 0.000103, ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",1,76,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/c25696/variables/"", status_code = 201L, ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:37 GMT"", ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",3,83,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""0"", ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",4,61,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/c25696/variables/6af3ce/"", ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",5,101,"style","Lines should not be more than 100 characters."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, PATCH, POST"", ","line_length_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",5,103,"style","Trailing whitespace is superfluous."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, PATCH, POST"", ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",6,61,"style","Trailing whitespace is superfluous."," `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",7,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 201L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",8,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:37 GMT"", ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",9,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",10,89,"style","Trailing whitespace is superfluous."," `content-length` = ""0"", location = ""/api/datasets/c25696/variables/6af3ce/"", ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",11,64,"style","Trailing whitespace is superfluous."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",12,101,"style","Lines should not be more than 100 characters."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","line_length_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",12,108,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",13,68,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = "".crunch.io"", ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",14,101,"style","Lines should not be more than 100 characters."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164377, class = c(""POSIXct"", ","line_length_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",14,105,"style","Trailing whitespace is superfluous."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164377, class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",15,75,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = ""token"", value = ""REDACTED""), row.names = c(NA, ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",16,101,"style","Lines should not be more than 100 characters."," -1L), class = ""data.frame""), content = charToRaw(""""), date = structure(1588628377, class = c(""POSIXct"", ","line_length_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",16,108,"style","Trailing whitespace is superfluous."," -1L), class = ""data.frame""), content = charToRaw(""""), date = structure(1588628377, class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",17,77,"style","Trailing whitespace is superfluous."," ""POSIXt""), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.4e-05, ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",18,71,"style","Trailing whitespace is superfluous."," connect = 2.5e-05, pretransfer = 8.8e-05, starttransfer = 9.3e-05, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",76,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",77,27,"style","Trailing whitespace is superfluous."," mean(ndogs) ~ country, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",102,18,"style","Trailing whitespace is superfluous."," private_deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",103,9,"style","Trailing whitespace is superfluous."," ~q1, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",104,40,"style","Trailing whitespace is superfluous."," title = ""Bar Plot of Favorite Pet"", ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",133,8,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",134,47,"style","Trailing whitespace is superfluous."," ""This survey was collected by ACME surveys"", ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",179,101,"style","Lines should not be more than 100 characters.","# (Note this controls the order of the slides in a deck, which controls how they appear in the web app's","line_length_linter" +"vignettes/deck-cookbook.Rmd",180,101,"style","Lines should not be more than 100 characters.","# deck viewer and Excel and PowerPoint exports, but does not change order or position of an existing ","line_length_linter" +"vignettes/deck-cookbook.Rmd",180,101,"style","Trailing whitespace is superfluous.","# deck viewer and Excel and PowerPoint exports, but does not change order or position of an existing ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",228,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",229,9,"style","Trailing whitespace is superfluous."," ~q1, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",244,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",245,19,"style","Trailing whitespace is superfluous."," ~q1 + country, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",251,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",252,26,"style","Trailing whitespace is superfluous."," ~q1 + country + wave, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",270,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",271,14,"style","Trailing whitespace is superfluous."," ~allpets, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",276,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",277,50,"style","Trailing whitespace is superfluous."," ~categories(allpets) + subvariables(allpets), ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",312,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",318,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",337,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",338,34,"style","Trailing whitespace is superfluous."," ~scorecard(allpets, allpets), ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",369,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",370,9,"style","Trailing whitespace is superfluous."," ~q1, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",380,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",381,48,"style","Trailing whitespace is superfluous."," ~categories(petloc) + subvariables(petloc), ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",400,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",401,9,"style","Trailing whitespace is superfluous."," ~q1, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",422,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",423,9,"style","Trailing whitespace is superfluous."," ~q1, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",451,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",452,19,"style","Trailing whitespace is superfluous."," ~q1 + country, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",459,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",460,16,"style","Trailing whitespace is superfluous."," ~q1 + wave, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",480,19,"style","Trailing whitespace is superfluous."," template_deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",481,9,"style","Trailing whitespace is superfluous."," ~q1, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",496,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",540,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",561,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",583,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",585,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",589,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",609,14,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",620,14,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",631,14,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/derive.Rmd",16,14,"style","Put spaces around all infix operators.","options(width=120)","infix_spaces_linter" +"vignettes/export.Rmd",15,14,"style","Put spaces around all infix operators.","options(width=120)","infix_spaces_linter" +"vignettes/export.Rmd",33,36,"style","Put spaces around all infix operators.","party_id <- as.vector(ds$pid3, mode=""id"")","infix_spaces_linter" +"vignettes/export.Rmd",64,30,"style","Put spaces around all infix operators.","df <- as.data.frame(ds, force=TRUE)","infix_spaces_linter" +"vignettes/export.Rmd",76,81,"style","Put spaces around all infix operators.","df <- as.data.frame(ds[ds$pid3 == ""Democrat"", c(""age"", ""educ"", ""gender"")], force=TRUE)","infix_spaces_linter" +"vignettes/export.Rmd",115,23,"style","Put spaces around all infix operators.","exportDataset(ds, file=""econ.sav"", format=""spss"")","infix_spaces_linter" +"vignettes/export.Rmd",115,42,"style","Put spaces around all infix operators.","exportDataset(ds, file=""econ.sav"", format=""spss"")","infix_spaces_linter" +"vignettes/export.Rmd",121,19,"style","Put spaces around all infix operators.","write.csv(ds, file=""econ.csv"")","infix_spaces_linter" +"vignettes/export.Rmd",129,70,"style","Put spaces around all infix operators.","write.csv(ds[ds$pid3 == ""Democrat"", c(""age"", ""educ"", ""gender"")], file=""demo-demos.csv"")","infix_spaces_linter" +"vignettes/filters.Rmd",15,14,"style","Put spaces around all infix operators.","options(width=120)","infix_spaces_linter" +"vignettes/filters.Rmd",33,19,"style","Put spaces around all infix operators.","cat(printdems, sep=""\n"")","infix_spaces_linter" +"vignettes/filters.Rmd",37,47,"style","Put spaces around all infix operators.","round(crtabs(mean(track) ~ educ + gender, data=dems), 2)","infix_spaces_linter" +"vignettes/filters.Rmd",90,28,"style","Put spaces around all infix operators.","cat(print.young.males1, sep=""\n"")","infix_spaces_linter" +"vignettes/filters.Rmd",125,28,"style","Put spaces around all infix operators.","cat(print.young.males2, sep=""\n"")","infix_spaces_linter" +"vignettes/filters.Rmd",144,27,"style","Put spaces around all infix operators.","cat(high_perc_skipped, sep=""\n"")","infix_spaces_linter" +"vignettes/fork-and-merge.Rmd",50,101,"style","Lines should not be more than 100 characters.","forked_ds$ImportantHiringCA <- makeArray(forked_ds[, c(""ImportantHiringTechExp"", ""ImportantHiringPMExp"")],","line_length_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Thu, 25 Mar 2021 15:16:07 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",3,66,"style","Trailing whitespace is superfluous."," `content-length` = ""176"", location = ""/api/datasets/5b6c9f/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",5,64,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",6,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",6,111,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",7,68,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",8,69,"style","Trailing whitespace is superfluous.","""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",9,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:16:07 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",10,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""176"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",11,62,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/5b6c9f/"", server = ""nginx"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",12,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",13,68,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",14,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",14,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",15,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",16,62,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",17,63,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",19,95,"style","Trailing whitespace is superfluous."," )), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",20,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",20,119,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.8e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",23,69,"style","Trailing whitespace is superfluous."," connect = 3e-05, pretransfer = 8.6e-05, starttransfer = 9.1e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/5b6c9f/batches/"", status_code = 202L, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:28 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""179"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",4,101,"style","Lines should not be more than 100 characters."," location = ""/api/datasets/5b6c9f/batches/import_batch%3A5b6c9f%24c6f12343-98a7-414c-b850-f4bc7ab927e2/"", ","line_length_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",4,113,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/5b6c9f/batches/import_batch%3A5b6c9f%24c6f12343-98a7-414c-b850-f4bc7ab927e2/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",5,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",7,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",7,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",8,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",9,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",10,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:28 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",11,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",12,101,"style","Lines should not be more than 100 characters."," `content-length` = ""179"", location = ""/api/datasets/5b6c9f/batches/import_batch%3A5b6c9f%24c6f12343-98a7-414c-b850-f4bc7ab927e2/"", ","line_length_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",12,143,"style","Trailing whitespace is superfluous."," `content-length` = ""179"", location = ""/api/datasets/5b6c9f/batches/import_batch%3A5b6c9f%24c6f12343-98a7-414c-b850-f4bc7ab927e2/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",13,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",14,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",15,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",15,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",16,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",17,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",18,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",19,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",20,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",20,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",21,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/batches/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",21,134,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/batches/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",23,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.8e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",24,69,"style","Trailing whitespace is superfluous."," connect = 2.9e-05, pretransfer = 8.5e-05, starttransfer = 9e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",1,72,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/5b6c9f/forks/"", status_code = 202L, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:31 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""176"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",4,62,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/9540f6/"", server = ""nginx"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",5,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",7,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",7,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",8,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",9,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",10,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:31 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",11,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",12,74,"style","Trailing whitespace is superfluous."," `content-length` = ""176"", location = ""/api/datasets/9540f6/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",13,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",14,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",15,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",15,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",16,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",17,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",18,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",19,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",20,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",20,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",21,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/forks/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",21,132,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/forks/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",23,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.3e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",24,71,"style","Trailing whitespace is superfluous."," connect = 2.4e-05, pretransfer = 7.5e-05, starttransfer = 7.9e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Thu, 25 Mar 2021 15:18:27 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",3,64,"style","Trailing whitespace is superfluous."," `content-length` = ""86"", location = ""/api/sources/16269c/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",5,95,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",6,73,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",7,68,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",8,69,"style","Trailing whitespace is superfluous.","""list"")), all_headers = list(list(status = 201L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",9,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:27 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",10,84,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""86"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",11,61,"style","Trailing whitespace is superfluous."," location = ""/api/sources/16269c/"", server = ""nginx"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",12,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",13,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",14,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",14,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",15,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",16,62,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",17,63,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",19,95,"style","Trailing whitespace is superfluous."," )), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",20,87,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/sources/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.8e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",23,71,"style","Trailing whitespace is superfluous."," connect = 3e-05, pretransfer = 0.000183, starttransfer = 0.000189, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",1,76,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/9540f6/variables/"", status_code = 201L, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:35 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",3,83,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""0"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",4,61,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/9540f6/variables/a57c56/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",5,101,"style","Lines should not be more than 100 characters."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, PATCH, POST"", ","line_length_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",5,103,"style","Trailing whitespace is superfluous."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, PATCH, POST"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",6,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",6,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",7,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",8,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 201L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",9,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:35 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",10,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",11,89,"style","Trailing whitespace is superfluous."," `content-length` = ""0"", location = ""/api/datasets/9540f6/variables/a57c56/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",12,64,"style","Trailing whitespace is superfluous."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",13,93,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",14,81,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",15,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",16,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",17,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",18,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",19,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",19,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",20,79,"style","Trailing whitespace is superfluous."," content = charToRaw(""""), date = structure(1616685515, class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",21,77,"style","Trailing whitespace is superfluous."," ""POSIXt""), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.7e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",22,71,"style","Trailing whitespace is superfluous."," connect = 2.9e-05, pretransfer = 8.9e-05, starttransfer = 9.4e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/5b6c9f/actions/"", status_code = 202L, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:37 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""178"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",4,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",5,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",6,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",6,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",7,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",8,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",9,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:37 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",10,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",11,85,"style","Trailing whitespace is superfluous."," `content-length` = ""178"", server = ""nginx"", `content-encoding` = ""gzip"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",12,82,"style","Trailing whitespace is superfluous."," vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, POST"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",13,67,"style","Trailing whitespace is superfluous."," `x-timing` = """", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",14,81,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",15,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",16,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",17,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",18,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",19,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",19,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",20,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/actions/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",20,134,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/actions/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.5e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",23,71,"style","Trailing whitespace is superfluous."," connect = 2.6e-05, pretransfer = 7.9e-05, starttransfer = 8.4e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Thu, 25 Mar 2021 15:18:40 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",3,66,"style","Trailing whitespace is superfluous."," `content-length` = ""176"", location = ""/api/datasets/25c7c7/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",5,64,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",6,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",6,111,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",7,68,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",8,69,"style","Trailing whitespace is superfluous.","""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",9,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:40 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",10,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""176"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",11,62,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/25c7c7/"", server = ""nginx"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",12,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",13,68,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",14,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",14,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",15,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",16,62,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",17,63,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",19,95,"style","Trailing whitespace is superfluous."," )), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",20,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",20,119,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.5e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",23,73,"style","Trailing whitespace is superfluous."," connect = 2.6e-05, pretransfer = 0.000106, starttransfer = 0.000109, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/25c7c7/batches/"", status_code = 202L, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:21:29 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""179"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",4,101,"style","Lines should not be more than 100 characters."," location = ""/api/datasets/25c7c7/batches/import_batch%3A25c7c7%24f8ecc6af-28ee-4ae1-8877-566f570f1b96/"", ","line_length_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",4,113,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/25c7c7/batches/import_batch%3A25c7c7%24f8ecc6af-28ee-4ae1-8877-566f570f1b96/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",5,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",7,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",7,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",8,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",9,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",10,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:21:29 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",11,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",12,101,"style","Lines should not be more than 100 characters."," `content-length` = ""179"", location = ""/api/datasets/25c7c7/batches/import_batch%3A25c7c7%24f8ecc6af-28ee-4ae1-8877-566f570f1b96/"", ","line_length_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",12,143,"style","Trailing whitespace is superfluous."," `content-length` = ""179"", location = ""/api/datasets/25c7c7/batches/import_batch%3A25c7c7%24f8ecc6af-28ee-4ae1-8877-566f570f1b96/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",13,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",14,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",15,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",15,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",16,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",17,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",18,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",19,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",20,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",20,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",21,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/25c7c7/batches/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",21,134,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/25c7c7/batches/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",23,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.7e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",24,71,"style","Trailing whitespace is superfluous."," connect = 2.8e-05, pretransfer = 8.1e-05, starttransfer = 8.6e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Thu, 25 Mar 2021 15:21:29 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",3,64,"style","Trailing whitespace is superfluous."," `content-length` = ""86"", location = ""/api/sources/e2adbc/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",5,95,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",6,73,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",7,68,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",8,69,"style","Trailing whitespace is superfluous.","""list"")), all_headers = list(list(status = 201L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",9,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:21:29 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",10,84,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""86"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",11,61,"style","Trailing whitespace is superfluous."," location = ""/api/sources/e2adbc/"", server = ""nginx"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",12,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",13,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",14,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",14,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",15,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",16,62,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",17,63,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",19,95,"style","Trailing whitespace is superfluous."," )), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",20,87,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/sources/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.4e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",23,73,"style","Trailing whitespace is superfluous."," connect = 2.5e-05, pretransfer = 0.000137, starttransfer = 0.000142, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",1,72,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/5b6c9f/forks/"", status_code = 202L, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:21:31 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""175"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",4,62,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/d04628/"", server = ""nginx"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",5,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",7,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",7,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",8,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",9,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",10,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:21:31 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",11,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",12,74,"style","Trailing whitespace is superfluous."," `content-length` = ""175"", location = ""/api/datasets/d04628/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",13,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",14,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",15,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",15,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",16,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",17,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",18,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",19,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",20,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",20,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",21,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/forks/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",21,132,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/forks/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",23,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.5e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",24,71,"style","Trailing whitespace is superfluous."," connect = 2.6e-05, pretransfer = 7.8e-05, starttransfer = 8.3e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/d04628/batches/"", status_code = 202L, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:22:41 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""177"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",4,101,"style","Lines should not be more than 100 characters."," location = ""/api/datasets/d04628/batches/import_batch%3Ad04628%2427437777-7092-4ad7-8705-4e154e217872/"", ","line_length_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",4,113,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/d04628/batches/import_batch%3Ad04628%2427437777-7092-4ad7-8705-4e154e217872/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",5,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",7,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",7,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",8,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",9,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",10,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:22:41 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",11,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",12,101,"style","Lines should not be more than 100 characters."," `content-length` = ""177"", location = ""/api/datasets/d04628/batches/import_batch%3Ad04628%2427437777-7092-4ad7-8705-4e154e217872/"", ","line_length_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",12,143,"style","Trailing whitespace is superfluous."," `content-length` = ""177"", location = ""/api/datasets/d04628/batches/import_batch%3Ad04628%2427437777-7092-4ad7-8705-4e154e217872/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",13,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",14,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",15,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",15,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",16,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",17,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",18,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",19,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",20,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",20,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",21,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/d04628/batches/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",21,134,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/d04628/batches/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",23,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.5e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",24,71,"style","Trailing whitespace is superfluous."," connect = 2.7e-05, pretransfer = 7.4e-05, starttransfer = 7.9e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/5b6c9f/actions/"", status_code = 202L, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:51 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""179"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",4,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",5,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",6,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",6,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",7,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",8,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",9,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:51 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",10,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",11,85,"style","Trailing whitespace is superfluous."," `content-length` = ""179"", server = ""nginx"", `content-encoding` = ""gzip"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",12,82,"style","Trailing whitespace is superfluous."," vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, POST"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",13,67,"style","Trailing whitespace is superfluous."," `x-timing` = """", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",14,81,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",15,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",16,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",17,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",18,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",19,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",19,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",20,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/actions/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",20,134,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/actions/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.9e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",23,71,"style","Trailing whitespace is superfluous."," connect = 3.1e-05, pretransfer = 8.8e-05, starttransfer = 9.2e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Thu, 25 Mar 2021 15:23:55 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",3,66,"style","Trailing whitespace is superfluous."," `content-length` = ""176"", location = ""/api/datasets/b5a775/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",5,64,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",6,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",6,111,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",7,68,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",8,69,"style","Trailing whitespace is superfluous.","""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",9,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:55 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",10,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""176"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",11,62,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/b5a775/"", server = ""nginx"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",12,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",13,68,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",14,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",14,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",15,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",16,62,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",17,63,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",19,95,"style","Trailing whitespace is superfluous."," )), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",20,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",20,119,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.7e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",23,71,"style","Trailing whitespace is superfluous."," connect = 2.8e-05, pretransfer = 8.1e-05, starttransfer = 8.6e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",1,72,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/5b6c9f/forks/"", status_code = 202L, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:59 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""176"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",4,62,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/91e745/"", server = ""nginx"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",5,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",7,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",7,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",8,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",9,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",10,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:59 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",11,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",12,74,"style","Trailing whitespace is superfluous."," `content-length` = ""176"", location = ""/api/datasets/91e745/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",13,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",14,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",15,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",15,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",16,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",17,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",18,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",19,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",20,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",20,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",21,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/forks/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",21,132,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/forks/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",23,67,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",24,71,"style","Trailing whitespace is superfluous."," connect = 2.1e-05, pretransfer = 6.1e-05, starttransfer = 6.4e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",1,76,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/91e745/variables/"", status_code = 202L, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:26:22 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""208"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",4,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",5,89,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",6,77,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",7,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",8,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",9,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:26:22 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",10,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",11,85,"style","Trailing whitespace is superfluous."," `content-length` = ""208"", server = ""nginx"", `content-encoding` = ""gzip"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",12,89,"style","Trailing whitespace is superfluous."," vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, PATCH, POST"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",13,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",13,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",14,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",15,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",16,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",17,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",18,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",18,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",19,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""description\"": \""Progress status of adapt job\"", \""value\"": \""/api/progress/\"", \""element\"": \""shoji:view\""}""), ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",19,140,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""description\"": \""Progress status of adapt job\"", \""value\"": \""/api/progress/\"", \""element\"": \""shoji:view\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",21,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.6e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",22,69,"style","Trailing whitespace is superfluous."," connect = 2.7e-05, pretransfer = 7.7e-05, starttransfer = 9e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/b5a775/batches/"", status_code = 202L, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:57 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""178"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",4,101,"style","Lines should not be more than 100 characters."," location = ""/api/datasets/b5a775/batches/import_batch%3Ab5a775%24125593e4-5a97-42e8-b680-fb537a150a66/"", ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",4,113,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/b5a775/batches/import_batch%3Ab5a775%24125593e4-5a97-42e8-b680-fb537a150a66/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",5,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",7,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",7,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",8,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",9,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",10,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:57 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",11,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",12,101,"style","Lines should not be more than 100 characters."," `content-length` = ""178"", location = ""/api/datasets/b5a775/batches/import_batch%3Ab5a775%24125593e4-5a97-42e8-b680-fb537a150a66/"", ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",12,143,"style","Trailing whitespace is superfluous."," `content-length` = ""178"", location = ""/api/datasets/b5a775/batches/import_batch%3Ab5a775%24125593e4-5a97-42e8-b680-fb537a150a66/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",13,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",14,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",15,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",15,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",16,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",17,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",18,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",19,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",20,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",20,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",21,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/b5a775/batches/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",21,134,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/b5a775/batches/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",23,67,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 3e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",24,71,"style","Trailing whitespace is superfluous."," connect = 3.2e-05, pretransfer = 8.9e-05, starttransfer = 9.4e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Thu, 25 Mar 2021 15:23:56 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",3,64,"style","Trailing whitespace is superfluous."," `content-length` = ""86"", location = ""/api/sources/4f9156/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",5,95,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",6,73,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",7,68,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",8,69,"style","Trailing whitespace is superfluous.","""list"")), all_headers = list(list(status = 201L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",9,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:56 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",10,84,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""86"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",11,61,"style","Trailing whitespace is superfluous."," location = ""/api/sources/4f9156/"", server = ""nginx"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",12,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",13,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",14,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",14,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",15,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",16,62,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",17,63,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",19,95,"style","Trailing whitespace is superfluous."," )), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",20,87,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/sources/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.4e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",23,73,"style","Trailing whitespace is superfluous."," connect = 2.5e-05, pretransfer = 0.000155, starttransfer = 0.000161, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/5b6c9f/actions/"", status_code = 202L, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:26:26 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""178"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",4,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",5,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",6,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",6,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",7,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",8,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",9,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:26:26 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",10,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",11,85,"style","Trailing whitespace is superfluous."," `content-length` = ""178"", server = ""nginx"", `content-encoding` = ""gzip"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",12,82,"style","Trailing whitespace is superfluous."," vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, POST"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",13,67,"style","Trailing whitespace is superfluous."," `x-timing` = """", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",14,81,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",15,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",16,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",17,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",18,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",19,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",19,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",20,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/actions/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",20,134,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/actions/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.6e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",23,71,"style","Trailing whitespace is superfluous."," connect = 2.7e-05, pretransfer = 8.2e-05, starttransfer = 8.7e-05, ","trailing_whitespace_linter" +"vignettes/subtotals.Rmd",19,14,"style","Put spaces around all infix operators.","options(width=120)","infix_spaces_linter" +"vignettes/subtotals.Rmd",27,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/subtotals.Rmd",33,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/subtotals.Rmd",187,101,"style","Lines should not be more than 100 characters.","transforms(cube)$q1$insertions <- list(Heading(""Mammals"", position = ""top""), Heading(""Other"", after = ""Dog""))","line_length_linter" +"vignettes/variable-order.Rmd",15,14,"style","Put spaces around all infix operators.","options(width=120)","infix_spaces_linter" +"vignettes/variables.Rmd",20,14,"style","Put spaces around all infix operators.","options(width=120)","infix_spaces_linter" +"vignettes/variables.Rmd",61,27,"style","Put spaces around all infix operators.","cat(summary.track.var, sep=""\n"")","infix_spaces_linter" +"vignettes/variables.Rmd",68,101,"style","Lines should not be more than 100 characters.","description(track.var) <- ""In your opinon, is the country going in the right direction, or is it on the wrong track?""","line_length_linter" +"vignettes/variables.Rmd",211,73,"style","Put spaces around all infix operators.","ids(categories(track.var)) <- sample(ids(categories(track.var)), replace=FALSE)","infix_spaces_linter" diff --git a/.dev/revdep_emails/crunch/email-body b/.dev/revdep_emails/crunch/email-body new file mode 100644 index 000000000..fcdb9cd0f --- /dev/null +++ b/.dev/revdep_emails/crunch/email-body @@ -0,0 +1,27 @@ +Hello Greg Freedman Ellis! Thank you for using {lintr} in your package {crunch}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/Crunch-io/rcrunch using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 335s on CRAN vs. 187s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/dampack/attachments/dampack.warnings b/.dev/revdep_emails/dampack/attachments/dampack.warnings new file mode 100644 index 000000000..182961f94 --- /dev/null +++ b/.dev/revdep_emails/dampack/attachments/dampack.warnings @@ -0,0 +1,2 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Trying to remove β€˜camel_case_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/dampack/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/dampack/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..d34293462 --- /dev/null +++ b/.dev/revdep_emails/dampack/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,331 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/calculate_outcome.R",32,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (outcome == ""nhb_loss"" | outcome == ""nmb_loss"") {","vector_logic_linter" +"R/calculate_outcome.R",43,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (outcome == ""nhb_loss_voi"" | outcome == ""nmb_loss_voi"") {","vector_logic_linter" +"R/create_sa.R",146,17,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (all_strat | (x$n_strategies <= n_trunc)) {","vector_logic_linter" +"R/evsi.R",140,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(length(n) == 1 | length(n) == n_params)) {","vector_logic_linter" +"R/evsi.R",144,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(length(n0) == 1 | length(n0) == n_params)) {","vector_logic_linter" +"R/evsi.R",315,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(unique(x$WTP)) == 1 & ""n"" %in% names(x)) {","vector_logic_linter" +"R/evsi.R",319,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (!(""n"" %in% names(x)) | (""n"" %in% names(x) & length(unique(x$n)) == 1)) {","vector_logic_linter" +"R/evsi.R",319,56,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (!(""n"" %in% names(x)) | (""n"" %in% names(x) & length(unique(x$n)) == 1)) {","vector_logic_linter" +"R/evsi.R",323,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (length(unique(x$WTP > 1)) & length(unique(x$n)) > 1) {","vector_logic_linter" +"R/icers.R",63,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (n_cost != n_eff | n_eff != n_strat) {","vector_logic_linter" +"R/icers.R",221,7,"warning","no visible global function definition for β€˜pivot_longer’"," pivot_longer(cols = everything(), names_to = ""Strategy"") %>%","object_usage_linter" +"R/icers.R",227,7,"warning","no visible global function definition for β€˜pivot_longer’"," pivot_longer(cols = everything(), names_to = ""Strategy"") %>%","object_usage_linter" +"R/metamodel.R",62,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (length(params) != 2 & analysis == ""twoway"") {","vector_logic_linter" +"R/metamodel.R",111,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (analysis == ""twoway"" | analysis == ""multiway"") {","vector_logic_linter" +"R/metamodel.R",324,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(i) & length(i) != 2) {","vector_logic_linter" +"R/metamodel.R",446,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (p_range[1] < psa_range[1] | p_range[2] > psa_range[2]) {","vector_logic_linter" +"R/owsa.R",136,7,"warning","no visible global function definition for β€˜pivot_longer’"," pivot_longer(cols = everything(),","object_usage_linter" +"R/owsa.R",181,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (min_rel_diff < 0 | min_rel_diff > 1) {","vector_logic_linter" +"R/psa.R",163,5,"warning","no visible global function definition for β€˜pivot_longer’"," pivot_longer(cost,","object_usage_linter" +"R/psa.R",169,5,"warning","no visible global function definition for β€˜pivot_longer’"," pivot_longer(effectiveness,","object_usage_linter" +"R/psa.R",204,32,"warning","no visible binding for global variable β€˜Effectiveness’"," ellipse(cor(Effectiveness, Cost),","object_usage_linter" +"R/psa.R",204,32,"warning","no visible binding for global variable β€˜Effectiveness’"," ellipse(cor(Effectiveness, Cost),","object_usage_linter" +"R/psa.R",204,32,"warning","no visible binding for global variable β€˜Effectiveness’"," ellipse(cor(Effectiveness, Cost),","object_usage_linter" +"R/psa.R",204,47,"warning","no visible binding for global variable β€˜Cost’"," ellipse(cor(Effectiveness, Cost),","object_usage_linter" +"R/psa.R",204,47,"warning","no visible binding for global variable β€˜Cost’"," ellipse(cor(Effectiveness, Cost),","object_usage_linter" +"R/psa.R",204,47,"warning","no visible binding for global variable β€˜Cost’"," ellipse(cor(Effectiveness, Cost),","object_usage_linter" +"R/run_dsa.R",52,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.list(params_basecase) | is.null(names(params_basecase))) {","vector_logic_linter" +"R/run_dsa.R",215,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.list(params_basecase) | is.null(names(params_basecase)))","vector_logic_linter" +"R/run_psa.R",85,78,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (i / (nrow(psa_samp) / 10) == round(i / (nrow(psa_samp) / 10), 0) & progress == TRUE) {","vector_logic_linter" +"R/run_psa.R",96,78,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (i / (nrow(psa_samp) / 10) == round(i / (nrow(psa_samp) / 10), 0) & progress == TRUE) {","vector_logic_linter" +"R/twsa.R",28,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(param1) | is.null(param2)) {","vector_logic_linter" +"tests/testthat/util_models_detfun.R",41,64,"style","Use FALSE instead of the symbol F."," nrow = length(state_name), byrow = F)","T_and_F_symbol_linter" +"vignettes/basic_cea.Rmd",71,33,"style","Put spaces around all infix operators.","icer_hiv <- calculate_icers(cost=v_hiv_costs, ","infix_spaces_linter" +"vignettes/basic_cea.Rmd",71,46,"style","Trailing whitespace is superfluous.","icer_hiv <- calculate_icers(cost=v_hiv_costs, ","trailing_whitespace_linter" +"vignettes/basic_cea.Rmd",72,35,"style","Put spaces around all infix operators."," effect=v_hiv_qalys, ","infix_spaces_linter" +"vignettes/basic_cea.Rmd",72,48,"style","Trailing whitespace is superfluous."," effect=v_hiv_qalys, ","trailing_whitespace_linter" +"vignettes/basic_cea.Rmd",73,39,"style","Put spaces around all infix operators."," strategies=v_hiv_strat_names)","infix_spaces_linter" +"vignettes/basic_cea.Rmd",101,15,"style","Trailing whitespace is superfluous.","plot(icer_hiv, ","trailing_whitespace_linter" +"vignettes/basic_cea.Rmd",102,11,"style","Put spaces around all infix operators."," label=""all"")","infix_spaces_linter" +"vignettes/basic_cea.Rmd",107,15,"style","Trailing whitespace is superfluous.","plot(icer_hiv, ","trailing_whitespace_linter" +"vignettes/basic_cea.Rmd",108,11,"style","Put spaces around all infix operators."," label=""all"") +","infix_spaces_linter" +"vignettes/basic_cea.Rmd",157,25,"style","Put spaces around all infix operators."," filter(Status == ""ND"")%>%","infix_spaces_linter" +"vignettes/dsa_generation.Rmd",43,80,"style","Trailing whitespace is superfluous."," # -- disease progression parameters (annual): r_HD, p_S1S2, hr_S1D, hr_S2D, ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",49,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",51,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",55,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",57,24,"warning","no visible binding for global variable β€˜r_disc’"," v_dw <- 1 / ((1 + r_disc) ^ (0:n_cycles))","object_usage_linter" +"vignettes/dsa_generation.Rmd",57,37,"warning","no visible binding for global variable β€˜n_cycles’"," v_dw <- 1 / ((1 + r_disc) ^ (0:n_cycles))","object_usage_linter" +"vignettes/dsa_generation.Rmd",58,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",60,29,"warning","no visible binding for global variable β€˜c_H’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" +"vignettes/dsa_generation.Rmd",60,41,"warning","no visible binding for global variable β€˜c_S1’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" +"vignettes/dsa_generation.Rmd",60,54,"warning","no visible binding for global variable β€˜c_S2’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" +"vignettes/dsa_generation.Rmd",60,66,"warning","no visible binding for global variable β€˜c_D’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" +"vignettes/dsa_generation.Rmd",61,32,"warning","no visible binding for global variable β€˜u_H’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" +"vignettes/dsa_generation.Rmd",61,44,"warning","no visible binding for global variable β€˜u_S1’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" +"vignettes/dsa_generation.Rmd",61,57,"warning","no visible binding for global variable β€˜u_S2’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" +"vignettes/dsa_generation.Rmd",61,69,"warning","no visible binding for global variable β€˜u_D’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" +"vignettes/dsa_generation.Rmd",62,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",64,14,"warning","no visible binding for global variable β€˜hr_S1D’"," r_S1D <- hr_S1D * r_HD # rate of death in sick state","object_usage_linter" +"vignettes/dsa_generation.Rmd",64,23,"warning","no visible binding for global variable β€˜r_HD’"," r_S1D <- hr_S1D * r_HD # rate of death in sick state","object_usage_linter" +"vignettes/dsa_generation.Rmd",65,14,"warning","no visible binding for global variable β€˜hr_S2D’"," r_S2D <- hr_S2D * r_HD # rate of death in sicker state","object_usage_linter" +"vignettes/dsa_generation.Rmd",65,23,"warning","no visible binding for global variable β€˜r_HD’"," r_S2D <- hr_S2D * r_HD # rate of death in sicker state","object_usage_linter" +"vignettes/dsa_generation.Rmd",68,23,"warning","no visible binding for global variable β€˜r_HD’"," p_HD <- 1 - exp(-r_HD) # probability of dying when healthy","object_usage_linter" +"vignettes/dsa_generation.Rmd",69,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",70,48,"style","Trailing whitespace is superfluous."," ## Initialize transition probability matrix ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",71,85,"style","Trailing whitespace is superfluous."," # all transitions to a non-death state are assumed to be conditional on survival ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",72,21,"style","Trailing whitespace is superfluous."," m_P <- matrix(0, ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",73,52,"style","Trailing whitespace is superfluous."," nrow = n_states, ncol = n_states, ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",77,42,"warning","no visible binding for global variable β€˜p_HS1’"," m_P[""H"", ""H""] <- (1 - p_HD) * (1 - p_HS1) ","object_usage_linter" +"vignettes/dsa_generation.Rmd",77,48,"style","Trailing whitespace is superfluous."," m_P[""H"", ""H""] <- (1 - p_HD) * (1 - p_HS1) ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",78,37,"warning","no visible binding for global variable β€˜p_HS1’"," m_P[""H"", ""S1""] <- (1 - p_HD) * p_HS1 ","object_usage_linter" +"vignettes/dsa_generation.Rmd",78,42,"style","Trailing whitespace is superfluous."," m_P[""H"", ""S1""] <- (1 - p_HD) * p_HS1 ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",81,38,"warning","no visible binding for global variable β€˜p_S1H’"," m_P[""S1"", ""H""] <- (1 - p_S1D) * p_S1H","object_usage_linter" +"vignettes/dsa_generation.Rmd",82,44,"warning","no visible binding for global variable β€˜p_S1H’"," m_P[""S1"", ""S1""] <- (1 - p_S1D) * (1 - (p_S1H + p_S1S2))","object_usage_linter" +"vignettes/dsa_generation.Rmd",82,52,"warning","no visible binding for global variable β€˜p_S1S2’"," m_P[""S1"", ""S1""] <- (1 - p_S1D) * (1 - (p_S1H + p_S1S2))","object_usage_linter" +"vignettes/dsa_generation.Rmd",83,38,"warning","no visible binding for global variable β€˜p_S1S2’"," m_P[""S1"", ""S2""] <- (1 - p_S1D) * p_S1S2","object_usage_linter" +"vignettes/dsa_generation.Rmd",90,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",91,67,"style","Trailing whitespace is superfluous."," # check that all transition matrix entries are between 0 and 1 ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",92,7,"style","Place a space before left parenthesis, except in a function call."," if(!all(m_P <= 1 & m_P >= 0)){","spaces_left_parentheses_linter" +"vignettes/dsa_generation.Rmd",92,34,"style","There should be a space before an opening curly brace."," if(!all(m_P <= 1 & m_P >= 0)){","brace_linter" +"vignettes/dsa_generation.Rmd",92,34,"style","There should be a space between a right parenthesis and a body expression."," if(!all(m_P <= 1 & m_P >= 0)){","paren_body_linter" +"vignettes/dsa_generation.Rmd",96,47,"style","Commas should always have a space after."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","commas_linter" +"vignettes/dsa_generation.Rmd",96,53,"style","Commas should always have a space after."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","commas_linter" +"vignettes/dsa_generation.Rmd",96,64,"style","There should be a space before an opening curly brace."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","brace_linter" +"vignettes/dsa_generation.Rmd",96,64,"style","There should be a space between a right parenthesis and a body expression."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","paren_body_linter" +"vignettes/dsa_generation.Rmd",99,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",102,34,"warning","no visible binding for global variable β€˜n_cycles’"," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","object_usage_linter" +"vignettes/dsa_generation.Rmd",102,34,"warning","no visible binding for global variable β€˜n_cycles’"," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","object_usage_linter" +"vignettes/dsa_generation.Rmd",102,46,"style","Commas should never have a space before."," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","commas_linter" +"vignettes/dsa_generation.Rmd",102,48,"style","Trailing whitespace is superfluous."," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",105,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",107,36,"warning","no visible binding for global variable β€˜n_cycles’"," v_C <- v_Q <- numeric(length = n_cycles + 1)","object_usage_linter" +"vignettes/dsa_generation.Rmd",108,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",110,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",111,21,"warning","no visible binding for global variable β€˜v_s_init’"," m_Trace[1, ] <- v_s_init # initialize Markov trace","object_usage_linter" +"vignettes/dsa_generation.Rmd",114,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",115,17,"warning","no visible binding for global variable β€˜n_cycles’"," for (t in 1:n_cycles){ # throughout the number of cycles","object_usage_linter" +"vignettes/dsa_generation.Rmd",117,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",119,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",121,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",123,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",125,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",128,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",131,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",133,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",136,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",144,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",156,56,"style","There should be a space before an opening curly brace.","simulate_strategies <- function(l_params, wtp = 100000){","brace_linter" +"vignettes/dsa_generation.Rmd",156,56,"style","There should be a space between a right parenthesis and a body expression.","simulate_strategies <- function(l_params, wtp = 100000){","paren_body_linter" +"vignettes/dsa_generation.Rmd",159,80,"style","Trailing whitespace is superfluous."," # -- disease progression parameters (annual): r_HD, p_S1S2, hr_S1D, hr_S2D, ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",169,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",171,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",177,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",180,18,"warning","no visible binding for global variable β€˜u_trtA’"," u_S1_trtA <- u_trtA","object_usage_linter" +"vignettes/dsa_generation.Rmd",182,18,"warning","no visible binding for global variable β€˜c_S1’"," c_S1_trtA <- c_S1 + c_trtA","object_usage_linter" +"vignettes/dsa_generation.Rmd",182,25,"warning","no visible binding for global variable β€˜c_trtA’"," c_S1_trtA <- c_S1 + c_trtA","object_usage_linter" +"vignettes/dsa_generation.Rmd",183,18,"warning","no visible binding for global variable β€˜c_S2’"," c_S2_trtA <- c_S2 + c_trtA","object_usage_linter" +"vignettes/dsa_generation.Rmd",183,25,"warning","no visible binding for global variable β€˜c_trtA’"," c_S2_trtA <- c_S2 + c_trtA","object_usage_linter" +"vignettes/dsa_generation.Rmd",184,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",187,29,"warning","no visible binding for global variable β€˜p_S1S2’"," r_S1S2_trtB <- -log(1 - p_S1S2) * hr_S1S2_trtB ","object_usage_linter" +"vignettes/dsa_generation.Rmd",187,39,"warning","no visible binding for global variable β€˜hr_S1S2_trtB’"," r_S1S2_trtB <- -log(1 - p_S1S2) * hr_S1S2_trtB ","object_usage_linter" +"vignettes/dsa_generation.Rmd",187,51,"style","Trailing whitespace is superfluous."," r_S1S2_trtB <- -log(1 - p_S1S2) * hr_S1S2_trtB ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",190,18,"warning","no visible binding for global variable β€˜c_S1’"," c_S1_trtB <- c_S1 + c_trtB","object_usage_linter" +"vignettes/dsa_generation.Rmd",190,25,"warning","no visible binding for global variable β€˜c_trtB’"," c_S1_trtB <- c_S1 + c_trtB","object_usage_linter" +"vignettes/dsa_generation.Rmd",191,18,"warning","no visible binding for global variable β€˜c_S2’"," c_S2_trtB <- c_S2 + c_trtB","object_usage_linter" +"vignettes/dsa_generation.Rmd",191,25,"warning","no visible binding for global variable β€˜c_trtB’"," c_S2_trtB <- c_S2 + c_trtB","object_usage_linter" +"vignettes/dsa_generation.Rmd",193,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",194,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",202,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",203,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",206,42,"warning","no visible binding for global variable β€˜n_cycles’"," l_params_markov <- list(n_cycles = n_cycles, r_disc = r_disc, v_s_init = v_s_init,","object_usage_linter" +"vignettes/dsa_generation.Rmd",206,61,"warning","no visible binding for global variable β€˜r_disc’"," l_params_markov <- list(n_cycles = n_cycles, r_disc = r_disc, v_s_init = v_s_init,","object_usage_linter" +"vignettes/dsa_generation.Rmd",206,80,"warning","no visible binding for global variable β€˜v_s_init’"," l_params_markov <- list(n_cycles = n_cycles, r_disc = r_disc, v_s_init = v_s_init,","object_usage_linter" +"vignettes/dsa_generation.Rmd",207,38,"warning","no visible binding for global variable β€˜c_H’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" +"vignettes/dsa_generation.Rmd",207,50,"warning","no visible binding for global variable β€˜c_S2’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" +"vignettes/dsa_generation.Rmd",207,63,"warning","no visible binding for global variable β€˜c_S1’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" +"vignettes/dsa_generation.Rmd",207,75,"warning","no visible binding for global variable β€˜c_D’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" +"vignettes/dsa_generation.Rmd",208,38,"warning","no visible binding for global variable β€˜u_H’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" +"vignettes/dsa_generation.Rmd",208,50,"warning","no visible binding for global variable β€˜u_S2’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" +"vignettes/dsa_generation.Rmd",208,63,"warning","no visible binding for global variable β€˜u_S1’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" +"vignettes/dsa_generation.Rmd",208,75,"warning","no visible binding for global variable β€˜u_D’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" +"vignettes/dsa_generation.Rmd",209,38,"warning","no visible binding for global variable β€˜r_HD’"," r_HD = r_HD, hr_S1D = hr_S1D, hr_S2D = hr_S2D,","object_usage_linter" +"vignettes/dsa_generation.Rmd",209,53,"warning","no visible binding for global variable β€˜hr_S1D’"," r_HD = r_HD, hr_S1D = hr_S1D, hr_S2D = hr_S2D,","object_usage_linter" +"vignettes/dsa_generation.Rmd",209,70,"warning","no visible binding for global variable β€˜hr_S2D’"," r_HD = r_HD, hr_S1D = hr_S1D, hr_S2D = hr_S2D,","object_usage_linter" +"vignettes/dsa_generation.Rmd",210,39,"warning","no visible binding for global variable β€˜p_HS1’"," p_HS1 = p_HS1, p_S1H = p_S1H, p_S1S2 = p_S1S2)","object_usage_linter" +"vignettes/dsa_generation.Rmd",210,54,"warning","no visible binding for global variable β€˜p_S1H’"," p_HS1 = p_HS1, p_S1H = p_S1H, p_S1S2 = p_S1S2)","object_usage_linter" +"vignettes/dsa_generation.Rmd",210,70,"warning","no visible binding for global variable β€˜p_S1S2’"," p_HS1 = p_HS1, p_S1H = p_S1H, p_S1S2 = p_S1S2)","object_usage_linter" +"vignettes/dsa_generation.Rmd",211,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",212,45,"style","There should be a space before an opening curly brace."," if (v_names_strat[i] == ""Treatment_A""){","brace_linter" +"vignettes/dsa_generation.Rmd",212,45,"style","There should be a space between a right parenthesis and a body expression."," if (v_names_strat[i] == ""Treatment_A""){","paren_body_linter" +"vignettes/dsa_generation.Rmd",216,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",217,16,"style","Place a space before left parenthesis, except in a function call."," } else if(v_names_strat[i] == ""Treatment_B""){","spaces_left_parentheses_linter" +"vignettes/dsa_generation.Rmd",217,51,"style","There should be a space before an opening curly brace."," } else if(v_names_strat[i] == ""Treatment_B""){","brace_linter" +"vignettes/dsa_generation.Rmd",217,51,"style","There should be a space between a right parenthesis and a body expression."," } else if(v_names_strat[i] == ""Treatment_B""){","paren_body_linter" +"vignettes/dsa_generation.Rmd",224,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",230,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",242,41,"style","Trailing whitespace is superfluous."," r_HD = 0.002, ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",243,39,"style","Trailing whitespace is superfluous."," hr_S1D = 3, ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",248,41,"style","Trailing whitespace is superfluous."," c_S2 = 15000, ","trailing_whitespace_linter" +"vignettes/psa_analysis.Rmd",98,28,"style","Trailing whitespace is superfluous.","psa_sum <- summary(psa_obj, ","trailing_whitespace_linter" +"vignettes/psa_analysis.Rmd",106,50,"style","Trailing whitespace is superfluous.","icers <- calculate_icers(cost = psa_sum$meanCost, ","trailing_whitespace_linter" +"vignettes/psa_analysis.Rmd",107,54,"style","Trailing whitespace is superfluous."," effect = psa_sum$meanEffect, ","trailing_whitespace_linter" +"vignettes/psa_analysis.Rmd",119,40,"style","Trailing whitespace is superfluous.","ceac_obj <- ceac(wtp = example_psa$wtp, ","trailing_whitespace_linter" +"vignettes/psa_analysis.Rmd",133,15,"style","Trailing whitespace is superfluous.","plot(ceac_obj, ","trailing_whitespace_linter" +"vignettes/psa_analysis.Rmd",134,22,"style","Trailing whitespace is superfluous."," frontier = TRUE, ","trailing_whitespace_linter" +"vignettes/psa_analysis.Rmd",145,43,"style","Trailing whitespace is superfluous.","el <- calc_exp_loss(wtp = example_psa$wtp, ","trailing_whitespace_linter" +"vignettes/psa_analysis.Rmd",148,9,"style","Trailing whitespace is superfluous.","plot(el, ","trailing_whitespace_linter" +"vignettes/psa_analysis.Rmd",149,20,"style","Trailing whitespace is superfluous."," n_x_ticks = 8, ","trailing_whitespace_linter" +"vignettes/psa_analysis.Rmd",183,16,"style","Trailing whitespace is superfluous.","owsa_tornado(o, ","trailing_whitespace_linter" +"vignettes/psa_analysis.Rmd",189,16,"style","Trailing whitespace is superfluous.","owsa_tornado(o, ","trailing_whitespace_linter" +"vignettes/psa_analysis.Rmd",198,18,"style","Trailing whitespace is superfluous.","owsa_opt_strat(o, ","trailing_whitespace_linter" +"vignettes/psa_analysis.Rmd",205,18,"style","Trailing whitespace is superfluous.","owsa_opt_strat(o, ","trailing_whitespace_linter" +"vignettes/psa_analysis.Rmd",214,20,"style","Trailing whitespace is superfluous.","tw <- twsa(psa_obj, ","trailing_whitespace_linter" +"vignettes/psa_analysis.Rmd",215,34,"style","Trailing whitespace is superfluous."," param1 = ""pFailChemo"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",39,80,"style","Trailing whitespace is superfluous."," # -- disease progression parameters (annual): r_HD, p_S1S2, hr_S1D, hr_S2D, ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",45,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",47,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",51,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",53,24,"warning","no visible binding for global variable β€˜r_disc’"," v_dw <- 1 / ((1 + r_disc) ^ (0:n_cycles))","object_usage_linter" +"vignettes/psa_generation.Rmd",53,37,"warning","no visible binding for global variable β€˜n_cycles’"," v_dw <- 1 / ((1 + r_disc) ^ (0:n_cycles))","object_usage_linter" +"vignettes/psa_generation.Rmd",54,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",56,29,"warning","no visible binding for global variable β€˜c_H’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" +"vignettes/psa_generation.Rmd",56,41,"warning","no visible binding for global variable β€˜c_S1’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" +"vignettes/psa_generation.Rmd",56,54,"warning","no visible binding for global variable β€˜c_S2’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" +"vignettes/psa_generation.Rmd",56,66,"warning","no visible binding for global variable β€˜c_D’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" +"vignettes/psa_generation.Rmd",57,32,"warning","no visible binding for global variable β€˜u_H’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" +"vignettes/psa_generation.Rmd",57,44,"warning","no visible binding for global variable β€˜u_S1’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" +"vignettes/psa_generation.Rmd",57,57,"warning","no visible binding for global variable β€˜u_S2’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" +"vignettes/psa_generation.Rmd",57,69,"warning","no visible binding for global variable β€˜u_D’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" +"vignettes/psa_generation.Rmd",58,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",60,14,"warning","no visible binding for global variable β€˜hr_S1D’"," r_S1D <- hr_S1D * r_HD # rate of death in sick state","object_usage_linter" +"vignettes/psa_generation.Rmd",60,23,"warning","no visible binding for global variable β€˜r_HD’"," r_S1D <- hr_S1D * r_HD # rate of death in sick state","object_usage_linter" +"vignettes/psa_generation.Rmd",61,14,"warning","no visible binding for global variable β€˜hr_S2D’"," r_S2D <- hr_S2D * r_HD # rate of death in sicker state","object_usage_linter" +"vignettes/psa_generation.Rmd",61,23,"warning","no visible binding for global variable β€˜r_HD’"," r_S2D <- hr_S2D * r_HD # rate of death in sicker state","object_usage_linter" +"vignettes/psa_generation.Rmd",64,23,"warning","no visible binding for global variable β€˜r_HD’"," p_HD <- 1 - exp(-r_HD) # probability of dying when healthy","object_usage_linter" +"vignettes/psa_generation.Rmd",65,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",66,48,"style","Trailing whitespace is superfluous."," ## Initialize transition probability matrix ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",67,85,"style","Trailing whitespace is superfluous."," # all transitions to a non-death state are assumed to be conditional on survival ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",68,21,"style","Trailing whitespace is superfluous."," m_P <- matrix(0, ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",69,52,"style","Trailing whitespace is superfluous."," nrow = n_states, ncol = n_states, ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",73,42,"warning","no visible binding for global variable β€˜p_HS1’"," m_P[""H"", ""H""] <- (1 - p_HD) * (1 - p_HS1) ","object_usage_linter" +"vignettes/psa_generation.Rmd",73,48,"style","Trailing whitespace is superfluous."," m_P[""H"", ""H""] <- (1 - p_HD) * (1 - p_HS1) ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",74,37,"warning","no visible binding for global variable β€˜p_HS1’"," m_P[""H"", ""S1""] <- (1 - p_HD) * p_HS1 ","object_usage_linter" +"vignettes/psa_generation.Rmd",74,42,"style","Trailing whitespace is superfluous."," m_P[""H"", ""S1""] <- (1 - p_HD) * p_HS1 ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",77,38,"warning","no visible binding for global variable β€˜p_S1H’"," m_P[""S1"", ""H""] <- (1 - p_S1D) * p_S1H","object_usage_linter" +"vignettes/psa_generation.Rmd",78,44,"warning","no visible binding for global variable β€˜p_S1H’"," m_P[""S1"", ""S1""] <- (1 - p_S1D) * (1 - (p_S1H + p_S1S2))","object_usage_linter" +"vignettes/psa_generation.Rmd",78,52,"warning","no visible binding for global variable β€˜p_S1S2’"," m_P[""S1"", ""S1""] <- (1 - p_S1D) * (1 - (p_S1H + p_S1S2))","object_usage_linter" +"vignettes/psa_generation.Rmd",79,38,"warning","no visible binding for global variable β€˜p_S1S2’"," m_P[""S1"", ""S2""] <- (1 - p_S1D) * p_S1S2","object_usage_linter" +"vignettes/psa_generation.Rmd",86,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",87,67,"style","Trailing whitespace is superfluous."," # check that all transition matrix entries are between 0 and 1 ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",88,7,"style","Place a space before left parenthesis, except in a function call."," if(!all(m_P <= 1 & m_P >= 0)){","spaces_left_parentheses_linter" +"vignettes/psa_generation.Rmd",88,34,"style","There should be a space before an opening curly brace."," if(!all(m_P <= 1 & m_P >= 0)){","brace_linter" +"vignettes/psa_generation.Rmd",88,34,"style","There should be a space between a right parenthesis and a body expression."," if(!all(m_P <= 1 & m_P >= 0)){","paren_body_linter" +"vignettes/psa_generation.Rmd",92,47,"style","Commas should always have a space after."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","commas_linter" +"vignettes/psa_generation.Rmd",92,53,"style","Commas should always have a space after."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","commas_linter" +"vignettes/psa_generation.Rmd",92,64,"style","There should be a space before an opening curly brace."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","brace_linter" +"vignettes/psa_generation.Rmd",92,64,"style","There should be a space between a right parenthesis and a body expression."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","paren_body_linter" +"vignettes/psa_generation.Rmd",95,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",98,34,"warning","no visible binding for global variable β€˜n_cycles’"," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","object_usage_linter" +"vignettes/psa_generation.Rmd",98,34,"warning","no visible binding for global variable β€˜n_cycles’"," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","object_usage_linter" +"vignettes/psa_generation.Rmd",98,46,"style","Commas should never have a space before."," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","commas_linter" +"vignettes/psa_generation.Rmd",98,48,"style","Trailing whitespace is superfluous."," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",101,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",103,36,"warning","no visible binding for global variable β€˜n_cycles’"," v_C <- v_Q <- numeric(length = n_cycles + 1)","object_usage_linter" +"vignettes/psa_generation.Rmd",104,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",106,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",107,21,"warning","no visible binding for global variable β€˜v_s_init’"," m_Trace[1, ] <- v_s_init # initialize Markov trace","object_usage_linter" +"vignettes/psa_generation.Rmd",110,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",111,17,"warning","no visible binding for global variable β€˜n_cycles’"," for (t in 1:n_cycles){ # throughout the number of cycles","object_usage_linter" +"vignettes/psa_generation.Rmd",113,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",115,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",117,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",119,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",121,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",124,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",127,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",129,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",132,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",140,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",148,56,"style","There should be a space before an opening curly brace.","simulate_strategies <- function(l_params, wtp = 100000){","brace_linter" +"vignettes/psa_generation.Rmd",148,56,"style","There should be a space between a right parenthesis and a body expression.","simulate_strategies <- function(l_params, wtp = 100000){","paren_body_linter" +"vignettes/psa_generation.Rmd",151,80,"style","Trailing whitespace is superfluous."," # -- disease progression parameters (annual): r_HD, p_S1S2, hr_S1D, hr_S2D, ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",161,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",163,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",169,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",172,18,"warning","no visible binding for global variable β€˜u_trtA’"," u_S1_trtA <- u_trtA","object_usage_linter" +"vignettes/psa_generation.Rmd",174,18,"warning","no visible binding for global variable β€˜c_S1’"," c_S1_trtA <- c_S1 + c_trtA","object_usage_linter" +"vignettes/psa_generation.Rmd",174,25,"warning","no visible binding for global variable β€˜c_trtA’"," c_S1_trtA <- c_S1 + c_trtA","object_usage_linter" +"vignettes/psa_generation.Rmd",175,18,"warning","no visible binding for global variable β€˜c_S2’"," c_S2_trtA <- c_S2 + c_trtA","object_usage_linter" +"vignettes/psa_generation.Rmd",175,25,"warning","no visible binding for global variable β€˜c_trtA’"," c_S2_trtA <- c_S2 + c_trtA","object_usage_linter" +"vignettes/psa_generation.Rmd",176,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",179,29,"warning","no visible binding for global variable β€˜p_S1S2’"," r_S1S2_trtB <- -log(1 - p_S1S2) * hr_S1S2_trtB ","object_usage_linter" +"vignettes/psa_generation.Rmd",179,39,"warning","no visible binding for global variable β€˜hr_S1S2_trtB’"," r_S1S2_trtB <- -log(1 - p_S1S2) * hr_S1S2_trtB ","object_usage_linter" +"vignettes/psa_generation.Rmd",179,51,"style","Trailing whitespace is superfluous."," r_S1S2_trtB <- -log(1 - p_S1S2) * hr_S1S2_trtB ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",182,18,"warning","no visible binding for global variable β€˜c_S1’"," c_S1_trtB <- c_S1 + c_trtB","object_usage_linter" +"vignettes/psa_generation.Rmd",182,25,"warning","no visible binding for global variable β€˜c_trtB’"," c_S1_trtB <- c_S1 + c_trtB","object_usage_linter" +"vignettes/psa_generation.Rmd",183,18,"warning","no visible binding for global variable β€˜c_S2’"," c_S2_trtB <- c_S2 + c_trtB","object_usage_linter" +"vignettes/psa_generation.Rmd",183,25,"warning","no visible binding for global variable β€˜c_trtB’"," c_S2_trtB <- c_S2 + c_trtB","object_usage_linter" +"vignettes/psa_generation.Rmd",185,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",186,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",194,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",195,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",198,42,"warning","no visible binding for global variable β€˜n_cycles’"," l_params_markov <- list(n_cycles = n_cycles, r_disc = r_disc, v_s_init = v_s_init,","object_usage_linter" +"vignettes/psa_generation.Rmd",198,61,"warning","no visible binding for global variable β€˜r_disc’"," l_params_markov <- list(n_cycles = n_cycles, r_disc = r_disc, v_s_init = v_s_init,","object_usage_linter" +"vignettes/psa_generation.Rmd",198,80,"warning","no visible binding for global variable β€˜v_s_init’"," l_params_markov <- list(n_cycles = n_cycles, r_disc = r_disc, v_s_init = v_s_init,","object_usage_linter" +"vignettes/psa_generation.Rmd",199,38,"warning","no visible binding for global variable β€˜c_H’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" +"vignettes/psa_generation.Rmd",199,50,"warning","no visible binding for global variable β€˜c_S2’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" +"vignettes/psa_generation.Rmd",199,63,"warning","no visible binding for global variable β€˜c_S1’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" +"vignettes/psa_generation.Rmd",199,75,"warning","no visible binding for global variable β€˜c_D’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" +"vignettes/psa_generation.Rmd",200,38,"warning","no visible binding for global variable β€˜u_H’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" +"vignettes/psa_generation.Rmd",200,50,"warning","no visible binding for global variable β€˜u_S2’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" +"vignettes/psa_generation.Rmd",200,63,"warning","no visible binding for global variable β€˜u_S1’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" +"vignettes/psa_generation.Rmd",200,75,"warning","no visible binding for global variable β€˜u_D’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" +"vignettes/psa_generation.Rmd",201,38,"warning","no visible binding for global variable β€˜r_HD’"," r_HD = r_HD, hr_S1D = hr_S1D, hr_S2D = hr_S2D,","object_usage_linter" +"vignettes/psa_generation.Rmd",201,53,"warning","no visible binding for global variable β€˜hr_S1D’"," r_HD = r_HD, hr_S1D = hr_S1D, hr_S2D = hr_S2D,","object_usage_linter" +"vignettes/psa_generation.Rmd",201,70,"warning","no visible binding for global variable β€˜hr_S2D’"," r_HD = r_HD, hr_S1D = hr_S1D, hr_S2D = hr_S2D,","object_usage_linter" +"vignettes/psa_generation.Rmd",202,39,"warning","no visible binding for global variable β€˜p_HS1’"," p_HS1 = p_HS1, p_S1H = p_S1H, p_S1S2 = p_S1S2)","object_usage_linter" +"vignettes/psa_generation.Rmd",202,54,"warning","no visible binding for global variable β€˜p_S1H’"," p_HS1 = p_HS1, p_S1H = p_S1H, p_S1S2 = p_S1S2)","object_usage_linter" +"vignettes/psa_generation.Rmd",202,70,"warning","no visible binding for global variable β€˜p_S1S2’"," p_HS1 = p_HS1, p_S1H = p_S1H, p_S1S2 = p_S1S2)","object_usage_linter" +"vignettes/psa_generation.Rmd",203,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",204,45,"style","There should be a space before an opening curly brace."," if (v_names_strat[i] == ""Treatment_A""){","brace_linter" +"vignettes/psa_generation.Rmd",204,45,"style","There should be a space between a right parenthesis and a body expression."," if (v_names_strat[i] == ""Treatment_A""){","paren_body_linter" +"vignettes/psa_generation.Rmd",208,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",209,16,"style","Place a space before left parenthesis, except in a function call."," } else if(v_names_strat[i] == ""Treatment_B""){","spaces_left_parentheses_linter" +"vignettes/psa_generation.Rmd",209,51,"style","There should be a space before an opening curly brace."," } else if(v_names_strat[i] == ""Treatment_B""){","brace_linter" +"vignettes/psa_generation.Rmd",209,51,"style","There should be a space between a right parenthesis and a body expression."," } else if(v_names_strat[i] == ""Treatment_B""){","paren_body_linter" +"vignettes/psa_generation.Rmd",216,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",222,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",238,24,"style","Trailing whitespace is superfluous."," ""p_HS1"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",239,24,"style","Trailing whitespace is superfluous."," ""p_S1H"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",240,25,"style","Trailing whitespace is superfluous."," ""p_S1S2"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",242,24,"style","Trailing whitespace is superfluous."," ""hr_S1"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",246,22,"style","Trailing whitespace is superfluous."," ""c_H"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",247,23,"style","Trailing whitespace is superfluous."," ""c_S1"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",254,23,"style","Trailing whitespace is superfluous."," ""u_S2"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",258,22,"style","Trailing whitespace is superfluous."," ""beta"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",259,22,"style","Trailing whitespace is superfluous."," ""beta"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",263,28,"style","Trailing whitespace is superfluous."," ""log-normal"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",266,23,"style","Trailing whitespace is superfluous."," ""gamma"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",267,23,"style","Trailing whitespace is superfluous."," ""gamma"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",269,23,"style","Trailing whitespace is superfluous."," ""gamma"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",270,23,"style","Trailing whitespace is superfluous."," ""gamma"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",272,34,"style","Trailing whitespace is superfluous."," ""truncated-normal"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",273,34,"style","Trailing whitespace is superfluous."," ""truncated-normal"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",274,34,"style","Trailing whitespace is superfluous."," ""truncated-normal"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",278,39,"style","Trailing whitespace is superfluous."," ""a, b"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",279,39,"style","Trailing whitespace is superfluous."," ""a, b"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",282,43,"style","Trailing whitespace is superfluous."," ""mean, sd"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",283,43,"style","Trailing whitespace is superfluous."," ""mean, sd"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",286,47,"style","Trailing whitespace is superfluous."," ""shape, scale"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",287,47,"style","Trailing whitespace is superfluous."," ""shape, scale"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",292,51,"style","Trailing whitespace is superfluous."," ""mean, sd, ll, ul"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",293,51,"style","Trailing whitespace is superfluous."," ""mean, sd, ll, ul"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",298,38,"style","Trailing whitespace is superfluous."," c(7.5, 42.5), ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",299,35,"style","Trailing whitespace is superfluous."," c(12, 12), ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",302,35,"style","Trailing whitespace is superfluous."," c(3, 0.5), ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",306,37,"style","Trailing whitespace is superfluous."," c(44.5, 45), ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",308,39,"style","Trailing whitespace is superfluous."," c(900, 16.67), ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",313,46,"style","Trailing whitespace is superfluous."," c(0.75, 0.02, NA, 1), ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",316,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",332,41,"style","Trailing whitespace is superfluous."," r_HD = 0.002, ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",333,39,"style","Trailing whitespace is superfluous."," hr_S1D = 3, ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",338,41,"style","Trailing whitespace is superfluous."," c_S2 = 15000, ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",364,62,"style","Trailing whitespace is superfluous.","cea_psa <- make_psa_obj(cost = psa_output$Cost$other_outcome, ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",365,64,"style","Trailing whitespace is superfluous."," effect = psa_output$QALY$other_outcome, ","trailing_whitespace_linter" +"vignettes/voi.Rmd",37,42,"style","Trailing whitespace is superfluous.","psa_big <- make_psa_obj(example_psa$cost, ","trailing_whitespace_linter" +"vignettes/voi.Rmd",39,48,"style","Trailing whitespace is superfluous."," example_psa$parameters, ","trailing_whitespace_linter" +"vignettes/voi.Rmd",54,24,"style","Trailing whitespace is superfluous."," txtsize = 16, ","trailing_whitespace_linter" +"vignettes/voi.Rmd",55,33,"style","Trailing whitespace is superfluous."," effect_units = ""QALY"", ","trailing_whitespace_linter" +"vignettes/voi.Rmd",57,42,"style","Trailing whitespace is superfluous."," xbreaks = seq(0, 200, by = 10), ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/dampack/email-body b/.dev/revdep_emails/dampack/email-body new file mode 100644 index 000000000..315766631 --- /dev/null +++ b/.dev/revdep_emails/dampack/email-body @@ -0,0 +1,27 @@ +Hello Greg Knowlton! Thank you for using {lintr} in your package {dampack}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/DARTH-git/dampack using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 27s on CRAN vs. 13s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/dashboardthemes/attachments/dashboardthemes.warnings b/.dev/revdep_emails/dashboardthemes/attachments/dashboardthemes.warnings new file mode 100644 index 000000000..3c25f3e16 --- /dev/null +++ b/.dev/revdep_emails/dashboardthemes/attachments/dashboardthemes.warnings @@ -0,0 +1,263 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Linter closed_curly_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. +Trying to remove β€˜open_curly_linter’, β€˜undesirable_function_linter’, β€˜undesirable_operator_linter’ and β€˜todo_comment_linter’, which are not in `defaults`. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. diff --git a/.dev/revdep_emails/dashboardthemes/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/dashboardthemes/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..35aab9a3a --- /dev/null +++ b/.dev/revdep_emails/dashboardthemes/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,3 @@ +"filename","line_number","column_number","type","message","line","linter" +"vignettes/using_dashboardthemes.Rmd",70,3,"error","unexpected symbol"," ...",NA +"vignettes/using_dashboardthemes.Rmd",267,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" diff --git a/.dev/revdep_emails/dashboardthemes/email-body b/.dev/revdep_emails/dashboardthemes/email-body new file mode 100644 index 000000000..c7ed7154b --- /dev/null +++ b/.dev/revdep_emails/dashboardthemes/email-body @@ -0,0 +1,27 @@ +Hello Nik Lilovski! Thank you for using {lintr} in your package {dashboardthemes}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/nik01010/dashboardthemes using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 10s on CRAN vs. 8s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/dat/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/dat/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..6e7ec86ce --- /dev/null +++ b/.dev/revdep_emails/dat/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,7 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/DataFrame.R",64,1,"style","Variable and function name style should be snake_case.","as.DataFrame.data.frame <- function(x, ...) {","object_name_linter" +"R/dataTableBackend.R",44,7,"style","Variable and function name style should be snake_case."," env$.__x__ <- x","object_name_linter" +"R/helper.R",20,13,"style","Variable and function name style should be snake_case."," .self$classOfX <- class(xS3)","object_name_linter" +"R/helper.R",23,13,"style","Variable and function name style should be snake_case."," .self$s4Object <- x","object_name_linter" +"R/helper.R",28,13,"style","Variable and function name style should be snake_case."," .self$classOfX <- class(x)","object_name_linter" +"R/useDplyr.R",12,1,"style","Variable and function name style should be snake_case.",".onAttach <- function(libname, pkgname) {","object_name_linter" diff --git a/.dev/revdep_emails/dat/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/dat/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..a856b4180 --- /dev/null +++ b/.dev/revdep_emails/dat/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,44 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/as.function.R",30,3,"style","`else` should come on the same line as the previous `}`."," else if (length(x) == 3) {","brace_linter" +"R/as.function.R",30,8,"style","Either both or neither branch in `if`/`else` should use curly braces."," else if (length(x) == 3) {","brace_linter" +"R/dataTableBackend.R",28,9,"style","Variable and function name style should be snake_case or symbols."," names(listOfNames) <- colsTmp","object_name_linter" +"R/FormulaList.R",47,9,"style","Variable and function name style should be snake_case or symbols."," names(formulaList) <- NULL","object_name_linter" +"R/FormulaList.R",62,3,"style","`else` should come on the same line as the previous `}`."," else if (is.list(object@.n)) {","brace_linter" +"R/helper.R",22,29,"style","Variable and function name style should be snake_case or symbols."," S3Part(x, needClass = ""data.frame"") <- data.frame()","object_name_linter" +"R/helper.R",27,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/helper.R",42,5,"style","`else` should come on the same line as the previous `}`."," else if (!is.null(classOfX)) {","brace_linter" +"R/helper.R",45,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/helper.R",81,10,"style","Variable and function name style should be snake_case or symbols."," S3Part(.Object) <- addTypeCheck(.Object@fun, class(.Object@prototype)) %>%","object_name_linter" +"R/helper.R",87,10,"style","Variable and function name style should be snake_case or symbols."," S3Part(.Object) <- addTypeCheck(.Object@fun, .Object@type)","object_name_linter" +"R/helper.R",92,11,"style","Compound semicolons are discouraged. Replace them by a newline."," force(f); force(l)","semicolon_linter" +"R/helper.R",106,11,"style","Compound semicolons are discouraged. Replace them by a newline."," force(f); force(type)","semicolon_linter" +"R/helper.R",196,10,"style","Variable and function name style should be snake_case or symbols."," S3Part(.Object) <- formula(tmp, lhs = 1, rhs = 1)","object_name_linter" +"R/helper.R",198,3,"style","Variable and function name style should be snake_case or symbols."," .Object@.n <- eval(.nUnevaluated, envir = environment(.Object))","object_name_linter" +"R/map.R",111,10,"style","Either both or neither branch in `if`/`else` should use curly braces."," ind <- if (length(p) == 1 && grepl(""^\\^"", p)) {","brace_linter" +"tests/testthat/test-DataFrame.R",85,9,"style","Variable and function name style should be snake_case or symbols."," datRef[""newVar""] <- datRef$x + 1","object_name_linter" +"tests/testthat/test-DataFrame.R",94,9,"style","Variable and function name style should be snake_case or symbols."," datRef[""newVar""] <- datRef$x + 1","object_name_linter" +"tests/testthat/test-DataFrame.R",95,9,"style","Variable and function name style should be snake_case or symbols."," datRef[""newVar1""] <- datRef$x + 2","object_name_linter" +"tests/testthat/test-DataFrame.R",105,9,"style","Variable and function name style should be snake_case or symbols."," datRef[""newVar""] <- datRef$x + 1","object_name_linter" +"tests/testthat/test-DataFrame.R",106,9,"style","Variable and function name style should be snake_case or symbols."," datRef[""newVar1""] <- datRef$x + 2","object_name_linter" +"tests/testthat/test-DataFrame.R",117,9,"style","Variable and function name style should be snake_case or symbols."," datRef[""newVar""] <- datRef$x + 1","object_name_linter" +"tests/testthat/test-DataFrame.R",118,9,"style","Variable and function name style should be snake_case or symbols."," datRef[""newVar1""] <- datRef$x + 2","object_name_linter" +"tests/testthat/test-DataFrame.R",126,9,"style","Variable and function name style should be snake_case or symbols."," datRef$id <- datRef$x > 4","object_name_linter" +"tests/testthat/test-DataFrame.R",128,15,"style","Variable and function name style should be snake_case or symbols."," names(datRef)[2] <- ""count""","object_name_linter" +"vignettes/Introduction.Rmd",136,1,"style","Variable and function name style should be snake_case or symbols.","DataTable <- function(...) {","object_name_linter" +"vignettes/performance.Rmd",56,1,"style","Variable and function name style should be snake_case or symbols.","N <- 2e7 # more is not possible with small laptop","object_name_linter" +"vignettes/performance.Rmd",57,1,"style","Variable and function name style should be snake_case or symbols.","K <- 100","object_name_linter" +"vignettes/performance.Rmd",60,1,"style","Variable and function name style should be snake_case or symbols.","DT <- data.table(","object_name_linter" +"vignettes/performance.Rmd",61,33,"style","Commas should always have a space after."," id1 = sample(sprintf(""id%03d"",1:K), N, TRUE), # large groups (char)","commas_linter" +"vignettes/performance.Rmd",62,33,"style","Commas should always have a space after."," id2 = sample(sprintf(""id%03d"",1:K), N, TRUE), # large groups (char)","commas_linter" +"vignettes/performance.Rmd",63,34,"style","Commas should always have a space after."," id3 = sample(sprintf(""id%010d"",1:(N/K)), N, TRUE), # small groups (char)","commas_linter" +"vignettes/performance.Rmd",63,38,"style","Put spaces around all infix operators."," id3 = sample(sprintf(""id%010d"",1:(N/K)), N, TRUE), # small groups (char)","infix_spaces_linter" +"vignettes/performance.Rmd",66,17,"style","Put spaces around all infix operators."," id6 = sample(N/K, N, TRUE), # small groups (int)","infix_spaces_linter" +"vignettes/performance.Rmd",69,32,"style","Commas should always have a space after."," v3 = sample(round(runif(100,max=100),4), N, TRUE) # numeric e.g. 23.5749","commas_linter" +"vignettes/performance.Rmd",69,35,"style","Put spaces around all infix operators."," v3 = sample(round(runif(100,max=100),4), N, TRUE) # numeric e.g. 23.5749","infix_spaces_linter" +"vignettes/performance.Rmd",69,41,"style","Commas should always have a space after."," v3 = sample(round(runif(100,max=100),4), N, TRUE) # numeric e.g. 23.5749","commas_linter" +"vignettes/performance.Rmd",74,1,"style","Variable and function name style should be snake_case or symbols.","DT4 <- new(""DataTable"", DT)","object_name_linter" +"vignettes/performance.Rmd",76,29,"style","Commas should always have a space after.","cat(""GB ="", round(sum(gc()[,2]) / 1024, 3), ""\n"")","commas_linter" +"vignettes/performance.Rmd",105,81,"style","Lines should not be more than 80 characters.","system.time(group_by(DT, id4) %>% summarise(V1 = mean(v1), V2 = mean(v2), V3 = mean(v3)))","line_length_linter" +"vignettes/performance.Rmd",106,81,"style","Lines should not be more than 80 characters.","system.time(group_by(DT, id4) %>% summarise(V1 = mean(v1), V2 = mean(v2), V3 = mean(v3)))","line_length_linter" +"vignettes/performance.Rmd",112,81,"style","Lines should not be more than 80 characters.","system.time(group_by(DT, id6) %>% summarise(V1 = sum(v1), V2 = sum(v2), V3 = sum(v3)))","line_length_linter" +"vignettes/performance.Rmd",113,81,"style","Lines should not be more than 80 characters.","system.time(group_by(DT, id6) %>% summarise(V1 = sum(v1), V2 = sum(v2), V3 = sum(v3)))","line_length_linter" diff --git a/.dev/revdep_emails/dat/email-body b/.dev/revdep_emails/dat/email-body new file mode 100644 index 000000000..534a9f5b1 --- /dev/null +++ b/.dev/revdep_emails/dat/email-body @@ -0,0 +1,27 @@ +Hello Sebastian Warnholz! Thank you for using {lintr} in your package {dat}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/wahani/dat using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 17s on CRAN vs. 11s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/datarobot/email-body b/.dev/revdep_emails/datarobot/email-body new file mode 100644 index 000000000..8412abf99 --- /dev/null +++ b/.dev/revdep_emails/datarobot/email-body @@ -0,0 +1,27 @@ +Hello AJ Alon! Thank you for using {lintr} in your package {datarobot}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cran/datarobot using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took NAs on CRAN vs. NAs in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/datastructures/attachments/datastructures.failure b/.dev/revdep_emails/datastructures/attachments/datastructures.failure new file mode 100644 index 000000000..c3d4a1db0 --- /dev/null +++ b/.dev/revdep_emails/datastructures/attachments/datastructures.failure @@ -0,0 +1 @@ +object 'absolute_paths_linter' not found diff --git a/.dev/revdep_emails/datastructures/email-body b/.dev/revdep_emails/datastructures/email-body new file mode 100644 index 000000000..b56b8bc9f --- /dev/null +++ b/.dev/revdep_emails/datastructures/email-body @@ -0,0 +1,27 @@ +Hello Simon Dirmeier! Thank you for using {lintr} in your package {datastructures}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/dirmeier/datastructures using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 8s on CRAN vs. 0s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/describer/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/describer/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..c18888fb2 --- /dev/null +++ b/.dev/revdep_emails/describer/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,2 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/describe.R",83,1,"style","Variable and function name style should be snake_case.","describe.data.frame <- function(.x) {","object_name_linter" diff --git a/.dev/revdep_emails/describer/email-body b/.dev/revdep_emails/describer/email-body new file mode 100644 index 000000000..b0befa241 --- /dev/null +++ b/.dev/revdep_emails/describer/email-body @@ -0,0 +1,27 @@ +Hello Paul Hendricks! Thank you for using {lintr} in your package {describer}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/paulhendricks/describer using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 3s on CRAN vs. 1s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/devtools/email-body b/.dev/revdep_emails/devtools/email-body new file mode 100644 index 000000000..344c8e1ca --- /dev/null +++ b/.dev/revdep_emails/devtools/email-body @@ -0,0 +1,27 @@ +Hello Jennifer Bryan! Thank you for using {lintr} in your package {devtools}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/r-lib/devtools using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 0s on CRAN vs. 3s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/diffusr/attachments/diffusr.failure b/.dev/revdep_emails/diffusr/attachments/diffusr.failure new file mode 100644 index 000000000..c3d4a1db0 --- /dev/null +++ b/.dev/revdep_emails/diffusr/attachments/diffusr.failure @@ -0,0 +1 @@ +object 'absolute_paths_linter' not found diff --git a/.dev/revdep_emails/diffusr/email-body b/.dev/revdep_emails/diffusr/email-body new file mode 100644 index 000000000..c869634ce --- /dev/null +++ b/.dev/revdep_emails/diffusr/email-body @@ -0,0 +1,27 @@ +Hello Simon Dirmeier! Thank you for using {lintr} in your package {diffusr}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/dirmeier/diffusr using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 2s on CRAN vs. 0s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/dittodb/attachments/dittodb.warnings b/.dev/revdep_emails/dittodb/attachments/dittodb.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/dittodb/attachments/dittodb.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/dittodb/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/dittodb/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..596ce57ed --- /dev/null +++ b/.dev/revdep_emails/dittodb/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,728 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/nycflights13-sql.R",50,41,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (inherits(con, ""SQLiteConnection"") | schema == """") {","vector_logic_linter" +"vignettes/dittodb/nycflights/conInfo-.R",1,69,"style","Trailing whitespace is superfluous.","list(host = ""127.0.0.1"", username = ""travis"", dbname = ""nycflights"", ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/conInfo-.R",2,94,"style","Trailing whitespace is superfluous."," con.type = ""127.0.0.1 via TCP/IP"", db.version = ""10.4.12-MariaDB-1:10.4.12+maria~bionic"", ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/SELECT-16d120.R",1,64,"style","Trailing whitespace is superfluous.","structure(list(day = 1:31, mean_delay = c(0x1.55fd54de872a1p+5, ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/SELECT-16d120.R",2,66,"style","Trailing whitespace is superfluous.","0x1.59e435941788dp+5, 0x1.0f393c4c771f6p+5, 0x1.baeff05b9e3cap+4, ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/SELECT-16d120.R",3,66,"style","Trailing whitespace is superfluous.","0x1.1c90412a948cbp+5, 0x1.e78c809868c81p+4, 0x1.67eea7da1dc83p+5, ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/SELECT-16d120.R",4,66,"style","Trailing whitespace is superfluous.","0x1.c1cf68f8013cfp+5, 0x1.603062afefb64p+5, 0x1.a4022947a53a4p+5, ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/SELECT-16d120.R",5,66,"style","Trailing whitespace is superfluous.","0x1.4ee3566690b4fp+5, 0x1.544397c49e8f1p+5, 0x1.444be7f3df2b9p+5, ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/SELECT-16d120.R",6,66,"style","Trailing whitespace is superfluous.","0x1.13e1aaa03ab5cp+5, 0x1.c2b1018fed867p+4, 0x1.0024cd47277d8p+5, ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/SELECT-16d120.R",7,66,"style","Trailing whitespace is superfluous.","0x1.45ed38b2dce19p+5, 0x1.615182d6f26c8p+5, 0x1.4b4858bf824f1p+5, ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/SELECT-16d120.R",8,66,"style","Trailing whitespace is superfluous.","0x1.ef6ff9df0ef05p+4, 0x1.e34fb5df73593p+4, 0x1.7919380ff74a9p+5, ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/SELECT-16d120.R",9,66,"style","Trailing whitespace is superfluous.","0x1.63e23337f7ce1p+5, 0x1.56d7c319729fap+5, 0x1.593dde5542ad9p+5, ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/SELECT-16d120.R",10,66,"style","Trailing whitespace is superfluous.","0x1.1016cdd7d9ab7p+5, 0x1.5c258f74b99bdp+5, 0x1.90ab3046fb0abp+5, ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/SELECT-e53189.R",1,65,"style","Trailing whitespace is superfluous.","structure(list(month = 1:12, mean_delay = c(0x1.13d1e5a46fdcp+5, ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/SELECT-e53189.R",2,66,"style","Trailing whitespace is superfluous.","0x1.0d837f713f91bp+5, 0x1.4492c49ce57bcp+5, 0x1.55eaa80cc1cf3p+5, ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/SELECT-e53189.R",3,65,"style","Trailing whitespace is superfluous.","0x1.4f163c59bf3a3p+5, 0x1.ade7fa6ccb7dp+5, 0x1.af9cb5a5cabccp+5, ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/SELECT-e53189.R",4,65,"style","Trailing whitespace is superfluous.","0x1.3c1a8138c6202p+5, 0x1.3671c4fbc61bp+5, 0x1.d0961ced931dbp+4, ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/SELECT-e53189.R",5,86,"style","Trailing whitespace is superfluous.","0x1.b7c0e577c0e57p+4, 0x1.3dd1671e576e9p+5)), class = ""data.frame"", row.names = c(NA, ","trailing_whitespace_linter" +"vignettes/travelling-old/resultInfo-6f7e1a.R",1,69,"style","Trailing whitespace is superfluous.","list(statement = ""SELECT * FROM \""flights\"" AS \""zzz13\"" WHERE 0=1"", ","trailing_whitespace_linter" +"vignettes/travelling-old/resultInfo-6f7e1a.R",2,70,"style","Trailing whitespace is superfluous."," isSelect = 1L, rowsAffected = -1L, rowCount = 0L, completed = 0L, ","trailing_whitespace_linter" +"vignettes/travelling-old/resultInfo-6f7e1a.R",3,66,"style","Trailing whitespace is superfluous."," fieldDescription = list(list(name = c(""year"", ""month"", ""day"", ","trailing_whitespace_linter" +"vignettes/travelling-old/resultInfo-6f7e1a.R",4,77,"style","Trailing whitespace is superfluous."," ""dep_time"", ""sched_dep_time"", ""dep_delay"", ""arr_time"", ""sched_arr_time"", ","trailing_whitespace_linter" +"vignettes/travelling-old/resultInfo-6f7e1a.R",5,67,"style","Trailing whitespace is superfluous."," ""arr_delay"", ""carrier"", ""flight"", ""tailnum"", ""origin"", ""dest"", ","trailing_whitespace_linter" +"vignettes/travelling-old/resultInfo-6f7e1a.R",6,76,"style","Trailing whitespace is superfluous."," ""air_time"", ""distance"", ""hour"", ""minute"", ""time_hour""), Sclass = c(13L, ","trailing_whitespace_linter" +"vignettes/travelling-old/resultInfo-6f7e1a.R",7,64,"style","Trailing whitespace is superfluous."," 13L, 13L, 13L, 13L, 14L, 13L, 13L, 14L, 16L, 13L, 16L, 16L, ","trailing_whitespace_linter" +"vignettes/travelling-old/resultInfo-6f7e1a.R",8,64,"style","Trailing whitespace is superfluous."," 16L, 14L, 14L, 14L, 14L, 16L), type = c(23L, 23L, 23L, 23L, ","trailing_whitespace_linter" +"vignettes/travelling-old/resultInfo-6f7e1a.R",9,62,"style","Trailing whitespace is superfluous."," 23L, 701L, 23L, 23L, 701L, 25L, 23L, 25L, 25L, 25L, 701L, ","trailing_whitespace_linter" +"vignettes/travelling-old/resultInfo-6f7e1a.R",10,62,"style","Trailing whitespace is superfluous."," 701L, 701L, 701L, 1184L), len = c(4L, 4L, 4L, 4L, 4L, 8L, ","trailing_whitespace_linter" +"vignettes/travelling-old/resultInfo-6f7e1a.R",11,61,"style","Trailing whitespace is superfluous."," 4L, 4L, 8L, -1L, 4L, -1L, -1L, -1L, 8L, 8L, 8L, 8L, 8L), ","trailing_whitespace_linter" +"vignettes/travelling-old/resultInfo-6f7e1a.R",12,62,"style","Trailing whitespace is superfluous."," precision = c(-1L, -1L, -1L, -1L, -1L, -1L, -1L, -1L, ","trailing_whitespace_linter" +"vignettes/travelling-old/resultInfo-6f7e1a.R",14,61,"style","Trailing whitespace is superfluous."," ), scale = c(-1L, -1L, -1L, -1L, -1L, -1L, -1L, -1L, ","trailing_whitespace_linter" +"vignettes/travelling-old/resultInfo-6f7e1a.R",16,64,"style","Trailing whitespace is superfluous."," ), nullOK = c(TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, ","trailing_whitespace_linter" +"vignettes/travelling-old/resultInfo-6f7e1a.R",17,62,"style","Trailing whitespace is superfluous."," TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",1,67,"style","Trailing whitespace is superfluous.","structure(list(tailnum = c(""N912XJ"", ""N645JB"", ""N904WN"", ""N3BWAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",2,70,"style","Trailing whitespace is superfluous.","""N3CJAA"", ""N14972"", ""N667UA"", ""N998AT"", ""N521JB"", ""N16559"", ""N14186"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",3,70,"style","Trailing whitespace is superfluous.","""N16170"", ""N789JB"", ""N409WN"", ""N593JB"", ""N11535"", ""N505AA"", ""N8928A"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",4,70,"style","Trailing whitespace is superfluous.","""N3DPAA"", ""N34222"", ""N639VA"", ""N480AA"", ""N511MQ"", ""N77518"", ""N697DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",5,70,"style","Trailing whitespace is superfluous.","""N87527"", ""N652SW"", ""N651JB"", ""N640AA"", ""N304DQ"", ""N643JB"", ""N988DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",6,70,"style","Trailing whitespace is superfluous.","""N231JB"", ""N14542"", ""N531JB"", ""N14573"", ""N76519"", ""N13161"", ""N567UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",7,70,"style","Trailing whitespace is superfluous.","""N201LV"", ""N27962"", ""N198JB"", ""N520MQ"", ""N689MQ"", ""N369NW"", ""N8432A"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",8,70,"style","Trailing whitespace is superfluous.","""N14902"", ""N8EGMQ"", ""N336NB"", ""N3FJAA"", ""N905DL"", ""N628VA"", ""N12136"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",9,70,"style","Trailing whitespace is superfluous.","""N550WN"", ""N353SW"", ""N844VA"", ""N738US"", ""N371NB"", ""N431WN"", ""N11206"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",10,69,"style","Trailing whitespace is superfluous.","""N412WN"", ""N832UA"", ""N14993"", ""N495UA"", ""N3759"", ""N314US"", ""N14231"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",11,70,"style","Trailing whitespace is superfluous.","""N176DN"", ""N363NB"", ""N3AHAA"", ""N5DMAA"", ""N764US"", ""N802MQ"", ""N33209"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",12,70,"style","Trailing whitespace is superfluous.","""N38451"", ""N14219"", ""N320US"", ""N8903A"", ""N3FCAA"", ""N682MQ"", ""N672DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",13,70,"style","Trailing whitespace is superfluous.","""N173US"", ""N691CA"", ""N33103"", ""N210WN"", ""N8877A"", ""N638JB"", ""N558UW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",14,70,"style","Trailing whitespace is superfluous.","""N820AS"", ""N479UA"", ""N180US"", ""N334JB"", ""N33292"", ""N513UA"", ""N775JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",15,70,"style","Trailing whitespace is superfluous.","""N528MQ"", ""N955DL"", ""N405UA"", ""N377NW"", ""N611QX"", ""N7732A"", ""N320AA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",16,70,"style","Trailing whitespace is superfluous.","""N11192"", ""N3769L"", ""N622VA"", ""N338AA"", ""N504UA"", ""N7739A"", ""N841UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",17,70,"style","Trailing whitespace is superfluous.","""N987AT"", ""N11113"", ""N14106"", ""N903WN"", ""N3CGAA"", ""N621VA"", ""N477AA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",18,70,"style","Trailing whitespace is superfluous.","""N837UA"", ""N339NB"", ""N374DA"", ""N8869B"", ""N284JB"", ""N924DL"", ""N8775A"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",19,70,"style","Trailing whitespace is superfluous.","""N836UA"", ""N324JB"", ""N833UA"", ""N13553"", ""N999DN"", ""N3763D"", ""N12996"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",20,70,"style","Trailing whitespace is superfluous.","""N513MQ"", ""N722US"", ""N14904"", ""N591AA"", ""N539MQ"", ""N14977"", ""N12924"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",21,70,"style","Trailing whitespace is superfluous.","""N358NB"", ""N877AS"", ""N554UA"", ""N76514"", ""N203JB"", ""N12135"", ""N387SW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",22,70,"style","Trailing whitespace is superfluous.","""N27722"", ""N444UA"", ""N469UA"", ""N575UA"", ""N3AUAA"", ""N306JB"", ""N24128"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",23,70,"style","Trailing whitespace is superfluous.","""N617MQ"", ""N642DL"", ""N595UA"", ""N588JB"", ""N3HSAA"", ""N915DE"", ""N3HTAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",24,70,"style","Trailing whitespace is superfluous.","""N592UA"", ""N37253"", ""N629JB"", ""N585UA"", ""N265WN"", ""N4XRAA"", ""N941DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",25,70,"style","Trailing whitespace is superfluous.","""N838VA"", ""N267AT"", ""N3JXAA"", ""N523UA"", ""N912DL"", ""N707TW"", ""N3GRAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",26,70,"style","Trailing whitespace is superfluous.","""N934WN"", ""N370SW"", ""N17133"", ""N594JB"", ""N11119"", ""N8942A"", ""N524JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",27,70,"style","Trailing whitespace is superfluous.","""N608QX"", ""N534JB"", ""N21130"", ""N534MQ"", ""N14105"", ""N659DL"", ""N18102"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",28,70,"style","Trailing whitespace is superfluous.","""N470UA"", ""N7714B"", ""N535MQ"", ""N910DE"", ""N921WN"", ""N918DL"", ""N703TW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",29,70,"style","Trailing whitespace is superfluous.","""N998DL"", ""N8982A"", ""N735MQ"", ""N76065"", ""N354NW"", ""N13994"", ""N644JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",30,70,"style","Trailing whitespace is superfluous.","""N282WN"", ""N722MQ"", ""N502UA"", ""N13202"", ""N66057"", ""N26545"", ""N37474"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",31,70,"style","Trailing whitespace is superfluous.","""N527AA"", ""N544AA"", ""N24212"", ""N935XJ"", ""N352AA"", ""N920AT"", ""N630JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",32,70,"style","Trailing whitespace is superfluous.","""N79402"", ""N8305E"", ""N849VA"", ""N477WN"", ""N603JB"", ""N8907A"", ""N4UCAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",33,70,"style","Trailing whitespace is superfluous.","""N535UW"", ""N8560F"", ""N17984"", ""N11189"", ""N709EV"", ""N727SW"", ""N3GLAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",34,69,"style","Trailing whitespace is superfluous.","""N7726A"", ""N3765"", ""N14959"", ""N796SW"", ""N325US"", ""N11165"", ""N3KBAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",35,69,"style","Trailing whitespace is superfluous.","""N4WVAA"", ""N713EV"", ""N3ASAA"", ""N8541D"", ""N744P"", ""N444WN"", ""N33294"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",36,70,"style","Trailing whitespace is superfluous.","""N476UA"", ""N845VA"", ""N950DL"", ""N937XJ"", ""N741SA"", ""N562UW"", ""N417UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",37,70,"style","Trailing whitespace is superfluous.","""N3ERAA"", ""N14179"", ""N684MQ"", ""N8800G"", ""N37252"", ""N11187"", ""N547JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",38,70,"style","Trailing whitespace is superfluous.","""N510JB"", ""N592JB"", ""N12569"", ""N16149"", ""N585AA"", ""N714CB"", ""N517MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",39,70,"style","Trailing whitespace is superfluous.","""N3HUAA"", ""N366NW"", ""N5EMAA"", ""N723EV"", ""N66051"", ""N961AT"", ""N365NW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",40,70,"style","Trailing whitespace is superfluous.","""N248WN"", ""N269WN"", ""N18557"", ""N390AA"", ""N18120"", ""N344AA"", ""N805UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",41,70,"style","Trailing whitespace is superfluous.","""N76529"", ""N661MQ"", ""N16713"", ""N426UA"", ""N356NW"", ""N3736C"", ""N27733"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",42,70,"style","Trailing whitespace is superfluous.","""N328AA"", ""N466UA"", ""N547AA"", ""N3FKAA"", ""N345NW"", ""N983DL"", ""N410UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",43,70,"style","Trailing whitespace is superfluous.","""N794JB"", ""N181UW"", ""N76516"", ""N75426"", ""N232WN"", ""N5DNAA"", ""N675DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",44,70,"style","Trailing whitespace is superfluous.","""N23721"", ""N624VA"", ""N604LR"", ""N830MQ"", ""N914DL"", ""N361NB"", ""N458UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",45,70,"style","Trailing whitespace is superfluous.","""N379DA"", ""N633DL"", ""N947DL"", ""N401WN"", ""N261AT"", ""N3FHAA"", ""N591JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",46,70,"style","Trailing whitespace is superfluous.","""N77066"", ""N601AW"", ""N702TW"", ""N8554A"", ""N15912"", ""N37466"", ""N331NW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",47,70,"style","Trailing whitespace is superfluous.","""N605LR"", ""N706JB"", ""N518UA"", ""N721MQ"", ""N695DL"", ""N14116"", ""N840VA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",48,70,"style","Trailing whitespace is superfluous.","""N904XJ"", ""N526JB"", ""N285WN"", ""N633VA"", ""N519AA"", ""N364NW"", ""N719EV"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",49,70,"style","Trailing whitespace is superfluous.","""N942MQ"", ""N476WN"", ""N529VA"", ""N3CKAA"", ""N533UA"", ""N372NW"", ""N529JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",50,70,"style","Trailing whitespace is superfluous.","""N504JB"", ""N705TW"", ""N121UW"", ""N16178"", ""N733SA"", ""N515MQ"", ""N195UW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",51,70,"style","Trailing whitespace is superfluous.","""N663MQ"", ""N328NW"", ""N8964E"", ""N625VA"", ""N852VA"", ""N340NW"", ""N544MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",52,70,"style","Trailing whitespace is superfluous.","""N327NB"", ""N6EAMQ"", ""N163US"", ""N11176"", ""N13989"", ""N585JB"", ""N374JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",53,70,"style","Trailing whitespace is superfluous.","""N8736A"", ""N370NW"", ""N717TW"", ""N6704Z"", ""N760JB"", ""N14148"", ""N3CYAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",54,70,"style","Trailing whitespace is superfluous.","""N14543"", ""N5DYAA"", ""N8936A"", ""N599JB"", ""N329AA"", ""N749US"", ""N324AA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",55,70,"style","Trailing whitespace is superfluous.","""N600LR"", ""N951FR"", ""N611MQ"", ""N4UBAA"", ""N690DL"", ""N758SW"", ""N338NB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",56,70,"style","Trailing whitespace is superfluous.","""N534UA"", ""N920DL"", ""N550NW"", ""N455UA"", ""N907MQ"", ""N358NW"", ""N850MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",57,70,"style","Trailing whitespace is superfluous.","""N419UA"", ""N3DHAA"", ""N984DL"", ""N39728"", ""N8790A"", ""N337AT"", ""N979DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",58,70,"style","Trailing whitespace is superfluous.","""N3FVAA"", ""N3CTAA"", ""N324US"", ""N730EV"", ""N41104"", ""N765SW"", ""N76515"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",59,70,"style","Trailing whitespace is superfluous.","""N3GSAA"", ""N8698A"", ""N76528"", ""N173AT"", ""N509MQ"", ""N805MQ"", ""N724MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",60,70,"style","Trailing whitespace is superfluous.","""N938DL"", ""N201FR"", ""N433UA"", ""N712EV"", ""N853VA"", ""N564JB"", ""N438UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",61,70,"style","Trailing whitespace is superfluous.","""N747SA"", ""N561JB"", ""N29906"", ""N387DA"", ""N924XJ"", ""N913DL"", ""N11127"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",62,70,"style","Trailing whitespace is superfluous.","""N326US"", ""N8696C"", ""N722TW"", ""N481AA"", ""N543UW"", ""N675AW"", ""N302NB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",63,70,"style","Trailing whitespace is superfluous.","""N270WN"", ""N482AA"", ""N632SW"", ""N310NW"", ""N77530"", ""N4WNAA"", ""N950UW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",64,70,"style","Trailing whitespace is superfluous.","""N828AS"", ""N296PQ"", ""N19554"", ""N963DL"", ""N893AT"", ""N530VA"", ""N827UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",65,70,"style","Trailing whitespace is superfluous.","""N76502"", ""N68453"", ""N24729"", ""N641VA"", ""N553UA"", ""N510UW"", ""N627JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",66,70,"style","Trailing whitespace is superfluous.","""N821MQ"", ""N506JB"", ""N3BGAA"", ""N18101"", ""N3KEAA"", ""N16918"", ""N844MH"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",67,70,"style","Trailing whitespace is superfluous.","""N402UA"", ""N550UW"", ""N758US"", ""N391DA"", ""N662JB"", ""N908XJ"", ""N801UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",68,70,"style","Trailing whitespace is superfluous.","""N649MQ"", ""N466WN"", ""N8646A"", ""N241WN"", ""N18223"", ""N17245"", ""N14731"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",69,70,"style","Trailing whitespace is superfluous.","""N16147"", ""N990DL"", ""N993DL"", ""N639AA"", ""N29717"", ""N934XJ"", ""N996DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",70,70,"style","Trailing whitespace is superfluous.","""N913XJ"", ""N562JB"", ""N5EHAA"", ""N582AA"", ""N839UA"", ""N4XVAA"", ""N178JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",71,70,"style","Trailing whitespace is superfluous.","""N445WN"", ""N915AT"", ""N214FR"", ""N891AT"", ""N8532G"", ""N239JB"", ""N948DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",72,70,"style","Trailing whitespace is superfluous.","""N915WN"", ""N827AS"", ""N4XCAA"", ""N645MQ"", ""N834AS"", ""N5CAAA"", ""N11547"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",73,70,"style","Trailing whitespace is superfluous.","""N351NB"", ""N927AT"", ""N463WN"", ""N452UA"", ""N29129"", ""N14562"", ""N899AT"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",74,70,"style","Trailing whitespace is superfluous.","""N913DE"", ""N437UA"", ""N354JB"", ""N501AA"", ""N842UA"", ""N827MQ"", ""N408WN"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",75,70,"style","Trailing whitespace is superfluous.","""N803UA"", ""N355NW"", ""N283JB"", ""N507MQ"", ""N508AA"", ""N509JB"", ""N176AT"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",76,70,"style","Trailing whitespace is superfluous.","""N627VA"", ""N715JB"", ""N348NW"", ""N3BAAA"", ""N8683B"", ""N13716"", ""N646JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",77,70,"style","Trailing whitespace is superfluous.","""N936DL"", ""N78438"", ""N3BDAA"", ""N638VA"", ""N507JB"", ""N403UA"", ""N16234"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",78,70,"style","Trailing whitespace is superfluous.","""N932XJ"", ""N784JB"", ""N297WN"", ""N902MQ"", ""N959UW"", ""N228JB"", ""N521VA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",79,70,"style","Trailing whitespace is superfluous.","""N3HGAA"", ""N906AT"", ""N267JB"", ""N507UA"", ""N612JB"", ""N17730"", ""N564UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",80,70,"style","Trailing whitespace is superfluous.","""N399DA"", ""N351JB"", ""N349NW"", ""N555LV"", ""N504MQ"", ""N16561"", ""N25134"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",81,70,"style","Trailing whitespace is superfluous.","""N607LR"", ""N833AY"", ""N615AA"", ""N607JB"", ""N3EPAA"", ""N577UA"", ""N324NB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",82,70,"style","Trailing whitespace is superfluous.","""N8930E"", ""N519JB"", ""N458WN"", ""N754EV"", ""N911DA"", ""N21129"", ""N16709"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",83,70,"style","Trailing whitespace is superfluous.","""N339JB"", ""N997AT"", ""N927LR"", ""N4XXAA"", ""N946DL"", ""N3HEAA"", ""N36444"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",84,70,"style","Trailing whitespace is superfluous.","""N16541"", ""N776WN"", ""N574UA"", ""N75435"", ""N14570"", ""N323JB"", ""N8933B"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",85,70,"style","Trailing whitespace is superfluous.","""N34110"", ""N17126"", ""N771SA"", ""N820AY"", ""N715UW"", ""N710EV"", ""N940DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",86,70,"style","Trailing whitespace is superfluous.","""N8598B"", ""N705JB"", ""N8506C"", ""N807JB"", ""N394DA"", ""N634VA"", ""N348JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",87,70,"style","Trailing whitespace is superfluous.","""N3DSAA"", ""N355JB"", ""N8972E"", ""N293PQ"", ""N3DUAA"", ""N13133"", ""N14950"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",88,70,"style","Trailing whitespace is superfluous.","""N524MQ"", ""N904DL"", ""N27190"", ""N8960A"", ""N484UA"", ""N624JB"", ""N3AJAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",89,70,"style","Trailing whitespace is superfluous.","""N930XJ"", ""N77520"", ""N335AA"", ""N635VA"", ""N8940E"", ""N849MQ"", ""N713SW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",90,70,"style","Trailing whitespace is superfluous.","""N75433"", ""N316JB"", ""N12900"", ""N768SW"", ""N972DL"", ""N3FSAA"", ""N346NB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",91,70,"style","Trailing whitespace is superfluous.","""N908MQ"", ""N3JCAA"", ""N950WN"", ""N959AT"", ""N842MQ"", ""N3GDAA"", ""N8315C"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",92,70,"style","Trailing whitespace is superfluous.","""N624AG"", ""N14118"", ""N446UA"", ""N752EV"", ""N172DN"", ""N457UW"", ""N7735A"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",93,70,"style","Trailing whitespace is superfluous.","""N430UA"", ""N14905"", ""N805JB"", ""N580UA"", ""N545UA"", ""N709TW"", ""N601LR"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",94,70,"style","Trailing whitespace is superfluous.","""N218FR"", ""N404UA"", ""N23139"", ""N497UA"", ""N257WN"", ""N17138"", ""N959DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",95,70,"style","Trailing whitespace is superfluous.","""N652DL"", ""N351NW"", ""N603DL"", ""N569UA"", ""N855UA"", ""N329NW"", ""N735SA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",96,70,"style","Trailing whitespace is superfluous.","""N995DL"", ""N38467"", ""N563JB"", ""N3KPAA"", ""N472UA"", ""N75861"", ""N4WSAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",97,70,"style","Trailing whitespace is superfluous.","""N16963"", ""N583AA"", ""N13979"", ""N12567"", ""N539AA"", ""N927XJ"", ""N571JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",98,70,"style","Trailing whitespace is superfluous.","""N519UA"", ""N353AT"", ""N640JB"", ""N11536"", ""N597UA"", ""N79279"", ""N3EFAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",99,70,"style","Trailing whitespace is superfluous.","""N15574"", ""N636JB"", ""N528VA"", ""N3APAA"", ""N14953"", ""N486AA"", ""N991DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",100,70,"style","Trailing whitespace is superfluous.","""N514MQ"", ""N14203"", ""N928DN"", ""N11109"", ""N8839E"", ""N184US"", ""N76504"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",101,70,"style","Trailing whitespace is superfluous.","""N425UA"", ""N631VA"", ""N15980"", ""N3GJAA"", ""N764SW"", ""N353NB"", ""N982DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",102,70,"style","Trailing whitespace is superfluous.","""N825AS"", ""N508JB"", ""N598JB"", ""N3ANAA"", ""N342NW"", ""N746JB"", ""N9EAMQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",103,70,"style","Trailing whitespace is superfluous.","""N708EV"", ""N296JB"", ""N231WN"", ""N8580A"", ""N328JB"", ""N555UA"", ""N380DA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",104,70,"style","Trailing whitespace is superfluous.","""N423UA"", ""N522UA"", ""N222WN"", ""N336AA"", ""N332AA"", ""N292JB"", ""N588UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",105,70,"style","Trailing whitespace is superfluous.","""N8733G"", ""N767UW"", ""N809UA"", ""N244WN"", ""N933LR"", ""N525UA"", ""N929DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",106,70,"style","Trailing whitespace is superfluous.","""N608JB"", ""N14991"", ""N187JB"", ""N980AT"", ""N527VA"", ""N17169"", ""N978DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",107,70,"style","Trailing whitespace is superfluous.","""N625AA"", ""N316NB"", ""N492UA"", ""N944UW"", ""N3FPAA"", ""N3CHAA"", ""N922DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",108,70,"style","Trailing whitespace is superfluous.","""N656JB"", ""N4YTAA"", ""N41135"", ""N566JB"", ""N138EV"", ""N676CA"", ""N813UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",109,70,"style","Trailing whitespace is superfluous.","""N12122"", ""N14214"", ""N3CXAA"", ""N37471"", ""N375NC"", ""N527MQ"", ""N13964"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",110,70,"style","Trailing whitespace is superfluous.","""N11181"", ""N5FGAA"", ""N3GCAA"", ""N946UW"", ""N808UA"", ""N835AS"", ""N737MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",111,70,"style","Trailing whitespace is superfluous.","""N362NW"", ""N673UA"", ""N838MQ"", ""N687MQ"", ""N3BCAA"", ""N435WN"", ""N5CGAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",112,70,"style","Trailing whitespace is superfluous.","""N73276"", ""N667AW"", ""N3750D"", ""N15910"", ""N374NW"", ""N247JB"", ""N516AS"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",113,70,"style","Trailing whitespace is superfluous.","""N707EV"", ""N777QC"", ""N579JB"", ""N337JB"", ""N464UA"", ""N8604C"", ""N847UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",114,70,"style","Trailing whitespace is superfluous.","""N400WN"", ""N3741S"", ""N15973"", ""N13538"", ""N39416"", ""N3DCAA"", ""N416UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",115,70,"style","Trailing whitespace is superfluous.","""N779JB"", ""N16976"", ""N494WN"", ""N807UA"", ""N929XJ"", ""N12195"", ""N3JDAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",116,70,"style","Trailing whitespace is superfluous.","""N1EAMQ"", ""N937DL"", ""N16151"", ""N576UA"", ""N17244"", ""N639MQ"", ""N13958"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",117,70,"style","Trailing whitespace is superfluous.","""N7738A"", ""N6716C"", ""N754UW"", ""N73299"", ""N185UW"", ""N3BRAA"", ""N8797A"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",118,70,"style","Trailing whitespace is superfluous.","""N8409N"", ""N3764D"", ""N954DL"", ""N13718"", ""N15985"", ""N318JB"", ""N197UW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",119,70,"style","Trailing whitespace is superfluous.","""N34111"", ""N509AY"", ""N13913"", ""N553UW"", ""N917WN"", ""N930DL"", ""N3749D"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",120,70,"style","Trailing whitespace is superfluous.","""N3748Y"", ""N218WN"", ""N73251"", ""N13124"", ""N507MJ"", ""N11150"", ""N519MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",121,70,"style","Trailing whitespace is superfluous.","""N928DL"", ""N819UA"", ""N917XJ"", ""N18556"", ""N8674A"", ""N520JB"", ""N8908D"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",122,70,"style","Trailing whitespace is superfluous.","""N910XJ"", ""N811MQ"", ""N609SW"", ""N12167"", ""N12564"", ""N485UA"", ""N556UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",123,70,"style","Trailing whitespace is superfluous.","""N657JB"", ""N18220"", ""N7741C"", ""N431UA"", ""N963WN"", ""N73275"", ""N368JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",124,70,"style","Trailing whitespace is superfluous.","""N12540"", ""N925DL"", ""N8745B"", ""N302DQ"", ""N935WN"", ""N236JB"", ""N16571"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",125,70,"style","Trailing whitespace is superfluous.","""N762US"", ""N912DE"", ""N77431"", ""N308DE"", ""N343NB"", ""N823UA"", ""N331NB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",126,70,"style","Trailing whitespace is superfluous.","""N558JB"", ""N8317M"", ""N75436"", ""N446WN"", ""N465UA"", ""N167US"", ""N587NW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",127,69,"style","Trailing whitespace is superfluous.","""N658JB"", ""N212WN"", ""N3733Z"", ""N3JUAA"", ""N531MQ"", ""N3735D"", ""N1603"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",128,70,"style","Trailing whitespace is superfluous.","""N700GS"", ""N332NW"", ""N516JB"", ""N5ETAA"", ""N4WMAA"", ""N397DA"", ""N13969"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",129,70,"style","Trailing whitespace is superfluous.","""N919DL"", ""N835VA"", ""N706SW"", ""N339AA"", ""N523UW"", ""N16732"", ""N183DN"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",130,70,"style","Trailing whitespace is superfluous.","""N486UA"", ""N12160"", ""N14117"", ""N76505"", ""N623VA"", ""N11565"", ""N3761R"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",131,70,"style","Trailing whitespace is superfluous.","""N710TW"", ""N960DL"", ""N827JB"", ""N314NB"", ""N221WN"", ""N811UA"", ""N76265"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",132,70,"style","Trailing whitespace is superfluous.","""N523JB"", ""N4YDAA"", ""N345NB"", ""N942WN"", ""N848VA"", ""N632MQ"", ""N606JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",133,70,"style","Trailing whitespace is superfluous.","""N925AT"", ""N482WN"", ""N480UA"", ""N3FNAA"", ""N443UA"", ""N502MJ"", ""N950AT"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",134,70,"style","Trailing whitespace is superfluous.","""N13132"", ""N535JB"", ""N894AT"", ""N15572"", ""N761RR"", ""N919DE"", ""N930AT"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",135,70,"style","Trailing whitespace is superfluous.","""N804UA"", ""N360NB"", ""N919FJ"", ""N529UA"", ""N3754A"", ""N512MQ"", ""N928AT"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",136,70,"style","Trailing whitespace is superfluous.","""N78501"", ""N392DA"", ""N857MQ"", ""N8828D"", ""N14237"", ""N766JB"", ""N461UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",137,70,"style","Trailing whitespace is superfluous.","""N744EV"", ""N3JMAA"", ""N615JB"", ""N835UA"", ""N503MQ"", ""N11548"", ""N830UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",138,70,"style","Trailing whitespace is superfluous.","""N487WN"", ""N480WN"", ""N348NB"", ""N922WN"", ""N812UA"", ""N327NW"", ""N12921"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",139,70,"style","Trailing whitespace is superfluous.","""N39418"", ""N292WN"", ""N810MQ"", ""N626VA"", ""N274JB"", ""N815MQ"", ""N565JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",140,70,"style","Trailing whitespace is superfluous.","""N18114"", ""N294WN"", ""N14923"", ""N467UA"", ""N925XJ"", ""N5PBMQ"", ""N21144"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",141,70,"style","Trailing whitespace is superfluous.","""N965DL"", ""N3GWAA"", ""N565AA"", ""N671DN"", ""N820UA"", ""N3JTAA"", ""N14125"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",142,70,"style","Trailing whitespace is superfluous.","""N344AT"", ""N663DN"", ""N615QX"", ""N558UA"", ""N928XJ"", ""N73256"", ""N411UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",143,70,"style","Trailing whitespace is superfluous.","""N515AA"", ""N961DL"", ""N11164"", ""N329NB"", ""N852MQ"", ""N341NW"", ""N339NW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",144,70,"style","Trailing whitespace is superfluous.","""N739GB"", ""N435UA"", ""N319NB"", ""N344NB"", ""N511UA"", ""N3JAAA"", ""N973DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",145,70,"style","Trailing whitespace is superfluous.","""N294PQ"", ""N830AS"", ""N11544"", ""N951DL"", ""N636MQ"", ""N67171"", ""N5CEAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",146,70,"style","Trailing whitespace is superfluous.","""N989DL"", ""N37413"", ""N522AA"", ""N841AY"", ""N3758Y"", ""N14168"", ""N613JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",147,70,"style","Trailing whitespace is superfluous.","""N12175"", ""N563UA"", ""N36476"", ""N3EXAA"", ""N909EV"", ""N320NB"", ""N36272"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",148,70,"style","Trailing whitespace is superfluous.","""N378NW"", ""N12201"", ""N13975"", ""N396DA"", ""N75429"", ""N3757D"", ""N937AT"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",149,70,"style","Trailing whitespace is superfluous.","""N939DL"", ""N553AA"", ""N317NB"", ""N7734H"", ""N310DE"", ""N76523"", ""N442UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",150,70,"style","Trailing whitespace is superfluous.","""N57852"", ""N37409"", ""N964AT"", ""N13566"", ""N525MQ"", ""N718EV"", ""N279JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",151,70,"style","Trailing whitespace is superfluous.","""N510MQ"", ""N738MQ"", ""N17185"", ""N406UA"", ""N247WN"", ""N3JEAA"", ""N944DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",152,70,"style","Trailing whitespace is superfluous.","""N670DN"", ""N918XJ"", ""N605JB"", ""N38454"", ""N27724"", ""N945DL"", ""N477UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",153,70,"style","Trailing whitespace is superfluous.","""N3AEMQ"", ""N276AT"", ""N753EV"", ""N16703"", ""N19966"", ""N13955"", ""N8458A"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",154,70,"style","Trailing whitespace is superfluous.","""N674DL"", ""N750EV"", ""N29917"", ""N8923A"", ""N546MQ"", ""N761ND"", ""N921AT"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",155,70,"style","Trailing whitespace is superfluous.","""N905WN"", ""N711MQ"", ""N515MJ"", ""N290AT"", ""N391CA"", ""N748EV"", ""N13965"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",156,70,"style","Trailing whitespace is superfluous.","""N27200"", ""N566UA"", ""N4XEAA"", ""N708JB"", ""N249JB"", ""N546AA"", ""N836VA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",157,70,"style","Trailing whitespace is superfluous.","""N634JB"", ""N176PQ"", ""N258JB"", ""N27239"", ""N459WN"", ""N16954"", ""N388DA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",158,70,"style","Trailing whitespace is superfluous.","""N467WN"", ""N653JB"", ""N179UW"", ""N560UW"", ""N318US"", ""N508UA"", ""N906DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",159,70,"style","Trailing whitespace is superfluous.","""N329JB"", ""N476AA"", ""N24706"", ""N21537"", ""N836AS"", ""N13978"", ""N902DE"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",160,70,"style","Trailing whitespace is superfluous.","""N936XJ"", ""N821UA"", ""N512UA"", ""N586JB"", ""N679DA"", ""N330NB"", ""N57111"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",161,70,"style","Trailing whitespace is superfluous.","""N13903"", ""N14916"", ""N14188"", ""N8659B"", ""N918FJ"", ""N723SW"", ""N906WN"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",162,70,"style","Trailing whitespace is superfluous.","""N382DA"", ""N634AA"", ""N491WN"", ""N11155"", ""N635JB"", ""N817UA"", ""N901XJ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",163,70,"style","Trailing whitespace is superfluous.","""N11121"", ""N660DL"", ""N493AA"", ""N969DL"", ""N589UA"", ""N526AA"", ""N662DN"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",164,70,"style","Trailing whitespace is superfluous.","""N474AA"", ""N946AT"", ""N81449"", ""N932WN"", ""N436UA"", ""N990AT"", ""N955AT"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",165,70,"style","Trailing whitespace is superfluous.","""N513AA"", ""N384AA"", ""N565UW"", ""N590JB"", ""N934DL"", ""N8623A"", ""N793JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",166,70,"style","Trailing whitespace is superfluous.","""N365AA"", ""N317US"", ""N794SW"", ""N8970D"", ""N3JVAA"", ""N202FR"", ""N155DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",167,70,"style","Trailing whitespace is superfluous.","""N8444F"", ""N656AW"", ""N8971A"", ""N557UA"", ""N319AA"", ""N816MQ"", ""N722EV"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",168,70,"style","Trailing whitespace is superfluous.","""N932DL"", ""N725MQ"", ""N913WN"", ""N4YJAA"", ""N14180"", ""N563UW"", ""N699DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",169,70,"style","Trailing whitespace is superfluous.","""N37293"", ""N8894A"", ""N283AT"", ""N437AA"", ""N995AT"", ""N554NW"", ""N297PQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",170,70,"style","Trailing whitespace is superfluous.","""N75858"", ""N515UA"", ""N14174"", ""N16999"", ""N8943A"", ""N223WN"", ""N914XJ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",171,70,"style","Trailing whitespace is superfluous.","""N921DL"", ""N920XJ"", ""N490AA"", ""N810UA"", ""N452UW"", ""N34460"", ""N3EDAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",172,70,"style","Trailing whitespace is superfluous.","""N335NB"", ""N403WN"", ""N481WN"", ""N610DL"", ""N3755D"", ""N26549"", ""N832AS"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",173,70,"style","Trailing whitespace is superfluous.","""N966AT"", ""N821JB"", ""N3FWAA"", ""N907DL"", ""N721UW"", ""N566AA"", ""N787SA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",174,70,"style","Trailing whitespace is superfluous.","""N274WN"", ""N301NB"", ""N14974"", ""N692DL"", ""N804MQ"", ""N376NW"", ""N16217"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",175,70,"style","Trailing whitespace is superfluous.","""N11191"", ""N37465"", ""N326NB"", ""N526UA"", ""N388SW"", ""N558AA"", ""N524VA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",176,70,"style","Trailing whitespace is superfluous.","""N949AT"", ""N945AT"", ""N818UA"", ""N828UA"", ""N16911"", ""N197JB"", ""N417WN"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",177,70,"style","Trailing whitespace is superfluous.","""N698MQ"", ""N949UW"", ""N21154"", ""N523VA"", ""N13997"", ""N687DL"", ""N916DE"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",178,70,"style","Trailing whitespace is superfluous.","""N16987"", ""N546UA"", ""N736MQ"", ""N968AT"", ""N633JB"", ""N8968E"", ""N849UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",179,70,"style","Trailing whitespace is superfluous.","""N239WN"", ""N12142"", ""N370AA"", ""N12967"", ""N822UA"", ""N906DE"", ""N8709A"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",180,70,"style","Trailing whitespace is superfluous.","""N530MQ"", ""N717MQ"", ""N506MJ"", ""N32404"", ""N16961"", ""N825UA"", ""N14177"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",181,68,"style","Trailing whitespace is superfluous.","""N3753"", ""N855MQ"", ""N3767"", ""N494AA"", ""N508MQ"", ""N365NB"", ""N723MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",182,70,"style","Trailing whitespace is superfluous.","""N357NB"", ""N503JB"", ""N39423"", ""N374AA"", ""N319US"", ""N750UW"", ""N4YCAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",183,70,"style","Trailing whitespace is superfluous.","""N532MQ"", ""N383DN"", ""N3JSAA"", ""N463UA"", ""N763JB"", ""N420WN"", ""N327AA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",184,70,"style","Trailing whitespace is superfluous.","""N832AY"", ""N418UA"", ""N36207"", ""N14228"", ""N948UW"", ""N439UA"", ""N559JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",185,70,"style","Trailing whitespace is superfluous.","""N356AA"", ""N229JB"", ""N307DQ"", ""N54711"", ""N903XJ"", ""N263AV"", ""N312US"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",186,70,"style","Trailing whitespace is superfluous.","""N900DE"", ""N554JB"", ""N347NW"", ""N826UA"", ""N5EAAA"", ""N432UA"", ""N910FJ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",187,70,"style","Trailing whitespace is superfluous.","""N717EV"", ""N814UA"", ""N964WN"", ""N777NC"", ""N3762Y"", ""N514UA"", ""N26123"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",188,70,"style","Trailing whitespace is superfluous.","""N216JB"", ""N428UA"", ""N361VA"", ""N665JB"", ""N962DL"", ""N701GS"", ""N902XJ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",189,70,"style","Trailing whitespace is superfluous.","""N338NW"", ""N560UA"", ""N960AT"", ""N922XJ"", ""N689DL"", ""N7715E"", ""N16919"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",190,70,"style","Trailing whitespace is superfluous.","""N906MQ"", ""N473WN"", ""N623JB"", ""N353NW"", ""N835MQ"", ""N963DN"", ""N204FR"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",191,70,"style","Trailing whitespace is superfluous.","""N593UA"", ""N809JB"", ""N632VA"", ""N8794B"", ""N854VA"", ""N76503"", ""N37263"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",192,70,"style","Trailing whitespace is superfluous.","""N37281"", ""N323NB"", ""N605QX"", ""N3DGAA"", ""N542AA"", ""N3JRAA"", ""N3GNAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",193,70,"style","Trailing whitespace is superfluous.","""N571AA"", ""N595JB"", ""N232PQ"", ""N184DN"", ""N8673D"", ""N238JB"", ""N34137"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",194,70,"style","Trailing whitespace is superfluous.","""N14143"", ""N496AA"", ""N360NW"", ""N429UA"", ""N650MQ"", ""N569JB"", ""N650AW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",195,70,"style","Trailing whitespace is superfluous.","""N729JB"", ""N298JB"", ""N278AT"", ""N309DE"", ""N906XJ"", ""N3738B"", ""N387AA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",196,70,"style","Trailing whitespace is superfluous.","""N11199"", ""N407UA"", ""N17146"", ""N3GEAA"", ""N838UA"", ""N355NB"", ""N8525B"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",197,70,"style","Trailing whitespace is superfluous.","""N640VA"", ""N16701"", ""N503AA"", ""N975DL"", ""N8475B"", ""N401UA"", ""N11140"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",198,70,"style","Trailing whitespace is superfluous.","""N78285"", ""N13908"", ""N36247"", ""N12552"", ""N967DL"", ""N629VA"", ""N817MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",199,70,"style","Trailing whitespace is superfluous.","""N5DCAA"", ""N445UA"", ""N8884E"", ""N286WN"", ""N978AT"", ""N538UA"", ""N183JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",200,70,"style","Trailing whitespace is superfluous.","""N3CAAA"", ""N3BTAA"", ""N751EV"", ""N631MQ"", ""N393AA"", ""N573UA"", ""N14568"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",201,70,"style","Trailing whitespace is superfluous.","""N635AA"", ""N4XJAA"", ""N192DN"", ""N16951"", ""N518MQ"", ""N3CCAA"", ""N353JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",202,69,"style","Trailing whitespace is superfluous.","""N3766"", ""N13123"", ""N483UA"", ""N373JB"", ""N5CHAA"", ""N206JB"", ""N295PQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",203,70,"style","Trailing whitespace is superfluous.","""N10575"", ""N903DE"", ""N21197"", ""N0EGMQ"", ""N15710"", ""N334NB"", ""N26215"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",204,70,"style","Trailing whitespace is superfluous.","""N612QX"", ""N923FJ"", ""N5DBAA"", ""N273JB"", ""N284AT"", ""N505UA"", ""N3KCAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",205,70,"style","Trailing whitespace is superfluous.","""N505JB"", ""N540US"", ""N3CWAA"", ""N16981"", ""N13949"", ""N8938A"", ""N14153"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",206,70,"style","Trailing whitespace is superfluous.","""N510MJ"", ""N17560"", ""N3760C"", ""N456UA"", ""N968DL"", ""N35407"", ""N626MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",207,70,"style","Trailing whitespace is superfluous.","""N361NW"", ""N770UW"", ""N69059"", ""N366AA"", ""N536JB"", ""N8888D"", ""N304JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",208,70,"style","Trailing whitespace is superfluous.","""N669AW"", ""N716UW"", ""N36915"", ""N851UA"", ""N711HK"", ""N526MQ"", ""N989AT"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",209,70,"style","Trailing whitespace is superfluous.","""N31131"", ""N4YAAA"", ""N3772H"", ""N659JB"", ""N740UW"", ""N484WN"", ""N196DN"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",210,70,"style","Trailing whitespace is superfluous.","""N654UA"", ""N201AA"", ""N3AAAA"", ""N33284"", ""N15986"", ""N916DL"", ""N3BYAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",211,70,"style","Trailing whitespace is superfluous.","""N326AT"", ""N552JB"", ""N712JB"", ""N38443"", ""N527JB"", ""N195DN"", ""N756US"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",212,70,"style","Trailing whitespace is superfluous.","""N8913A"", ""N920DE"", ""N840AY"", ""N13970"", ""N724SW"", ""N25705"", ""N337NW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",213,70,"style","Trailing whitespace is superfluous.","""N911DE"", ""N970DL"", ""N527UA"", ""N818MQ"", ""N15983"", ""N709SW"", ""N578UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",214,70,"style","Trailing whitespace is superfluous.","""N376AA"", ""N13992"", ""N538CA"", ""N833AS"", ""N487UA"", ""N661JB"", ""N5FFAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",215,70,"style","Trailing whitespace is superfluous.","""N599AA"", ""N935AT"", ""N562UA"", ""N206FR"", ""N928MQ"", ""N4YGAA"", ""N3HRAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",216,70,"style","Trailing whitespace is superfluous.","""N587AS"", ""N37287"", ""N845UA"", ""N762SW"", ""N509UA"", ""N372DA"", ""N14171"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",217,70,"style","Trailing whitespace is superfluous.","""N4YUAA"", ""N17229"", ""N6711M"", ""N8672A"", ""N829UA"", ""N895AT"", ""N441WN"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",218,70,"style","Trailing whitespace is superfluous.","""N13914"", ""N738EV"", ""N552UW"", ""N415UA"", ""N482UA"", ""N767NC"", ""N328NB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",219,70,"style","Trailing whitespace is superfluous.","""N570UA"", ""N587JB"", ""N8577D"", ""N759EV"", ""N713TW"", ""N322US"", ""N422UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",220,70,"style","Trailing whitespace is superfluous.","""N8976E"", ""N441UA"", ""N665MQ"", ""N13118"", ""N363NW"", ""N915XJ"", ""N784SW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",221,70,"style","Trailing whitespace is superfluous.","""N976DL"", ""N8501F"", ""N8808H"", ""N910WN"", ""N942AT"", ""N947UW"", ""N48901"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",222,70,"style","Trailing whitespace is superfluous.","""N489UA"", ""N12114"", ""N12957"", ""N923XJ"", ""N507AY"", ""N169UW"", ""N3737C"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",223,70,"style","Trailing whitespace is superfluous.","""N819AY"", ""N38473"", ""N5CPAA"", ""N537JB"", ""N450WN"", ""N18243"", ""N17115"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",224,70,"style","Trailing whitespace is superfluous.","""N14998"", ""N22971"", ""N235WN"", ""N667DN"", ""N713MQ"", ""N716EV"", ""N648JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",225,70,"style","Trailing whitespace is superfluous.","""N24702"", ""N73283"", ""N956AT"", ""N12563"", ""N955WN"", ""N8310C"", ""N14920"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",226,70,"style","Trailing whitespace is superfluous.","""N945UW"", ""N528AA"", ""N741UW"", ""N5EGAA"", ""N12172"", ""N460WN"", ""N521US"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",227,70,"style","Trailing whitespace is superfluous.","""N33203"", ""N943DL"", ""N12109"", ""N649AW"", ""N333NW"", ""N216FR"", ""N179JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",228,70,"style","Trailing whitespace is superfluous.","""N931WN"", ""N3FLAA"", ""N11551"", ""N305AS"", ""N8886A"", ""N37290"", ""N523MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",229,70,"style","Trailing whitespace is superfluous.","""N907DE"", ""N13750"", ""N14558"", ""N758EV"", ""N933AT"", ""N685DA"", ""N265JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",230,70,"style","Trailing whitespace is superfluous.","""N12166"", ""N652JB"", ""N988AT"", ""N734MQ"", ""N994AT"", ""N457UA"", ""N951UW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",231,70,"style","Trailing whitespace is superfluous.","""N76288"", ""N8533D"", ""N740EV"", ""N395DN"", ""N843VA"", ""N133EV"", ""N657MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",232,70,"style","Trailing whitespace is superfluous.","""N371CA"", ""N8492C"", ""N843UA"", ""N594AA"", ""N425AA"", ""N641DL"", ""N741EV"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",233,70,"style","Trailing whitespace is superfluous.","""N537UA"", ""N909XJ"", ""N618JB"", ""N3746H"", ""N804JB"", ""N926XJ"", ""N405WN"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",234,70,"style","Trailing whitespace is superfluous.","""N131EV"", ""N568JB"", ""N983AT"", ""N658MQ"", ""N424AA"", ""N277WN"", ""N359NW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",235,70,"style","Trailing whitespace is superfluous.","""N398CA"", ""N298WN"", ""N3FDAA"", ""N695CA"", ""N3JHAA"", ""N8946A"", ""N506MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",236,70,"style","Trailing whitespace is superfluous.","""N606MQ"", ""N854UA"", ""N346JB"", ""N621JB"", ""N807MQ"", ""N655JB"", ""N307JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",237,70,"style","Trailing whitespace is superfluous.","""N342AA"", ""N322NB"", ""N713UW"", ""N206WN"", ""N37298"", ""N522MQ"", ""N3FYAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",238,70,"style","Trailing whitespace is superfluous.","""N7811F"", ""N587UA"", ""N556JB"", ""N971DL"", ""N3EMAA"", ""N760US"", ""N102UW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",239,70,"style","Trailing whitespace is superfluous.","""N208FR"", ""N716SW"", ""N918DE"", ""N755EV"", ""N517JB"", ""N14960"", ""N73259"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",240,70,"style","Trailing whitespace is superfluous.","""N452WN"", ""N16546"", ""N905XJ"", ""N6712B"", ""N77510"", ""N13995"", ""N3GHAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",241,70,"style","Trailing whitespace is superfluous.","""N3EVAA"", ""N824UA"", ""N30401"", ""N12221"", ""N12922"", ""N751UW"", ""N78448"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",242,70,"style","Trailing whitespace is superfluous.","""N969AT"", ""N349NB"", ""N15555"", ""N14198"", ""N337NB"", ""N472WN"", ""N386DA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",243,70,"style","Trailing whitespace is superfluous.","""N589JB"", ""N939WN"", ""N651AW"", ""N846UA"", ""N637JB"", ""N909DL"", ""N543AA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",244,70,"style","Trailing whitespace is superfluous.","""N281JB"", ""N628MQ"", ""N4XBAA"", ""N135EV"", ""N12116"", ""N317JB"", ""N583JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",245,70,"style","Trailing whitespace is superfluous.","""N3CFAA"", ""N447WN"", ""N846MQ"", ""N460UA"", ""N340NB"", ""N33714"", ""N717JL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",246,70,"style","Trailing whitespace is superfluous.","""N912WN"", ""N972AT"", ""N834UA"", ""N11137"", ""N35271"", ""N364NB"", ""N33262"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",247,70,"style","Trailing whitespace is superfluous.","""N604QX"", ""N422WN"", ""N190JB"", ""N916XJ"", ""N570JB"", ""N8423C"", ""N14952"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",248,70,"style","Trailing whitespace is superfluous.","""N851NW"", ""N333NB"", ""N352NB"", ""N561UA"", ""N104UW"", ""N542UW"", ""N544UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",249,70,"style","Trailing whitespace is superfluous.","""N910DL"", ""N500MQ"", ""N87507"", ""N815UA"", ""N308AT"", ""N717SA"", ""N907XJ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",250,70,"style","Trailing whitespace is superfluous.","""N12163"", ""N162UW"", ""N174DN"", ""N14907"", ""N371NW"", ""N33286"", ""N720MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",251,70,"style","Trailing whitespace is superfluous.","""N227WN"", ""N13968"", ""N323AA"", ""N668UA"", ""N923AT"", ""N731SA"", ""N727TW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",252,70,"style","Trailing whitespace is superfluous.","""N14162"", ""N565UA"", ""N483WN"", ""N786NC"", ""N3771K"", ""N200WN"", ""N800AY"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",253,70,"style","Trailing whitespace is superfluous.","""N11107"", ""N922EV"", ""N828AW"", ""N3GKAA"", ""N597JB"", ""N24211"", ""N791SW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",254,70,"style","Trailing whitespace is superfluous.","""N174US"", ""N623DL"", ""N757LV"", ""N935DL"", ""N16183"", ""N79521"", ""N812MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",255,70,"style","Trailing whitespace is superfluous.","""N852UA"", ""N737US"", ""N673MQ"", ""N796JB"", ""N769US"", ""N921XJ"", ""N943AT"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",256,70,"style","Trailing whitespace is superfluous.","""N8588D"", ""N823AY"", ""N795SW"", ""N38727"", ""N77430"", ""N960WN"", ""N844MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",257,70,"style","Trailing whitespace is superfluous.","""N751SW"", ""N522VA"", ""N5FJAA"", ""N724EV"", ""N943WN"", ""N750SA"", ""N323US"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",258,70,"style","Trailing whitespace is superfluous.","""N14704"", ""N13988"", ""N464WN"", ""N931DL"", ""N514AA"", ""N12157"", ""N309US"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",259,69,"style","Trailing whitespace is superfluous.","""N266JB"", ""N203FR"", ""N806JB"", ""N931XJ"", ""N501MQ"", ""N6702"", ""N37420"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",260,70,"style","Trailing whitespace is superfluous.","""N10156"", ""N505MQ"", ""N87513"", ""N8495B"", ""N233LV"", ""N720EV"", ""N812AY"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",261,70,"style","Trailing whitespace is superfluous.","""N933XJ"", ""N496WN"", ""N580JB"", ""N927DA"", ""N3730B"", ""N658AW"", ""N474UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",262,70,"style","Trailing whitespace is superfluous.","""N3BEAA"", ""N192JB"", ""N850UA"", ""N506AA"", ""N802UA"", ""N556UW"", ""N373AA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",263,70,"style","Trailing whitespace is superfluous.","""N584JB"", ""N806UA"", ""N600QX"", ""N426WN"", ""N23708"", ""N371DA"", ""N824MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",264,70,"style","Trailing whitespace is superfluous.","""N917DE"", ""N17128"", ""N415WN"", ""N22909"", ""N381DN"", ""N411WN"", ""N829AS"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",265,70,"style","Trailing whitespace is superfluous.","""N77296"", ""N607AT"", ""N384HA"", ""N840UA"", ""N684WN"", ""N8965E"", ""N541UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",266,70,"style","Trailing whitespace is superfluous.","""N184JB"", ""N205FR"", ""N672AW"", ""N839VA"", ""N389DA"", ""N956WN"", ""N17108"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",267,70,"style","Trailing whitespace is superfluous.","""N641JB"", ""N3GMAA"", ""N176UW"", ""N303DQ"", ""N5FNAA"", ""N826AS"", ""N451UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",268,70,"style","Trailing whitespace is superfluous.","""N642VA"", ""N380AA"", ""N373NW"", ""N649JB"", ""N543MQ"", ""N571UA"", ""N487AA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",269,70,"style","Trailing whitespace is superfluous.","""N676AW"", ""N630MQ"", ""N354AT"", ""N8325D"", ""N345AA"", ""N344NW"", ""N602LR"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",1,63,"style","Trailing whitespace is superfluous.","structure(list(oid = c(16L, 17L, 18L, 19L, 20L, 21L, 22L, 23L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",2,61,"style","Trailing whitespace is superfluous.","24L, 25L, 26L, 27L, 28L, 29L, 30L, 71L, 75L, 81L, 83L, 114L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",3,63,"style","Trailing whitespace is superfluous.","142L, 194L, 3361L, 3402L, 5017L, 32L, 5069L, 600L, 601L, 602L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",4,66,"style","Trailing whitespace is superfluous.","603L, 604L, 628L, 700L, 701L, 705L, 718L, 790L, 829L, 869L, 650L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",5,62,"style","Trailing whitespace is superfluous.","774L, 1033L, 1042L, 1043L, 1082L, 1083L, 1114L, 1184L, 1186L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",6,63,"style","Trailing whitespace is superfluous.","1266L, 1560L, 1562L, 1700L, 1790L, 2202L, 2203L, 2204L, 2205L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",7,63,"style","Trailing whitespace is superfluous.","4191L, 2206L, 4096L, 4089L, 2950L, 3220L, 3614L, 3642L, 3615L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",8,63,"style","Trailing whitespace is superfluous.","3734L, 3769L, 3802L, 4072L, 2970L, 5038L, 3904L, 3906L, 3908L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",9,63,"style","Trailing whitespace is superfluous.","3910L, 3912L, 3926L, 2249L, 2287L, 2275L, 2276L, 2277L, 2278L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",10,62,"style","Trailing whitespace is superfluous.","2279L, 3838L, 2280L, 2281L, 2283L, 2776L, 3500L, 3115L, 325L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",11,62,"style","Trailing whitespace is superfluous.","3310L, 269L, 3831L, 5077L, 5078L, 5079L, 5080L, 1000L, 1001L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",12,63,"style","Trailing whitespace is superfluous.","1002L, 1003L, 1016L, 1005L, 1006L, 1007L, 1008L, 1009L, 1028L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",13,67,"style","Trailing whitespace is superfluous.","1010L, 1011L, 1012L, 1013L, 199L, 143L, 271L, 1017L, 1018L, 1019L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",14,66,"style","Trailing whitespace is superfluous.","1020L, 1027L, 629L, 1021L, 1022L, 719L, 791L, 1040L, 1041L, 651L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",15,62,"style","Trailing whitespace is superfluous.","775L, 1034L, 1014L, 1015L, 1182L, 1183L, 1115L, 1185L, 1187L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",16,63,"style","Trailing whitespace is superfluous.","1270L, 1561L, 1563L, 1231L, 2201L, 2207L, 2208L, 2209L, 2210L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",17,63,"style","Trailing whitespace is superfluous.","4192L, 2211L, 4097L, 4090L, 2951L, 3221L, 3643L, 3644L, 3645L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",18,63,"style","Trailing whitespace is superfluous.","3735L, 3770L, 3807L, 4073L, 2949L, 5039L, 3905L, 3907L, 3909L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",19,68,"style","Trailing whitespace is superfluous.","3911L, 3913L, 3927L, 1263L, 12000L, 12001L, 12002L, 12003L, 12004L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",20,64,"style","Trailing whitespace is superfluous.","12005L, 12006L, 12007L, 12008L, 12009L, 12010L, 12011L, 12012L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",21,64,"style","Trailing whitespace is superfluous.","12013L, 12014L, 12015L, 12016L, 12017L, 12018L, 12019L, 12020L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",22,63,"style","Trailing whitespace is superfluous.","12021L, 12022L, 12023L, 12024L, 12025L, 1248L, 12026L, 12027L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",23,62,"style","Trailing whitespace is superfluous.","2842L, 2843L, 12028L, 12029L, 12030L, 12031L, 12032L, 12033L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",24,64,"style","Trailing whitespace is superfluous.","12034L, 12035L, 12036L, 12037L, 12038L, 12039L, 12040L, 12041L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",25,63,"style","Trailing whitespace is superfluous.","12042L, 12043L, 12044L, 4066L, 12045L, 12046L, 12047L, 12048L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",26,63,"style","Trailing whitespace is superfluous.","12049L, 12050L, 12051L, 6101L, 12052L, 12053L, 12054L, 12055L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",27,64,"style","Trailing whitespace is superfluous.","12056L, 12057L, 12058L, 12059L, 12060L, 12061L, 12062L, 12063L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",28,64,"style","Trailing whitespace is superfluous.","12064L, 12065L, 12066L, 12067L, 12068L, 12069L, 12070L, 12071L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",29,64,"style","Trailing whitespace is superfluous.","12072L, 12073L, 12074L, 12075L, 12076L, 12077L, 12078L, 12079L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",30,64,"style","Trailing whitespace is superfluous.","12080L, 12081L, 12082L, 12083L, 12084L, 12085L, 12086L, 12088L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",31,64,"style","Trailing whitespace is superfluous.","12092L, 12096L, 12099L, 12102L, 12106L, 12110L, 12114L, 12118L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",32,64,"style","Trailing whitespace is superfluous.","12122L, 12126L, 12130L, 12134L, 12138L, 12142L, 12145L, 12148L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",33,64,"style","Trailing whitespace is superfluous.","12151L, 12155L, 12159L, 12162L, 12166L, 12171L, 12174L, 12177L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",34,64,"style","Trailing whitespace is superfluous.","12180L, 12183L, 12186L, 12189L, 12193L, 12197L, 12201L, 12204L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",35,64,"style","Trailing whitespace is superfluous.","12208L, 12211L, 12215L, 12218L, 12221L, 12225L, 12228L, 12231L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",36,64,"style","Trailing whitespace is superfluous.","12235L, 12238L, 12241L, 12245L, 12248L, 12251L, 12255L, 12259L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",37,64,"style","Trailing whitespace is superfluous.","12262L, 12265L, 12268L, 12271L, 12274L, 12278L, 12282L, 12285L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",38,64,"style","Trailing whitespace is superfluous.","12289L, 12293L, 12296L, 12299L, 12303L, 12307L, 12311L, 12315L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",39,64,"style","Trailing whitespace is superfluous.","12319L, 12323L, 13124L, 13123L, 13127L, 13126L, 13129L, 13128L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",40,64,"style","Trailing whitespace is superfluous.","13131L, 13134L, 13133L, 13136L, 13135L, 13139L, 13143L, 13146L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",41,64,"style","Trailing whitespace is superfluous.","13150L, 13154L, 13158L, 13162L, 13166L, 13170L, 13174L, 13178L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",42,64,"style","Trailing whitespace is superfluous.","13182L, 13186L, 13190L, 13194L, 13198L, 13202L, 13206L, 13210L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",43,64,"style","Trailing whitespace is superfluous.","13213L, 13217L, 13221L, 13225L, 13228L, 13232L, 13235L, 13239L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",44,64,"style","Trailing whitespace is superfluous.","13242L, 13246L, 13248L, 13251L, 13253L, 13256L, 13258L, 13261L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",45,64,"style","Trailing whitespace is superfluous.","13263L, 13266L, 13270L, 13274L, 13277L, 13281L, 13285L, 13289L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",46,64,"style","Trailing whitespace is superfluous.","13293L, 13297L, 13300L, 13304L, 13307L, 13311L, 13315L, 13319L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",47,64,"style","Trailing whitespace is superfluous.","13323L, 13327L, 13331L, 13335L, 13339L, 13342L, 13345L, 13348L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",48,64,"style","Trailing whitespace is superfluous.","13351L, 13355L, 13358L, 13361L, 13365L, 13368L, 13371L, 13375L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",49,64,"style","Trailing whitespace is superfluous.","13379L, 16483L, 16482L, 16485L, 16489L, 16488L, 16491L, 16495L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",51,64,"style","Trailing whitespace is superfluous.","), typname = c(""bool"", ""bytea"", ""char"", ""name"", ""int8"", ""int2"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",52,62,"style","Trailing whitespace is superfluous.","""int2vector"", ""int4"", ""regproc"", ""text"", ""oid"", ""tid"", ""xid"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",53,70,"style","Trailing whitespace is superfluous.","""cid"", ""oidvector"", ""pg_type"", ""pg_attribute"", ""pg_proc"", ""pg_class"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",54,66,"style","Trailing whitespace is superfluous.","""json"", ""xml"", ""pg_node_tree"", ""pg_ndistinct"", ""pg_dependencies"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",55,66,"style","Trailing whitespace is superfluous.","""pg_mcv_list"", ""pg_ddl_command"", ""xid8"", ""point"", ""lseg"", ""path"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",56,67,"style","Trailing whitespace is superfluous.","""box"", ""polygon"", ""line"", ""float4"", ""float8"", ""unknown"", ""circle"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",57,69,"style","Trailing whitespace is superfluous.","""money"", ""macaddr"", ""inet"", ""cidr"", ""macaddr8"", ""aclitem"", ""bpchar"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",58,67,"style","Trailing whitespace is superfluous.","""varchar"", ""date"", ""time"", ""timestamp"", ""timestamptz"", ""interval"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",59,67,"style","Trailing whitespace is superfluous.","""timetz"", ""bit"", ""varbit"", ""numeric"", ""refcursor"", ""regprocedure"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",60,65,"style","Trailing whitespace is superfluous.","""regoper"", ""regoperator"", ""regclass"", ""regcollation"", ""regtype"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",61,70,"style","Trailing whitespace is superfluous.","""regrole"", ""regnamespace"", ""uuid"", ""pg_lsn"", ""tsvector"", ""gtsvector"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",62,62,"style","Trailing whitespace is superfluous.","""tsquery"", ""regconfig"", ""regdictionary"", ""jsonb"", ""jsonpath"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",63,68,"style","Trailing whitespace is superfluous.","""txid_snapshot"", ""pg_snapshot"", ""int4range"", ""numrange"", ""tsrange"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",64,71,"style","Trailing whitespace is superfluous.","""tstzrange"", ""daterange"", ""int8range"", ""record"", ""_record"", ""cstring"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",65,75,"style","Trailing whitespace is superfluous.","""any"", ""anyarray"", ""void"", ""trigger"", ""event_trigger"", ""language_handler"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",66,67,"style","Trailing whitespace is superfluous.","""internal"", ""anyelement"", ""anynonarray"", ""anyenum"", ""fdw_handler"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",67,67,"style","Trailing whitespace is superfluous.","""index_am_handler"", ""tsm_handler"", ""table_am_handler"", ""anyrange"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",68,64,"style","Trailing whitespace is superfluous.","""anycompatible"", ""anycompatiblearray"", ""anycompatiblenonarray"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",69,68,"style","Trailing whitespace is superfluous.","""anycompatiblerange"", ""_bool"", ""_bytea"", ""_char"", ""_name"", ""_int8"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",70,62,"style","Trailing whitespace is superfluous.","""_int2"", ""_int2vector"", ""_int4"", ""_regproc"", ""_text"", ""_oid"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",71,64,"style","Trailing whitespace is superfluous.","""_tid"", ""_xid"", ""_cid"", ""_oidvector"", ""_json"", ""_xml"", ""_xid8"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",72,68,"style","Trailing whitespace is superfluous.","""_point"", ""_lseg"", ""_path"", ""_box"", ""_polygon"", ""_line"", ""_float4"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",73,62,"style","Trailing whitespace is superfluous.","""_float8"", ""_circle"", ""_money"", ""_macaddr"", ""_inet"", ""_cidr"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",74,66,"style","Trailing whitespace is superfluous.","""_macaddr8"", ""_aclitem"", ""_bpchar"", ""_varchar"", ""_date"", ""_time"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",75,62,"style","Trailing whitespace is superfluous.","""_timestamp"", ""_timestamptz"", ""_interval"", ""_timetz"", ""_bit"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",76,66,"style","Trailing whitespace is superfluous.","""_varbit"", ""_numeric"", ""_refcursor"", ""_regprocedure"", ""_regoper"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",77,70,"style","Trailing whitespace is superfluous.","""_regoperator"", ""_regclass"", ""_regcollation"", ""_regtype"", ""_regrole"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",78,64,"style","Trailing whitespace is superfluous.","""_regnamespace"", ""_uuid"", ""_pg_lsn"", ""_tsvector"", ""_gtsvector"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",79,67,"style","Trailing whitespace is superfluous.","""_tsquery"", ""_regconfig"", ""_regdictionary"", ""_jsonb"", ""_jsonpath"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",80,61,"style","Trailing whitespace is superfluous.","""_txid_snapshot"", ""_pg_snapshot"", ""_int4range"", ""_numrange"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",81,66,"style","Trailing whitespace is superfluous.","""_tsrange"", ""_tstzrange"", ""_daterange"", ""_int8range"", ""_cstring"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",82,73,"style","Trailing whitespace is superfluous.","""pg_attrdef"", ""pg_constraint"", ""pg_inherits"", ""pg_index"", ""pg_operator"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",83,62,"style","Trailing whitespace is superfluous.","""pg_opfamily"", ""pg_opclass"", ""pg_am"", ""pg_amop"", ""pg_amproc"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",84,76,"style","Trailing whitespace is superfluous.","""pg_language"", ""pg_largeobject_metadata"", ""pg_largeobject"", ""pg_aggregate"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",85,61,"style","Trailing whitespace is superfluous.","""pg_statistic_ext"", ""pg_statistic_ext_data"", ""pg_statistic"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",86,66,"style","Trailing whitespace is superfluous.","""pg_rewrite"", ""pg_trigger"", ""pg_event_trigger"", ""pg_description"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",87,68,"style","Trailing whitespace is superfluous.","""pg_cast"", ""pg_enum"", ""pg_namespace"", ""pg_conversion"", ""pg_depend"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",88,67,"style","Trailing whitespace is superfluous.","""pg_database"", ""pg_db_role_setting"", ""pg_tablespace"", ""pg_authid"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",89,70,"style","Trailing whitespace is superfluous.","""pg_auth_members"", ""pg_shdepend"", ""pg_shdescription"", ""pg_ts_config"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",90,68,"style","Trailing whitespace is superfluous.","""pg_ts_config_map"", ""pg_ts_dict"", ""pg_ts_parser"", ""pg_ts_template"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",91,64,"style","Trailing whitespace is superfluous.","""pg_extension"", ""pg_foreign_data_wrapper"", ""pg_foreign_server"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",92,77,"style","Trailing whitespace is superfluous.","""pg_user_mapping"", ""pg_foreign_table"", ""pg_policy"", ""pg_replication_origin"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",93,67,"style","Trailing whitespace is superfluous.","""pg_default_acl"", ""pg_init_privs"", ""pg_seclabel"", ""pg_shseclabel"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",94,68,"style","Trailing whitespace is superfluous.","""pg_collation"", ""pg_partitioned_table"", ""pg_range"", ""pg_transform"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",95,74,"style","Trailing whitespace is superfluous.","""pg_sequence"", ""pg_publication"", ""pg_publication_rel"", ""pg_subscription"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",96,74,"style","Trailing whitespace is superfluous.","""pg_subscription_rel"", ""pg_toast_2600"", ""pg_toast_2604"", ""pg_toast_3456"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",97,67,"style","Trailing whitespace is superfluous.","""pg_toast_2606"", ""pg_toast_826"", ""pg_toast_2609"", ""pg_toast_3466"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",98,68,"style","Trailing whitespace is superfluous.","""pg_toast_3079"", ""pg_toast_2328"", ""pg_toast_1417"", ""pg_toast_3118"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",99,68,"style","Trailing whitespace is superfluous.","""pg_toast_3394"", ""pg_toast_2612"", ""pg_toast_2615"", ""pg_toast_3350"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",100,68,"style","Trailing whitespace is superfluous.","""pg_toast_3256"", ""pg_toast_1255"", ""pg_toast_2618"", ""pg_toast_3596"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",101,68,"style","Trailing whitespace is superfluous.","""pg_toast_2619"", ""pg_toast_3381"", ""pg_toast_3429"", ""pg_toast_2620"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",102,68,"style","Trailing whitespace is superfluous.","""pg_toast_3600"", ""pg_toast_1247"", ""pg_toast_1418"", ""pg_toast_1260"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",103,68,"style","Trailing whitespace is superfluous.","""pg_toast_1262"", ""pg_toast_2964"", ""pg_toast_6000"", ""pg_toast_2396"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",104,63,"style","Trailing whitespace is superfluous.","""pg_toast_3592"", ""pg_toast_6100"", ""pg_toast_1213"", ""pg_roles"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",105,63,"style","Trailing whitespace is superfluous.","""pg_shadow"", ""pg_group"", ""pg_user"", ""pg_policies"", ""pg_rules"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",106,70,"style","Trailing whitespace is superfluous.","""pg_views"", ""pg_tables"", ""pg_matviews"", ""pg_indexes"", ""pg_sequences"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",107,65,"style","Trailing whitespace is superfluous.","""pg_stats"", ""pg_stats_ext"", ""pg_publication_tables"", ""pg_locks"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",108,76,"style","Trailing whitespace is superfluous.","""pg_cursors"", ""pg_available_extensions"", ""pg_available_extension_versions"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",109,63,"style","Trailing whitespace is superfluous.","""pg_prepared_xacts"", ""pg_prepared_statements"", ""pg_seclabels"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",110,79,"style","Trailing whitespace is superfluous.","""pg_settings"", ""pg_file_settings"", ""pg_hba_file_rules"", ""pg_timezone_abbrevs"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",111,80,"style","Trailing whitespace is superfluous.","""pg_timezone_names"", ""pg_config"", ""pg_shmem_allocations"", ""pg_stat_all_tables"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",112,76,"style","Trailing whitespace is superfluous.","""pg_stat_xact_all_tables"", ""pg_stat_sys_tables"", ""pg_stat_xact_sys_tables"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",113,75,"style","Trailing whitespace is superfluous.","""pg_stat_user_tables"", ""pg_stat_xact_user_tables"", ""pg_statio_all_tables"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",114,72,"style","Trailing whitespace is superfluous.","""pg_statio_sys_tables"", ""pg_statio_user_tables"", ""pg_stat_all_indexes"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",115,72,"style","Trailing whitespace is superfluous.","""pg_stat_sys_indexes"", ""pg_stat_user_indexes"", ""pg_statio_all_indexes"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",116,78,"style","Trailing whitespace is superfluous.","""pg_statio_sys_indexes"", ""pg_statio_user_indexes"", ""pg_statio_all_sequences"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",117,75,"style","Trailing whitespace is superfluous.","""pg_statio_sys_sequences"", ""pg_statio_user_sequences"", ""pg_stat_activity"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",118,63,"style","Trailing whitespace is superfluous.","""pg_stat_replication"", ""pg_stat_slru"", ""pg_stat_wal_receiver"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",119,81,"style","Trailing whitespace is superfluous.","""pg_stat_subscription"", ""pg_stat_ssl"", ""pg_stat_gssapi"", ""pg_replication_slots"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",120,76,"style","Trailing whitespace is superfluous.","""pg_stat_database"", ""pg_stat_database_conflicts"", ""pg_stat_user_functions"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",121,71,"style","Trailing whitespace is superfluous.","""pg_stat_xact_user_functions"", ""pg_stat_archiver"", ""pg_stat_bgwriter"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",122,83,"style","Trailing whitespace is superfluous.","""pg_stat_progress_analyze"", ""pg_stat_progress_vacuum"", ""pg_stat_progress_cluster"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",123,64,"style","Trailing whitespace is superfluous.","""pg_stat_progress_create_index"", ""pg_stat_progress_basebackup"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",124,71,"style","Trailing whitespace is superfluous.","""pg_user_mappings"", ""pg_replication_origin_status"", ""cardinal_number"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",125,75,"style","Trailing whitespace is superfluous.","""_cardinal_number"", ""character_data"", ""_character_data"", ""sql_identifier"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",126,68,"style","Trailing whitespace is superfluous.","""_sql_identifier"", ""information_schema_catalog_name"", ""time_stamp"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",127,62,"style","Trailing whitespace is superfluous.","""_time_stamp"", ""yes_or_no"", ""_yes_or_no"", ""applicable_roles"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",128,69,"style","Trailing whitespace is superfluous.","""administrable_role_authorizations"", ""attributes"", ""character_sets"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",129,69,"style","Trailing whitespace is superfluous.","""check_constraint_routine_usage"", ""check_constraints"", ""collations"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",130,64,"style","Trailing whitespace is superfluous.","""collation_character_set_applicability"", ""column_column_usage"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",131,64,"style","Trailing whitespace is superfluous.","""column_domain_usage"", ""column_privileges"", ""column_udt_usage"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",132,64,"style","Trailing whitespace is superfluous.","""columns"", ""constraint_column_usage"", ""constraint_table_usage"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",133,70,"style","Trailing whitespace is superfluous.","""domain_constraints"", ""domain_udt_usage"", ""domains"", ""enabled_roles"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",134,61,"style","Trailing whitespace is superfluous.","""key_column_usage"", ""parameters"", ""referential_constraints"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",135,67,"style","Trailing whitespace is superfluous.","""role_column_grants"", ""routine_privileges"", ""role_routine_grants"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",136,71,"style","Trailing whitespace is superfluous.","""routines"", ""schemata"", ""sequences"", ""sql_features"", ""pg_toast_13245"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",137,76,"style","Trailing whitespace is superfluous.","""sql_implementation_info"", ""pg_toast_13250"", ""sql_parts"", ""pg_toast_13255"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",138,73,"style","Trailing whitespace is superfluous.","""sql_sizing"", ""pg_toast_13260"", ""table_constraints"", ""table_privileges"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",139,73,"style","Trailing whitespace is superfluous.","""role_table_grants"", ""tables"", ""transforms"", ""triggered_update_columns"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",140,69,"style","Trailing whitespace is superfluous.","""triggers"", ""udt_privileges"", ""role_udt_grants"", ""usage_privileges"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",141,64,"style","Trailing whitespace is superfluous.","""role_usage_grants"", ""user_defined_types"", ""view_column_usage"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",142,75,"style","Trailing whitespace is superfluous.","""view_routine_usage"", ""view_table_usage"", ""views"", ""data_type_privileges"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",143,64,"style","Trailing whitespace is superfluous.","""element_types"", ""_pg_foreign_table_columns"", ""column_options"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",144,61,"style","Trailing whitespace is superfluous.","""_pg_foreign_data_wrappers"", ""foreign_data_wrapper_options"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",145,74,"style","Trailing whitespace is superfluous.","""foreign_data_wrappers"", ""_pg_foreign_servers"", ""foreign_server_options"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",146,66,"style","Trailing whitespace is superfluous.","""foreign_servers"", ""_pg_foreign_tables"", ""foreign_table_options"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",147,63,"style","Trailing whitespace is superfluous.","""foreign_tables"", ""_pg_user_mappings"", ""user_mapping_options"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",148,72,"style","Trailing whitespace is superfluous.","""user_mappings"", ""airlines"", ""_airlines"", ""pg_toast_16481"", ""airports"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",149,72,"style","Trailing whitespace is superfluous.","""_airports"", ""pg_toast_16487"", ""flights"", ""_flights"", ""pg_toast_16493"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",150,62,"style","Trailing whitespace is superfluous.","""planes"", ""_planes"", ""pg_toast_16499"", ""weather"", ""_weather"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-90cd6a.R",1,72,"style","Trailing whitespace is superfluous.","structure(list(year = integer(0), month = integer(0), day = integer(0), ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-90cd6a.R",2,80,"style","Trailing whitespace is superfluous."," dep_time = integer(0), sched_dep_time = integer(0), dep_delay = numeric(0), ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-90cd6a.R",3,80,"style","Trailing whitespace is superfluous."," arr_time = integer(0), sched_arr_time = integer(0), arr_delay = numeric(0), ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-90cd6a.R",4,73,"style","Trailing whitespace is superfluous."," carrier = character(0), flight = integer(0), tailnum = character(0), ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-90cd6a.R",5,71,"style","Trailing whitespace is superfluous."," origin = character(0), dest = character(0), air_time = numeric(0), ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-90cd6a.R",6,67,"style","Trailing whitespace is superfluous."," distance = numeric(0), hour = numeric(0), minute = numeric(0), ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",1,67,"style","Trailing whitespace is superfluous.","structure(list(tailnum = c(""N912XJ"", ""N645JB"", ""N904WN"", ""N3BWAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",2,70,"style","Trailing whitespace is superfluous.","""N3CJAA"", ""N14972"", ""N667UA"", ""N521JB"", ""N998AT"", ""N16559"", ""N14186"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",3,70,"style","Trailing whitespace is superfluous.","""N16170"", ""N789JB"", ""N593JB"", ""N409WN"", ""N11535"", ""N505AA"", ""N8928A"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",4,70,"style","Trailing whitespace is superfluous.","""N3DPAA"", ""N34222"", ""N639VA"", ""N480AA"", ""N77518"", ""N511MQ"", ""N697DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",5,70,"style","Trailing whitespace is superfluous.","""N87527"", ""N652SW"", ""N651JB"", ""N640AA"", ""N304DQ"", ""N988DL"", ""N643JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",6,70,"style","Trailing whitespace is superfluous.","""N231JB"", ""N14542"", ""N531JB"", ""N14573"", ""N76519"", ""N13161"", ""N567UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",7,70,"style","Trailing whitespace is superfluous.","""N201LV"", ""N27962"", ""N198JB"", ""N520MQ"", ""N689MQ"", ""N369NW"", ""N8432A"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",8,70,"style","Trailing whitespace is superfluous.","""N14902"", ""N8EGMQ"", ""N3FJAA"", ""N336NB"", ""N905DL"", ""N12136"", ""N628VA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",9,70,"style","Trailing whitespace is superfluous.","""N550WN"", ""N844VA"", ""N353SW"", ""N738US"", ""N371NB"", ""N431WN"", ""N11206"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",10,69,"style","Trailing whitespace is superfluous.","""N412WN"", ""N832UA"", ""N14993"", ""N495UA"", ""N3759"", ""N314US"", ""N14231"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",11,70,"style","Trailing whitespace is superfluous.","""N176DN"", ""N363NB"", ""N3AHAA"", ""N5DMAA"", ""N764US"", ""N802MQ"", ""N33209"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",12,70,"style","Trailing whitespace is superfluous.","""N38451"", ""N14219"", ""N320US"", ""N8903A"", ""N682MQ"", ""N672DL"", ""N3FCAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",13,70,"style","Trailing whitespace is superfluous.","""N173US"", ""N691CA"", ""N33103"", ""N210WN"", ""N8877A"", ""N638JB"", ""N558UW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",14,70,"style","Trailing whitespace is superfluous.","""N820AS"", ""N479UA"", ""N180US"", ""N334JB"", ""N33292"", ""N513UA"", ""N775JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",15,70,"style","Trailing whitespace is superfluous.","""N528MQ"", ""N955DL"", ""N405UA"", ""N377NW"", ""N611QX"", ""N7732A"", ""N320AA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",16,70,"style","Trailing whitespace is superfluous.","""N11192"", ""N3769L"", ""N622VA"", ""N338AA"", ""N504UA"", ""N7739A"", ""N841UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",17,70,"style","Trailing whitespace is superfluous.","""N987AT"", ""N11113"", ""N14106"", ""N903WN"", ""N3CGAA"", ""N621VA"", ""N477AA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",18,70,"style","Trailing whitespace is superfluous.","""N837UA"", ""N339NB"", ""N374DA"", ""N8869B"", ""N284JB"", ""N924DL"", ""N8775A"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",19,70,"style","Trailing whitespace is superfluous.","""N836UA"", ""N324JB"", ""N833UA"", ""N13553"", ""N999DN"", ""N3763D"", ""N12996"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",20,70,"style","Trailing whitespace is superfluous.","""N513MQ"", ""N722US"", ""N14904"", ""N591AA"", ""N539MQ"", ""N14977"", ""N12924"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",21,70,"style","Trailing whitespace is superfluous.","""N358NB"", ""N877AS"", ""N554UA"", ""N203JB"", ""N76514"", ""N12135"", ""N387SW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",22,70,"style","Trailing whitespace is superfluous.","""N27722"", ""N444UA"", ""N469UA"", ""N575UA"", ""N3AUAA"", ""N306JB"", ""N24128"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",23,70,"style","Trailing whitespace is superfluous.","""N617MQ"", ""N595UA"", ""N642DL"", ""N588JB"", ""N3HSAA"", ""N915DE"", ""N3HTAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",24,70,"style","Trailing whitespace is superfluous.","""N592UA"", ""N37253"", ""N629JB"", ""N585UA"", ""N265WN"", ""N4XRAA"", ""N941DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",25,70,"style","Trailing whitespace is superfluous.","""N838VA"", ""N267AT"", ""N3JXAA"", ""N523UA"", ""N912DL"", ""N3GRAA"", ""N707TW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",26,70,"style","Trailing whitespace is superfluous.","""N934WN"", ""N370SW"", ""N17133"", ""N594JB"", ""N11119"", ""N8942A"", ""N524JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",27,70,"style","Trailing whitespace is superfluous.","""N608QX"", ""N534JB"", ""N21130"", ""N534MQ"", ""N659DL"", ""N18102"", ""N14105"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",28,70,"style","Trailing whitespace is superfluous.","""N470UA"", ""N7714B"", ""N535MQ"", ""N910DE"", ""N921WN"", ""N918DL"", ""N703TW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",29,70,"style","Trailing whitespace is superfluous.","""N998DL"", ""N8982A"", ""N735MQ"", ""N76065"", ""N354NW"", ""N13994"", ""N644JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",30,70,"style","Trailing whitespace is superfluous.","""N282WN"", ""N722MQ"", ""N502UA"", ""N13202"", ""N66057"", ""N26545"", ""N37474"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",31,70,"style","Trailing whitespace is superfluous.","""N527AA"", ""N544AA"", ""N24212"", ""N935XJ"", ""N352AA"", ""N920AT"", ""N630JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",32,70,"style","Trailing whitespace is superfluous.","""N79402"", ""N8305E"", ""N849VA"", ""N477WN"", ""N603JB"", ""N8907A"", ""N4UCAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",33,70,"style","Trailing whitespace is superfluous.","""N535UW"", ""N8560F"", ""N17984"", ""N11189"", ""N709EV"", ""N727SW"", ""N3GLAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",34,69,"style","Trailing whitespace is superfluous.","""N7726A"", ""N3765"", ""N14959"", ""N796SW"", ""N325US"", ""N11165"", ""N3KBAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",35,69,"style","Trailing whitespace is superfluous.","""N4WVAA"", ""N713EV"", ""N3ASAA"", ""N8541D"", ""N444WN"", ""N744P"", ""N33294"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",36,70,"style","Trailing whitespace is superfluous.","""N476UA"", ""N845VA"", ""N950DL"", ""N937XJ"", ""N741SA"", ""N562UW"", ""N417UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",37,70,"style","Trailing whitespace is superfluous.","""N3ERAA"", ""N14179"", ""N684MQ"", ""N8800G"", ""N37252"", ""N11187"", ""N547JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",38,70,"style","Trailing whitespace is superfluous.","""N510JB"", ""N12569"", ""N592JB"", ""N16149"", ""N585AA"", ""N714CB"", ""N517MQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",39,70,"style","Trailing whitespace is superfluous.","""N3HUAA"", ""N366NW"", ""N5EMAA"", ""N723EV"", ""N66051"", ""N961AT"", ""N365NW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",40,70,"style","Trailing whitespace is superfluous.","""N269WN"", ""N248WN"", ""N18557"", ""N390AA"", ""N18120"", ""N344AA"", ""N805UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",41,70,"style","Trailing whitespace is superfluous.","""N76529"", ""N16713"", ""N661MQ"", ""N426UA"", ""N3736C"", ""N356NW"", ""N27733"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",42,70,"style","Trailing whitespace is superfluous.","""N328AA"", ""N466UA"", ""N547AA"", ""N3FKAA"", ""N345NW"", ""N983DL"", ""N410UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",43,70,"style","Trailing whitespace is superfluous.","""N794JB"", ""N181UW"", ""N76516"", ""N75426"", ""N232WN"", ""N5DNAA"", ""N675DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",44,70,"style","Trailing whitespace is superfluous.","""N23721"", ""N624VA"", ""N830MQ"", ""N604LR"", ""N914DL"", ""N361NB"", ""N458UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",45,70,"style","Trailing whitespace is superfluous.","""N379DA"", ""N633DL"", ""N947DL"", ""N401WN"", ""N261AT"", ""N3FHAA"", ""N591JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",46,70,"style","Trailing whitespace is superfluous.","""N77066"", ""N702TW"", ""N601AW"", ""N8554A"", ""N15912"", ""N37466"", ""N331NW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",47,70,"style","Trailing whitespace is superfluous.","""N605LR"", ""N706JB"", ""N518UA"", ""N695DL"", ""N721MQ"", ""N14116"", ""N840VA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",48,70,"style","Trailing whitespace is superfluous.","""N904XJ"", ""N526JB"", ""N285WN"", ""N633VA"", ""N519AA"", ""N364NW"", ""N942MQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",49,70,"style","Trailing whitespace is superfluous.","""N719EV"", ""N476WN"", ""N529VA"", ""N3CKAA"", ""N533UA"", ""N372NW"", ""N529JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",50,70,"style","Trailing whitespace is superfluous.","""N504JB"", ""N705TW"", ""N121UW"", ""N16178"", ""N515MQ"", ""N733SA"", ""N195UW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",51,70,"style","Trailing whitespace is superfluous.","""N328NW"", ""N663MQ"", ""N8964E"", ""N625VA"", ""N852VA"", ""N544MQ"", ""N327NB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",52,70,"style","Trailing whitespace is superfluous.","""N6EAMQ"", ""N340NW"", ""N163US"", ""N11176"", ""N13989"", ""N585JB"", ""N374JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",53,70,"style","Trailing whitespace is superfluous.","""N8736A"", ""N370NW"", ""N717TW"", ""N6704Z"", ""N760JB"", ""N14148"", ""N3CYAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",54,70,"style","Trailing whitespace is superfluous.","""N14543"", ""N5DYAA"", ""N329AA"", ""N8936A"", ""N599JB"", ""N749US"", ""N324AA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",55,70,"style","Trailing whitespace is superfluous.","""N600LR"", ""N951FR"", ""N611MQ"", ""N690DL"", ""N758SW"", ""N4UBAA"", ""N338NB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",56,70,"style","Trailing whitespace is superfluous.","""N534UA"", ""N550NW"", ""N455UA"", ""N920DL"", ""N907MQ"", ""N358NW"", ""N850MQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",57,70,"style","Trailing whitespace is superfluous.","""N419UA"", ""N3DHAA"", ""N984DL"", ""N39728"", ""N8790A"", ""N337AT"", ""N979DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",58,70,"style","Trailing whitespace is superfluous.","""N3FVAA"", ""N3CTAA"", ""N324US"", ""N730EV"", ""N41104"", ""N765SW"", ""N76515"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",59,70,"style","Trailing whitespace is superfluous.","""N3GSAA"", ""N8698A"", ""N173AT"", ""N76528"", ""N509MQ"", ""N805MQ"", ""N938DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",60,70,"style","Trailing whitespace is superfluous.","""N724MQ"", ""N201FR"", ""N433UA"", ""N712EV"", ""N853VA"", ""N564JB"", ""N438UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",61,70,"style","Trailing whitespace is superfluous.","""N747SA"", ""N561JB"", ""N29906"", ""N387DA"", ""N924XJ"", ""N913DL"", ""N11127"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",62,70,"style","Trailing whitespace is superfluous.","""N326US"", ""N8696C"", ""N722TW"", ""N481AA"", ""N543UW"", ""N675AW"", ""N302NB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",63,70,"style","Trailing whitespace is superfluous.","""N270WN"", ""N482AA"", ""N632SW"", ""N310NW"", ""N77530"", ""N4WNAA"", ""N950UW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",64,70,"style","Trailing whitespace is superfluous.","""N828AS"", ""N296PQ"", ""N19554"", ""N963DL"", ""N530VA"", ""N827UA"", ""N893AT"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",65,70,"style","Trailing whitespace is superfluous.","""N76502"", ""N68453"", ""N641VA"", ""N24729"", ""N553UA"", ""N510UW"", ""N627JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",66,70,"style","Trailing whitespace is superfluous.","""N821MQ"", ""N3BGAA"", ""N506JB"", ""N18101"", ""N16918"", ""N3KEAA"", ""N402UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",67,70,"style","Trailing whitespace is superfluous.","""N844MH"", ""N550UW"", ""N758US"", ""N391DA"", ""N662JB"", ""N908XJ"", ""N801UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",68,70,"style","Trailing whitespace is superfluous.","""N649MQ"", ""N466WN"", ""N8646A"", ""N241WN"", ""N18223"", ""N17245"", ""N14731"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",69,70,"style","Trailing whitespace is superfluous.","""N16147"", ""N990DL"", ""N993DL"", ""N639AA"", ""N29717"", ""N934XJ"", ""N996DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",70,70,"style","Trailing whitespace is superfluous.","""N913XJ"", ""N562JB"", ""N5EHAA"", ""N582AA"", ""N839UA"", ""N4XVAA"", ""N445WN"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",71,70,"style","Trailing whitespace is superfluous.","""N178JB"", ""N915AT"", ""N214FR"", ""N891AT"", ""N8532G"", ""N239JB"", ""N948DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",72,70,"style","Trailing whitespace is superfluous.","""N915WN"", ""N827AS"", ""N4XCAA"", ""N5CAAA"", ""N834AS"", ""N645MQ"", ""N11547"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",73,70,"style","Trailing whitespace is superfluous.","""N351NB"", ""N927AT"", ""N463WN"", ""N452UA"", ""N29129"", ""N14562"", ""N899AT"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",74,70,"style","Trailing whitespace is superfluous.","""N437UA"", ""N913DE"", ""N354JB"", ""N842UA"", ""N501AA"", ""N827MQ"", ""N408WN"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",75,70,"style","Trailing whitespace is superfluous.","""N803UA"", ""N355NW"", ""N283JB"", ""N507MQ"", ""N508AA"", ""N509JB"", ""N627VA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",76,70,"style","Trailing whitespace is superfluous.","""N176AT"", ""N348NW"", ""N715JB"", ""N3BAAA"", ""N8683B"", ""N13716"", ""N646JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",77,70,"style","Trailing whitespace is superfluous.","""N936DL"", ""N78438"", ""N3BDAA"", ""N638VA"", ""N507JB"", ""N403UA"", ""N16234"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",78,70,"style","Trailing whitespace is superfluous.","""N932XJ"", ""N784JB"", ""N297WN"", ""N902MQ"", ""N959UW"", ""N228JB"", ""N521VA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",79,70,"style","Trailing whitespace is superfluous.","""N906AT"", ""N3HGAA"", ""N267JB"", ""N507UA"", ""N612JB"", ""N564UA"", ""N17730"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",80,70,"style","Trailing whitespace is superfluous.","""N399DA"", ""N351JB"", ""N349NW"", ""N555LV"", ""N16561"", ""N504MQ"", ""N25134"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",81,70,"style","Trailing whitespace is superfluous.","""N607LR"", ""N833AY"", ""N615AA"", ""N607JB"", ""N3EPAA"", ""N324NB"", ""N577UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",82,70,"style","Trailing whitespace is superfluous.","""N8930E"", ""N519JB"", ""N458WN"", ""N754EV"", ""N911DA"", ""N21129"", ""N16709"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",83,70,"style","Trailing whitespace is superfluous.","""N339JB"", ""N997AT"", ""N4XXAA"", ""N927LR"", ""N946DL"", ""N3HEAA"", ""N36444"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",84,70,"style","Trailing whitespace is superfluous.","""N16541"", ""N776WN"", ""N574UA"", ""N75435"", ""N14570"", ""N323JB"", ""N8933B"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",85,70,"style","Trailing whitespace is superfluous.","""N34110"", ""N17126"", ""N771SA"", ""N820AY"", ""N715UW"", ""N710EV"", ""N940DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",86,70,"style","Trailing whitespace is superfluous.","""N8598B"", ""N705JB"", ""N8506C"", ""N807JB"", ""N394DA"", ""N634VA"", ""N348JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",87,70,"style","Trailing whitespace is superfluous.","""N3DSAA"", ""N355JB"", ""N8972E"", ""N293PQ"", ""N3DUAA"", ""N13133"", ""N14950"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",88,70,"style","Trailing whitespace is superfluous.","""N524MQ"", ""N904DL"", ""N27190"", ""N8960A"", ""N484UA"", ""N624JB"", ""N3AJAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",89,70,"style","Trailing whitespace is superfluous.","""N930XJ"", ""N77520"", ""N335AA"", ""N635VA"", ""N8940E"", ""N849MQ"", ""N713SW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",90,70,"style","Trailing whitespace is superfluous.","""N75433"", ""N316JB"", ""N12900"", ""N768SW"", ""N972DL"", ""N3FSAA"", ""N346NB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",91,70,"style","Trailing whitespace is superfluous.","""N908MQ"", ""N3JCAA"", ""N950WN"", ""N959AT"", ""N842MQ"", ""N3GDAA"", ""N8315C"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",92,70,"style","Trailing whitespace is superfluous.","""N624AG"", ""N14118"", ""N446UA"", ""N752EV"", ""N172DN"", ""N457UW"", ""N7735A"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",93,70,"style","Trailing whitespace is superfluous.","""N430UA"", ""N14905"", ""N805JB"", ""N580UA"", ""N545UA"", ""N709TW"", ""N601LR"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",94,70,"style","Trailing whitespace is superfluous.","""N218FR"", ""N404UA"", ""N23139"", ""N497UA"", ""N257WN"", ""N17138"", ""N959DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",95,70,"style","Trailing whitespace is superfluous.","""N652DL"", ""N351NW"", ""N603DL"", ""N855UA"", ""N569UA"", ""N329NW"", ""N735SA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",96,70,"style","Trailing whitespace is superfluous.","""N995DL"", ""N38467"", ""N563JB"", ""N3KPAA"", ""N75861"", ""N472UA"", ""N4WSAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",97,70,"style","Trailing whitespace is superfluous.","""N16963"", ""N583AA"", ""N13979"", ""N12567"", ""N539AA"", ""N927XJ"", ""N571JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",98,70,"style","Trailing whitespace is superfluous.","""N519UA"", ""N353AT"", ""N640JB"", ""N11536"", ""N597UA"", ""N79279"", ""N3EFAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",99,70,"style","Trailing whitespace is superfluous.","""N15574"", ""N636JB"", ""N14953"", ""N3APAA"", ""N528VA"", ""N486AA"", ""N514MQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",100,70,"style","Trailing whitespace is superfluous.","""N991DL"", ""N14203"", ""N928DN"", ""N11109"", ""N8839E"", ""N184US"", ""N76504"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",101,70,"style","Trailing whitespace is superfluous.","""N425UA"", ""N631VA"", ""N15980"", ""N3GJAA"", ""N764SW"", ""N353NB"", ""N982DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",102,70,"style","Trailing whitespace is superfluous.","""N825AS"", ""N508JB"", ""N598JB"", ""N342NW"", ""N3ANAA"", ""N746JB"", ""N9EAMQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",103,70,"style","Trailing whitespace is superfluous.","""N296JB"", ""N708EV"", ""N231WN"", ""N8580A"", ""N328JB"", ""N555UA"", ""N380DA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",104,70,"style","Trailing whitespace is superfluous.","""N423UA"", ""N522UA"", ""N222WN"", ""N336AA"", ""N292JB"", ""N332AA"", ""N588UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",105,70,"style","Trailing whitespace is superfluous.","""N8733G"", ""N809UA"", ""N767UW"", ""N244WN"", ""N933LR"", ""N525UA"", ""N608JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",106,70,"style","Trailing whitespace is superfluous.","""N929DL"", ""N14991"", ""N187JB"", ""N980AT"", ""N527VA"", ""N17169"", ""N978DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",107,70,"style","Trailing whitespace is superfluous.","""N625AA"", ""N316NB"", ""N492UA"", ""N944UW"", ""N3FPAA"", ""N922DL"", ""N3CHAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",108,70,"style","Trailing whitespace is superfluous.","""N656JB"", ""N4YTAA"", ""N41135"", ""N566JB"", ""N138EV"", ""N676CA"", ""N813UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",109,70,"style","Trailing whitespace is superfluous.","""N12122"", ""N14214"", ""N3CXAA"", ""N37471"", ""N375NC"", ""N527MQ"", ""N13964"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",110,70,"style","Trailing whitespace is superfluous.","""N11181"", ""N5FGAA"", ""N3GCAA"", ""N946UW"", ""N808UA"", ""N835AS"", ""N737MQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",111,70,"style","Trailing whitespace is superfluous.","""N673UA"", ""N362NW"", ""N838MQ"", ""N687MQ"", ""N3BCAA"", ""N435WN"", ""N5CGAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",112,70,"style","Trailing whitespace is superfluous.","""N73276"", ""N667AW"", ""N3750D"", ""N15910"", ""N374NW"", ""N247JB"", ""N516AS"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",113,70,"style","Trailing whitespace is superfluous.","""N707EV"", ""N777QC"", ""N579JB"", ""N337JB"", ""N464UA"", ""N8604C"", ""N847UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",114,70,"style","Trailing whitespace is superfluous.","""N400WN"", ""N3741S"", ""N15973"", ""N13538"", ""N3DCAA"", ""N39416"", ""N779JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",115,70,"style","Trailing whitespace is superfluous.","""N16976"", ""N416UA"", ""N807UA"", ""N494WN"", ""N929XJ"", ""N12195"", ""N3JDAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",116,70,"style","Trailing whitespace is superfluous.","""N1EAMQ"", ""N937DL"", ""N16151"", ""N576UA"", ""N17244"", ""N639MQ"", ""N13958"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",117,70,"style","Trailing whitespace is superfluous.","""N7738A"", ""N754UW"", ""N6716C"", ""N73299"", ""N185UW"", ""N3BRAA"", ""N8797A"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",118,70,"style","Trailing whitespace is superfluous.","""N8409N"", ""N3764D"", ""N954DL"", ""N13718"", ""N15985"", ""N318JB"", ""N197UW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",119,70,"style","Trailing whitespace is superfluous.","""N34111"", ""N509AY"", ""N13913"", ""N553UW"", ""N917WN"", ""N930DL"", ""N3749D"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",120,70,"style","Trailing whitespace is superfluous.","""N218WN"", ""N73251"", ""N3748Y"", ""N13124"", ""N11150"", ""N507MJ"", ""N519MQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",121,70,"style","Trailing whitespace is superfluous.","""N819UA"", ""N928DL"", ""N917XJ"", ""N18556"", ""N8674A"", ""N520JB"", ""N8908D"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",122,70,"style","Trailing whitespace is superfluous.","""N910XJ"", ""N811MQ"", ""N609SW"", ""N12167"", ""N12564"", ""N485UA"", ""N556UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",123,70,"style","Trailing whitespace is superfluous.","""N657JB"", ""N18220"", ""N7741C"", ""N431UA"", ""N963WN"", ""N73275"", ""N368JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",124,70,"style","Trailing whitespace is superfluous.","""N12540"", ""N925DL"", ""N8745B"", ""N302DQ"", ""N935WN"", ""N236JB"", ""N16571"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",125,70,"style","Trailing whitespace is superfluous.","""N762US"", ""N912DE"", ""N77431"", ""N308DE"", ""N343NB"", ""N823UA"", ""N331NB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",126,70,"style","Trailing whitespace is superfluous.","""N558JB"", ""N8317M"", ""N75436"", ""N446WN"", ""N465UA"", ""N167US"", ""N587NW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",127,70,"style","Trailing whitespace is superfluous.","""N658JB"", ""N212WN"", ""N3733Z"", ""N531MQ"", ""N3JUAA"", ""N3735D"", ""N700GS"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",128,69,"style","Trailing whitespace is superfluous.","""N1603"", ""N332NW"", ""N5ETAA"", ""N516JB"", ""N4WMAA"", ""N397DA"", ""N13969"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",129,70,"style","Trailing whitespace is superfluous.","""N919DL"", ""N835VA"", ""N706SW"", ""N339AA"", ""N523UW"", ""N16732"", ""N486UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",130,70,"style","Trailing whitespace is superfluous.","""N183DN"", ""N12160"", ""N14117"", ""N76505"", ""N623VA"", ""N11565"", ""N3761R"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",131,70,"style","Trailing whitespace is superfluous.","""N710TW"", ""N960DL"", ""N827JB"", ""N314NB"", ""N221WN"", ""N811UA"", ""N76265"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",132,70,"style","Trailing whitespace is superfluous.","""N523JB"", ""N4YDAA"", ""N345NB"", ""N942WN"", ""N848VA"", ""N632MQ"", ""N606JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",133,70,"style","Trailing whitespace is superfluous.","""N925AT"", ""N482WN"", ""N480UA"", ""N3FNAA"", ""N443UA"", ""N502MJ"", ""N950AT"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",134,70,"style","Trailing whitespace is superfluous.","""N894AT"", ""N13132"", ""N535JB"", ""N15572"", ""N761RR"", ""N919DE"", ""N930AT"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",135,70,"style","Trailing whitespace is superfluous.","""N804UA"", ""N360NB"", ""N919FJ"", ""N529UA"", ""N3754A"", ""N512MQ"", ""N928AT"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",136,70,"style","Trailing whitespace is superfluous.","""N78501"", ""N392DA"", ""N857MQ"", ""N8828D"", ""N14237"", ""N766JB"", ""N461UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",137,70,"style","Trailing whitespace is superfluous.","""N744EV"", ""N3JMAA"", ""N615JB"", ""N835UA"", ""N503MQ"", ""N11548"", ""N830UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",138,70,"style","Trailing whitespace is superfluous.","""N487WN"", ""N480WN"", ""N348NB"", ""N922WN"", ""N812UA"", ""N327NW"", ""N12921"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",139,70,"style","Trailing whitespace is superfluous.","""N39418"", ""N292WN"", ""N810MQ"", ""N626VA"", ""N274JB"", ""N815MQ"", ""N565JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",140,70,"style","Trailing whitespace is superfluous.","""N18114"", ""N294WN"", ""N14923"", ""N467UA"", ""N925XJ"", ""N5PBMQ"", ""N21144"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",141,70,"style","Trailing whitespace is superfluous.","""N965DL"", ""N3GWAA"", ""N671DN"", ""N565AA"", ""N820UA"", ""N3JTAA"", ""N14125"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",142,70,"style","Trailing whitespace is superfluous.","""N344AT"", ""N663DN"", ""N615QX"", ""N558UA"", ""N928XJ"", ""N73256"", ""N411UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",143,70,"style","Trailing whitespace is superfluous.","""N515AA"", ""N961DL"", ""N11164"", ""N329NB"", ""N852MQ"", ""N341NW"", ""N339NW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",144,70,"style","Trailing whitespace is superfluous.","""N739GB"", ""N435UA"", ""N319NB"", ""N511UA"", ""N344NB"", ""N3JAAA"", ""N973DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",145,70,"style","Trailing whitespace is superfluous.","""N294PQ"", ""N830AS"", ""N11544"", ""N951DL"", ""N636MQ"", ""N67171"", ""N5CEAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",146,70,"style","Trailing whitespace is superfluous.","""N989DL"", ""N37413"", ""N522AA"", ""N841AY"", ""N3758Y"", ""N14168"", ""N613JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",147,70,"style","Trailing whitespace is superfluous.","""N12175"", ""N563UA"", ""N36476"", ""N3EXAA"", ""N320NB"", ""N909EV"", ""N36272"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",148,70,"style","Trailing whitespace is superfluous.","""N378NW"", ""N12201"", ""N396DA"", ""N13975"", ""N75429"", ""N937AT"", ""N3757D"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",149,70,"style","Trailing whitespace is superfluous.","""N939DL"", ""N553AA"", ""N317NB"", ""N7734H"", ""N310DE"", ""N76523"", ""N442UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",150,70,"style","Trailing whitespace is superfluous.","""N57852"", ""N37409"", ""N964AT"", ""N525MQ"", ""N13566"", ""N718EV"", ""N279JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",151,70,"style","Trailing whitespace is superfluous.","""N510MQ"", ""N738MQ"", ""N17185"", ""N406UA"", ""N247WN"", ""N3JEAA"", ""N944DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",152,70,"style","Trailing whitespace is superfluous.","""N670DN"", ""N918XJ"", ""N605JB"", ""N27724"", ""N38454"", ""N945DL"", ""N477UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",153,70,"style","Trailing whitespace is superfluous.","""N3AEMQ"", ""N276AT"", ""N753EV"", ""N16703"", ""N19966"", ""N8458A"", ""N13955"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",154,70,"style","Trailing whitespace is superfluous.","""N674DL"", ""N750EV"", ""N29917"", ""N8923A"", ""N546MQ"", ""N761ND"", ""N921AT"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",155,70,"style","Trailing whitespace is superfluous.","""N905WN"", ""N711MQ"", ""N515MJ"", ""N290AT"", ""N391CA"", ""N748EV"", ""N13965"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",156,70,"style","Trailing whitespace is superfluous.","""N566UA"", ""N27200"", ""N4XEAA"", ""N708JB"", ""N249JB"", ""N546AA"", ""N836VA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",157,70,"style","Trailing whitespace is superfluous.","""N634JB"", ""N176PQ"", ""N258JB"", ""N27239"", ""N459WN"", ""N16954"", ""N388DA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",158,70,"style","Trailing whitespace is superfluous.","""N467WN"", ""N653JB"", ""N179UW"", ""N560UW"", ""N318US"", ""N508UA"", ""N906DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",159,70,"style","Trailing whitespace is superfluous.","""N329JB"", ""N476AA"", ""N24706"", ""N21537"", ""N836AS"", ""N13978"", ""N902DE"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",160,70,"style","Trailing whitespace is superfluous.","""N936XJ"", ""N821UA"", ""N512UA"", ""N586JB"", ""N679DA"", ""N57111"", ""N330NB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",161,70,"style","Trailing whitespace is superfluous.","""N13903"", ""N14916"", ""N14188"", ""N8659B"", ""N918FJ"", ""N723SW"", ""N906WN"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",162,70,"style","Trailing whitespace is superfluous.","""N382DA"", ""N634AA"", ""N491WN"", ""N11155"", ""N817UA"", ""N635JB"", ""N901XJ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",163,70,"style","Trailing whitespace is superfluous.","""N11121"", ""N660DL"", ""N493AA"", ""N969DL"", ""N589UA"", ""N526AA"", ""N662DN"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",164,70,"style","Trailing whitespace is superfluous.","""N474AA"", ""N946AT"", ""N81449"", ""N932WN"", ""N436UA"", ""N990AT"", ""N955AT"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",165,70,"style","Trailing whitespace is superfluous.","""N513AA"", ""N384AA"", ""N565UW"", ""N934DL"", ""N8623A"", ""N590JB"", ""N793JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",166,70,"style","Trailing whitespace is superfluous.","""N365AA"", ""N317US"", ""N794SW"", ""N8970D"", ""N3JVAA"", ""N202FR"", ""N155DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",167,70,"style","Trailing whitespace is superfluous.","""N8444F"", ""N656AW"", ""N557UA"", ""N8971A"", ""N319AA"", ""N816MQ"", ""N722EV"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",168,70,"style","Trailing whitespace is superfluous.","""N932DL"", ""N725MQ"", ""N913WN"", ""N4YJAA"", ""N14180"", ""N563UW"", ""N699DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",169,70,"style","Trailing whitespace is superfluous.","""N37293"", ""N8894A"", ""N283AT"", ""N437AA"", ""N995AT"", ""N297PQ"", ""N554NW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",170,70,"style","Trailing whitespace is superfluous.","""N75858"", ""N515UA"", ""N14174"", ""N16999"", ""N8943A"", ""N223WN"", ""N914XJ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",171,70,"style","Trailing whitespace is superfluous.","""N921DL"", ""N920XJ"", ""N490AA"", ""N810UA"", ""N452UW"", ""N3EDAA"", ""N34460"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",172,70,"style","Trailing whitespace is superfluous.","""N335NB"", ""N403WN"", ""N481WN"", ""N610DL"", ""N3755D"", ""N26549"", ""N832AS"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",173,70,"style","Trailing whitespace is superfluous.","""N966AT"", ""N821JB"", ""N3FWAA"", ""N907DL"", ""N721UW"", ""N566AA"", ""N787SA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",174,70,"style","Trailing whitespace is superfluous.","""N274WN"", ""N301NB"", ""N14974"", ""N692DL"", ""N804MQ"", ""N376NW"", ""N16217"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",175,70,"style","Trailing whitespace is superfluous.","""N11191"", ""N37465"", ""N326NB"", ""N526UA"", ""N388SW"", ""N558AA"", ""N524VA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",176,70,"style","Trailing whitespace is superfluous.","""N949AT"", ""N945AT"", ""N818UA"", ""N828UA"", ""N16911"", ""N197JB"", ""N417WN"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",177,70,"style","Trailing whitespace is superfluous.","""N698MQ"", ""N949UW"", ""N21154"", ""N523VA"", ""N13997"", ""N687DL"", ""N916DE"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",178,70,"style","Trailing whitespace is superfluous.","""N16987"", ""N546UA"", ""N736MQ"", ""N968AT"", ""N633JB"", ""N8968E"", ""N849UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",179,70,"style","Trailing whitespace is superfluous.","""N239WN"", ""N12142"", ""N370AA"", ""N12967"", ""N822UA"", ""N906DE"", ""N8709A"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",180,70,"style","Trailing whitespace is superfluous.","""N530MQ"", ""N717MQ"", ""N506MJ"", ""N32404"", ""N16961"", ""N825UA"", ""N14177"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",181,68,"style","Trailing whitespace is superfluous.","""N3753"", ""N855MQ"", ""N3767"", ""N494AA"", ""N508MQ"", ""N365NB"", ""N723MQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",182,70,"style","Trailing whitespace is superfluous.","""N357NB"", ""N503JB"", ""N39423"", ""N374AA"", ""N750UW"", ""N319US"", ""N4YCAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",183,70,"style","Trailing whitespace is superfluous.","""N532MQ"", ""N3JSAA"", ""N383DN"", ""N463UA"", ""N763JB"", ""N420WN"", ""N327AA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",184,70,"style","Trailing whitespace is superfluous.","""N832AY"", ""N418UA"", ""N36207"", ""N14228"", ""N948UW"", ""N439UA"", ""N356AA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",185,70,"style","Trailing whitespace is superfluous.","""N229JB"", ""N559JB"", ""N307DQ"", ""N54711"", ""N903XJ"", ""N263AV"", ""N312US"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",186,70,"style","Trailing whitespace is superfluous.","""N900DE"", ""N554JB"", ""N347NW"", ""N826UA"", ""N5EAAA"", ""N432UA"", ""N910FJ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",187,70,"style","Trailing whitespace is superfluous.","""N814UA"", ""N717EV"", ""N964WN"", ""N777NC"", ""N3762Y"", ""N26123"", ""N514UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",188,70,"style","Trailing whitespace is superfluous.","""N216JB"", ""N428UA"", ""N361VA"", ""N962DL"", ""N665JB"", ""N701GS"", ""N902XJ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",189,70,"style","Trailing whitespace is superfluous.","""N338NW"", ""N560UA"", ""N960AT"", ""N922XJ"", ""N689DL"", ""N7715E"", ""N16919"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",190,70,"style","Trailing whitespace is superfluous.","""N473WN"", ""N906MQ"", ""N623JB"", ""N353NW"", ""N835MQ"", ""N963DN"", ""N204FR"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",191,70,"style","Trailing whitespace is superfluous.","""N593UA"", ""N632VA"", ""N8794B"", ""N809JB"", ""N854VA"", ""N76503"", ""N37263"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",192,70,"style","Trailing whitespace is superfluous.","""N37281"", ""N323NB"", ""N3DGAA"", ""N542AA"", ""N605QX"", ""N3JRAA"", ""N3GNAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",193,70,"style","Trailing whitespace is superfluous.","""N571AA"", ""N595JB"", ""N232PQ"", ""N8673D"", ""N184DN"", ""N238JB"", ""N34137"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",194,70,"style","Trailing whitespace is superfluous.","""N14143"", ""N496AA"", ""N360NW"", ""N429UA"", ""N650MQ"", ""N569JB"", ""N650AW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",195,70,"style","Trailing whitespace is superfluous.","""N729JB"", ""N298JB"", ""N278AT"", ""N309DE"", ""N906XJ"", ""N3738B"", ""N387AA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",196,70,"style","Trailing whitespace is superfluous.","""N11199"", ""N407UA"", ""N17146"", ""N3GEAA"", ""N838UA"", ""N355NB"", ""N8525B"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",197,70,"style","Trailing whitespace is superfluous.","""N640VA"", ""N16701"", ""N503AA"", ""N975DL"", ""N8475B"", ""N401UA"", ""N11140"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",198,70,"style","Trailing whitespace is superfluous.","""N78285"", ""N13908"", ""N36247"", ""N12552"", ""N629VA"", ""N967DL"", ""N817MQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",199,70,"style","Trailing whitespace is superfluous.","""N5DCAA"", ""N445UA"", ""N8884E"", ""N286WN"", ""N978AT"", ""N538UA"", ""N183JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",200,70,"style","Trailing whitespace is superfluous.","""N3BTAA"", ""N751EV"", ""N3CAAA"", ""N631MQ"", ""N393AA"", ""N573UA"", ""N14568"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",201,70,"style","Trailing whitespace is superfluous.","""N635AA"", ""N4XJAA"", ""N192DN"", ""N16951"", ""N518MQ"", ""N3CCAA"", ""N353JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",202,69,"style","Trailing whitespace is superfluous.","""N3766"", ""N13123"", ""N483UA"", ""N5CHAA"", ""N373JB"", ""N206JB"", ""N295PQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",203,70,"style","Trailing whitespace is superfluous.","""N10575"", ""N21197"", ""N903DE"", ""N0EGMQ"", ""N15710"", ""N334NB"", ""N26215"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",204,70,"style","Trailing whitespace is superfluous.","""N612QX"", ""N923FJ"", ""N5DBAA"", ""N273JB"", ""N284AT"", ""N505UA"", ""N3KCAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",205,70,"style","Trailing whitespace is superfluous.","""N505JB"", ""N540US"", ""N13949"", ""N3CWAA"", ""N16981"", ""N8938A"", ""N14153"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",206,70,"style","Trailing whitespace is superfluous.","""N510MJ"", ""N17560"", ""N3760C"", ""N456UA"", ""N968DL"", ""N626MQ"", ""N361NW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",207,70,"style","Trailing whitespace is superfluous.","""N35407"", ""N770UW"", ""N69059"", ""N366AA"", ""N536JB"", ""N8888D"", ""N304JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",208,70,"style","Trailing whitespace is superfluous.","""N669AW"", ""N716UW"", ""N36915"", ""N851UA"", ""N711HK"", ""N526MQ"", ""N989AT"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",209,70,"style","Trailing whitespace is superfluous.","""N31131"", ""N4YAAA"", ""N3772H"", ""N659JB"", ""N740UW"", ""N484WN"", ""N196DN"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",210,70,"style","Trailing whitespace is superfluous.","""N654UA"", ""N201AA"", ""N3AAAA"", ""N33284"", ""N15986"", ""N916DL"", ""N3BYAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",211,70,"style","Trailing whitespace is superfluous.","""N326AT"", ""N552JB"", ""N712JB"", ""N38443"", ""N527JB"", ""N195DN"", ""N756US"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",212,70,"style","Trailing whitespace is superfluous.","""N8913A"", ""N920DE"", ""N840AY"", ""N13970"", ""N724SW"", ""N25705"", ""N337NW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",213,70,"style","Trailing whitespace is superfluous.","""N911DE"", ""N970DL"", ""N527UA"", ""N818MQ"", ""N709SW"", ""N15983"", ""N578UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",214,70,"style","Trailing whitespace is superfluous.","""N376AA"", ""N13992"", ""N833AS"", ""N538CA"", ""N661JB"", ""N487UA"", ""N5FFAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",215,70,"style","Trailing whitespace is superfluous.","""N599AA"", ""N935AT"", ""N562UA"", ""N206FR"", ""N928MQ"", ""N4YGAA"", ""N3HRAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",216,70,"style","Trailing whitespace is superfluous.","""N587AS"", ""N37287"", ""N845UA"", ""N762SW"", ""N509UA"", ""N372DA"", ""N14171"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",217,70,"style","Trailing whitespace is superfluous.","""N4YUAA"", ""N6711M"", ""N17229"", ""N8672A"", ""N895AT"", ""N829UA"", ""N441WN"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",218,70,"style","Trailing whitespace is superfluous.","""N13914"", ""N738EV"", ""N552UW"", ""N482UA"", ""N415UA"", ""N767NC"", ""N328NB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",219,70,"style","Trailing whitespace is superfluous.","""N570UA"", ""N587JB"", ""N8577D"", ""N759EV"", ""N713TW"", ""N322US"", ""N422UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",220,70,"style","Trailing whitespace is superfluous.","""N8976E"", ""N441UA"", ""N665MQ"", ""N13118"", ""N363NW"", ""N915XJ"", ""N784SW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",221,70,"style","Trailing whitespace is superfluous.","""N976DL"", ""N8501F"", ""N910WN"", ""N8808H"", ""N942AT"", ""N947UW"", ""N48901"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",222,70,"style","Trailing whitespace is superfluous.","""N489UA"", ""N12114"", ""N12957"", ""N923XJ"", ""N507AY"", ""N169UW"", ""N3737C"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",223,70,"style","Trailing whitespace is superfluous.","""N819AY"", ""N38473"", ""N5CPAA"", ""N537JB"", ""N450WN"", ""N18243"", ""N17115"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",224,70,"style","Trailing whitespace is superfluous.","""N14998"", ""N22971"", ""N667DN"", ""N235WN"", ""N713MQ"", ""N716EV"", ""N648JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",225,70,"style","Trailing whitespace is superfluous.","""N24702"", ""N73283"", ""N956AT"", ""N12563"", ""N955WN"", ""N8310C"", ""N14920"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",226,70,"style","Trailing whitespace is superfluous.","""N945UW"", ""N528AA"", ""N741UW"", ""N5EGAA"", ""N12172"", ""N460WN"", ""N521US"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",227,70,"style","Trailing whitespace is superfluous.","""N33203"", ""N943DL"", ""N12109"", ""N649AW"", ""N333NW"", ""N216FR"", ""N179JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",228,70,"style","Trailing whitespace is superfluous.","""N931WN"", ""N3FLAA"", ""N11551"", ""N305AS"", ""N8886A"", ""N37290"", ""N523MQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",229,70,"style","Trailing whitespace is superfluous.","""N907DE"", ""N13750"", ""N14558"", ""N758EV"", ""N933AT"", ""N685DA"", ""N265JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",230,70,"style","Trailing whitespace is superfluous.","""N12166"", ""N652JB"", ""N734MQ"", ""N994AT"", ""N988AT"", ""N457UA"", ""N951UW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",231,70,"style","Trailing whitespace is superfluous.","""N76288"", ""N8533D"", ""N740EV"", ""N395DN"", ""N843VA"", ""N133EV"", ""N657MQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",232,70,"style","Trailing whitespace is superfluous.","""N371CA"", ""N8492C"", ""N843UA"", ""N594AA"", ""N425AA"", ""N641DL"", ""N741EV"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",233,70,"style","Trailing whitespace is superfluous.","""N537UA"", ""N909XJ"", ""N618JB"", ""N3746H"", ""N926XJ"", ""N804JB"", ""N405WN"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",234,70,"style","Trailing whitespace is superfluous.","""N131EV"", ""N568JB"", ""N983AT"", ""N658MQ"", ""N424AA"", ""N277WN"", ""N359NW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",235,70,"style","Trailing whitespace is superfluous.","""N398CA"", ""N298WN"", ""N3FDAA"", ""N695CA"", ""N3JHAA"", ""N8946A"", ""N506MQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",236,70,"style","Trailing whitespace is superfluous.","""N606MQ"", ""N346JB"", ""N854UA"", ""N621JB"", ""N807MQ"", ""N342AA"", ""N322NB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",237,70,"style","Trailing whitespace is superfluous.","""N655JB"", ""N307JB"", ""N713UW"", ""N206WN"", ""N37298"", ""N522MQ"", ""N3FYAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",238,70,"style","Trailing whitespace is superfluous.","""N7811F"", ""N556JB"", ""N587UA"", ""N971DL"", ""N760US"", ""N102UW"", ""N208FR"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",239,70,"style","Trailing whitespace is superfluous.","""N3EMAA"", ""N716SW"", ""N918DE"", ""N755EV"", ""N517JB"", ""N14960"", ""N73259"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",240,70,"style","Trailing whitespace is superfluous.","""N452WN"", ""N16546"", ""N905XJ"", ""N77510"", ""N6712B"", ""N13995"", ""N3GHAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",241,70,"style","Trailing whitespace is superfluous.","""N3EVAA"", ""N824UA"", ""N30401"", ""N12221"", ""N12922"", ""N751UW"", ""N78448"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",242,70,"style","Trailing whitespace is superfluous.","""N969AT"", ""N349NB"", ""N15555"", ""N337NB"", ""N14198"", ""N472WN"", ""N386DA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",243,70,"style","Trailing whitespace is superfluous.","""N589JB"", ""N939WN"", ""N651AW"", ""N846UA"", ""N637JB"", ""N909DL"", ""N543AA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",244,70,"style","Trailing whitespace is superfluous.","""N281JB"", ""N628MQ"", ""N4XBAA"", ""N12116"", ""N135EV"", ""N317JB"", ""N583JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",245,70,"style","Trailing whitespace is superfluous.","""N3CFAA"", ""N447WN"", ""N846MQ"", ""N460UA"", ""N340NB"", ""N33714"", ""N717JL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",246,70,"style","Trailing whitespace is superfluous.","""N912WN"", ""N972AT"", ""N834UA"", ""N11137"", ""N35271"", ""N364NB"", ""N33262"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",247,70,"style","Trailing whitespace is superfluous.","""N604QX"", ""N422WN"", ""N190JB"", ""N916XJ"", ""N570JB"", ""N8423C"", ""N14952"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",248,70,"style","Trailing whitespace is superfluous.","""N851NW"", ""N333NB"", ""N352NB"", ""N561UA"", ""N104UW"", ""N542UW"", ""N544UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",249,70,"style","Trailing whitespace is superfluous.","""N910DL"", ""N87507"", ""N500MQ"", ""N815UA"", ""N308AT"", ""N717SA"", ""N907XJ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",250,70,"style","Trailing whitespace is superfluous.","""N12163"", ""N162UW"", ""N174DN"", ""N14907"", ""N371NW"", ""N33286"", ""N720MQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",251,70,"style","Trailing whitespace is superfluous.","""N227WN"", ""N13968"", ""N323AA"", ""N668UA"", ""N731SA"", ""N923AT"", ""N727TW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",252,70,"style","Trailing whitespace is superfluous.","""N14162"", ""N565UA"", ""N483WN"", ""N786NC"", ""N3771K"", ""N200WN"", ""N800AY"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",253,70,"style","Trailing whitespace is superfluous.","""N11107"", ""N922EV"", ""N828AW"", ""N3GKAA"", ""N24211"", ""N597JB"", ""N791SW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",254,70,"style","Trailing whitespace is superfluous.","""N174US"", ""N623DL"", ""N757LV"", ""N935DL"", ""N16183"", ""N79521"", ""N812MQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",255,70,"style","Trailing whitespace is superfluous.","""N852UA"", ""N673MQ"", ""N737US"", ""N796JB"", ""N769US"", ""N921XJ"", ""N943AT"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",256,70,"style","Trailing whitespace is superfluous.","""N8588D"", ""N823AY"", ""N795SW"", ""N38727"", ""N77430"", ""N960WN"", ""N844MQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",257,70,"style","Trailing whitespace is superfluous.","""N751SW"", ""N522VA"", ""N5FJAA"", ""N724EV"", ""N943WN"", ""N750SA"", ""N323US"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",258,70,"style","Trailing whitespace is superfluous.","""N14704"", ""N13988"", ""N464WN"", ""N931DL"", ""N514AA"", ""N12157"", ""N309US"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",259,69,"style","Trailing whitespace is superfluous.","""N266JB"", ""N203FR"", ""N806JB"", ""N931XJ"", ""N501MQ"", ""N6702"", ""N37420"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",260,70,"style","Trailing whitespace is superfluous.","""N10156"", ""N505MQ"", ""N87513"", ""N8495B"", ""N233LV"", ""N720EV"", ""N812AY"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",261,70,"style","Trailing whitespace is superfluous.","""N933XJ"", ""N496WN"", ""N580JB"", ""N927DA"", ""N3730B"", ""N658AW"", ""N474UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",262,70,"style","Trailing whitespace is superfluous.","""N3BEAA"", ""N192JB"", ""N850UA"", ""N506AA"", ""N802UA"", ""N556UW"", ""N373AA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",263,70,"style","Trailing whitespace is superfluous.","""N584JB"", ""N806UA"", ""N426WN"", ""N23708"", ""N600QX"", ""N824MQ"", ""N371DA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",264,70,"style","Trailing whitespace is superfluous.","""N917DE"", ""N17128"", ""N415WN"", ""N22909"", ""N381DN"", ""N411WN"", ""N829AS"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",265,70,"style","Trailing whitespace is superfluous.","""N77296"", ""N607AT"", ""N384HA"", ""N840UA"", ""N684WN"", ""N8965E"", ""N541UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",266,70,"style","Trailing whitespace is superfluous.","""N184JB"", ""N205FR"", ""N672AW"", ""N839VA"", ""N389DA"", ""N17108"", ""N956WN"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",267,70,"style","Trailing whitespace is superfluous.","""N641JB"", ""N3GMAA"", ""N176UW"", ""N303DQ"", ""N826AS"", ""N5FNAA"", ""N451UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",268,70,"style","Trailing whitespace is superfluous.","""N642VA"", ""N380AA"", ""N373NW"", ""N649JB"", ""N543MQ"", ""N487AA"", ""N571UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",269,70,"style","Trailing whitespace is superfluous.","""N630MQ"", ""N676AW"", ""N8325D"", ""N354AT"", ""N345AA"", ""N344NW"", ""N602LR"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",270,72,"style","Trailing whitespace is superfluous.","""N952AT"", ""N637VA"", ""N663JB"")), class = ""data.frame"", row.names = c(NA, ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/dittodb/email-body b/.dev/revdep_emails/dittodb/email-body new file mode 100644 index 000000000..24fb633a9 --- /dev/null +++ b/.dev/revdep_emails/dittodb/email-body @@ -0,0 +1,27 @@ +Hello Jonathan Keane! Thank you for using {lintr} in your package {dittodb}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/ropensci/dittodb using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 24s on CRAN vs. 17s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/dupree/attachments/dupree.warnings b/.dev/revdep_emails/dupree/attachments/dupree.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/dupree/attachments/dupree.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/dupree/email-body b/.dev/revdep_emails/dupree/email-body new file mode 100644 index 000000000..91b3f6289 --- /dev/null +++ b/.dev/revdep_emails/dupree/email-body @@ -0,0 +1,27 @@ +Hello Russ Hyde! Thank you for using {lintr} in your package {dupree}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/russHyde/dupree using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 9s on CRAN vs. 6s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/edgarWebR/attachments/edgarWebR.warnings b/.dev/revdep_emails/edgarWebR/attachments/edgarWebR.warnings new file mode 100644 index 000000000..61d9875d5 --- /dev/null +++ b/.dev/revdep_emails/edgarWebR/attachments/edgarWebR.warnings @@ -0,0 +1,2 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Trying to remove β€˜absolute_paths_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/edgarWebR/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/edgarWebR/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..1df85e4c8 --- /dev/null +++ b/.dev/revdep_emails/edgarWebR/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,19916 @@ +"filename","line_number","column_number","type","message","line","linter" +"data-raw/sic_codes.R",43,58,"style","Use FALSE instead of the symbol F."," group = group_name, stringsAsFactors = F)","T_and_F_symbol_linter" +"data-raw/sic_codes.R",47,26,"style","Use FALSE instead of the symbol F.","})), stringsAsFactors = F)","T_and_F_symbol_linter" +"data-raw/sic_codes.R",58,42,"style","Use FALSE instead of the symbol F."," stringsAsFactors = F)","T_and_F_symbol_linter" +"data-raw/sic_codes.R",62,53,"style","Commas should always have a space after."," substr(majors$sic[startsWith(majors$sic, ""0"")], 2,4)","commas_linter" +"data-raw/sic_codes.R",69,42,"style","Use FALSE instead of the symbol F."," stringsAsFactors = F)","T_and_F_symbol_linter" +"data-raw/sic_codes.R",78,43,"style","Use FALSE instead of the symbol F."," stringsAsFactors = F)","T_and_F_symbol_linter" +"data-raw/sic_codes.R",79,36,"style","Commas should always have a space after.","sec_sic <- sec_sic[2:nrow(sec_sic),]","commas_linter" +"data-raw/sic_codes.R",85,62,"style","Use TRUE instead of the symbol T."," by.x = ""major_code"", by.y = ""sic"", all.x = T)","T_and_F_symbol_linter" +"data-raw/sic_codes.R",87,62,"style","Use TRUE instead of the symbol T."," by.x = ""group_code"", by.y = ""sic"", all.x = T)","T_and_F_symbol_linter" +"R/browse_edgar.R",20,32,"style","Put spaces around all infix operators."," before="""",","infix_spaces_linter" +"R/browse_edgar.R",33,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (res$status != ""200"" | res$headers[""content-type""] != ""application/atom+xml"") {","vector_logic_linter" +"R/browse_edgar.R",34,53,"style","Trailing semicolons are not needed."," stop(paste0(""Could not find company: "", ticker));","semicolon_linter" +"R/company_details.R",26,32,"style","Put spaces around all infix operators."," before="""",","infix_spaces_linter" +"R/company_filings.R",24,32,"style","Put spaces around all infix operators."," before="""",","infix_spaces_linter" +"R/effectiveness.R",47,57,"style","Use TRUE instead of the symbol T."," res$type <- sub("" Statements"", """", res$type, fixed = T)","T_and_F_symbol_linter" +"R/effectiveness.R",48,66,"style","Use TRUE instead of the symbol T."," res$division <- sub(""Division of "", """", res$division, fixed = T)","T_and_F_symbol_linter" +"R/parse_filing.R",39,30,"style","Use TRUE instead of the symbol T."," doc <- get_doc(x, clean = T)","T_and_F_symbol_linter" +"R/parse_filing.R",130,43,"style","Use FALSE instead of the symbol F."," stringsAsFactors = F)","T_and_F_symbol_linter" +"R/parse_filing.R",153,40,"style","Use FALSE instead of the symbol F."," include.raw = F,","T_and_F_symbol_linter" +"R/parse_filing.R",154,41,"style","Use FALSE instead of the symbol F."," include.path = F) {","T_and_F_symbol_linter" +"R/parse_filing.R",325,75,"style","Use FALSE instead of the symbol F."," result <- replicate(length(return_cols) + 2, character(), simplify = F)","T_and_F_symbol_linter" +"R/parse_filing.R",350,25,"style","Use TRUE instead of the symbol T."," ignore.case = T)","T_and_F_symbol_linter" +"R/parse_filing.R",366,42,"style","Use TRUE instead of the symbol T."," ignore.case = T)","T_and_F_symbol_linter" +"R/parse_submission.R",58,48,"style","Use TRUE instead of the symbol T."," include.binary = T,","T_and_F_symbol_linter" +"R/parse_submission.R",59,49,"style","Use TRUE instead of the symbol T."," include.content = T) {","T_and_F_symbol_linter" +"R/parse_submission.R",66,17,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.secdoc & (nchar(res) > 8e6)) {","vector_logic_linter" +"R/parse_submission.R",79,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (!is.secdoc & file.exists(res)) {","vector_logic_linter" +"R/parse_submission.R",130,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.binary & !include.binary) {","vector_logic_linter" +"R/parse_submission.R",148,59,"style","Use TRUE instead of the symbol T."," include.binary = T,","T_and_F_symbol_linter" +"R/parse_submission.R",149,60,"style","Use TRUE instead of the symbol T."," include.content = T) {","T_and_F_symbol_linter" +"R/parse_submission.R",153,44,"style","Use FALSE instead of the symbol F."," stringsAsFactors = F)","T_and_F_symbol_linter" +"R/parse_submission.R",156,15,"style","Use FALSE instead of the symbol F."," in.text <- F","T_and_F_symbol_linter" +"R/parse_submission.R",157,17,"style","Use FALSE instead of the symbol F."," is.binary <- F","T_and_F_symbol_linter" +"R/parse_submission.R",160,52,"style","Use FALSE instead of the symbol F."," while (length(l <- readLines(con, n = 1, warn = F)) > 0) {","T_and_F_symbol_linter" +"R/parse_submission.R",163,21,"style","Use FALSE instead of the symbol F."," in.text <- F","T_and_F_symbol_linter" +"R/parse_submission.R",166,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (text.line == 1 & startsWith(l, ""begin "")) {","vector_logic_linter" +"R/parse_submission.R",167,25,"style","Use TRUE instead of the symbol T."," is.binary <- T","T_and_F_symbol_linter" +"R/parse_submission.R",169,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (include.content & (!is.binary || include.binary)) {","vector_logic_linter" +"R/parse_submission.R",187,61,"style","Use FALSE instead of the symbol F."," result <- rbind(result, file.row, stringsAsFactors = F)","T_and_F_symbol_linter" +"R/parse_submission.R",192,19,"style","Use TRUE instead of the symbol T."," in.text <- T","T_and_F_symbol_linter" +"R/parse_submission.R",193,21,"style","Use FALSE instead of the symbol F."," is.binary <- F","T_and_F_symbol_linter" +"R/parse_submission.R",206,54,"style","Use TRUE instead of the symbol T."," txt.lines <- unlist(strsplit(txt, ""\n"", fixed = T))","T_and_F_symbol_linter" +"R/parse_submission.R",216,20,"style","Use FALSE instead of the symbol F."," prior.long <- c(F, (txt.length == 1023 | txt.length == 1025)[-length(txt.length)])","T_and_F_symbol_linter" +"R/utils.R",61,47,"style","Use TRUE instead of the symbol T."," grepl(""^(http|ftp)s?://"", x, ignore.case = T)","T_and_F_symbol_linter" +"R/utils.R",64,33,"style","Use FALSE instead of the symbol F.","get_doc <- function(x, clean = F) {","T_and_F_symbol_linter" +"R/utils.R",77,20,"style","Use TRUE instead of the symbol T."," }, silent = T)","T_and_F_symbol_linter" +"R/utils.R",89,20,"style","Use TRUE instead of the symbol T."," }, silent = T)","T_and_F_symbol_linter" +"R/utils.R",161,23,"style","Use TRUE instead of the symbol T.","), ncol = 2, byrow = T)","T_and_F_symbol_linter" +"R/utils.R",298,24,"style","Use TRUE instead of the symbol T."," fixed = T)","T_and_F_symbol_linter" +"R/utils.R",306,46,"style","Use TRUE instead of the symbol T."," x <- gsub("""", "" "", x, fixed = T)","T_and_F_symbol_linter" +"R/utils.R",308,44,"style","Use TRUE instead of the symbol T."," x <- gsub(""
"", "" "", x, ignore.case = T)","T_and_F_symbol_linter" +"R/utils.R",309,45,"style","Use TRUE instead of the symbol T."," x <- gsub(""
"", "" "", x, ignore.case = T)","T_and_F_symbol_linter" +"R/utils.R",310,46,"style","Use TRUE instead of the symbol T."," x <- gsub("""", "" "", x, ignore.case = T)","T_and_F_symbol_linter" +"R/utils.R",323,28,"style","Use TRUE instead of the symbol T."," free = T)","T_and_F_symbol_linter" +"R/utils.R",327,88,"style","Use TRUE instead of the symbol T."," count(*)) and normalize-space() = '']""), free = T)","T_and_F_symbol_linter" +"R/utils.R",331,67,"style","Use TRUE instead of the symbol T."," xml2::xml_remove(xml2::xml_find_all(doc, ""//header""), free = T)","T_and_F_symbol_linter" +"tests/dev_tests/parse_to_html.R",3,34,"style","Use FALSE instead of the symbol F.","library(dplyr, warn.conflicts = F)","T_and_F_symbol_linter" +"tests/dev_tests/parse_to_html.R",56,55,"style","Use TRUE instead of the symbol T."," include.raw = T,","T_and_F_symbol_linter" +"tests/dev_tests/parse_to_html.R",57,56,"style","Use TRUE instead of the symbol T."," include.path = T)","T_and_F_symbol_linter" +"tests/dev_tests/parse_to_html.R",78,43,"style","Use TRUE instead of the symbol T.","doc <- edgarWebR:::get_doc(href, clean = T)","T_and_F_symbol_linter" +"tests/dev_tests/parse_to_html.R",82,55,"style","Use TRUE instead of the symbol T.","res <- build_parts(edgarWebR:::get_doc(href, clean = T), ""//text"")","T_and_F_symbol_linter" +"tests/testthat/helper_mock.R",36,38,"warning","Conditional expressions require scalar logical operators (&& and ||)","} else if (ewr_mock_bypass == ""true"" | !ewr_has_mocks) {","vector_logic_linter" +"tests/testthat/test_parse_filing.R",15,16,"style","Use TRUE instead of the symbol T."," }, silent = T)","T_and_F_symbol_linter" +"tests/testthat/test_parse_filing.R",20,85,"style","Use TRUE instead of the symbol T."," plain.words <- length(tokenizers::tokenize_words(xml2::xml_text(doc), simplify = T))","T_and_F_symbol_linter" +"tests/testthat/test_parse_filing.R",170,37,"style","Use FALSE instead of the symbol F."," ignore.case = F), ]","T_and_F_symbol_linter" +"vignettes/edgarWebR.Rmd",17,35,"style","Use TRUE instead of the symbol T.","knitr::opts_chunk$set(collapse = T, comment = ""#>"")","T_and_F_symbol_linter" +"vignettes/edgarWebR.Rmd",19,23,"style","Put spaces around all infix operators.","library(dplyr, quietly=TRUE)","infix_spaces_linter" +"vignettes/edgarWebR.Rmd",20,23,"style","Put spaces around all infix operators.","library(purrr, quietly=TRUE)","infix_spaces_linter" +"vignettes/edgarWebR.Rmd",102,29,"style","`%>%` should always have a space before it and a new line after it, unless the full pipeline fits on one line."," group_by(type) %>% summarize(","pipe_continuation_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1,121,"style","Lines should not be more than 120 characters.","structure(list(url = ""/browse-edgar?action=getcompany&CIK=EA&owner=exclude&type=10-&dateb=&start=0&count=100&output=atom"", ","line_length_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1,123,"style","Trailing whitespace is superfluous.","structure(list(url = ""/browse-edgar?action=getcompany&CIK=EA&owner=exclude&type=10-&dateb=&start=0&count=100&output=atom"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2,78,"style","Trailing whitespace is superfluous."," status_code = 200L, headers = structure(list(`content-encoding` = ""gzip"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3,68,"style","Trailing whitespace is superfluous."," `content-type` = ""application/atom+xml"", server = ""Apache"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4,80,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff"", `x-frame-options` = ""SAMEORIGIN"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5,73,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `content-length` = ""8015"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6,78,"style","Trailing whitespace is superfluous."," `cache-control` = ""no-cache"", date = ""Mon, 20 Jan 2020 17:54:21 GMT"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7,61,"style","Trailing whitespace is superfluous."," connection = ""keep-alive"", vary = ""Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8,88,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000 ; includeSubDomains ; preload"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10,69,"style","Trailing whitespace is superfluous."," )), all_headers = list(list(status = 200L, version = ""HTTP/1.1"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11,62,"style","Trailing whitespace is superfluous."," headers = structure(list(`content-encoding` = ""gzip"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12,72,"style","Trailing whitespace is superfluous."," `content-type` = ""application/atom+xml"", server = ""Apache"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13,84,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff"", `x-frame-options` = ""SAMEORIGIN"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",14,77,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `content-length` = ""8015"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",15,82,"style","Trailing whitespace is superfluous."," `cache-control` = ""no-cache"", date = ""Mon, 20 Jan 2020 17:54:21 GMT"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",16,65,"style","Trailing whitespace is superfluous."," connection = ""keep-alive"", vary = ""Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",17,118,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000 ; includeSubDomains ; preload""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",18,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",19,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",20,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",21,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",22,65,"style","Trailing whitespace is superfluous."," content = as.raw(c(0x3c, 0x3f, 0x78, 0x6d, 0x6c, 0x20, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",23,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x73, 0x69, 0x6f, 0x6e, 0x3d, 0x22, 0x31, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",24,64,"style","Trailing whitespace is superfluous."," 0x30, 0x22, 0x20, 0x65, 0x6e, 0x63, 0x6f, 0x64, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",25,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3d, 0x22, 0x49, 0x53, 0x4f, 0x2d, 0x38, 0x38, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",26,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x22, 0x20, 0x3f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",27,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x65, 0x65, 0x64, 0x20, 0x78, 0x6d, 0x6c, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",28,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",29,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x77, 0x33, 0x2e, 0x6f, 0x72, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",30,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x32, 0x30, 0x30, 0x35, 0x2f, 0x41, 0x74, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",31,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",32,64,"style","Trailing whitespace is superfluous."," 0x74, 0x68, 0x6f, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",33,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6d, 0x61, 0x69, 0x6c, 0x3e, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",34,64,"style","Trailing whitespace is superfluous."," 0x65, 0x62, 0x6d, 0x61, 0x73, 0x74, 0x65, 0x72, 0x40, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",35,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x3c, 0x2f, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",36,64,"style","Trailing whitespace is superfluous."," 0x61, 0x69, 0x6c, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",37,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x57, 0x65, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",38,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x73, 0x74, 0x65, 0x72, 0x3c, 0x2f, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",39,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",40,64,"style","Trailing whitespace is superfluous."," 0x61, 0x75, 0x74, 0x68, 0x6f, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",41,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",42,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x66, 0x6f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",43,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",44,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",45,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",46,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",47,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",48,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",49,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x79, 0x3e, 0x52, 0x45, 0x44, 0x57, 0x4f, 0x4f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",50,64,"style","Trailing whitespace is superfluous."," 0x44, 0x20, 0x43, 0x49, 0x54, 0x59, 0x3c, 0x2f, 0x63, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",51,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",52,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x74, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",53,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x43, 0x41, 0x3c, 0x2f, 0x73, 0x74, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",54,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",55,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x74, 0x72, 0x65, 0x65, 0x74, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",56,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x39, 0x20, 0x52, 0x45, 0x44, 0x57, 0x4f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",57,64,"style","Trailing whitespace is superfluous."," 0x4f, 0x44, 0x20, 0x53, 0x48, 0x4f, 0x52, 0x45, 0x53, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",58,64,"style","Trailing whitespace is superfluous."," 0x50, 0x41, 0x52, 0x4b, 0x57, 0x41, 0x59, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",59,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x65, 0x65, 0x74, 0x31, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",60,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",61,64,"style","Trailing whitespace is superfluous."," 0x69, 0x70, 0x3e, 0x39, 0x34, 0x30, 0x36, 0x35, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",62,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x69, 0x70, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",63,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x61, 0x64, 0x64, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",64,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",65,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",66,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x62, 0x75, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",67,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x65, 0x73, 0x73, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",68,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",69,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x79, 0x3e, 0x52, 0x45, 0x44, 0x57, 0x4f, 0x4f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",70,64,"style","Trailing whitespace is superfluous."," 0x44, 0x20, 0x43, 0x49, 0x54, 0x59, 0x3c, 0x2f, 0x63, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",71,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",72,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x70, 0x68, 0x6f, 0x6e, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",73,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x36, 0x35, 0x30, 0x2d, 0x36, 0x32, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",74,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x3c, 0x2f, 0x70, 0x68, 0x6f, 0x6e, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",75,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",76,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x74, 0x61, 0x74, 0x65, 0x3e, 0x43, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",77,64,"style","Trailing whitespace is superfluous."," 0x41, 0x3c, 0x2f, 0x73, 0x74, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",78,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",79,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x74, 0x72, 0x65, 0x65, 0x74, 0x31, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",80,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x20, 0x52, 0x45, 0x44, 0x57, 0x4f, 0x4f, 0x44, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",81,64,"style","Trailing whitespace is superfluous."," 0x20, 0x53, 0x48, 0x4f, 0x52, 0x45, 0x53, 0x20, 0x50, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",82,64,"style","Trailing whitespace is superfluous."," 0x52, 0x4b, 0x57, 0x41, 0x59, 0x3c, 0x2f, 0x73, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",83,64,"style","Trailing whitespace is superfluous."," 0x65, 0x65, 0x74, 0x31, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",84,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x7a, 0x69, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",85,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x39, 0x34, 0x30, 0x36, 0x35, 0x3c, 0x2f, 0x7a, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",86,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",87,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",88,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",89,64,"style","Trailing whitespace is superfluous."," 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, 0x73, 0x65, 0x73, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",90,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",91,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x67, 0x6e, 0x65, 0x64, 0x2d, 0x73, 0x69, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",92,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x37, 0x33, 0x37, 0x32, 0x3c, 0x2f, 0x61, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",93,64,"style","Trailing whitespace is superfluous."," 0x69, 0x67, 0x6e, 0x65, 0x64, 0x2d, 0x73, 0x69, 0x63, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",94,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",95,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x67, 0x6e, 0x65, 0x64, 0x2d, 0x73, 0x69, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",96,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x65, 0x73, 0x63, 0x3e, 0x53, 0x45, 0x52, 0x56, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",97,64,"style","Trailing whitespace is superfluous."," 0x49, 0x43, 0x45, 0x53, 0x2d, 0x50, 0x52, 0x45, 0x50, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",98,64,"style","Trailing whitespace is superfluous."," 0x43, 0x4b, 0x41, 0x47, 0x45, 0x44, 0x20, 0x53, 0x4f, 0x46, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",99,64,"style","Trailing whitespace is superfluous."," 0x54, 0x57, 0x41, 0x52, 0x45, 0x3c, 0x2f, 0x61, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",100,64,"style","Trailing whitespace is superfluous."," 0x69, 0x67, 0x6e, 0x65, 0x64, 0x2d, 0x73, 0x69, 0x63, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",101,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x73, 0x63, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",102,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x73, 0x73, 0x69, 0x67, 0x6e, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",103,64,"style","Trailing whitespace is superfluous."," 0x64, 0x2d, 0x73, 0x69, 0x63, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",104,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",105,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",106,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",107,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",108,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",109,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",110,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x53, 0x49, 0x43, 0x3d, 0x37, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",111,64,"style","Trailing whitespace is superfluous."," 0x37, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",112,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",113,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",114,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x61, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",115,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6e, 0x65, 0x64, 0x2d, 0x73, 0x69, 0x63, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",116,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",117,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x69, 0x6b, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",118,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x3c, 0x2f, 0x63, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",119,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",120,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",121,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",122,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",123,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",124,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",125,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",126,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",127,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x43, 0x49, 0x4b, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",128,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",129,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",130,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",131,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",132,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",133,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",134,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x65, 0x64, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",135,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x45, 0x4c, 0x45, 0x43, 0x54, 0x52, 0x4f, 0x4e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",136,64,"style","Trailing whitespace is superfluous."," 0x49, 0x43, 0x20, 0x41, 0x52, 0x54, 0x53, 0x20, 0x49, 0x4e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",137,64,"style","Trailing whitespace is superfluous."," 0x43, 0x2e, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",138,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x64, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",139,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",140,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x6c, 0x2d, 0x79, 0x65, 0x61, 0x72, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",141,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x3e, 0x30, 0x33, 0x33, 0x31, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",142,64,"style","Trailing whitespace is superfluous."," 0x69, 0x73, 0x63, 0x61, 0x6c, 0x2d, 0x79, 0x65, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",143,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x6e, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",144,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",145,64,"style","Trailing whitespace is superfluous."," 0x79, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x73, 0x20, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",146,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x22, 0x31, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",147,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",148,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",149,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",150,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x30, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",151,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3c, 0x2f, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",152,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",153,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x45, 0x4c, 0x45, 0x43, 0x54, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",154,64,"style","Trailing whitespace is superfluous."," 0x52, 0x4f, 0x4e, 0x49, 0x43, 0x20, 0x41, 0x52, 0x54, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",155,64,"style","Trailing whitespace is superfluous."," 0x20, 0x49, 0x4e, 0x43, 0x3c, 0x2f, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",156,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",157,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x6e, 0x61, 0x6d, 0x65, 0x73, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",158,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",159,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x72, 0x6c, 0x79, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",160,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",161,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x66, 0x66, 0x69, 0x63, 0x65, 0x3e, 0x4f, 0x66, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",162,64,"style","Trailing whitespace is superfluous."," 0x69, 0x63, 0x65, 0x20, 0x6f, 0x66, 0x20, 0x54, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",163,64,"style","Trailing whitespace is superfluous."," 0x68, 0x6e, 0x6f, 0x6c, 0x6f, 0x67, 0x79, 0x3c, 0x2f, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",164,64,"style","Trailing whitespace is superfluous."," 0x66, 0x66, 0x69, 0x63, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",165,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x74, 0x61, 0x74, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",166,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6f, 0x63, 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x3e, 0x43, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",167,64,"style","Trailing whitespace is superfluous."," 0x41, 0x3c, 0x2f, 0x73, 0x74, 0x61, 0x74, 0x65, 0x2d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",168,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x63, 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",169,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x74, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",170,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6c, 0x6f, 0x63, 0x61, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",171,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",172,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",173,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",174,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",175,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",176,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",177,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",178,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x74, 0x65, 0x3d, 0x43, 0x41, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",179,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",180,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",181,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",182,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x74, 0x61, 0x74, 0x65, 0x2d, 0x6c, 0x6f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",183,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",184,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",185,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x74, 0x65, 0x2d, 0x6f, 0x66, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",186,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x72, 0x70, 0x6f, 0x72, 0x61, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",187,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3e, 0x44, 0x45, 0x3c, 0x2f, 0x73, 0x74, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",188,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6f, 0x66, 0x2d, 0x69, 0x6e, 0x63, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",189,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",190,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",191,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x2d, 0x69, 0x6e, 0x66, 0x6f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",192,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",193,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",194,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",195,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",196,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",197,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",198,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",199,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",200,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",201,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",202,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",203,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",204,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",205,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",206,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",207,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",208,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x32, 0x39, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",209,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",210,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",211,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",212,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",213,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",214,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",215,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",216,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",217,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",218,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",219,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",220,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",221,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",222,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",223,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",224,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",225,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",226,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",227,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",228,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",229,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",230,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",231,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",232,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",233,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",234,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",235,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",236,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",237,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",238,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",239,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",240,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",241,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",242,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",243,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",244,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",245,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",246,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x32, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",247,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",248,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x31, 0x32, 0x39, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",249,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",250,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",251,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",252,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",253,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",254,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",255,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",256,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",257,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x39, 0x31, 0x31, 0x39, 0x34, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",258,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",259,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",260,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",261,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",262,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",263,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",264,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",265,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",266,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",267,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",268,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",269,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",270,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",271,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",272,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",273,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",274,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",275,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",276,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",277,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",278,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",279,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",280,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",281,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x31, 0x32, 0x39, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",282,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",283,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",284,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",285,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",286,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",287,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",288,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",289,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",290,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",291,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",292,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",293,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",294,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",295,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",296,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",297,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",298,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",299,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",300,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",301,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x31, 0x39, 0x30, 0x30, 0x30, 0x31, 0x32, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",302,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",303,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",304,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",305,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",306,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",307,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",308,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",309,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",310,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",311,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",312,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",313,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",314,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x39, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",315,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",316,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",317,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",318,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",319,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x32, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",320,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",321,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",322,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x33, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",323,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",324,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",325,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",326,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",327,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",328,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",329,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",330,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",331,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",332,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",333,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x35, 0x54, 0x31, 0x39, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",334,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x3a, 0x32, 0x33, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",335,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",336,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",337,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",338,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",339,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",340,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",341,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",342,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",343,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",344,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",345,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",346,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",347,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",348,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",349,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",350,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",351,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",352,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",353,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",354,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x34, 0x39, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",355,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",356,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",357,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",358,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",359,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",360,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",361,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",362,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",363,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",364,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",365,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",366,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",367,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",368,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",369,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",370,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",371,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",372,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",373,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",374,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",375,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",376,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",377,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",378,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",379,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",380,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",381,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",382,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",383,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",384,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",385,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",386,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",387,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",388,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",389,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",390,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",391,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x31, 0x39, 0x30, 0x30, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",392,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",393,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",394,64,"style","Trailing whitespace is superfluous."," 0x34, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",395,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",396,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",397,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",398,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",399,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",400,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",401,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",402,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",403,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x32, 0x33, 0x31, 0x35, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",404,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",405,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",406,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",407,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",409,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",410,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",411,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",412,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",413,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",414,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",415,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",416,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",417,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",418,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",419,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",420,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",421,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",422,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",423,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",424,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",425,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",426,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",427,64,"style","Trailing whitespace is superfluous."," 0x34, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",428,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",429,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",430,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",431,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",432,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",433,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",434,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",435,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",436,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",437,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",438,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",439,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",440,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",441,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",442,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",443,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",444,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",445,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",446,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x39, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",447,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x34, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",448,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",449,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",450,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",451,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",452,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",453,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",454,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",455,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",456,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",457,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",458,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",459,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",460,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x36, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",461,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",462,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",463,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",464,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",465,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x34, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",466,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",467,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",468,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",469,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",470,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",471,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",472,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",473,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",474,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",475,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",476,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",477,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",478,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",479,64,"style","Trailing whitespace is superfluous."," 0x36, 0x54, 0x31, 0x36, 0x3a, 0x31, 0x38, 0x3a, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",480,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",481,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",482,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",483,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",484,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",485,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",486,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",487,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",488,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",489,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",490,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",491,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",492,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",493,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",494,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",495,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",496,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",497,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",498,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",499,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x39, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",500,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",501,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",502,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",503,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",504,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",505,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",506,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",507,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",508,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",509,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",510,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",511,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",512,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",513,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",514,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",515,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",516,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",517,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",518,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",519,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",520,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",521,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",522,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",523,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",524,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",525,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",526,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",527,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",528,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",529,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",530,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",531,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",532,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",533,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",534,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",535,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",536,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",537,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x31, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",538,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",539,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x39, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",540,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",541,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",542,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",543,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",544,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",545,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",546,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",547,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",548,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x39, 0x38, 0x35, 0x31, 0x38, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",549,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",550,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",551,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",552,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",553,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",554,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",555,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",556,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",557,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",558,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",559,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",560,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x36, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",561,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",562,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",563,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",564,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",565,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",566,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",567,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",568,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",569,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",570,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",571,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",572,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",573,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",574,64,"style","Trailing whitespace is superfluous."," 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",575,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",576,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",577,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",578,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",579,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",580,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",581,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",582,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",583,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",584,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",585,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",586,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",587,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",588,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",589,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",590,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",591,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",592,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",593,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x39, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",594,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",595,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",596,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",597,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",598,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",599,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",600,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",601,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",602,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",603,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",604,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",605,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",606,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",607,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x34, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",608,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",609,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",610,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",611,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",612,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",613,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",614,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",615,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",616,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",617,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",618,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",619,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",620,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",621,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",622,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",623,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",624,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",625,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",626,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",627,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x33, 0x54, 0x32, 0x30, 0x3a, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",628,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x35, 0x34, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",629,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",630,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",631,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",632,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",633,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",634,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",635,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",636,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",637,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",638,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",639,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",640,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",641,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",642,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",643,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",644,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",645,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",646,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",647,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",648,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",649,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",650,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",651,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",652,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",653,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",654,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",655,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",656,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",657,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",658,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",659,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",660,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",661,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",662,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",663,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",664,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",665,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",666,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",667,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",668,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",669,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",670,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",671,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",672,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",673,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",674,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",675,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",676,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",677,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",678,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",679,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",680,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",681,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",682,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",683,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",684,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",685,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x31, 0x39, 0x30, 0x30, 0x30, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",686,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",687,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",688,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",689,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",690,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",691,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",692,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",693,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",694,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",695,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",696,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",697,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x38, 0x32, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",698,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",699,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",700,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",701,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",702,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",703,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",704,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",705,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",706,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",707,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",708,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",709,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",710,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",711,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",712,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",713,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",714,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",715,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",716,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",717,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",718,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",719,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",720,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",721,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",722,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",723,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",724,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",725,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",726,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",727,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",728,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",729,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",730,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",731,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",732,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x34, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",733,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",734,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",735,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",736,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",737,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",738,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",739,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",740,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x39, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",741,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",742,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",743,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",744,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",745,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",746,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",747,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",748,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",749,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",750,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",751,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",752,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",753,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",754,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",755,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",756,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",757,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",758,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",759,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",760,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",761,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",762,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",763,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",764,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",765,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",766,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",767,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",768,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",769,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",770,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",771,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",772,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x54, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",773,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x3a, 0x32, 0x30, 0x3a, 0x32, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",774,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",775,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",776,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",777,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",778,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",779,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",780,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",781,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",782,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",783,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",784,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",785,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",786,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",787,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",788,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",789,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",790,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",791,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",792,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",793,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, 0x39, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",794,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",795,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",796,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",797,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",798,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",799,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",800,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",801,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",802,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",803,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",804,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",805,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",806,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",807,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",808,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",809,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",810,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",811,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",812,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",813,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",814,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",815,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",816,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",817,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",818,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",819,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",820,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",821,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",822,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",823,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",824,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",825,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",826,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",827,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",828,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",829,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",830,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x38, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",831,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",832,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",833,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",834,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",835,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",836,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",837,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",838,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",839,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",840,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",841,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",842,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x38, 0x31, 0x31, 0x36, 0x33, 0x33, 0x33, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",843,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",844,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",845,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",846,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",847,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",848,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",849,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",850,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",851,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",852,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",853,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",854,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",855,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",856,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",857,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",858,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",859,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",860,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",861,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",862,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",863,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",864,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",865,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",866,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",867,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",868,64,"style","Trailing whitespace is superfluous."," 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",869,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",870,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",871,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",872,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",873,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",874,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",875,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",876,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",877,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, 0x39, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",878,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",879,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",880,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",881,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",882,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",883,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",884,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",885,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",886,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x30, 0x30, 0x30, 0x30, 0x35, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",887,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",888,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",889,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",890,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",891,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",892,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",893,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",894,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",895,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",896,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",897,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",898,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",899,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",900,64,"style","Trailing whitespace is superfluous."," 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",901,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",902,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",903,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",904,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, 0x39, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",905,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",906,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",907,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x31, 0x33, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",908,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",909,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",910,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",911,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",912,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",913,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",914,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",915,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",916,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",917,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",918,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x36, 0x54, 0x31, 0x36, 0x3a, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",919,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x32, 0x36, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",920,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",921,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",922,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",923,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",924,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",925,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",926,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",927,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",928,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",929,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",930,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",931,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",932,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",933,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",934,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",935,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",936,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",937,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",938,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",939,64,"style","Trailing whitespace is superfluous."," 0x34, 0x35, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",940,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",941,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",942,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",943,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",944,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",945,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",946,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",947,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",948,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",949,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",950,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",951,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",952,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",953,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",954,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",955,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",956,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",957,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",958,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",959,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",960,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",961,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",962,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",963,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",964,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",965,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",966,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",967,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",968,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",969,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",970,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",971,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",972,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",973,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",974,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",975,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",976,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x38, 0x30, 0x30, 0x30, 0x30, 0x34, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",977,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",978,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",979,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",980,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",981,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",982,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",983,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",984,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",985,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",986,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",987,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x38, 0x39, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",988,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",989,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",990,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",991,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",992,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",993,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",994,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",995,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",996,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",997,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",998,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x32, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",999,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1000,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1001,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1002,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1003,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1004,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1005,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1006,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1007,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1008,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1009,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1010,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1011,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x35, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1012,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1013,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1014,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1015,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1016,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1017,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1018,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1019,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1020,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1021,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1022,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1023,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1024,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1025,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1026,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1027,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1028,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1029,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1030,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1031,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x31, 0x38, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1032,64,"style","Trailing whitespace is superfluous."," 0x34, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1033,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1034,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1035,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1036,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1037,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1038,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1039,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1040,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1041,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1042,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1043,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1044,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1045,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x30, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1046,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1047,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1048,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1049,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1050,64,"style","Trailing whitespace is superfluous."," 0x34, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1051,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1052,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1053,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1054,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1055,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1056,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1057,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1058,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1059,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1060,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1061,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1062,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1063,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x37, 0x54, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1064,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3a, 0x30, 0x33, 0x3a, 0x33, 0x30, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1065,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1066,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1067,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1068,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1069,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1070,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1071,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1072,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1073,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1074,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1075,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1076,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1077,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1078,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1079,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1080,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1081,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1082,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1083,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1084,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x32, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1085,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1086,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1087,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1088,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1089,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1090,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1091,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1092,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1093,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1094,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1095,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1096,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1097,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1098,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1099,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1100,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1101,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1102,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1103,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1104,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1105,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1106,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1107,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1108,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1109,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1110,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1111,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1112,64,"style","Trailing whitespace is superfluous."," 0x32, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1113,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1114,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1115,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1116,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1117,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1118,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1119,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1120,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1121,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x38, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1122,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1123,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1124,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1125,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1126,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1127,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1128,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1129,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1130,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1131,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1132,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1133,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x38, 0x35, 0x35, 0x34, 0x37, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1134,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1135,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1136,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1137,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1138,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1139,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1140,64,"style","Trailing whitespace is superfluous."," 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1141,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1142,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1143,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1144,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1145,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x31, 0x35, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1146,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1147,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1148,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1149,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1150,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1151,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1152,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1153,64,"style","Trailing whitespace is superfluous."," 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1154,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1155,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1156,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1157,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1158,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, 0x34, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1159,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1160,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1161,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1162,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1163,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1164,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1165,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1166,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1167,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1168,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1169,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1170,64,"style","Trailing whitespace is superfluous."," 0x32, 0x34, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1171,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1172,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1173,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1174,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1175,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1176,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1177,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1178,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x31, 0x38, 0x30, 0x30, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1179,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1180,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1181,64,"style","Trailing whitespace is superfluous."," 0x32, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1182,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1183,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1184,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1185,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1186,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1187,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1188,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1189,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1190,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1191,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1192,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x32, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1193,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1194,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1195,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1196,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1197,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1198,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1199,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x35, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1200,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1201,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1202,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1203,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1204,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1205,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1206,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1207,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1208,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1209,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1210,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1211,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1212,64,"style","Trailing whitespace is superfluous."," 0x32, 0x33, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1213,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1214,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1215,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1216,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1217,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1218,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1219,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1220,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1221,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1222,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1223,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1224,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1225,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1226,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1227,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1228,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1229,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1230,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1231,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1232,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1233,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1234,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1235,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1236,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1237,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1238,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1239,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1240,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1241,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1242,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1243,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1244,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1245,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1246,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1247,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1248,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1249,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1250,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1251,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1252,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1253,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1254,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1255,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1256,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1257,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1258,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1259,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1260,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1261,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1262,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1263,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1264,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1265,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1266,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1267,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1268,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1269,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1270,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x30, 0x30, 0x30, 0x30, 0x38, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1271,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1272,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x38, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1273,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1274,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1275,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1276,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1277,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1278,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1279,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1280,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1281,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x31, 0x38, 0x35, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1282,64,"style","Trailing whitespace is superfluous."," 0x36, 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1283,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1284,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1285,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1286,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1287,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1288,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1289,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1290,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1291,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1292,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1293,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1294,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1295,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1296,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1297,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1298,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1299,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1300,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1301,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1302,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1303,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1304,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1305,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1306,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1307,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1308,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1309,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1310,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1311,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1312,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1313,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1314,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1315,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1316,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1317,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1318,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1319,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1320,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1321,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1322,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1323,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1324,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1325,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x31, 0x38, 0x30, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1326,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1327,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1328,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1329,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1330,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1331,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1332,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1333,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1334,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1335,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1336,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1337,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1338,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1339,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1340,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1341,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1342,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1343,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1344,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1345,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1346,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1347,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1348,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1349,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1350,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1351,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1352,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1353,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1354,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1355,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1356,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1357,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1358,64,"style","Trailing whitespace is superfluous."," 0x32, 0x32, 0x3a, 0x32, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1359,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1360,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1361,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1362,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1363,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1364,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1365,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1366,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1367,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1368,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1369,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1370,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1371,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1372,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1373,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1374,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1375,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1376,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1377,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1378,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x38, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1379,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1380,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1381,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1382,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1383,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1384,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1385,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1386,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1387,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1388,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1389,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1390,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1391,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1392,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1393,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1394,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1395,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1396,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1397,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1398,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1399,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1400,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1401,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1402,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1403,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1404,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1405,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x37, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1406,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1407,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1409,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1410,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1411,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1412,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1413,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1414,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1415,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x31, 0x37, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1416,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1417,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1418,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1419,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1420,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1421,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1422,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1423,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1424,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1425,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1426,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1427,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x38, 0x30, 0x35, 0x32, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1428,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1429,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1430,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1431,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1432,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1433,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1434,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1435,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1436,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1437,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x39, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1438,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1439,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1440,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1441,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1442,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1443,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1444,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1445,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1446,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1447,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1448,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1449,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1450,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1451,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1452,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1453,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1454,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1455,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1456,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1457,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1458,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1459,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1460,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1461,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1462,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1463,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1464,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1465,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1466,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1467,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1468,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1469,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1470,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x37, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1471,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1472,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1473,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1474,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1475,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1476,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1477,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1478,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1479,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1480,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1481,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1482,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1483,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1484,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x37, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1485,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1486,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1487,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1488,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1489,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1490,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1491,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1492,64,"style","Trailing whitespace is superfluous."," 0x39, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1493,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1494,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1495,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1496,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1497,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1498,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1499,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1500,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1501,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1502,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x37, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x36, 0x54, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1503,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x3a, 0x35, 0x36, 0x3a, 0x33, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1504,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1505,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1506,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1507,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1508,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1509,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1510,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1511,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1512,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1513,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1514,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1515,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1516,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1517,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1518,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1519,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1520,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1521,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1522,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1523,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1524,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1525,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1526,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1527,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1528,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1529,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1530,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1531,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1532,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1533,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1534,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1535,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1536,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1537,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1538,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1539,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1540,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1541,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1542,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1543,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1544,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1545,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1546,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1547,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1548,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1549,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1550,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1551,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1552,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1553,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1554,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1555,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1556,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1557,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1558,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1559,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1560,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x37, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1561,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x36, 0x33, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1562,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1563,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x36, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1564,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1565,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1566,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1567,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1568,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1569,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1570,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1571,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1572,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x37, 0x31, 0x30, 0x31, 0x35, 0x35, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1573,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1574,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1575,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1576,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1577,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1578,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1579,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1580,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1581,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1582,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1583,64,"style","Trailing whitespace is superfluous."," 0x38, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1584,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1585,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1586,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1587,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1588,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1589,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1590,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1591,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1592,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1593,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1594,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1595,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1596,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x36, 0x33, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1597,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1598,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1599,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1600,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1601,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1602,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1603,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1604,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1605,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1606,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1607,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1608,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1609,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1610,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1611,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1612,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1613,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1614,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1615,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1616,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1617,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1618,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1619,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1620,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1621,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1622,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1623,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1624,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1625,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1626,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1627,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1628,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1629,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1630,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1631,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1632,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1633,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1634,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1635,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1636,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1637,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x38, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1638,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1639,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1640,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1641,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1642,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1643,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1644,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1645,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1646,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1647,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1648,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x54, 0x31, 0x37, 0x3a, 0x30, 0x35, 0x3a, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1649,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1650,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1651,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1652,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1653,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1654,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1655,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1656,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1657,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1658,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1659,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1660,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1661,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1662,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1663,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1664,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1665,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1666,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1667,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1668,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1669,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1670,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1671,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1672,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1673,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1674,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1675,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1676,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1677,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1678,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1679,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1680,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1681,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1682,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1683,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1684,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1685,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1686,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1687,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1688,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1689,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1690,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1691,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1692,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1693,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1694,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1695,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1696,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x34, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1697,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1698,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1699,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1700,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1701,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1702,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1703,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1704,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1705,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1706,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x30, 0x30, 0x30, 0x33, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1707,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1708,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x35, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1709,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1710,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1711,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1712,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1713,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1714,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1715,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1716,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1717,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x31, 0x37, 0x38, 0x36, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1718,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1719,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1720,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1721,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1722,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1723,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1724,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1725,64,"style","Trailing whitespace is superfluous."," 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1726,64,"style","Trailing whitespace is superfluous."," 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1727,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1728,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1729,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1730,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1731,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1732,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1733,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1734,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1735,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1736,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1737,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1738,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1739,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1740,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1741,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1742,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1743,64,"style","Trailing whitespace is superfluous."," 0x33, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1744,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1745,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1746,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1747,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1748,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1749,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1750,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1751,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1752,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1753,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1754,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x33, 0x35, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1755,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1756,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1757,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1758,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1759,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1760,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1761,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1762,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x37, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1763,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x33, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1764,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1765,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x33, 0x35, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1766,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1767,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1768,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1769,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1770,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1771,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1772,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1773,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1774,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1775,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1776,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x34, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1777,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1778,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1779,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1780,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1781,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x33, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1782,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1783,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1784,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1785,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1786,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1787,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1788,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1789,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1790,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1791,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1792,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1793,64,"style","Trailing whitespace is superfluous."," 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1794,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1795,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1796,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x34, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1797,64,"style","Trailing whitespace is superfluous."," 0x34, 0x31, 0x3a, 0x31, 0x32, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1798,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1799,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1800,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1801,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1802,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1803,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1804,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1805,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1806,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1807,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1808,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1809,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1810,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1811,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1812,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1813,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1814,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1815,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1816,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1817,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1818,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1819,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1820,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1821,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1822,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1823,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1824,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1825,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1826,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1827,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1828,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1829,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1830,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1831,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1832,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1833,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1834,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1835,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1836,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1837,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1838,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1839,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1840,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1841,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1842,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1843,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1844,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1845,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1846,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1847,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1848,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1849,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1850,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1851,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1852,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1853,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1854,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x31, 0x37, 0x30, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1855,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1856,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1857,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1858,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1859,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1860,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1861,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1862,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1863,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1864,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1865,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1866,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x39, 0x32, 0x37, 0x36, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1867,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1868,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1869,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1870,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1871,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1872,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1873,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1874,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1875,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1876,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x30, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1877,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1878,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1879,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1880,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1881,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1882,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1883,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1884,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1885,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1886,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1887,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1888,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1889,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1890,64,"style","Trailing whitespace is superfluous."," 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1891,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1892,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1893,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1894,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1895,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1896,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1897,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1898,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1899,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1900,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1901,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1902,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1903,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1904,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1905,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1906,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1907,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1908,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1909,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x37, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1910,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1911,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1912,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1913,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1914,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1915,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1916,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1917,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1918,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1919,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1920,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1921,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1922,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1923,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x37, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1924,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1925,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1926,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1927,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1928,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1929,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1930,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1931,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1932,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1933,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1934,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1935,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1936,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1937,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1938,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1939,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1940,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1941,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1942,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x36, 0x3a, 0x31, 0x38, 0x3a, 0x35, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1943,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1944,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1945,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1946,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1947,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1948,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1949,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1950,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1951,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1952,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1953,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1954,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1955,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1956,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1957,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1958,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1959,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1960,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1961,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1962,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x34, 0x39, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1963,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1964,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1965,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1966,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1967,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1968,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1969,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1970,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1971,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1972,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1973,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1974,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1975,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1976,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1977,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1978,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1979,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1980,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1981,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1982,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1983,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1984,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1985,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1986,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1987,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1988,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1989,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1990,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1991,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1992,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1993,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1994,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1995,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1996,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1997,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1998,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1999,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x36, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2000,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x34, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2001,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2002,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x34, 0x39, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2003,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2004,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2005,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2006,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2007,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2008,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2009,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2010,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2011,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x31, 0x36, 0x31, 0x39, 0x38, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2012,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2013,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2014,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2015,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2016,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2017,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2018,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2019,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2020,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2021,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2022,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2023,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2024,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2025,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2026,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2027,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2028,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2029,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2030,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2031,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2032,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2033,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2034,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2035,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x34, 0x39, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2036,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2037,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2038,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2039,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2040,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2041,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2042,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2043,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2044,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2045,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2046,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x34, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2047,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2048,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2049,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2050,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2051,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2052,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2053,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2054,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2055,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x36, 0x30, 0x30, 0x30, 0x31, 0x34, 0x39, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2056,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2057,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x34, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2058,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2059,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2060,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2061,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2062,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2063,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2064,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2065,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2066,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2067,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2068,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2069,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2070,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2071,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2072,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2073,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x34, 0x39, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2074,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2075,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2076,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x30, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2077,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2078,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2079,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2080,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2081,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2082,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2083,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2084,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2085,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2086,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2087,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x38, 0x54, 0x31, 0x36, 0x3a, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2088,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3a, 0x34, 0x37, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2089,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2090,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2091,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2092,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2093,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2094,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2095,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2096,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2097,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2098,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2099,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2100,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2101,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2102,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2103,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2104,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2105,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2106,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2107,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2108,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x38, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2109,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2110,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2111,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2112,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2113,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2114,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2115,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2116,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2117,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2118,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2119,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2120,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2121,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2122,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2123,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2124,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2125,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2126,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2127,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2128,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2129,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2130,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2131,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2132,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2133,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2134,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2135,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2136,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2137,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2138,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2139,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2140,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2141,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2142,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2143,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2144,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2145,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x31, 0x36, 0x30, 0x30, 0x30, 0x31, 0x33, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2146,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2147,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2148,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2149,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2150,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2151,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2152,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2153,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2154,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2155,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2156,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2157,64,"style","Trailing whitespace is superfluous."," 0x38, 0x31, 0x38, 0x32, 0x37, 0x39, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2158,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2159,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2160,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2161,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2162,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2163,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2164,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2165,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2166,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2167,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x39, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2168,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2169,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2170,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2171,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2172,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2173,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2174,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2175,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2176,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2177,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2178,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2179,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2180,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x33, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2181,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2182,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2183,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2184,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2185,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2186,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2187,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2188,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2189,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2190,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2191,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2192,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2193,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2194,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2195,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2196,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2197,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2198,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2199,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2200,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x36, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2201,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2202,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2203,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2204,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2205,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2206,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2207,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2208,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2209,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2210,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2211,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2212,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2213,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2214,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2215,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2216,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2217,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2218,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2219,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2220,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2221,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2222,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2223,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2224,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2225,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2226,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2227,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2228,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2229,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2230,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2231,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2232,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, 0x54, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2233,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x32, 0x35, 0x3a, 0x34, 0x37, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2234,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2235,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2236,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2237,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2238,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2239,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2240,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2241,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2242,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2243,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2244,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2245,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2246,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2247,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2248,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2249,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2250,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2251,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2252,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2253,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x31, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2254,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2255,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2256,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2257,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2258,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2259,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2260,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2261,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2262,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2263,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2264,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2265,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2266,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2267,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2268,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2269,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2270,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2271,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2272,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2273,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2274,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2275,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2276,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2277,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2278,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2279,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2280,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2281,64,"style","Trailing whitespace is superfluous."," 0x32, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2282,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2283,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2284,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2285,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2286,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2287,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2288,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2289,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2290,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x36, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2291,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2292,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2293,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2294,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2295,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2296,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2297,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2298,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2299,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2300,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2301,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2302,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x36, 0x37, 0x39, 0x37, 0x33, 0x38, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2303,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2304,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2305,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2306,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2307,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2308,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2309,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2310,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2311,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2312,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2313,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2314,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x35, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2315,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2316,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2317,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2318,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2319,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2320,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2321,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2322,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2323,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2324,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2325,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2326,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2327,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x31, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2328,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2329,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2330,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2331,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2332,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2333,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2334,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2335,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2336,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2337,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2338,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2339,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2340,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2341,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2342,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2343,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2344,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2345,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2346,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2347,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x31, 0x36, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2348,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2349,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2350,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2351,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2352,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2353,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2354,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2355,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2356,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2357,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2358,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2359,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2360,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2361,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2362,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2363,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2364,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2365,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2366,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2367,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2368,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2369,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2370,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2371,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2372,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2373,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2374,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2375,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2376,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2377,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2378,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2379,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2380,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2381,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x36, 0x54, 0x31, 0x39, 0x3a, 0x34, 0x33, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2382,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2383,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2384,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2385,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2386,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2387,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2388,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2389,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2390,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2391,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2392,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2393,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2394,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2395,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2396,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2397,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2398,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2399,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2400,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2401,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2402,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2403,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2404,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2405,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2406,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2407,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2408,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2409,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2410,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2411,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2412,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2413,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2414,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2415,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2416,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2417,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2418,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2419,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2420,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2421,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2422,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2423,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2424,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2425,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2426,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2427,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2428,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2429,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2430,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2431,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2432,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2433,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2434,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2435,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2436,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2437,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2438,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2439,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x30, 0x30, 0x30, 0x30, 0x38, 0x36, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2440,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2441,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2442,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2443,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2444,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2445,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2446,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2447,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2448,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2449,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2450,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x36, 0x31, 0x33, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2451,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x32, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2452,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2453,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2454,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2455,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2456,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2457,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2458,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2459,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2460,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2461,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2462,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2463,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2464,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2465,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2466,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2467,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2468,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2469,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2470,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2471,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2472,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2473,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2474,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x36, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2475,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2476,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2477,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2478,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2479,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2480,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2481,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2482,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2483,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2484,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2485,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2486,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x36, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2487,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2488,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2489,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2490,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2491,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2492,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2493,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2494,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x31, 0x36, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2495,64,"style","Trailing whitespace is superfluous."," 0x38, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2496,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2497,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2498,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2499,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2500,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2501,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2502,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2503,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2504,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2505,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2506,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2507,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2508,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2509,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2510,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2511,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2512,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2513,64,"style","Trailing whitespace is superfluous."," 0x38, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2514,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2515,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2516,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2517,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2518,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2519,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2520,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2521,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2522,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2523,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2524,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2525,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2526,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x38, 0x54, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2527,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x33, 0x33, 0x3a, 0x34, 0x35, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2528,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2529,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2530,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2531,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2532,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2533,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2534,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2535,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2536,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2537,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2538,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2539,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2540,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2541,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2542,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2543,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2544,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2545,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2546,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2547,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x30, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2548,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2549,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2550,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2551,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2552,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2553,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2554,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2555,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2556,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2557,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2558,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2559,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2560,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2561,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2562,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2563,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2564,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2565,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2566,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2567,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2568,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2569,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2570,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2571,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2572,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2573,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2574,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2575,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2576,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2577,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2578,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2579,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2580,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2581,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2582,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2583,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2584,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2585,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x30, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2586,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2587,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2588,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2589,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2590,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2591,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2592,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2593,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2594,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2595,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2596,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x31, 0x32, 0x31, 0x39, 0x33, 0x39, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2597,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2598,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2599,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2600,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2601,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2602,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2603,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2604,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2605,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2606,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2607,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2608,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2609,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2610,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2611,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2612,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2613,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2614,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2615,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2616,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2617,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2618,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2619,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2620,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2621,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2622,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2623,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2624,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2625,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2626,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2627,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2628,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2629,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2630,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2631,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2632,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2633,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2634,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2635,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2636,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2637,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2638,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2639,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2640,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x30, 0x37, 0x30, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2641,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2642,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x30, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2643,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2644,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2645,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2646,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2647,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2648,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2649,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2650,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2651,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2652,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2653,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2654,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2655,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2656,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2657,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2658,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x30, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2659,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2660,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2661,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2662,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2663,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2664,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2665,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2666,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2667,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2668,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2669,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2670,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2671,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2672,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x36, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2673,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2674,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2675,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2676,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2677,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2678,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2679,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2680,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2681,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2682,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2683,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2684,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2685,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2686,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2687,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2688,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2689,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2690,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2691,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2692,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2693,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2694,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2695,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2696,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2697,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2698,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2699,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2700,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2701,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2702,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2703,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2704,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2705,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2706,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2707,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2708,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2709,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2710,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2711,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2712,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2713,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2714,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2715,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2716,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2717,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2718,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2719,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2720,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x31, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2721,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2722,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2723,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2724,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2725,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2726,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2727,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2728,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2729,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2730,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x30, 0x30, 0x30, 0x30, 0x35, 0x33, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2731,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2732,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, 0x33, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2733,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2734,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2735,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2736,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2737,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2738,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2739,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2740,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2741,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x35, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2742,64,"style","Trailing whitespace is superfluous."," 0x34, 0x34, 0x35, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2743,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2744,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2745,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2746,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2747,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2748,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2749,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2750,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2751,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2752,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x39, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2753,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2754,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2755,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2756,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2757,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2758,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2759,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2760,64,"style","Trailing whitespace is superfluous."," 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2761,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2762,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2763,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2764,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2765,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, 0x33, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2766,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2767,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2768,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2769,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2770,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2771,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2772,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2773,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2774,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2775,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2776,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2777,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2778,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2779,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2780,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2781,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2782,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2783,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2784,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2785,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x31, 0x35, 0x30, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2786,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2787,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2788,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2789,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2790,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2791,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2792,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2793,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2794,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2795,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2796,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2797,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2798,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2799,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x31, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2800,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2801,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2802,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2803,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2804,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2805,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2806,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x39, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2807,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2808,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2809,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2810,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2811,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2812,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2813,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2814,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2815,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2816,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2817,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x31, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2818,64,"style","Trailing whitespace is superfluous."," 0x34, 0x34, 0x3a, 0x30, 0x32, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2819,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2820,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2821,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2822,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2823,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2824,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2825,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2826,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2827,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2828,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2829,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2830,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2831,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2832,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2833,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2834,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2835,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2836,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2837,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2838,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x33, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2839,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2840,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2841,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2842,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2843,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2844,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2845,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2846,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2847,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2848,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2849,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2850,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2851,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2852,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2853,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2854,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2855,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2856,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2857,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2858,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2859,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2860,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2861,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2862,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2863,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2864,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2865,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2866,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2867,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2868,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2869,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2870,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2871,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2872,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2873,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2874,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2875,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x31, 0x35, 0x30, 0x30, 0x30, 0x30, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2876,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2877,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2878,64,"style","Trailing whitespace is superfluous."," 0x33, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2879,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2880,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2881,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2882,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2883,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2884,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2885,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2886,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2887,64,"style","Trailing whitespace is superfluous."," 0x38, 0x38, 0x33, 0x33, 0x32, 0x31, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2888,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2889,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2890,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2891,64,"style","Trailing whitespace is superfluous."," 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2892,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2893,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2894,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2895,64,"style","Trailing whitespace is superfluous."," 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2896,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2897,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2898,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2899,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2900,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2901,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2902,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2903,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2904,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2905,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2906,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2907,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2908,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2909,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2910,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2911,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2912,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x33, 0x33, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2913,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2914,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2915,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2916,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2917,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2918,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2919,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2920,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2921,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2922,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2923,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2924,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2925,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2926,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2927,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2928,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2929,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2930,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2931,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2932,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x30, 0x30, 0x30, 0x30, 0x33, 0x33, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2933,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2934,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2935,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2936,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2937,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2938,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2939,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2940,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2941,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2942,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2943,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2944,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2945,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2946,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2947,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2948,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2949,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2950,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2951,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2952,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2953,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x31, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2954,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2955,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2956,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2957,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2958,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2959,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2960,64,"style","Trailing whitespace is superfluous."," 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2961,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2962,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2963,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2964,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2965,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2966,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x36, 0x3a, 0x34, 0x36, 0x3a, 0x32, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2967,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2968,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2969,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2970,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2971,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2972,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2973,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2974,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2975,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2976,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2977,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2978,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2979,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2980,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2981,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2982,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2983,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2984,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2985,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2986,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2987,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2988,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2989,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2990,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2991,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2992,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2993,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2994,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2995,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2996,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2997,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2998,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2999,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3000,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3001,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3002,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3003,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3004,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3005,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3006,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3007,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3008,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3009,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3010,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3011,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3012,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3013,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3014,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3015,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3016,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3017,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3018,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3019,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3020,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3021,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3022,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3023,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3024,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x32, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3025,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3026,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x31, 0x32, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3027,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3028,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3029,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3030,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3031,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3032,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3033,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3034,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3035,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x31, 0x35, 0x35, 0x37, 0x35, 0x38, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3036,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3037,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3038,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3039,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3040,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3041,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3042,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3043,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3044,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3045,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3046,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3047,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3048,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3049,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3050,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3051,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3052,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3053,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3054,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3055,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3056,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3057,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3058,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3059,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3060,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3061,64,"style","Trailing whitespace is superfluous."," 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3062,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3063,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3064,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3065,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3066,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3067,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3068,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3069,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3070,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x32, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3071,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3072,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3073,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3074,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3075,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3076,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3077,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3078,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3079,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x30, 0x30, 0x30, 0x30, 0x31, 0x32, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3080,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3081,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3082,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3083,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3084,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3085,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3086,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3087,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3088,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3089,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3090,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3091,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3092,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3093,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3094,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3095,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3096,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3097,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x32, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3098,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3099,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3100,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x31, 0x36, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3101,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3102,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3103,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3104,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3105,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3106,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3107,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3108,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3109,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3110,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3111,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x34, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3112,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x35, 0x38, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3113,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3114,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3115,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3116,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3117,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3118,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3119,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3120,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3121,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3122,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3123,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3124,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3125,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3126,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3127,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3128,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3129,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3130,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3131,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3132,64,"style","Trailing whitespace is superfluous."," 0x36, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3133,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3134,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3135,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3136,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3137,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3138,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3139,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3140,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3141,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3142,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3143,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3144,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3145,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3146,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3147,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3148,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3149,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3150,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3151,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3152,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3153,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3154,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3155,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3156,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3157,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3158,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3159,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3160,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3161,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3162,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3163,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3164,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3165,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3166,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3167,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3168,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3169,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x34, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3170,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3171,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3172,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3173,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3174,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3175,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3176,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3177,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3178,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3179,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3180,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x34, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3181,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x37, 0x39, 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3182,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3183,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3184,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3185,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3186,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3187,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3188,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3189,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3190,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3191,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x35, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3192,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3193,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3194,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3195,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3196,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3197,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3198,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3199,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3200,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3201,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3202,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3203,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3204,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3205,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3206,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3207,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3208,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3209,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3210,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3211,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3212,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3213,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3214,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3215,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3216,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x36, 0x33, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3217,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3218,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3219,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3220,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3221,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3222,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3223,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3224,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x34, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3225,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x33, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3226,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3227,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x36, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3228,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3229,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3230,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3231,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3232,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3233,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3234,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3235,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3236,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3237,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3238,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x34, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3239,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3240,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3241,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3242,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3243,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3244,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3245,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3246,64,"style","Trailing whitespace is superfluous."," 0x35, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3247,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3248,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3249,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3250,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3251,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3252,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3253,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3254,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3255,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3256,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x34, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x34, 0x54, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3257,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x3a, 0x34, 0x34, 0x3a, 0x34, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3258,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3259,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3260,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3261,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3262,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3263,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3264,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3265,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3266,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3267,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3268,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3269,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x4b, 0x2f, 0x41, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3270,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3271,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3272,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3273,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3274,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3275,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3276,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3277,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3278,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3279,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3280,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3281,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3282,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3283,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x6e, 0x64, 0x3e, 0x5b, 0x41, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3284,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x5d, 0x3c, 0x2f, 0x61, 0x6d, 0x65, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3285,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3286,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3287,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3288,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3289,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3290,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3291,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3292,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3293,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3294,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3295,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3296,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3297,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3298,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3299,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3300,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3301,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3302,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3303,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3304,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3305,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3306,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3307,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3308,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3309,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3310,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3311,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3312,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3313,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3314,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3315,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3316,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3317,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3318,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3319,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3320,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3321,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3322,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3323,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3324,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3325,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3326,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3327,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3328,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3329,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x34, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3330,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x31, 0x39, 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3331,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3332,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3333,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3334,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3335,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3336,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3337,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3338,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3339,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3340,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3341,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3342,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x34, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3343,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3344,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3345,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3346,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3347,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3348,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3349,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3350,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3351,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3352,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3353,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3354,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3355,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3356,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3357,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3358,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3359,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3360,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3361,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3362,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3363,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3364,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3365,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3366,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3367,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3368,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3369,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3370,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3371,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3372,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3373,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x31, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3374,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3375,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3376,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3377,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3378,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3379,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3380,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3381,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x39, 0x33, 0x34, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3382,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3383,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3384,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3385,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x41, 0x6d, 0x65, 0x6e, 0x64, 0x5d, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3386,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3387,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3388,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3389,64,"style","Trailing whitespace is superfluous."," 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3390,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3391,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3392,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3393,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3394,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x34, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3395,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x36, 0x3a, 0x33, 0x36, 0x3a, 0x34, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3396,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3397,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3398,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3399,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3400,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3401,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3402,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3403,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3404,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3405,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3406,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3407,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3409,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3410,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3411,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3412,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3413,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3414,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3415,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x39, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3416,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3417,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3418,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3419,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3420,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3421,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3422,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3423,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3424,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3425,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3426,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3427,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3428,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3429,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3430,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3431,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3432,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3433,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3434,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3435,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3436,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3437,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3438,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3439,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3440,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3441,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3442,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3443,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3444,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3445,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3446,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3447,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3448,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3449,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3450,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3451,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3452,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3453,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x33, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3454,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3455,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x33, 0x39, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3456,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3457,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3458,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3459,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3460,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3461,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3462,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3463,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3464,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x31, 0x34, 0x31, 0x30, 0x31, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3465,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3466,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3467,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3468,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3469,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3470,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3471,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3472,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3473,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3474,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3475,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3476,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3477,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3478,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3479,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3480,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3481,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3482,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3483,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3484,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3485,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3486,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3487,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3488,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x33, 0x39, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3489,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3490,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3491,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3492,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3493,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3494,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3495,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3496,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3497,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3498,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3499,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3500,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3501,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3502,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3503,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3504,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3505,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3506,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3507,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3508,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x34, 0x30, 0x30, 0x30, 0x30, 0x33, 0x39, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3509,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3510,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3511,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3512,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3513,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3514,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3515,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3516,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3517,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3518,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3519,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3520,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3521,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3522,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3523,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3524,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3525,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3526,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x39, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3527,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3528,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3529,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x33, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3530,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3531,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3532,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3533,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3534,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3535,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3536,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3537,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3538,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3539,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3540,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x30, 0x35, 0x54, 0x31, 0x36, 0x3a, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3541,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3a, 0x32, 0x34, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3542,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3543,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3544,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3545,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3546,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3547,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3548,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3549,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3550,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3551,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3552,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3553,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3554,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3555,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3556,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3557,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3558,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3559,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3560,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3561,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3562,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3563,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3564,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3565,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3566,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3567,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3568,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3569,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3570,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3571,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3572,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3573,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3574,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3575,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3576,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3577,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3578,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3579,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3580,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3581,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3582,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3583,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3584,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3585,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3586,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3587,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3588,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x34, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x31, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3589,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3590,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3591,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3592,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3593,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3594,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3595,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3596,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3597,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3598,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x31, 0x34, 0x30, 0x30, 0x30, 0x30, 0x32, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3599,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3600,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3601,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3602,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3603,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3604,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3605,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3606,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3607,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3608,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3609,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3610,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x32, 0x31, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3611,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3612,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3613,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3614,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3615,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3616,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3617,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3618,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3619,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3620,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3621,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3622,64,"style","Trailing whitespace is superfluous."," 0x32, 0x36, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3623,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3624,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3625,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3626,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3627,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3628,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3629,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3630,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3631,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3632,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3633,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3634,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3635,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x32, 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3636,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3637,64,"style","Trailing whitespace is superfluous."," 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3638,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3639,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3640,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3641,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3642,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3643,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3644,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3645,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3646,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3647,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3648,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3649,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3650,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3651,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3652,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3653,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3654,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3655,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x30, 0x30, 0x30, 0x30, 0x32, 0x34, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3656,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3657,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3658,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3659,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3660,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3661,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3662,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3663,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3664,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3665,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3666,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3667,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3668,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, 0x35, 0x2d, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3669,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3670,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3671,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3672,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3673,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, 0x34, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3674,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3675,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3676,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x36, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3677,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3678,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3679,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3680,64,"style","Trailing whitespace is superfluous."," 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3681,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3682,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3683,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3684,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3685,64,"style","Trailing whitespace is superfluous."," 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3686,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3687,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3688,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x34, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x31, 0x54, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3689,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x3a, 0x33, 0x38, 0x3a, 0x34, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3690,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3691,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3692,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3693,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3694,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3695,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3696,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3697,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3698,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3699,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3700,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3701,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3702,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3703,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3704,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3705,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3706,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3707,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3708,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3709,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x39, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3710,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3711,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3712,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3713,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3714,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3715,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3716,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3717,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3718,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3719,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3720,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3721,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3722,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3723,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3724,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3725,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3726,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3727,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3728,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3729,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3730,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3731,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3732,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3733,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3734,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3735,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3736,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3737,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3738,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3739,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3740,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3741,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3742,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3743,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3744,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3745,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3746,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x34, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3747,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3748,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3749,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3750,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3751,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3752,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3753,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3754,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3755,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3756,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3757,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3758,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x34, 0x35, 0x37, 0x32, 0x39, 0x30, 0x35, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3759,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3760,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3761,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3762,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3763,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3764,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3765,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3766,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3767,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3768,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3769,64,"style","Trailing whitespace is superfluous."," 0x35, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3770,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3771,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3772,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3773,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3774,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3775,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3776,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3777,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3778,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3779,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3780,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3781,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3782,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3783,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3784,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3785,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3786,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3787,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3788,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3789,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3790,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3791,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3792,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3793,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x39, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3794,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3795,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3796,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3797,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3798,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3799,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3800,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3801,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3802,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x30, 0x30, 0x30, 0x30, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3803,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3804,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x39, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3805,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3806,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3807,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3808,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3809,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3810,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3811,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3812,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3813,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3814,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3815,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3816,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3817,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3818,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3819,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3820,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x39, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3821,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3822,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3823,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x35, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3824,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3825,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3826,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3827,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3828,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3829,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3830,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3831,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3832,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3833,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3834,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x54, 0x31, 0x36, 0x3a, 0x34, 0x38, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3835,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3836,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3837,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3838,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3839,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3840,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3841,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3842,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3843,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3844,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3845,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3846,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3847,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3848,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3849,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3850,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3851,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3852,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3853,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3854,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3855,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3856,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3857,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3858,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3859,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3860,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3861,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3862,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3863,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3864,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3865,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3866,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3867,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3868,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3869,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3870,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3871,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3872,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3873,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3874,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3875,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3876,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3877,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3878,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3879,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3880,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3881,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3882,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x35, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3883,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3884,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3885,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3886,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3887,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3888,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3889,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3890,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3891,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3892,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x30, 0x30, 0x30, 0x30, 0x34, 0x32, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3893,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3894,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3895,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3896,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3897,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3898,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3899,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3900,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3901,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3902,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3903,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x33, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3904,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x38, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3905,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3906,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3907,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3908,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3909,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3910,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3911,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3912,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3913,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3914,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x35, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3915,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3916,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3917,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3918,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3919,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3920,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3921,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3922,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3923,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3924,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3925,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3926,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3927,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x32, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3928,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3929,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3930,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3931,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3932,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3933,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3934,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3935,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3936,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3937,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3938,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3939,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x32, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3940,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3941,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3942,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3943,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3944,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3945,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3946,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3947,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x31, 0x33, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3948,64,"style","Trailing whitespace is superfluous."," 0x34, 0x32, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3949,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3950,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3951,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3952,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3953,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3954,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3955,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3956,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3957,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3958,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3959,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3960,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x33, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3961,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3962,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3963,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3964,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3965,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3966,64,"style","Trailing whitespace is superfluous."," 0x34, 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3967,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3968,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3969,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3970,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3971,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3972,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3973,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3974,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3975,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3976,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3977,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3978,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3979,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x35, 0x54, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3980,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x33, 0x36, 0x3a, 0x35, 0x38, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3981,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3982,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3983,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3984,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3985,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3986,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3987,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3988,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3989,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3990,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3991,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3992,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3993,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3994,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3995,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3996,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3997,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3998,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3999,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4000,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x33, 0x37, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4001,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4002,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4003,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4004,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4005,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4006,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4007,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4008,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4009,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4010,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4011,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4012,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4013,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4014,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4015,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4016,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4017,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4018,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4019,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4020,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4021,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4022,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4023,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4024,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4025,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4026,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4027,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4028,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4029,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4030,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4031,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4032,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4033,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4034,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4035,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4036,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4037,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x33, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4038,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x37, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4039,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4040,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x33, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4041,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4042,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4043,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4044,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4045,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4046,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4047,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4048,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4049,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x31, 0x30, 0x30, 0x36, 0x37, 0x39, 0x39, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4050,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4051,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4052,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4053,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4054,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4055,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4056,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4057,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4058,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4059,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4060,64,"style","Trailing whitespace is superfluous."," 0x39, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4061,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4062,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4063,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4064,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4065,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4066,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4067,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4068,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4069,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4070,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4071,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4072,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4073,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x33, 0x37, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4074,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4075,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4076,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4077,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4078,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4079,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4080,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4081,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4082,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4083,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4084,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x37, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4085,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4086,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4087,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4088,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4089,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4090,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4091,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4092,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4093,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x30, 0x30, 0x30, 0x33, 0x37, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4094,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4095,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x37, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4096,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4097,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4098,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4099,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4100,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4101,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4102,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4103,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4104,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4105,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4106,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4107,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4108,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4109,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4110,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4111,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x37, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4112,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4113,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4114,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x39, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4115,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4116,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4117,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4118,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4119,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4120,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4121,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4122,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4123,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4124,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4125,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x30, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4126,64,"style","Trailing whitespace is superfluous."," 0x34, 0x31, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4127,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4128,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4129,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4130,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4131,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4132,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4133,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4134,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4135,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4136,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4137,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4138,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4139,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4140,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4141,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4142,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4143,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4144,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4145,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4146,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4147,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4148,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4149,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4150,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4151,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4152,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4153,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4154,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4155,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4156,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4157,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4158,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4159,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4160,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4161,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4162,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4163,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4164,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4165,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4166,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4167,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4168,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4169,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4170,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4171,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4172,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4173,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x32, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4174,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4175,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4176,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4177,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4178,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4179,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4180,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4181,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4182,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4183,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x30, 0x30, 0x30, 0x30, 0x32, 0x32, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4184,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4185,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4186,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4187,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4188,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4189,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4190,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4191,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4192,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4193,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4194,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x33, 0x38, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4195,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4196,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4197,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4198,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4199,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4200,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4201,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4202,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4203,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4204,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4205,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4206,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x32, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4207,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4208,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4209,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4210,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4211,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4212,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4213,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4214,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4215,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4216,64,"style","Trailing whitespace is superfluous."," 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4217,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4218,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4219,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4220,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4221,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4222,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4223,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4224,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4225,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4226,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4227,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4228,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4229,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4230,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4231,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, 0x32, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4232,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4233,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4234,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4235,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4236,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4237,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4238,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4239,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4240,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x32, 0x32, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4241,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4242,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4243,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4244,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4245,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4246,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4247,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4248,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4249,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4250,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4251,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4252,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4253,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x32, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4254,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4255,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4256,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4257,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4258,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x32, 0x32, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4259,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4260,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4261,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4262,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4263,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4264,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4265,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4266,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4267,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4268,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4269,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4270,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4271,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4272,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4273,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x32, 0x54, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4274,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x32, 0x31, 0x3a, 0x35, 0x33, 0x2d, 0x30, 0x34, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4275,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4276,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4277,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4278,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4279,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4280,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4281,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4282,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4283,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4284,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4285,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4286,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4287,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4288,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4289,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4290,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4291,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4292,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4293,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4294,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4295,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4296,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4297,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4298,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4299,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4300,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4301,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4302,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4303,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4304,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4305,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4306,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4307,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4308,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4309,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4310,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4311,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4312,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4313,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4314,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4315,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4316,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4317,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4318,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4319,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4320,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4321,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4322,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4323,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4324,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4325,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4326,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4327,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4328,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4329,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4330,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4331,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x31, 0x33, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4332,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4333,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4334,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4335,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4336,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4337,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4338,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4339,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4340,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4341,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4342,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4343,64,"style","Trailing whitespace is superfluous."," 0x33, 0x35, 0x37, 0x34, 0x31, 0x34, 0x34, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4344,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4345,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4346,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4347,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4348,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4349,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4350,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4351,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4352,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4353,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4354,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4355,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4356,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4357,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4358,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4359,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4360,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4361,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4362,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4363,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4364,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4365,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4366,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4367,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4368,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4369,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4370,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4371,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4372,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4373,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4374,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4375,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4376,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4377,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4378,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x30, 0x37, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4379,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4380,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4381,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4382,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4383,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4384,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4385,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4386,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x33, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4387,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4388,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4389,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x30, 0x37, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4390,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4391,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4392,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4393,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4394,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4395,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4396,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4397,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4398,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4399,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4400,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x35, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4401,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4402,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4403,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4404,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4405,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4406,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4407,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4409,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4410,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4411,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4412,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4413,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4414,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4415,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4416,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4417,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4418,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4419,64,"style","Trailing whitespace is superfluous."," 0x35, 0x54, 0x31, 0x36, 0x3a, 0x31, 0x34, 0x3a, 0x33, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4420,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4421,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4422,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4423,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4424,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4425,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4426,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4427,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4428,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4429,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4430,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4431,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4432,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4433,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4434,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4435,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4436,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4437,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4438,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4439,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4440,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4441,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4442,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4443,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4444,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4445,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4446,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4447,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4448,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4449,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4450,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4451,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4452,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4453,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4454,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4455,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4456,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4457,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4458,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4459,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4460,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4461,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4462,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4463,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4464,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4465,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4466,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4467,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4468,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4469,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4470,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4471,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4472,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4473,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4474,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4475,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4476,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4477,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x31, 0x30, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4478,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4479,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x30, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4480,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4481,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4482,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4483,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4484,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4485,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4486,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4487,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4488,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x32, 0x31, 0x31, 0x38, 0x33, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4489,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4490,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4491,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4492,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4493,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4494,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4495,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4496,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4497,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4498,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4499,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4500,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4501,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4502,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4503,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4504,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4505,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4506,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4507,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4508,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4509,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4510,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4511,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4512,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4513,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4514,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4515,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4516,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4517,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4518,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4519,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4520,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4521,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4522,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4523,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4524,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4525,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4526,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4527,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4528,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4529,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4530,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4531,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4532,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x31, 0x32, 0x30, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4533,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4534,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4535,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4536,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4537,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4538,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4539,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4540,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4541,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4542,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4543,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4544,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4545,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x32, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4546,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4547,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4548,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4549,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4550,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4551,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4552,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4553,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x33, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4554,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4555,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4556,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4557,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4558,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4559,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4560,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4561,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4562,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4563,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4564,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x36, 0x54, 0x31, 0x37, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4565,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3a, 0x32, 0x33, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4566,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4567,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4568,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4569,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4570,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4571,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4572,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4573,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4574,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4575,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4576,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4577,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4578,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4579,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4580,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4581,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4582,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4583,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4584,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4585,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4586,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4587,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4588,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4589,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4590,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4591,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4592,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4593,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4594,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4595,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4596,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4597,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4598,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4599,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4600,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4601,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4602,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4603,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4604,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4605,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4606,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4607,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4608,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4609,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4610,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4611,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4612,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x32, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4613,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4614,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4615,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4616,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4617,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4618,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4619,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4620,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4621,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4622,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x31, 0x32, 0x30, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4623,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4624,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4625,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4626,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4627,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4628,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4629,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4630,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4631,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4632,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4633,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4634,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x37, 0x37, 0x38, 0x36, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4635,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4636,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4637,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4638,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4639,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4640,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4641,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4642,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4643,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4644,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4645,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4646,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4647,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4648,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4649,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4650,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4651,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4652,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4653,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4654,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4655,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4656,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4657,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4658,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4659,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4660,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4661,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4662,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4663,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4664,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4665,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4666,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4667,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4668,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4669,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x30, 0x34, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4670,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4671,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4672,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4673,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4674,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4675,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4676,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4677,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4678,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4679,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4680,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x30, 0x34, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4681,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4682,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4683,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4684,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4685,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4686,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4687,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4688,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4689,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4690,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4691,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x33, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4692,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4693,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4694,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4695,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4696,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4697,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4698,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4699,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4700,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4701,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4702,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4703,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4704,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4705,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4706,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4707,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4708,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4709,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x32, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4710,64,"style","Trailing whitespace is superfluous."," 0x33, 0x54, 0x31, 0x37, 0x3a, 0x32, 0x33, 0x3a, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4711,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4712,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4713,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4714,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4715,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4716,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4717,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4718,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4719,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4720,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4721,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4722,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4723,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4724,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4725,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4726,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4727,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4728,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4729,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4730,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x2d, 0x32, 0x34, 0x39, 0x33, 0x32, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4731,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4732,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4733,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4734,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4735,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4736,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4737,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4738,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4739,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4740,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4741,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4742,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4743,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4744,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4745,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4746,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4747,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4748,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4749,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4750,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4751,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4752,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4753,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4754,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4755,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4756,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4757,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4758,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4759,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4760,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4761,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4762,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4763,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4764,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4765,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4766,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4767,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4768,64,"style","Trailing whitespace is superfluous."," 0x32, 0x34, 0x39, 0x33, 0x32, 0x34, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4769,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4770,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x34, 0x39, 0x33, 0x32, 0x34, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4771,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4772,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4773,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4774,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4775,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4776,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4777,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4778,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4779,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x32, 0x38, 0x37, 0x31, 0x37, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4780,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4781,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4782,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4783,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4784,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4785,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4786,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4787,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4788,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4789,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4790,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4791,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4792,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4793,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4794,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4795,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4796,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4797,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4798,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4799,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4800,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4801,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4802,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4803,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4804,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x32, 0x34, 0x39, 0x33, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4805,64,"style","Trailing whitespace is superfluous."," 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4806,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4807,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4808,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4809,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4810,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4811,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4812,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4813,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4814,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4815,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4816,64,"style","Trailing whitespace is superfluous."," 0x34, 0x39, 0x33, 0x32, 0x34, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4817,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4818,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4819,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4820,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4821,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4822,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4823,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4824,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x32, 0x32, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4825,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x32, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4826,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4827,64,"style","Trailing whitespace is superfluous."," 0x34, 0x39, 0x33, 0x32, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4828,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4829,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4830,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4831,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4832,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4833,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4834,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4835,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4836,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4837,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4838,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x35, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4839,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4840,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4841,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4842,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x32, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4843,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x32, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4844,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4845,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4846,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4847,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4848,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4849,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4850,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4851,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4852,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4853,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4854,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4855,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4856,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4857,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4858,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x35, 0x54, 0x31, 0x36, 0x3a, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4859,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3a, 0x34, 0x35, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4860,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4861,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4862,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4863,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4864,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4865,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4866,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4867,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4868,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4869,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4870,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4871,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4872,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4873,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4874,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4875,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4876,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4877,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4878,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x34, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4879,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4880,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4881,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4882,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4883,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4884,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4885,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4886,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4887,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4888,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4889,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4890,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4891,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4892,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4893,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4894,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4895,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4896,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4897,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4898,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4899,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4900,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4901,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4902,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4903,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4904,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4905,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4906,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x32, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x37, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4907,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4908,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4909,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4910,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4911,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4912,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4913,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4914,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4915,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4916,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x32, 0x30, 0x34, 0x31, 0x36, 0x35, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4917,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4918,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x34, 0x31, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4919,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4920,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4921,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4922,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4923,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4924,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4925,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4926,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4927,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4928,64,"style","Trailing whitespace is superfluous."," 0x37, 0x34, 0x38, 0x38, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4929,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4930,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4931,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4932,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4933,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4934,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4935,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4936,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4937,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4938,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4939,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4940,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4941,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4942,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4943,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4944,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4945,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4946,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4947,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4948,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4949,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4950,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4951,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x2d, 0x30, 0x34, 0x31, 0x36, 0x35, 0x33, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4952,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4953,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4954,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4955,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4956,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4957,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4958,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4959,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4960,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4961,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4962,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x34, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4963,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x33, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4964,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4965,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4966,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4967,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4968,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4969,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4970,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4971,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x31, 0x32, 0x30, 0x34, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4972,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4973,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x34, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4974,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4975,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4976,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4977,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4978,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4979,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4980,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4981,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4982,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4983,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4984,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4985,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4986,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4987,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4988,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4989,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x34, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4990,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4991,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4992,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4993,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4994,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4995,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4996,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4997,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4998,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4999,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5000,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5001,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5002,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5003,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x54, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5004,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x33, 0x30, 0x3a, 0x32, 0x37, 0x2d, 0x30, 0x35, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5005,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5006,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5007,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5008,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5009,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5010,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5011,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5012,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5013,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5014,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5015,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5016,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5017,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5018,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5019,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5020,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5021,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5022,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5023,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5024,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x32, 0x37, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5025,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5026,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5027,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5028,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5029,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5030,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5031,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5032,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5033,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5034,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5035,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5036,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5037,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5038,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5039,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5040,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5041,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5042,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5043,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5044,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5045,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5046,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5047,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5048,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5049,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5050,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5051,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5052,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5053,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5054,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5055,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5056,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5057,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5058,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5059,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5060,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5061,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x31, 0x31, 0x33, 0x30, 0x32, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5062,64,"style","Trailing whitespace is superfluous."," 0x37, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5063,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x33, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5064,64,"style","Trailing whitespace is superfluous."," 0x32, 0x37, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5065,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5066,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5067,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5068,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5069,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5070,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5071,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5072,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5073,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x31, 0x38, 0x38, 0x32, 0x38, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5074,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5075,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5076,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5077,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5078,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5079,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5080,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5081,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5082,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5083,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5084,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5085,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5086,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5087,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5088,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5089,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5090,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5091,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5092,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5093,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5094,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5095,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5096,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x33, 0x30, 0x32, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5097,64,"style","Trailing whitespace is superfluous."," 0x37, 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5098,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5099,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5100,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5101,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5102,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5103,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5104,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5105,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5106,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5107,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5108,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x32, 0x32, 0x37, 0x34, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5109,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5110,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5111,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5112,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5113,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5114,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5115,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5116,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5117,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x32, 0x37, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5118,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5119,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x32, 0x32, 0x37, 0x34, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5120,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5121,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5122,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5123,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5124,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5125,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5126,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5127,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5128,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5129,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5130,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x38, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5131,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5132,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5133,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5134,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5135,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x32, 0x37, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5136,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5137,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5138,64,"style","Trailing whitespace is superfluous."," 0x20, 0x38, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5139,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5140,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5141,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5142,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5143,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5144,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5145,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5146,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5147,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5148,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x31, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5149,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x36, 0x3a, 0x34, 0x33, 0x3a, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5150,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5151,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5152,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5153,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5154,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5155,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5156,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5157,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5158,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5159,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5160,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5161,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5162,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5163,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5164,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5165,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5166,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5167,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5168,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5169,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x32, 0x31, 0x36, 0x35, 0x33, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5170,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5171,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5172,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5173,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5174,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5175,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5176,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5177,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5178,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5179,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5180,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5181,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5182,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5183,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5184,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5185,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5186,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5187,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5188,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5189,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5190,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5191,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5192,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5193,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5194,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5195,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5196,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5197,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5198,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5199,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5200,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5201,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5202,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5203,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5204,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5205,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5206,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5207,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x35, 0x33, 0x30, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5208,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5209,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x36, 0x35, 0x33, 0x30, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5210,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5211,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5212,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5213,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5214,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5215,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5216,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5217,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5218,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x31, 0x31, 0x31, 0x30, 0x32, 0x31, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5219,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5220,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5221,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5222,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5223,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5224,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5225,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5226,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5227,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5228,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5229,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5230,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5231,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5232,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5233,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5234,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5235,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5236,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5237,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5238,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5239,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5240,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5241,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5242,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x35, 0x33, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5243,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5244,64,"style","Trailing whitespace is superfluous."," 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5245,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5246,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5247,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5248,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5249,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5250,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5251,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5252,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5253,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x32, 0x31, 0x36, 0x35, 0x33, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5254,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5255,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5256,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5257,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5258,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5259,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5260,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5261,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5262,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x32, 0x31, 0x36, 0x35, 0x33, 0x30, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5263,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5264,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x32, 0x31, 0x36, 0x35, 0x33, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5265,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5266,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5267,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5268,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5269,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5270,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5271,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5272,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5273,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5274,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5275,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5276,64,"style","Trailing whitespace is superfluous."," 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5277,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5278,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5279,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5280,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x32, 0x31, 0x36, 0x35, 0x33, 0x30, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5281,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5282,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5283,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5284,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5285,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5286,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5287,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5288,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5289,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5290,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5291,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5292,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5293,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5294,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x39, 0x54, 0x31, 0x36, 0x3a, 0x32, 0x31, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5295,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5296,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5297,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5298,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5299,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5300,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5301,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5302,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5303,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5304,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5305,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5306,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5307,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5308,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5309,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5310,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5311,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5312,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5313,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5314,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x39, 0x32, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5315,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5316,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5317,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5318,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5319,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5320,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5321,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5322,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5323,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5324,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5325,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5326,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5327,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5328,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5329,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5330,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5331,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5332,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5333,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5334,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5335,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5336,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5337,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5338,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5339,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5340,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5341,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5342,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x34, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5343,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5344,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5345,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5346,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5347,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5348,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5349,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5350,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5351,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5352,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x31, 0x34, 0x39, 0x32, 0x36, 0x32, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5353,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5354,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x31, 0x34, 0x39, 0x32, 0x36, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5355,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5356,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5357,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5358,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5359,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5360,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5361,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5362,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5363,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x31, 0x38, 0x36, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5364,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5365,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5366,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5367,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5368,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5369,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5370,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5371,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5372,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5373,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5374,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5375,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5376,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5377,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5378,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5379,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5380,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5381,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5382,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5383,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5384,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5385,64,"style","Trailing whitespace is superfluous."," 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5386,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5387,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5388,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5389,64,"style","Trailing whitespace is superfluous."," 0x32, 0x36, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5390,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5391,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5392,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5393,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5394,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5395,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5396,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5397,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5398,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5399,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5400,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x39, 0x32, 0x36, 0x32, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5401,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5402,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5403,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5404,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5405,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5406,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5407,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5408,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5409,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x39, 0x32, 0x36, 0x32, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5410,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5411,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x39, 0x32, 0x36, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5412,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5413,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5414,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5415,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5416,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5417,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5418,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5419,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5420,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5421,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5422,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x34, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5423,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5424,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5425,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5426,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5427,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x39, 0x32, 0x36, 0x32, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5428,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5429,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5430,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5431,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5432,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5433,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5434,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5435,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5436,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5437,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5438,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5439,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5440,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5441,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5442,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x34, 0x54, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5443,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x35, 0x36, 0x3a, 0x30, 0x32, 0x2d, 0x30, 0x34, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5444,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5445,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5446,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5447,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5448,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5449,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5450,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5451,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5452,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5453,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5454,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5455,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5456,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5457,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5458,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5459,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5460,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5461,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5462,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5463,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x39, 0x35, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5464,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5465,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5466,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5467,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5468,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5469,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5470,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5471,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5472,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5473,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5474,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5475,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5476,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5477,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5478,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5479,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5480,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5481,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5482,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5483,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5484,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5485,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5486,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5487,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5488,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5489,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5490,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5491,64,"style","Trailing whitespace is superfluous."," 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5492,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5493,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5494,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5495,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5496,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5497,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5498,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5499,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5500,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x31, 0x31, 0x30, 0x32, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5501,64,"style","Trailing whitespace is superfluous."," 0x35, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5502,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5503,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5504,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5505,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5506,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5507,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5508,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5509,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5510,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5511,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5512,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x37, 0x39, 0x35, 0x39, 0x31, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5513,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5514,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5515,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5516,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5517,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5518,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5519,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5520,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5521,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5522,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x35, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5523,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5524,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5525,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5526,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5527,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5528,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5529,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5530,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5531,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5532,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5533,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5534,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5535,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5536,64,"style","Trailing whitespace is superfluous."," 0x35, 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5537,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5538,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5539,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5540,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5541,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5542,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5543,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5544,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5545,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5546,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5547,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x35, 0x39, 0x35, 0x34, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5548,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5549,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5550,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5551,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5552,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5553,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5554,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5555,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5556,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x39, 0x35, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5557,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5558,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x35, 0x39, 0x35, 0x34, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5559,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5560,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5561,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5562,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5563,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5564,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5565,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5566,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5567,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5568,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5569,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x37, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5570,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5571,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5572,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5573,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5574,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x39, 0x35, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5575,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5576,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5577,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5578,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5579,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5580,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5581,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5582,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5583,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5584,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5585,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5586,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5587,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5588,64,"style","Trailing whitespace is superfluous."," 0x37, 0x54, 0x31, 0x37, 0x3a, 0x32, 0x35, 0x3a, 0x34, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5589,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5590,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5591,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5592,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5593,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5594,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5595,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5596,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5597,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5598,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5599,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5600,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5601,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5602,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5603,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5604,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5605,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5606,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5607,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5608,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x32, 0x35, 0x32, 0x31, 0x37, 0x31, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5609,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5610,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5611,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5612,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5613,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5614,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5615,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5616,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5617,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5618,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5619,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5620,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5621,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5622,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5623,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5624,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5625,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5626,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5627,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5628,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5629,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5630,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5631,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5632,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5633,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5634,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5635,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5636,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5637,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5638,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5639,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5640,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5641,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5642,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5643,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5644,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5645,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5646,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x32, 0x31, 0x37, 0x31, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5647,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5648,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x35, 0x32, 0x31, 0x37, 0x31, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5649,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5650,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5651,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5652,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5653,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5654,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5655,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5656,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5657,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x30, 0x31, 0x31, 0x37, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5658,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5659,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5660,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5661,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5662,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5663,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5664,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5665,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5666,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5667,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5668,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5669,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5670,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5671,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5672,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5673,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5674,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5675,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5676,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5677,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5678,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5679,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5680,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5681,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x35, 0x32, 0x31, 0x37, 0x31, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5682,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5683,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5684,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5685,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5686,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5687,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5688,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5689,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5690,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5691,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5692,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x35, 0x32, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5693,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5694,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5695,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5696,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5697,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5698,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5699,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5700,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5701,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x30, 0x32, 0x35, 0x32, 0x31, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5702,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5703,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x35, 0x32, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5704,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5705,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5706,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5707,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5708,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5709,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5710,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5711,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5712,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5713,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5714,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5715,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5716,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5717,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5718,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5719,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x35, 0x32, 0x31, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5720,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5721,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5722,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x33, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5723,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5724,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5725,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5726,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5727,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5728,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5729,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5730,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5731,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5732,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5733,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x38, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5734,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x3a, 0x32, 0x36, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5735,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5736,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5737,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5738,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5739,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5740,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5741,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5742,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5743,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5744,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5745,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5746,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5747,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5748,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5749,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5750,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5751,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5752,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5753,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5754,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x34, 0x38, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5755,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5756,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5757,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5758,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5759,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5760,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5761,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5762,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5763,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5764,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5765,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5766,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5767,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5768,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5769,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5770,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5771,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5772,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5773,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5774,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5775,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5776,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5777,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5778,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5779,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5780,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5781,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5782,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5783,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5784,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5785,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5786,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5787,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5788,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5789,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5790,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5791,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x30, 0x31, 0x38, 0x33, 0x34, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5792,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5793,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x31, 0x38, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5794,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5795,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5796,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5797,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5798,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5799,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5800,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5801,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5802,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5803,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x32, 0x30, 0x37, 0x32, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5804,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5805,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5806,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5807,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5808,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5809,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5810,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5811,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5812,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5813,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5814,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5815,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5816,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5817,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5818,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5819,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5820,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5821,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5822,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5823,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5824,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5825,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5826,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x31, 0x38, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5827,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5828,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5829,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5830,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5831,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5832,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5833,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5834,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5835,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5836,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5837,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5838,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x33, 0x34, 0x34, 0x38, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5839,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5840,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5841,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5842,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5843,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5844,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5845,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5846,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5847,64,"style","Trailing whitespace is superfluous."," 0x38, 0x33, 0x34, 0x34, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5848,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5849,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x33, 0x34, 0x34, 0x38, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5850,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5851,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5852,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5853,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5854,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5855,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5856,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5857,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5858,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5859,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5860,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5861,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5862,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5863,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5864,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5865,64,"style","Trailing whitespace is superfluous."," 0x38, 0x33, 0x34, 0x34, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5866,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5867,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5868,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5869,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5870,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5871,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5872,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5873,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5874,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5875,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5876,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5877,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5878,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5879,64,"style","Trailing whitespace is superfluous."," 0x39, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x37, 0x3a, 0x32, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5880,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5881,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5882,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5883,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5884,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5885,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5886,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5887,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5888,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5889,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5890,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5891,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5892,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5893,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5894,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5895,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5896,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5897,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5898,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5899,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x30, 0x30, 0x31, 0x35, 0x37, 0x39, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5900,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5901,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5902,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5903,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5904,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5905,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5906,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5907,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5908,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5909,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5910,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5911,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5912,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5913,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5914,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5915,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5916,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5917,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5918,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5919,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5920,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5921,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5922,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5923,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5924,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5925,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5926,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5927,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5928,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5929,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5930,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5931,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5932,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5933,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5934,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5935,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5936,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5937,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x35, 0x37, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5938,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x30, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5939,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x31, 0x35, 0x37, 0x39, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5940,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5941,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5942,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5943,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5944,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5945,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5946,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5947,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5948,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x30, 0x38, 0x36, 0x37, 0x34, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5949,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5950,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5951,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5952,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5953,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5954,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5955,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5956,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5957,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5958,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5959,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5960,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x35, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5961,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5962,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5963,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5964,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5965,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5966,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5967,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5968,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5969,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5970,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5971,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5972,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5973,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, 0x31, 0x35, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5974,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5975,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5976,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5977,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5978,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5979,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5980,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5981,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5982,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5983,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5984,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x30, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5985,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x37, 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5986,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5987,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5988,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5989,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5990,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5991,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5992,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5993,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x33, 0x30, 0x31, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5994,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5995,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x30, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5996,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x37, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5997,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5998,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5999,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6000,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6001,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6002,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6003,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6004,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6005,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6006,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6007,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x38, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6008,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6009,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6010,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6011,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x30, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6012,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6013,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6014,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6015,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6016,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6017,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6018,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6019,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6020,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6021,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6022,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6023,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6024,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6025,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6026,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6027,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x38, 0x54, 0x31, 0x37, 0x3a, 0x31, 0x37, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6028,64,"style","Trailing whitespace is superfluous."," 0x33, 0x38, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6029,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6030,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6031,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6032,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6033,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6034,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6035,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6036,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6037,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6038,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6039,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6040,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6041,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6042,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6043,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6044,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6045,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6046,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6047,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x31, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6048,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6049,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6050,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6051,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6052,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6053,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x6d, 0x65, 0x6e, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6054,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x41, 0x6d, 0x65, 0x6e, 0x64, 0x5d, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6055,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x6e, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6056,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6057,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6058,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6059,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6060,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6061,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6062,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6063,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6064,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6065,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6066,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6067,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6068,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6069,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6070,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6071,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6072,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6073,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6074,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6075,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6076,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6077,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6078,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6079,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6080,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6081,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6082,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6083,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6084,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6085,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6086,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6087,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6088,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x30, 0x31, 0x30, 0x32, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6089,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6090,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x31, 0x30, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6091,64,"style","Trailing whitespace is superfluous."," 0x35, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6092,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6093,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6094,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6095,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6096,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x2f, 0x41, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6097,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6098,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6099,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6100,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x37, 0x38, 0x37, 0x39, 0x31, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6101,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6102,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6103,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6104,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6105,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6106,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6107,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6108,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6109,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6110,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6111,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6112,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6113,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6114,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6115,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6116,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6117,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6118,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6119,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6120,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x32, 0x30, 0x35, 0x32, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6121,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6122,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6123,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6124,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6125,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6126,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6127,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6128,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6129,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x32, 0x30, 0x35, 0x32, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6130,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6131,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x32, 0x30, 0x35, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6132,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6133,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6134,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6135,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6136,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6137,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6138,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6139,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6140,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6141,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6142,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6143,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6144,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6145,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6146,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6147,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x32, 0x30, 0x35, 0x32, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6148,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6149,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6150,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x37, 0x32, 0x33, 0x20, 0x4b, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6151,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6152,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6153,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x2f, 0x41, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6154,64,"style","Trailing whitespace is superfluous."," 0x41, 0x6d, 0x65, 0x6e, 0x64, 0x5d, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6155,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6156,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6157,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6158,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6159,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6160,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6161,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6162,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x30, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x31, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6163,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6164,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6165,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6166,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6167,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6168,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6169,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6170,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6171,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6172,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6173,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6174,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6175,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6176,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6177,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6178,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6179,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6180,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6181,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6182,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6183,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6184,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6185,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6186,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6187,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6188,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6189,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6190,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6191,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6192,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6193,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6194,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6195,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6196,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6197,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6198,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6199,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6200,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6201,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6202,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6203,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6204,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6205,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6206,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6207,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6208,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6209,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6210,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x39, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6211,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6212,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6213,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6214,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6215,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6216,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6217,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6218,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6219,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6220,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x32, 0x35, 0x38, 0x35, 0x36, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6221,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6222,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x35, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6223,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6224,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6225,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6226,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6227,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6228,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6229,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6230,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6231,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x30, 0x35, 0x38, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6232,64,"style","Trailing whitespace is superfluous."," 0x36, 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6233,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6234,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6235,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6236,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6237,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6238,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6239,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6240,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6241,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6242,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6243,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6244,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6245,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6246,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6247,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6248,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6249,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6250,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6251,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6252,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6253,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6254,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6255,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x35, 0x38, 0x35, 0x36, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6256,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6257,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6258,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6259,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6260,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6261,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6262,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6263,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6264,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6265,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6266,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6267,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6268,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6269,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6270,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6271,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6272,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6273,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6274,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6275,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x30, 0x30, 0x32, 0x35, 0x38, 0x35, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6276,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6277,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6278,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6279,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6280,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6281,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6282,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6283,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6284,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6285,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6286,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6287,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6288,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6289,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6290,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6291,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6292,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6293,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x35, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6294,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6295,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6296,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x33, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6297,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6298,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6299,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6300,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6301,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6302,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6303,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6304,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6305,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6306,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6307,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x39, 0x54, 0x31, 0x36, 0x3a, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6308,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x35, 0x32, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6309,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6310,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6311,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6312,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6313,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6314,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6315,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6316,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6317,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6318,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6319,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6320,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6321,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6322,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6323,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6324,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6325,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6326,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6327,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x32, 0x33, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6328,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6329,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6330,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6331,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6332,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6333,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6334,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6335,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6336,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6337,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6338,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6339,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6340,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6341,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6342,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6343,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6344,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6345,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6346,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6347,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6348,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6349,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6350,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6351,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6352,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6353,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6354,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6355,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6356,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6357,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6358,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6359,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6360,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6361,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6362,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6363,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6364,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6365,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x30, 0x39, 0x32, 0x33, 0x30, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6366,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6367,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x32, 0x33, 0x30, 0x37, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6368,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6369,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6370,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6371,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6372,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6373,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6374,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6375,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6376,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6377,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x32, 0x35, 0x38, 0x37, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6378,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6379,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6380,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6381,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6382,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6383,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6384,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6385,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6386,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6387,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x33, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6388,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6389,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6390,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6391,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6392,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6393,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6394,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6395,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6396,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6397,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6398,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6399,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6400,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x39, 0x2d, 0x32, 0x33, 0x30, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6401,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6402,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6403,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6404,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6405,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6406,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6407,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6408,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6409,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6410,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6411,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x32, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6412,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x38, 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6413,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6414,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6415,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6416,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6417,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6418,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6419,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6420,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, 0x32, 0x33, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6421,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6422,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x32, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6423,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x38, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6424,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6425,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6426,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6427,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6428,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6429,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6430,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6431,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6432,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6433,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6434,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x30, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6435,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6436,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6437,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6438,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x32, 0x33, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6439,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6440,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6441,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6442,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6443,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6444,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6445,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6446,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6447,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6448,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6449,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6450,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6451,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6452,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x30, 0x54, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6453,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x34, 0x39, 0x3a, 0x33, 0x36, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6454,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6455,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6456,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6457,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6458,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6459,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6460,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6461,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6462,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6463,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6464,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6465,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6466,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6467,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6468,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6469,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6470,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6471,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6472,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6473,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x30, 0x37, 0x35, 0x39, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6474,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6475,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6476,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6477,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6478,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6479,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6480,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6481,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6482,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6483,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6484,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6485,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6486,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6487,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6488,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6489,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6490,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6491,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6492,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6493,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6494,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6495,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6496,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6497,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6498,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6499,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6500,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6501,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6502,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6503,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6504,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6505,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6506,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6507,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6508,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6509,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6510,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, 0x31, 0x37, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6511,64,"style","Trailing whitespace is superfluous."," 0x37, 0x35, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6512,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6513,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x35, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6514,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6515,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6516,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6517,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6518,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6519,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6520,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6521,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6522,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x31, 0x30, 0x30, 0x30, 0x35, 0x35, 0x37, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6523,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6524,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6525,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6526,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6527,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6528,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6529,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6530,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6531,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6532,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6533,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6534,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6535,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6536,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6537,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6538,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6539,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6540,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6541,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6542,64,"style","Trailing whitespace is superfluous."," 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6543,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6544,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6545,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x31, 0x37, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6546,64,"style","Trailing whitespace is superfluous."," 0x37, 0x35, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6547,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6548,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6549,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6550,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6551,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6552,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6553,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6554,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6555,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6556,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6557,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x30, 0x37, 0x35, 0x39, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6558,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6559,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6560,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6561,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6562,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6563,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6564,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6565,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6566,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x30, 0x37, 0x35, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6567,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6568,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x30, 0x37, 0x35, 0x39, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6569,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6570,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6571,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6572,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6573,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6574,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6575,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6576,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6577,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6578,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6579,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x30, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6580,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6581,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6582,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6583,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6584,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x30, 0x37, 0x35, 0x39, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6585,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6586,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6587,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6588,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6589,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6590,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6591,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6592,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6593,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6594,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6595,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6596,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6597,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6598,64,"style","Trailing whitespace is superfluous."," 0x30, 0x54, 0x31, 0x36, 0x3a, 0x35, 0x31, 0x3a, 0x33, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6599,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6600,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6601,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6602,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6603,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6604,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6605,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6606,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6607,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6608,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6609,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6610,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6611,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6612,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6613,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6614,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6615,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6616,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6617,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6618,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x2d, 0x31, 0x31, 0x36, 0x38, 0x39, 0x35, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6619,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6620,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6621,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6622,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6623,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6624,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6625,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6626,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6627,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6628,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6629,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6630,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6631,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6632,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6633,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6634,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6635,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6636,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6637,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6638,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6639,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6640,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6641,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6642,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6643,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6644,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6645,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6646,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6647,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6648,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6649,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6650,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6651,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6652,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6653,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6654,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6655,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6656,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x36, 0x38, 0x39, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6657,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6658,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x36, 0x38, 0x39, 0x35, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6659,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6660,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6661,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6662,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6663,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6664,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6665,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6666,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6667,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x39, 0x38, 0x34, 0x36, 0x36, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6668,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6669,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6670,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6671,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6672,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6673,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6674,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6675,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6676,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6677,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6678,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6679,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x32, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6680,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6681,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6682,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6683,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6684,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6685,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6686,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6687,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6688,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x31, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6689,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6690,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6691,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6692,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6693,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6694,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6695,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6696,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6697,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, 0x31, 0x31, 0x36, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6698,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6699,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x31, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6700,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6701,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6702,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6703,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6704,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6705,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6706,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6707,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6708,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6709,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6710,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6711,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6712,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6713,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6714,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6715,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x31, 0x31, 0x36, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6716,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6717,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6718,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6719,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6720,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6721,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6722,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6723,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6724,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6725,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6726,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6727,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6728,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6729,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6730,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6731,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x54, 0x32, 0x30, 0x3a, 0x35, 0x38, 0x3a, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6732,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6733,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6734,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6735,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6736,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6737,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6738,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6739,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6740,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6741,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6742,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6743,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6744,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6745,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6746,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6747,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6748,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6749,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6750,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6751,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x39, 0x2d, 0x30, 0x31, 0x38, 0x39, 0x32, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6752,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6753,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6754,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6755,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6756,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6757,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6758,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6759,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6760,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6761,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6762,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6763,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6764,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6765,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6766,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6767,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6768,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6769,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6770,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6771,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6772,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6773,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6774,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6775,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6776,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6777,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6778,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6779,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x34, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6780,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6781,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6782,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6783,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6784,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6785,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6786,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6787,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6788,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6789,64,"style","Trailing whitespace is superfluous."," 0x39, 0x30, 0x31, 0x38, 0x39, 0x32, 0x31, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6790,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6791,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x31, 0x38, 0x39, 0x32, 0x31, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6792,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6793,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6794,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6795,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6796,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6797,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6798,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6799,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6800,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x39, 0x35, 0x36, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6801,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6802,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6803,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6804,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6805,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6806,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6807,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6808,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6809,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6810,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6811,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6812,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6813,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6814,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6815,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6816,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6817,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6818,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6819,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6820,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x2d, 0x30, 0x31, 0x38, 0x39, 0x32, 0x31, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6821,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6822,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6823,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6824,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6825,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6826,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6827,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6828,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6829,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x30, 0x31, 0x38, 0x39, 0x32, 0x31, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6830,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6831,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x2d, 0x30, 0x31, 0x38, 0x39, 0x32, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6832,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6833,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6834,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6835,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6836,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6837,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6838,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6839,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6840,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6841,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6842,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6843,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6844,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6845,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6846,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6847,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x31, 0x38, 0x39, 0x32, 0x31, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6848,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6849,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6850,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6851,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6852,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6853,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6854,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6855,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6856,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6857,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6858,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6859,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6860,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6861,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x54, 0x31, 0x37, 0x3a, 0x31, 0x33, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6862,64,"style","Trailing whitespace is superfluous."," 0x32, 0x36, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6863,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6864,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6865,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6866,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6867,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6868,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6869,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6870,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6871,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6872,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6873,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6874,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6875,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6876,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6877,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6878,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6879,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6880,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6881,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x31, 0x39, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6882,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6883,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6884,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6885,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6886,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6887,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6888,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6889,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6890,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6891,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6892,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6893,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6894,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6895,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6896,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6897,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6898,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6899,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6900,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6901,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6902,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6903,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6904,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6905,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6906,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6907,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6908,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6909,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x36, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6910,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6911,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6912,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6913,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6914,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6915,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6916,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6917,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6918,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6919,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x30, 0x31, 0x39, 0x36, 0x35, 0x31, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6920,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6921,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x30, 0x31, 0x39, 0x36, 0x35, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6922,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6923,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6924,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6925,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6926,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6927,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6928,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6929,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6930,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x38, 0x31, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6931,64,"style","Trailing whitespace is superfluous."," 0x36, 0x36, 0x33, 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6932,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6933,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6934,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6935,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6936,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6937,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6938,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6939,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6940,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6941,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x36, 0x30, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6942,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6943,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6944,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6945,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6946,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6947,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6948,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6949,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6950,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6951,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6952,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6953,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6954,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6955,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6956,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6957,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6958,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6959,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x30, 0x38, 0x30, 0x31, 0x39, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6960,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6961,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6962,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6963,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6964,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6965,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6966,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6967,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6968,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6969,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6970,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6971,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6972,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6973,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6974,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6975,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6976,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6977,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x31, 0x39, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6978,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6979,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6980,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6981,64,"style","Trailing whitespace is superfluous."," 0x30, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6982,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6983,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6984,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6985,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6986,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6987,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6988,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6989,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6990,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6991,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x36, 0x54, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6992,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x3a, 0x33, 0x35, 0x3a, 0x30, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6993,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6994,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6995,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6996,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6997,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6998,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6999,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7000,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7001,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7002,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7003,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7004,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7005,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7006,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7007,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7008,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7009,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7010,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7011,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7012,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x33, 0x39, 0x39, 0x31, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7013,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7014,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7015,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7016,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7017,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7018,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7019,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7020,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7021,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7022,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7023,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7024,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7025,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7026,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7027,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7028,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7029,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7030,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7031,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7032,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7033,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7034,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7035,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7036,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7037,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7038,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7039,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x38, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7040,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7041,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7042,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7043,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7044,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7045,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7046,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7047,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7048,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7049,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x38, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7050,64,"style","Trailing whitespace is superfluous."," 0x33, 0x39, 0x39, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7051,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7052,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x39, 0x39, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7053,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7054,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7055,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7056,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7057,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7058,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7059,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7060,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7061,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x38, 0x39, 0x38, 0x38, 0x38, 0x36, 0x38, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7062,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7063,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7064,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7065,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7066,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7067,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7068,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7069,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7070,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7071,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7072,64,"style","Trailing whitespace is superfluous."," 0x35, 0x35, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7073,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7074,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7075,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7076,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7077,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7078,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7079,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7080,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7081,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x31, 0x33, 0x39, 0x39, 0x31, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7082,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7083,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7084,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7085,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7086,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7087,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7088,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7089,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7090,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x31, 0x33, 0x39, 0x39, 0x31, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7091,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7092,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x31, 0x33, 0x39, 0x39, 0x31, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7093,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7094,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7095,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7096,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7097,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7098,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7099,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7100,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7101,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7102,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7103,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7104,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7105,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7106,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7107,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7108,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x33, 0x39, 0x39, 0x31, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7109,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7110,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7111,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x36, 0x35, 0x35, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7112,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7113,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7114,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7115,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7116,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7117,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7118,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7119,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7120,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7121,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7122,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x34, 0x54, 0x31, 0x37, 0x3a, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7123,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x31, 0x39, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7124,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7125,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7126,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7127,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7128,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7129,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7130,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7131,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7132,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7133,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7134,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7135,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7136,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7137,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7138,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7139,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7140,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7141,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7142,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7143,64,"style","Trailing whitespace is superfluous."," 0x39, 0x30, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7144,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7145,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7146,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7147,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7148,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7149,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7150,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7151,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7152,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7153,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7154,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7155,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7156,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7157,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7158,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7159,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7160,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7161,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7162,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7163,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7164,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7165,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7166,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7167,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7168,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7169,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7170,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7171,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7172,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7173,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7174,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7175,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7176,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7177,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7178,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7179,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7180,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x38, 0x30, 0x30, 0x30, 0x32, 0x39, 0x30, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7181,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7182,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x32, 0x39, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7183,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7184,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7185,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7186,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7187,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7188,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7189,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7190,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7191,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x38, 0x38, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7192,64,"style","Trailing whitespace is superfluous."," 0x39, 0x30, 0x34, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7193,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7194,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7195,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7196,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7197,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7198,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7199,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7200,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7201,64,"style","Trailing whitespace is superfluous."," 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7202,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7203,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7204,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7205,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7206,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7207,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7208,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7209,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7210,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7211,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7212,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7213,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x32, 0x39, 0x30, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7214,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7215,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7216,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7217,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7218,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7219,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7220,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7221,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, 0x38, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7222,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x39, 0x30, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7223,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7224,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x32, 0x39, 0x30, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7225,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7226,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7227,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7228,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7229,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7230,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7231,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7232,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7233,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7234,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7235,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x33, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7236,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7237,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7238,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7239,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7240,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x39, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7241,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7242,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7243,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7244,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7245,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7246,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7247,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7248,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7249,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7250,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7251,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7252,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7253,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7254,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7255,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x33, 0x54, 0x31, 0x37, 0x3a, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7256,64,"style","Trailing whitespace is superfluous."," 0x37, 0x3a, 0x32, 0x34, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7257,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7258,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7259,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7260,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7261,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7262,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7263,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7264,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7265,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7266,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7267,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7268,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7269,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7270,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7271,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7272,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7273,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7274,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7275,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7276,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7277,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7278,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7279,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7280,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7281,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7282,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7283,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7284,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7285,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7286,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7287,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7288,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7289,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7290,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7291,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7292,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7293,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7294,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7295,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7296,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7297,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7298,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7299,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7300,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7301,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7302,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7303,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x35, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7304,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7305,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7306,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7307,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7308,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7309,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7310,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7311,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7312,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7313,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x30, 0x38, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7314,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7315,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7316,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7317,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7318,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7319,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7320,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7321,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7322,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7323,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7324,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x38, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7325,64,"style","Trailing whitespace is superfluous."," 0x37, 0x33, 0x36, 0x39, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7326,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7327,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7328,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7329,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7330,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7331,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7332,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7333,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7334,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7335,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x36, 0x32, 0x35, 0x20, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7336,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7337,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7338,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7339,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7340,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7341,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7342,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7343,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7344,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7345,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7346,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7347,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7348,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7349,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7350,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7351,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7352,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7353,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, 0x38, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7354,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7355,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7356,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7357,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7358,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7359,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7360,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7361,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7362,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7363,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7364,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7365,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7366,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7367,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x35, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7368,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7369,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7370,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7371,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7372,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7373,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7374,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7375,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7376,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7377,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7378,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7379,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7380,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7381,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7382,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7383,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7384,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7385,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7386,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x38, 0x3a, 0x33, 0x38, 0x3a, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7387,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7388,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7389,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7390,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7391,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7392,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7393,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7394,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7395,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7396,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7397,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7398,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7399,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7400,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7401,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7402,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7403,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7404,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7405,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7406,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x32, 0x33, 0x30, 0x30, 0x35, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7407,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7408,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7409,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7410,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7411,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7412,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7413,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7414,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7415,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7416,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7417,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7418,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7419,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7420,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7421,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7422,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7423,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7424,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7425,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7426,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7427,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7428,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7429,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7430,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7431,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7432,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7433,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7434,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7435,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7436,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7437,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7438,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7439,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7440,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7441,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7442,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7443,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x37, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7444,64,"style","Trailing whitespace is superfluous."," 0x32, 0x33, 0x30, 0x30, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7445,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7446,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x33, 0x30, 0x30, 0x35, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7447,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7448,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7449,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7450,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7451,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7452,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7453,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7454,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7455,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x37, 0x31, 0x32, 0x31, 0x38, 0x34, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7456,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7457,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7458,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7459,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7460,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7461,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7462,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7463,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7464,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7465,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7466,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x36, 0x37, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7467,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7468,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7469,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7470,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7471,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7472,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7473,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7474,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7475,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x32, 0x33, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7476,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7477,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7478,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7479,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7480,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7481,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7482,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7483,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7484,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x37, 0x30, 0x32, 0x33, 0x30, 0x30, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7485,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7486,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x32, 0x33, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7487,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7488,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7489,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7490,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7491,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7492,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7493,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7494,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7495,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7496,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7497,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7498,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7499,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7500,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7501,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7502,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x30, 0x32, 0x33, 0x30, 0x30, 0x35, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7503,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7504,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7505,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x36, 0x37, 0x36, 0x20, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7506,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7507,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7508,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7509,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7510,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7511,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7512,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7513,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7514,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7515,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7516,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x36, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7517,64,"style","Trailing whitespace is superfluous."," 0x34, 0x31, 0x3a, 0x30, 0x38, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7518,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7519,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7520,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7521,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7522,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7523,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7524,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7525,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7526,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7527,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7528,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7529,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7530,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7531,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7532,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7533,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7534,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7535,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7536,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7537,64,"style","Trailing whitespace is superfluous."," 0x36, 0x39, 0x39, 0x35, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7538,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7539,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7540,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7541,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7542,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7543,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7544,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7545,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7546,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7547,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7548,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7549,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7550,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7551,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7552,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7553,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7554,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7555,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7556,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7557,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7558,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7559,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7560,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7561,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7562,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7563,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7564,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x37, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7565,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7566,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7567,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7568,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7569,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7570,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7571,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7572,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7573,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7574,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x30, 0x37, 0x30, 0x31, 0x36, 0x39, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7575,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7576,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x36, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7577,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7578,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7579,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7580,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7581,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7582,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7583,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7584,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7585,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7586,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x32, 0x38, 0x33, 0x39, 0x31, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7587,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7588,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7589,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7590,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7591,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7592,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7593,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7594,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7595,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7596,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x37, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7597,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7598,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7599,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7600,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7601,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7602,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7603,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7604,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7605,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7606,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x39, 0x39, 0x35, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7607,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7608,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7609,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7610,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7611,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7612,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7613,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7614,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x37, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7615,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x39, 0x39, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7616,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7617,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x39, 0x39, 0x35, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7618,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7619,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7620,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7621,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7622,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7623,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7624,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7625,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7626,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7627,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7628,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x36, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7629,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7630,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7631,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7632,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7633,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x39, 0x39, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7634,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7635,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7636,64,"style","Trailing whitespace is superfluous."," 0x20, 0x38, 0x37, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7637,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7638,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7639,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7640,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7641,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7642,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7643,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7644,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7645,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7646,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7647,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x54, 0x31, 0x36, 0x3a, 0x34, 0x37, 0x3a, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7648,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7649,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7650,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7651,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7652,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7653,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7654,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7655,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7656,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7657,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7658,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7659,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7660,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7661,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7662,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7663,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7664,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7665,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7666,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7667,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x32, 0x35, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7668,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7669,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7670,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7671,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7672,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7673,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7674,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7675,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7676,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7677,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7678,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7679,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7680,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7681,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7682,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7683,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7684,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7685,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7686,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7687,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7688,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7689,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7690,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7691,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7692,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7693,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7694,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7695,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x33, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7696,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7697,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7698,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7699,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7700,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7701,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7702,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7703,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7704,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7705,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x31, 0x32, 0x35, 0x32, 0x38, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7706,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7707,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x31, 0x32, 0x35, 0x32, 0x38, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7708,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7709,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7710,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7711,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7712,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7713,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7714,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7715,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7716,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x37, 0x38, 0x38, 0x35, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7717,64,"style","Trailing whitespace is superfluous."," 0x38, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7718,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7719,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7720,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7721,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7722,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7723,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7724,64,"style","Trailing whitespace is superfluous."," 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7725,64,"style","Trailing whitespace is superfluous."," 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7726,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7727,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7728,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7729,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7730,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7731,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7732,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7733,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7734,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7735,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7736,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7737,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7738,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x32, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7739,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7740,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7741,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7742,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7743,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7744,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7745,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7746,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x37, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7747,64,"style","Trailing whitespace is superfluous."," 0x35, 0x32, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7748,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7749,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x32, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7750,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7751,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7752,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7753,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7754,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7755,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7756,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7757,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7758,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7759,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7760,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x33, 0x30, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7761,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7762,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7763,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7764,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7765,64,"style","Trailing whitespace is superfluous."," 0x35, 0x32, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7766,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7767,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7768,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7769,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7770,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7771,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7772,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7773,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7774,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7775,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7776,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7777,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7778,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7779,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7780,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x39, 0x54, 0x32, 0x31, 0x3a, 0x32, 0x36, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7781,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7782,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7783,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7784,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7785,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7786,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7787,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7788,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7789,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7790,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7791,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7792,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7793,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7794,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7795,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7796,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7797,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7798,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7799,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7800,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x30, 0x32, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7801,64,"style","Trailing whitespace is superfluous."," 0x37, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7802,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7803,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7804,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7805,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7806,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7807,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7808,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7809,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7810,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7811,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7812,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7813,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7814,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7815,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7816,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7817,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7818,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7819,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7820,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7821,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7822,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7823,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7824,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7825,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7826,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7827,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7828,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7829,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7830,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7831,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7832,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7833,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7834,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7835,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7836,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7837,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7838,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x30, 0x30, 0x32, 0x31, 0x33, 0x37, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7839,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7840,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x30, 0x30, 0x32, 0x31, 0x33, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7841,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7842,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7843,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7844,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7845,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7846,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7847,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7848,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7849,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x37, 0x35, 0x38, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7850,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7851,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7852,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7853,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7854,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7855,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7856,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7857,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7858,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7859,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7860,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x37, 0x35, 0x34, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7861,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7862,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7863,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7864,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7865,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7866,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7867,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7868,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7869,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x30, 0x32, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7870,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7871,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7872,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7873,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7874,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7875,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7876,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7877,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7878,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x30, 0x37, 0x30, 0x30, 0x32, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7879,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7880,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x30, 0x32, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7881,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7882,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7883,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7884,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7885,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7886,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7887,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7888,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7889,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7890,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7891,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7892,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7893,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7894,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7895,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7896,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x30, 0x32, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7897,64,"style","Trailing whitespace is superfluous."," 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7898,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7899,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, 0x35, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7900,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7901,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7902,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7903,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7904,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7905,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7906,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7907,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7908,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7909,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7910,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x54, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7911,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3a, 0x34, 0x38, 0x3a, 0x32, 0x33, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7912,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7913,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7914,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7915,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7916,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7917,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7918,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7919,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7920,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7921,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7922,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7923,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7924,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7925,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7926,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7927,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7928,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7929,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7930,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7931,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x30, 0x36, 0x32, 0x36, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7932,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7933,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7934,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7935,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7936,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7937,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7938,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7939,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7940,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7941,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7942,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7943,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7944,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7945,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7946,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7947,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7948,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7949,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7950,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7951,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7952,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7953,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7954,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7955,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7956,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7957,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7958,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x30, 0x36, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7959,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7960,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7961,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7962,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7963,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7964,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7965,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7966,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7967,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7968,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x36, 0x30, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7969,64,"style","Trailing whitespace is superfluous."," 0x36, 0x32, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7970,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7971,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x32, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7972,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7973,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7974,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7975,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7976,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7977,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7978,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7979,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7980,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x31, 0x31, 0x39, 0x31, 0x38, 0x39, 0x31, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7981,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7982,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7983,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7984,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7985,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7986,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7987,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7988,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7989,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7990,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7991,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7992,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7993,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7994,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7995,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7996,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7997,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7998,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7999,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8000,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x32, 0x30, 0x36, 0x32, 0x36, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8001,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8002,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8003,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8004,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8005,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8006,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8007,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8008,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8009,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x32, 0x30, 0x36, 0x32, 0x36, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8010,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8011,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x32, 0x30, 0x36, 0x32, 0x36, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8012,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8013,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8014,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8015,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8016,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8017,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8018,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8019,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8020,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8021,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8022,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x36, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8023,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8024,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8025,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8026,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8027,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x30, 0x36, 0x32, 0x36, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8028,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8029,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8030,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x37, 0x34, 0x36, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8031,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8032,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8033,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8034,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8035,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8036,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8037,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8038,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8039,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8040,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x36, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8041,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x36, 0x54, 0x32, 0x31, 0x3a, 0x34, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8042,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8043,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8044,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8045,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8046,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8047,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8048,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8049,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8050,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8051,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8052,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8053,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8054,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8055,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8056,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8057,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8058,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8059,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8060,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8061,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, 0x35, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8062,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8063,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8064,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8065,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8066,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8067,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8068,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8069,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8070,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8071,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8072,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8073,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8074,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8075,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8076,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8077,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8078,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8079,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8080,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8081,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8082,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8083,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8084,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8085,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8086,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8087,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8088,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8089,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8090,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8091,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8092,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8093,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8094,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8095,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8096,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8097,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8098,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8099,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x36, 0x30, 0x31, 0x35, 0x32, 0x39, 0x31, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8100,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8101,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, 0x35, 0x32, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8102,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8103,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8104,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8105,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8106,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8107,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8108,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8109,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8110,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x36, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8111,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x36, 0x39, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8112,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8113,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8114,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8115,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8116,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8117,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8118,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8119,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8120,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8121,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x35, 0x36, 0x20, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8122,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8123,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8124,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8125,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8126,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8127,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8128,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8129,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8130,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8131,64,"style","Trailing whitespace is superfluous."," 0x35, 0x32, 0x39, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8132,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8133,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8134,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8135,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8136,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8137,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8138,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8139,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x36, 0x30, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8140,64,"style","Trailing whitespace is superfluous."," 0x32, 0x39, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8141,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8142,64,"style","Trailing whitespace is superfluous."," 0x35, 0x32, 0x39, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8143,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8144,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8145,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8146,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8147,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8148,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8149,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8150,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8151,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8152,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8153,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8154,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8155,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8156,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8157,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8158,64,"style","Trailing whitespace is superfluous."," 0x32, 0x39, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8159,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8160,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8161,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8162,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8163,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8164,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8165,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8166,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8167,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8168,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8169,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8170,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8171,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x36, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8172,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x36, 0x3a, 0x34, 0x34, 0x3a, 0x30, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8173,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8174,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8175,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8176,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8177,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8178,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8179,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8180,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8181,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8182,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8183,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8184,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8185,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8186,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8187,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8188,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8189,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8190,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8191,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8192,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x31, 0x31, 0x34, 0x30, 0x31, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8193,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8194,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8195,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8196,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8197,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8198,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8199,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8200,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8201,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8202,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8203,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8204,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8205,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8206,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8207,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8208,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8209,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8210,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8211,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8212,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8213,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8214,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8215,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8216,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8217,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8218,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8219,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x36, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8220,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x31, 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8221,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8222,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8223,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8224,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8225,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8226,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8227,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8228,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8229,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x36, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8230,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x34, 0x30, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8231,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8232,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x34, 0x30, 0x31, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8233,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8234,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8235,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8236,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8237,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8238,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8239,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8240,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8241,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x36, 0x38, 0x39, 0x38, 0x32, 0x38, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8242,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8243,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8244,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8245,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8246,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8247,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8248,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8249,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8250,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8251,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8252,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8253,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8254,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8255,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8256,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8257,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8258,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8259,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8260,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8261,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8262,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8263,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8264,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8265,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8266,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8267,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8268,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8269,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8270,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8271,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x30, 0x36, 0x30, 0x31, 0x31, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8272,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8273,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8274,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8275,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8276,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8277,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8278,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8279,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8280,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8281,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8282,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8283,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8284,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x36, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8285,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x31, 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8286,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8287,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8288,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8289,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, 0x31, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8290,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8291,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8292,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8293,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8294,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8295,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8296,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8297,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8298,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8299,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8300,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8301,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8302,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8303,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8304,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x36, 0x2d, 0x30, 0x36, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8305,64,"style","Trailing whitespace is superfluous."," 0x39, 0x54, 0x32, 0x31, 0x3a, 0x34, 0x34, 0x3a, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8306,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8307,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8308,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8309,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8310,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8311,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8312,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8313,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8314,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8315,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8316,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8317,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8318,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8319,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8320,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8321,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8322,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8323,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8324,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8325,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x2d, 0x30, 0x30, 0x32, 0x30, 0x37, 0x39, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8326,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8327,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8328,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8329,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8330,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8331,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8332,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8333,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8334,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8335,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8336,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8337,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8338,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8339,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8340,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8341,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8342,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8343,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8344,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8345,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8346,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8347,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8348,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8349,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8350,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8351,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8352,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8353,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8354,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8355,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8356,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8357,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8358,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8359,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8360,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8361,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8362,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8363,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x30, 0x37, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8364,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8365,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x32, 0x30, 0x37, 0x39, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8366,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8367,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8368,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8369,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8370,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8371,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8372,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8373,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8374,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x36, 0x35, 0x38, 0x36, 0x37, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8375,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8376,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8377,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8378,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8379,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8380,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8381,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8382,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8383,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8384,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8385,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8386,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8387,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8388,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8389,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8390,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8391,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8392,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8393,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8394,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x30, 0x32, 0x30, 0x37, 0x39, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8395,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8396,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8397,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8398,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8399,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8400,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8401,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8402,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8403,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x30, 0x32, 0x30, 0x37, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8404,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8405,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x30, 0x32, 0x30, 0x37, 0x39, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8406,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8407,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8408,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8409,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8410,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8411,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8412,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8413,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8414,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8415,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8416,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x36, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8417,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8418,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8419,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8420,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8421,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x32, 0x30, 0x37, 0x39, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8422,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8423,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8424,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8425,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8426,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8427,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8428,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8429,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8430,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8431,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8432,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8433,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8434,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x30, 0x36, 0x2d, 0x30, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8435,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x54, 0x31, 0x39, 0x3a, 0x30, 0x37, 0x3a, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8436,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8437,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8438,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8439,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8440,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8441,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8442,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8443,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8444,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8445,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8446,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8447,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8448,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8449,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8450,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8451,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8452,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8453,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8454,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8455,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x38, 0x35, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8456,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8457,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8458,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8459,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8460,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8461,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8462,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8463,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8464,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8465,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8466,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8467,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8468,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8469,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8470,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8471,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8472,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8473,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8474,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8475,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8476,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8477,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8478,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8479,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8480,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8481,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8482,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8483,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8484,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8485,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8486,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8487,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8488,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8489,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8490,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8491,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8492,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8493,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x38, 0x35, 0x33, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8494,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8495,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x30, 0x38, 0x35, 0x33, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8496,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8497,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8498,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8499,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8500,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8501,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8502,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8503,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8504,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x35, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8505,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8506,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8507,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8508,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8509,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8510,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8511,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8512,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8513,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8514,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8515,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x36, 0x36, 0x38, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8516,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8517,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8518,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8519,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8520,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8521,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8522,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8523,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8524,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8525,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8526,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8527,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8528,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8529,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8530,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8531,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8532,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8533,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x30, 0x35, 0x30, 0x30, 0x30, 0x38, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8534,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8535,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8536,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8537,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8538,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8539,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8540,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8541,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8542,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8543,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8544,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8545,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8546,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8547,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x31, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8548,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8549,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8550,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8551,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x38, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8552,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8553,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8554,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x36, 0x36, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8555,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8556,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8557,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8558,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8559,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8560,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8561,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8562,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8563,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8564,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8565,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x30, 0x54, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8566,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x34, 0x39, 0x3a, 0x32, 0x30, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8567,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8568,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8569,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8570,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8571,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8572,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8573,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8574,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8575,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8576,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8577,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8578,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8579,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8580,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8581,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8582,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8583,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8584,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8585,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8586,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x34, 0x36, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8587,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8588,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8589,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8590,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8591,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8592,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8593,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8594,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8595,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8596,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8597,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8598,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8599,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8600,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8601,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8602,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8603,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8604,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8605,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8606,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8607,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8608,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8609,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8610,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8611,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8612,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8613,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8614,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8615,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8616,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8617,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8618,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8619,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8620,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8621,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8622,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8623,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8624,64,"style","Trailing whitespace is superfluous."," 0x35, 0x34, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8625,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8626,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x34, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8627,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8628,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8629,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8630,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8631,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8632,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8633,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8634,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8635,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x39, 0x39, 0x36, 0x30, 0x33, 0x36, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8636,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8637,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8638,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8639,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8640,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8641,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8642,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8643,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8644,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8645,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8646,64,"style","Trailing whitespace is superfluous."," 0x38, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8647,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8648,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8649,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8650,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8651,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8652,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8653,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8654,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8655,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x35, 0x34, 0x36, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8656,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8657,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8658,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8659,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8660,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8661,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8662,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8663,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8664,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x34, 0x36, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8665,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8666,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x35, 0x34, 0x36, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8667,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8668,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8669,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8670,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8671,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8672,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8673,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8674,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8675,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8676,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8677,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8678,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8679,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8680,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8681,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8682,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x34, 0x36, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8683,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8684,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8685,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x38, 0x38, 0x38, 0x20, 0x4b, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8686,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8687,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8688,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8689,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8690,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8691,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8692,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8693,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8694,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8695,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8696,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x33, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x31, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8697,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8698,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8699,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8700,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8701,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8702,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8703,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8704,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8705,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8706,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8707,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8708,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8709,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8710,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8711,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8712,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8713,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8714,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8715,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8716,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8717,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8718,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8719,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8720,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8721,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8722,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8723,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8724,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8725,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8726,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8727,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8728,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8729,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8730,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8731,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8732,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8733,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8734,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8735,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8736,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8737,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8738,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8739,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8740,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8741,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8742,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8743,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8744,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x37, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8745,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8746,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8747,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8748,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8749,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8750,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8751,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8752,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8753,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8754,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x30, 0x30, 0x30, 0x34, 0x30, 0x36, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8755,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8756,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x34, 0x30, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8757,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8758,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8759,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8760,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8761,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8762,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8763,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8764,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8765,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x35, 0x38, 0x38, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8766,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8767,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8768,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8769,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8770,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8771,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8772,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8773,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8774,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8775,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8776,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8777,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8778,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8779,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8780,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8781,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8782,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8783,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8784,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8785,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8786,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8787,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x34, 0x30, 0x36, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8788,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8789,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8790,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8791,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8792,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8793,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8794,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8795,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8796,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x30, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8797,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8798,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x34, 0x30, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8799,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8800,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8801,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8802,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8803,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8804,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8805,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8806,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8807,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8808,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8809,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x37, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8810,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8811,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8812,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8813,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8814,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8815,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8816,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8817,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8818,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8819,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8820,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8821,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8822,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8823,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8824,64,"style","Trailing whitespace is superfluous."," 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8825,64,"style","Trailing whitespace is superfluous."," 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8826,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8827,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8828,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8829,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x37, 0x54, 0x31, 0x35, 0x3a, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8830,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x32, 0x38, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8831,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8832,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8833,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8834,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8835,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8836,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8837,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8838,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8839,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8840,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8841,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8842,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8843,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8844,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8845,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8846,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8847,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8848,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8849,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8850,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8851,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8852,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8853,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8854,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8855,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8856,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8857,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8858,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8859,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8860,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8861,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8862,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8863,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8864,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8865,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8866,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8867,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8868,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8869,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8870,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8871,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8872,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8873,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8874,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8875,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8876,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8877,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8878,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8879,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8880,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8881,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8882,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8883,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8884,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8885,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8886,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8887,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x35, 0x30, 0x30, 0x31, 0x39, 0x31, 0x33, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8888,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8889,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x31, 0x39, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8890,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8891,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8892,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8893,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8894,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8895,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8896,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8897,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8898,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x35, 0x35, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8899,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x37, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8900,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8901,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8902,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8903,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8904,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8905,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8906,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8907,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8908,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8909,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x35, 0x33, 0x34, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8910,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8911,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8912,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8913,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8914,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8915,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8916,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8917,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8918,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8919,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x33, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8920,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8921,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8922,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8923,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8924,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8925,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8926,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8927,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x30, 0x35, 0x30, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8928,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8929,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8930,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8931,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8932,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8933,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8934,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8935,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8936,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8937,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8938,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8939,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8940,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8941,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8942,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8943,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8944,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8945,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8946,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8947,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8948,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x35, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8949,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8950,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8951,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8952,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8953,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8954,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8955,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8956,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8957,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8958,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8959,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x32, 0x54, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8960,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x3a, 0x35, 0x31, 0x3a, 0x31, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8961,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8962,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8963,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8964,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8965,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8966,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8967,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8968,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8969,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8970,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8971,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8972,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8973,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8974,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8975,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8976,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8977,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8978,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8979,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8980,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x36, 0x32, 0x37, 0x30, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8981,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8982,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8983,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8984,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8985,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8986,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8987,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8988,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8989,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8990,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8991,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8992,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8993,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8994,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8995,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8996,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8997,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8998,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8999,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9000,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9001,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9002,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9003,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9004,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9005,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9006,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9007,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x34, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9008,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9009,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9010,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9011,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9012,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9013,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9014,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9015,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9016,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9017,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x34, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9018,64,"style","Trailing whitespace is superfluous."," 0x36, 0x32, 0x37, 0x30, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9019,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9020,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x32, 0x37, 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9021,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9022,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9023,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9024,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9025,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9026,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9027,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9028,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9029,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x34, 0x31, 0x31, 0x31, 0x36, 0x38, 0x33, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9030,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9031,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9032,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9033,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9034,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9035,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9036,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9037,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9038,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9039,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9040,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x39, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9041,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9042,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9043,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9044,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9045,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9046,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9047,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9048,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9049,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x2d, 0x30, 0x31, 0x36, 0x32, 0x37, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9050,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9051,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9052,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9053,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9054,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9055,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9056,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9057,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9058,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x30, 0x31, 0x36, 0x32, 0x37, 0x30, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9059,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9060,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x2d, 0x30, 0x31, 0x36, 0x32, 0x37, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9061,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9062,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9063,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9064,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9065,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9066,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9067,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9068,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9069,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9070,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9071,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x30, 0x34, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9072,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9073,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9074,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9075,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9076,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x31, 0x36, 0x32, 0x37, 0x30, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9077,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9078,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9079,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x35, 0x31, 0x39, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9080,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9081,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9082,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9083,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9084,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9085,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9086,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9087,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9088,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9089,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9090,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x33, 0x54, 0x31, 0x36, 0x3a, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9091,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x31, 0x32, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9092,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9093,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9094,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9095,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9096,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9097,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9098,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9099,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9100,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9101,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9102,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9103,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9104,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9105,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9106,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9107,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9108,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9109,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9110,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9111,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9112,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9113,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9114,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9115,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9116,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9117,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9118,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9119,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9120,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9121,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9122,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9123,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9124,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9125,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9126,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9127,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9128,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9129,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9130,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9131,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9132,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9133,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9134,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9135,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9136,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x33, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9137,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9138,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9139,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9140,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9141,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9142,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9143,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9144,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9145,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9146,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x30, 0x31, 0x31, 0x31, 0x32, 0x34, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9147,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9148,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x2d, 0x30, 0x31, 0x31, 0x31, 0x32, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9149,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9150,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9151,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9152,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9153,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9154,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9155,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9156,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9157,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x34, 0x39, 0x34, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9158,64,"style","Trailing whitespace is superfluous."," 0x36, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9159,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9160,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9161,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9162,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9163,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9164,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9165,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9166,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9167,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9168,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9169,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9170,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9171,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9172,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9173,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9174,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9175,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9176,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9177,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x31, 0x31, 0x31, 0x32, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9178,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9179,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9180,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9181,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9182,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9183,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9184,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9185,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9186,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x34, 0x30, 0x31, 0x31, 0x31, 0x32, 0x34, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9187,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9188,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x31, 0x31, 0x31, 0x32, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9189,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9190,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9191,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9192,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9193,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9194,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9195,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9196,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9197,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9198,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9199,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x30, 0x34, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9200,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9201,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9202,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9203,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9204,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x2d, 0x30, 0x31, 0x31, 0x31, 0x32, 0x34, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9205,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9206,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9207,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9208,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9209,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9210,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9211,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9212,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9213,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9214,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9215,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9216,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9217,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9218,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x33, 0x54, 0x31, 0x33, 0x3a, 0x33, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9219,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x31, 0x35, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9220,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9221,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9222,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9223,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9224,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9225,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9226,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9227,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9228,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9229,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9230,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9231,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9232,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9233,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9234,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9235,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9236,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9237,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9238,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9239,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9240,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9241,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9242,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9243,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9244,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9245,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9246,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9247,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9248,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9249,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9250,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9251,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9252,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9253,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9254,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9255,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9256,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9257,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9258,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9259,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9260,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9261,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9262,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9263,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9264,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x34, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9265,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9266,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9267,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9268,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9269,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9270,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9271,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9272,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9273,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9274,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x30, 0x31, 0x30, 0x34, 0x36, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9275,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9276,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x30, 0x31, 0x30, 0x34, 0x36, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9277,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9278,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9279,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9280,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9281,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9282,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9283,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9284,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9285,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x34, 0x38, 0x35, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9286,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9287,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9288,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9289,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9290,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9291,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9292,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9293,64,"style","Trailing whitespace is superfluous."," 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9294,64,"style","Trailing whitespace is superfluous."," 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9295,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9296,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9297,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9298,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9299,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9300,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9301,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9302,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9303,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9304,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9305,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9306,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9307,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9308,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9309,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9310,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9311,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9312,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9313,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9314,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9315,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, 0x34, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9316,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9317,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9318,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9319,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9320,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9321,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9322,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9323,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9324,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9325,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9326,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9327,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9328,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9329,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x34, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9330,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9331,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9332,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9333,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9334,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9335,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9336,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9337,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9338,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9339,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9340,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9341,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9342,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9343,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9344,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9345,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9346,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9347,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9348,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x34, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9349,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x54, 0x31, 0x37, 0x3a, 0x32, 0x31, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9350,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9351,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9352,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9353,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9354,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9355,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9356,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9357,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9358,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9359,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9360,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9361,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9362,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9363,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9364,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9365,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9366,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9367,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9368,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9369,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9370,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9371,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9372,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9373,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9374,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9375,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9376,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9377,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9378,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9379,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9380,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9381,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9382,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9383,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9384,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9385,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9386,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9387,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9388,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9389,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9390,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9391,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9392,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9393,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9394,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9395,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x31, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9396,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9397,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9398,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9399,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9400,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9401,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9402,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9403,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9404,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9405,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x32, 0x33, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9406,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9407,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x35, 0x32, 0x33, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9408,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9409,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9410,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9411,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9412,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9413,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9414,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9415,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9416,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x34, 0x35, 0x38, 0x31, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9417,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9418,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9419,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9420,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9421,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9422,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9423,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9424,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9425,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9426,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9427,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x39, 0x34, 0x38, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9428,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9429,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9430,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9431,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9432,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9433,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9434,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9435,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9436,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x32, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9437,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9438,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9439,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9440,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9441,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9442,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9443,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9444,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9445,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x34, 0x30, 0x30, 0x30, 0x35, 0x32, 0x33, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9446,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9447,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x32, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9448,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9449,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9450,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9451,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9452,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9453,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9454,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9455,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9456,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9457,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9458,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x30, 0x34, 0x2d, 0x30, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9459,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9460,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9461,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9462,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9463,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x32, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9464,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9465,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9466,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x39, 0x34, 0x38, 0x20, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9467,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9468,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9469,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9470,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9471,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9472,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9473,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9474,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9475,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9476,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9477,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x30, 0x54, 0x31, 0x33, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9478,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x3a, 0x32, 0x38, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9479,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9480,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9481,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9482,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9483,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9484,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9485,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9486,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9487,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9488,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9489,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9490,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9491,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9492,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9493,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9494,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9495,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9496,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9497,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9498,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x34, 0x35, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9499,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9500,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9501,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9502,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9503,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9504,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9505,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9506,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9507,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9508,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9509,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9510,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9511,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9512,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9513,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9514,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9515,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9516,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9517,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9518,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9519,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9520,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9521,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9522,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9523,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x37, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9524,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9525,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9526,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9527,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9528,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9529,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9530,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9531,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9532,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9533,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x33, 0x30, 0x30, 0x35, 0x37, 0x34, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9534,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9535,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x37, 0x34, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9536,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9537,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9538,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9539,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9540,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9541,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9542,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9543,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9544,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x33, 0x39, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9545,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9546,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9547,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9548,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9549,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9550,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9551,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9552,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9553,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9554,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9555,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9556,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9557,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9558,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9559,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9560,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9561,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9562,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9563,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9564,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x37, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9565,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9566,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9567,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9568,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9569,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9570,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9571,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9572,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9573,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x30, 0x33, 0x30, 0x30, 0x35, 0x37, 0x34, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9574,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9575,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x37, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9576,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9577,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9578,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9579,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9580,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9581,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9582,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9583,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9584,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9585,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9586,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x33, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9587,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9588,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9589,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9590,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9591,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x37, 0x34, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9592,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9593,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9594,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x33, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9595,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9596,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9597,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9598,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9599,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9600,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9601,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9602,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9603,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9604,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x33, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9605,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x37, 0x54, 0x31, 0x35, 0x3a, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9606,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3a, 0x30, 0x35, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9607,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9608,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9609,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9610,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9611,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9612,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9613,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9614,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9615,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9616,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9617,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9618,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9619,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9620,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9621,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9622,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9623,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9624,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9625,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9626,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x37, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9627,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9628,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9629,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9630,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9631,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9632,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9633,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9634,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9635,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9636,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9637,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9638,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9639,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9640,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9641,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9642,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9643,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9644,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9645,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9646,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9647,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9648,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9649,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9650,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9651,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x31, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9652,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9653,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9654,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9655,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9656,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9657,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9658,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9659,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9660,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9661,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x30, 0x30, 0x34, 0x32, 0x35, 0x37, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9662,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9663,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x2d, 0x30, 0x30, 0x34, 0x32, 0x35, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9664,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9665,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9666,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9667,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9668,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9669,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9670,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9671,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9672,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x33, 0x38, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9673,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9674,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9675,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9676,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9677,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9678,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9679,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9680,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9681,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9682,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9683,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x34, 0x39, 0x38, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9684,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9685,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9686,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9687,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9688,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9689,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9690,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9691,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9692,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9693,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9694,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9695,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9696,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9697,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9698,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9699,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9700,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9701,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x30, 0x33, 0x30, 0x30, 0x34, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9702,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9703,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9704,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9705,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9706,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9707,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9708,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9709,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9710,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9711,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9712,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9713,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9714,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9715,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x31, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9716,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9717,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9718,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9719,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x34, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9720,64,"style","Trailing whitespace is superfluous."," 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9721,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9722,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x34, 0x39, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9723,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9724,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9725,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9726,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9727,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9728,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9729,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9730,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9731,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9732,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9733,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x31, 0x54, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9734,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3a, 0x30, 0x36, 0x3a, 0x34, 0x37, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9735,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9736,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9737,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9738,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9739,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9740,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9741,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9742,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9743,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9744,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9745,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9746,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9747,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9748,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9749,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9750,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9751,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9752,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9753,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9754,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x39, 0x33, 0x39, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9755,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9756,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9757,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9758,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9759,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9760,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9761,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9762,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9763,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9764,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9765,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9766,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9767,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9768,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9769,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9770,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9771,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9772,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9773,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9774,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9775,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9776,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9777,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9778,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9779,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x33, 0x2d, 0x30, 0x36, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9780,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9781,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9782,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9783,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9784,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9785,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9786,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9787,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9788,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9789,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x30, 0x33, 0x30, 0x30, 0x32, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9790,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9791,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x32, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9792,64,"style","Trailing whitespace is superfluous."," 0x33, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9793,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9794,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9795,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9796,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9797,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9798,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9799,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9800,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9801,64,"style","Trailing whitespace is superfluous."," 0x37, 0x33, 0x39, 0x35, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9802,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9803,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9804,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9805,64,"style","Trailing whitespace is superfluous."," 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9806,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9807,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9808,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9809,64,"style","Trailing whitespace is superfluous."," 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9810,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9811,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9812,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9813,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9814,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9815,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9816,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9817,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9818,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9819,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9820,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9821,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9822,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x30, 0x32, 0x39, 0x33, 0x39, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9823,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9824,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9825,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9826,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9827,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9828,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9829,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9830,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9831,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x30, 0x32, 0x39, 0x33, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9832,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9833,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x30, 0x32, 0x39, 0x33, 0x39, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9834,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9835,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9836,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9837,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9838,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9839,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9840,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9841,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9842,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9843,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9844,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x33, 0x2d, 0x30, 0x36, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9845,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9846,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9847,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9848,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9849,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x32, 0x39, 0x33, 0x39, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9850,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9851,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9852,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9853,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9854,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9855,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9856,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9857,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9858,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9859,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9860,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9861,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9862,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9863,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9864,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x36, 0x2d, 0x31, 0x30, 0x54, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9865,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x31, 0x35, 0x3a, 0x35, 0x38, 0x2d, 0x30, 0x34, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9866,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9867,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9868,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9869,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9870,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9871,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9872,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9873,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9874,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9875,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9876,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9877,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9878,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9879,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9880,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9881,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9882,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9883,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9884,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9885,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x36, 0x39, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9886,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9887,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9888,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9889,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9890,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9891,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9892,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9893,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9894,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9895,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9896,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9897,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9898,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9899,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9900,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9901,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9902,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9903,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9904,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9905,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9906,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9907,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9908,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9909,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9910,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x33, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x31, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9911,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9912,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9913,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9914,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9915,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9916,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9917,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9918,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9919,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9920,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x30, 0x33, 0x30, 0x30, 0x30, 0x36, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9921,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9922,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9923,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9924,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9925,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9926,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9927,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9928,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9929,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9930,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9931,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x33, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9932,64,"style","Trailing whitespace is superfluous."," 0x34, 0x39, 0x35, 0x39, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9933,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9934,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9935,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9936,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9937,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9938,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9939,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9940,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9941,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9942,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9943,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9944,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9945,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9946,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9947,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9948,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9949,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9950,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9951,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9952,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9953,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9954,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9955,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9956,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9957,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9958,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9959,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9960,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x30, 0x33, 0x30, 0x30, 0x30, 0x36, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9961,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9962,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9963,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9964,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9965,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9966,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9967,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9968,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9969,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9970,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9971,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9972,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9973,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9974,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x31, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9975,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9976,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9977,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9978,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9979,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9980,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9981,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9982,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9983,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9984,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9985,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9986,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9987,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9988,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9989,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9990,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9991,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9992,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x31, 0x54, 0x31, 0x33, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9993,64,"style","Trailing whitespace is superfluous."," 0x34, 0x33, 0x3a, 0x32, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9994,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9995,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9996,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9997,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9998,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9999,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10000,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10001,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10002,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10003,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10004,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10005,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10006,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10007,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10008,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10009,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10010,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10011,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10012,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10013,64,"style","Trailing whitespace is superfluous."," 0x34, 0x39, 0x36, 0x30, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10014,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10015,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10016,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10017,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10018,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10019,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10020,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10021,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10022,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10023,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10024,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10025,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10026,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10027,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10028,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10029,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10030,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10031,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10032,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10033,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10034,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10035,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10036,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10037,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10038,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10039,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10040,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10041,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10042,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10043,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10044,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10045,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10046,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10047,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10048,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x32, 0x30, 0x30, 0x34, 0x39, 0x36, 0x30, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10049,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10050,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, 0x34, 0x39, 0x36, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10051,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10052,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10053,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10054,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10055,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10056,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10057,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10058,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10059,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x32, 0x38, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10060,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x34, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10061,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10062,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10063,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10064,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10065,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10066,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10067,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10068,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10069,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10070,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x39, 0x30, 0x32, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10071,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10072,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10073,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10074,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10075,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10076,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10077,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10078,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10079,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10080,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x30, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10081,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10082,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10083,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10084,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10085,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10086,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10087,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10088,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x30, 0x32, 0x30, 0x30, 0x34, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10089,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10090,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10091,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10092,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10093,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10094,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10095,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10096,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10097,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10098,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10099,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10100,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10101,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10102,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10103,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10104,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10105,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10106,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, 0x34, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10107,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10108,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10109,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x39, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10110,64,"style","Trailing whitespace is superfluous."," 0x32, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10111,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10112,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10113,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10114,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10115,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10116,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10117,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10118,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10119,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10120,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x38, 0x54, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10121,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x3a, 0x35, 0x31, 0x3a, 0x34, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10122,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10123,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10124,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10125,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10126,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10127,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10128,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10129,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10130,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10131,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10132,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10133,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10134,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10135,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10136,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10137,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10138,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10139,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10140,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x32, 0x31, 0x34, 0x30, 0x38, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10141,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x30, 0x37, 0x32, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10142,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10143,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10144,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10145,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10146,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10147,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10148,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10149,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10150,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10151,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10152,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10153,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10154,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10155,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10156,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10157,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10158,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10159,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10160,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10161,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10162,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10163,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10164,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10165,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10166,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x32, 0x2d, 0x30, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10167,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10168,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10169,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10170,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10171,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10172,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10173,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10174,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10175,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10176,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x30, 0x38, 0x30, 0x32, 0x30, 0x31, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10177,64,"style","Trailing whitespace is superfluous."," 0x32, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x32, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10178,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10179,64,"style","Trailing whitespace is superfluous."," 0x37, 0x32, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10180,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10181,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10182,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10183,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10184,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10185,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10186,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10187,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10188,64,"style","Trailing whitespace is superfluous."," 0x32, 0x37, 0x33, 0x31, 0x32, 0x38, 0x33, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10189,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10190,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10191,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10192,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10193,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10194,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10195,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10196,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10197,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10198,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10199,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10200,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10201,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10202,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10203,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10204,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10205,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10206,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10207,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x30, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10208,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x32, 0x34, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10209,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10210,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10211,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10212,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10213,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10214,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10215,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10216,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x34, 0x30, 0x38, 0x30, 0x32, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10217,64,"style","Trailing whitespace is superfluous."," 0x37, 0x32, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10218,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x30, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10219,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x32, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10220,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10221,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10222,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10223,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10224,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10225,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10226,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10227,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10228,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10229,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10230,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x33, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10231,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10232,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10233,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x30, 0x32, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10234,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10235,64,"style","Trailing whitespace is superfluous."," 0x37, 0x32, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10236,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10237,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10238,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10239,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10240,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10241,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10242,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10243,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10244,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10245,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10246,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10247,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10248,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x33, 0x54, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10249,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3a, 0x32, 0x35, 0x3a, 0x30, 0x38, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10250,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10251,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10252,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10253,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10254,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10255,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10256,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10257,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10258,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10259,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10260,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10261,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10262,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10263,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10264,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10265,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10266,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10267,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10268,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x30, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10269,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x38, 0x37, 0x37, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10270,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10271,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10272,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10273,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10274,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10275,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10276,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10277,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10278,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10279,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10280,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10281,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10282,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10283,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10284,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10285,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10286,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10287,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10288,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10289,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10290,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10291,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10292,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10293,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10294,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10295,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10296,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10297,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10298,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10299,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10300,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10301,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10302,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10303,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10304,64,"style","Trailing whitespace is superfluous."," 0x38, 0x37, 0x30, 0x30, 0x32, 0x30, 0x30, 0x32, 0x38, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10305,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10306,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10307,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10308,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10309,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10310,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10311,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10312,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10313,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10314,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10315,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10316,64,"style","Trailing whitespace is superfluous."," 0x36, 0x39, 0x31, 0x38, 0x32, 0x33, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10317,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10318,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10319,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10320,64,"style","Trailing whitespace is superfluous."," 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10321,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10322,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10323,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10324,64,"style","Trailing whitespace is superfluous."," 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10325,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10326,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10327,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10328,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x39, 0x30, 0x30, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10329,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10330,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10331,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10332,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10333,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10334,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10335,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10336,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10337,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, 0x32, 0x38, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10338,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10339,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10340,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10341,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10342,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10343,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10344,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10345,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10346,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x30, 0x30, 0x32, 0x38, 0x37, 0x37, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10347,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10348,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, 0x32, 0x38, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10349,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10350,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10351,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10352,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10353,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10354,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10355,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10356,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10357,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10358,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10359,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10360,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10361,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10362,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10363,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10364,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x30, 0x32, 0x38, 0x37, 0x37, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10365,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10366,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10367,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x39, 0x30, 0x30, 0x20, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10368,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10369,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10370,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10371,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10372,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10373,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10374,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10375,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10376,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10377,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10378,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10379,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x2d, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10380,64,"style","Trailing whitespace is superfluous."," 0x38, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x36, 0x3a, 0x32, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10381,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10382,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10383,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10384,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10385,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10386,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10387,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10388,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10389,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10390,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10391,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10392,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10393,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10394,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10395,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10396,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10397,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10398,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10399,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10400,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x38, 0x39, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10401,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10402,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10403,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10404,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10405,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10406,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10407,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10409,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10410,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10411,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10412,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10413,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10414,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10415,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10416,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10417,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10418,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10419,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10420,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10421,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10422,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10423,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10424,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10425,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x32, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10426,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10427,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10428,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10429,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10430,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10431,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10432,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10433,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10434,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10435,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x30, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10436,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10437,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10438,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x36, 0x38, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10439,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10440,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10441,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10442,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10443,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10444,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10445,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10446,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10447,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x32, 0x35, 0x34, 0x38, 0x38, 0x31, 0x36, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10448,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10449,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10450,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10451,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10452,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10453,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10454,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10455,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10456,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10457,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10458,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10459,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10460,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10461,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10462,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10463,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10464,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10465,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10466,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10467,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x38, 0x39, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10468,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10469,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10470,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10471,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10472,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10473,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10474,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10475,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10476,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x30, 0x36, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10477,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10478,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x38, 0x39, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10479,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10480,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10481,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10482,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10483,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10484,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10485,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10486,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10487,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10488,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10489,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x32, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10490,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10491,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10492,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10493,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10494,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x36, 0x38, 0x39, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10495,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10496,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10497,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x31, 0x35, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10498,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10499,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10500,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10501,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10502,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10503,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10504,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10505,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10506,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10507,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10508,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x31, 0x34, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10509,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10510,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10511,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10512,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10513,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10514,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10515,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10516,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10517,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10518,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10519,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10520,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10521,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10522,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10523,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10524,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10525,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10526,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10527,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10528,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10529,64,"style","Trailing whitespace is superfluous."," 0x32, 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10530,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10531,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10532,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10533,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10534,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10535,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10536,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10537,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10538,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10539,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10540,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10541,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10542,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10543,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10544,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10545,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10546,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10547,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10548,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10549,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10550,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10551,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10552,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10553,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10554,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10555,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10556,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10557,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10558,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10559,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10560,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10561,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10562,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10563,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10564,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x30, 0x32, 0x38, 0x32, 0x32, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10565,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10566,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x35, 0x30, 0x32, 0x38, 0x32, 0x32, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10567,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10568,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10569,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10570,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10571,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10572,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10573,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10574,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10575,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x31, 0x37, 0x38, 0x38, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10576,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10577,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10578,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10579,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10580,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10581,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10582,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10583,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10584,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10585,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10586,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x39, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10587,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10588,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10589,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10590,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10591,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10592,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10593,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10594,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10595,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x32, 0x38, 0x32, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10596,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10597,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10598,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10599,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10600,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10601,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10602,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10603,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10604,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x35, 0x30, 0x32, 0x38, 0x32, 0x32, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10605,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10606,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x32, 0x38, 0x32, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10607,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10608,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10609,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10610,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10611,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10612,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10613,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10614,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10615,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10616,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10617,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x30, 0x31, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10618,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10619,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10620,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10621,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10622,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x35, 0x30, 0x32, 0x38, 0x32, 0x32, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10623,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10624,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10625,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x36, 0x20, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10626,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10627,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10628,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10629,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10630,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10631,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10632,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10633,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10634,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10635,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10636,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x54, 0x30, 0x30, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10637,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10638,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10639,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10640,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10641,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10642,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10643,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10644,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10645,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10646,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10647,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10648,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10649,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10650,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10651,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10652,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10653,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10654,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10655,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10656,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x37, 0x30, 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10657,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10658,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10659,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10660,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10661,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10662,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10663,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10664,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10665,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10666,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10667,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10668,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10669,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10670,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10671,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10672,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10673,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10674,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10675,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10676,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10677,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10678,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10679,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10680,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10681,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10682,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10683,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10684,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10685,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10686,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10687,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10688,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10689,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10690,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10691,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10692,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x35, 0x30, 0x31, 0x36, 0x31, 0x31, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10693,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10694,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x31, 0x36, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10695,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10696,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10697,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10698,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10699,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10700,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10701,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10702,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10703,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x37, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10704,64,"style","Trailing whitespace is superfluous."," 0x34, 0x32, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10705,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10706,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10707,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10708,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10709,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10710,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10711,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10712,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10713,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10714,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x38, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10715,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10716,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10717,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10718,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10719,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10720,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10721,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10722,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10723,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10724,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10725,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10726,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10727,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10728,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10729,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10730,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10731,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10732,64,"style","Trailing whitespace is superfluous."," 0x38, 0x37, 0x30, 0x30, 0x31, 0x35, 0x30, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10733,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10734,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10735,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10736,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10737,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10738,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10739,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10740,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10741,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10742,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10743,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10744,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10745,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10746,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10747,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10748,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10749,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10750,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10751,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10752,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10753,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10754,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10755,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10756,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10757,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10758,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10759,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10760,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10761,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10762,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10763,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10764,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x34, 0x54, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10765,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10766,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10767,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10768,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10769,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10770,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10771,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10772,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10773,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10774,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10775,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10776,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10777,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10778,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10779,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10780,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10781,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10782,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10783,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10784,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10785,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x32, 0x35, 0x35, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10786,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10787,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10788,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10789,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10790,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10791,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10792,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10793,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10794,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10795,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10796,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10797,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10798,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10799,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10800,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10801,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10802,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10803,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10804,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10805,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10806,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10807,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10808,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10809,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10810,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x31, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10811,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10812,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10813,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10814,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10815,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10816,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10817,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10818,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10819,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10820,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x30, 0x31, 0x35, 0x30, 0x30, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10821,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10822,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10823,64,"style","Trailing whitespace is superfluous."," 0x35, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10824,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10825,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10826,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10827,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10828,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10829,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10830,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10831,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10832,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x36, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10833,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10834,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10835,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10836,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10837,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10838,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10839,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10840,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10841,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10842,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10843,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10844,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10845,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10846,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10847,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10848,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10849,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10850,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10851,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10852,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10853,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x35, 0x30, 0x30, 0x32, 0x35, 0x35, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10854,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10855,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10856,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10857,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10858,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10859,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10860,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10861,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10862,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x32, 0x35, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10863,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10864,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x35, 0x30, 0x30, 0x32, 0x35, 0x35, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10865,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10866,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10867,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10868,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10869,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10870,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10871,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10872,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10873,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10874,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10875,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x39, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10876,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10877,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10878,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10879,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10880,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x32, 0x35, 0x35, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10881,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10882,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10883,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10884,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10885,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10886,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10887,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10888,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10889,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10890,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10891,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10892,64,"style","Trailing whitespace is superfluous."," 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10893,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10894,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10895,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x39, 0x54, 0x30, 0x30, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10896,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10897,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10898,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10899,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10900,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10901,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10902,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10903,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10904,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10905,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10906,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10907,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10908,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10909,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10910,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10911,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10912,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10913,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10914,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10915,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x31, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10916,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x34, 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10917,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10918,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10919,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10920,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10921,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10922,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10923,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10924,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10925,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10926,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10927,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10928,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10929,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10930,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10931,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10932,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10933,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10934,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10935,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10936,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10937,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10938,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10939,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10940,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10941,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10942,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10943,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10944,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10945,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10946,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10947,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10948,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10949,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10950,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10951,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x30, 0x30, 0x30, 0x31, 0x34, 0x31, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10952,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10953,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x34, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10954,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10955,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10956,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10957,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10958,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10959,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10960,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10961,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10962,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x35, 0x33, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10963,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10964,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10965,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10966,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10967,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10968,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10969,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10970,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10971,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10972,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10973,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x33, 0x37, 0x35, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10974,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10975,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10976,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10977,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10978,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10979,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10980,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10981,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10982,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x31, 0x2d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10983,64,"style","Trailing whitespace is superfluous."," 0x34, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10984,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10985,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10986,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10987,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10988,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10989,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10990,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10991,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x30, 0x31, 0x30, 0x30, 0x30, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10992,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10993,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x31, 0x2d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10994,64,"style","Trailing whitespace is superfluous."," 0x34, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10995,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10996,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10997,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10998,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10999,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11000,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11001,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11002,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11003,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11004,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11005,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x31, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11006,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11007,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11008,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11009,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x31, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11010,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11011,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11012,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x33, 0x37, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11013,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11014,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11015,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11016,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11017,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11018,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11019,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11020,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11021,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11022,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11023,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x33, 0x54, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11024,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11025,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11026,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11027,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11028,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11029,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11030,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11031,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11032,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11033,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11034,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11035,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11036,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11037,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11038,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11039,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11040,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11041,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11042,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11043,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11044,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x33, 0x38, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11045,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11046,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11047,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11048,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11049,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11050,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11051,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11052,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11053,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11054,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11055,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11056,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11057,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11058,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11059,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11060,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11061,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11062,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11063,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11064,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11065,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11066,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11067,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11068,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11069,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11070,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11071,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11072,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11073,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11074,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11075,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11076,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11077,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11078,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11079,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x30, 0x30, 0x30, 0x30, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11080,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11081,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11082,64,"style","Trailing whitespace is superfluous."," 0x33, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11083,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11084,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11085,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11086,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11087,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11088,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11089,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11090,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x37, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11091,64,"style","Trailing whitespace is superfluous."," 0x36, 0x33, 0x35, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11092,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11093,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11094,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11095,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11096,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11097,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11098,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11099,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11100,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11101,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x39, 0x33, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11102,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11103,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11104,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11105,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11106,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11107,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11108,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11109,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11110,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11111,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11112,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11113,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11114,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11115,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11116,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11117,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11118,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11119,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x30, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11120,64,"style","Trailing whitespace is superfluous."," 0x33, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11121,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11122,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11123,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11124,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11125,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11126,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11127,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11128,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11129,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11130,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11131,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11132,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11133,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11134,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11135,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11136,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11137,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11138,64,"style","Trailing whitespace is superfluous."," 0x33, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11139,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11140,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11141,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11142,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11143,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11144,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11145,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11146,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11147,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11148,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11149,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11150,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11151,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x54, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11152,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11153,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11154,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11155,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11156,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11157,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11158,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11159,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11160,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11161,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11162,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11163,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11164,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11165,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11166,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11167,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11168,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11169,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11170,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11171,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11172,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x39, 0x31, 0x36, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11173,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11174,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11175,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11176,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11177,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11178,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11179,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11180,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11181,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11182,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11183,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11184,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11185,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11186,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11187,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11188,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11189,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11190,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11191,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11192,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11193,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11194,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11195,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11196,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11197,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x30, 0x2d, 0x30, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11198,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11199,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11200,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11201,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11202,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11203,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11204,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11205,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11206,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11207,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x30, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11208,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11209,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11210,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11211,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11212,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11213,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11214,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11215,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11216,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11217,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11218,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11219,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x32, 0x37, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11220,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11221,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11222,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11223,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11224,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11225,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11226,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11227,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11228,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11229,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x39, 0x20, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11230,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11231,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11232,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11233,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11234,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11235,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11236,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11237,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11238,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11239,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x31, 0x36, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11240,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11241,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11242,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11243,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11244,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11245,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11246,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11247,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x35, 0x30, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11248,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11249,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11250,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x31, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11251,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11252,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11253,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11254,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11255,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11256,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11257,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11258,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11259,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11260,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11261,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11262,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11263,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11264,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11265,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11266,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11267,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11268,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11269,64,"style","Trailing whitespace is superfluous."," 0x34, 0x39, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11270,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11271,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11272,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11273,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11274,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11275,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11276,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11277,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11278,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11279,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x30, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11280,64,"style","Trailing whitespace is superfluous."," 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11281,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11282,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11283,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11284,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11285,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11286,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11287,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11288,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11289,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11290,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11291,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11292,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x2f, 0x41, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11293,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11294,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11295,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11296,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11297,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11298,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11299,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11300,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x38, 0x37, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11301,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11302,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11303,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11304,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x6e, 0x64, 0x3e, 0x5b, 0x41, 0x6d, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11305,64,"style","Trailing whitespace is superfluous."," 0x64, 0x5d, 0x3c, 0x2f, 0x61, 0x6d, 0x65, 0x6e, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11306,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11307,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11308,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11309,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11310,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11311,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11312,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11313,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11314,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11315,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11316,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11317,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11318,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11319,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11320,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11321,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11322,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11323,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11324,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11325,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11326,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11327,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11328,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11329,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x31, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11330,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11331,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11332,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11333,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11334,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11335,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11336,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11337,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11338,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11339,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x38, 0x37, 0x36, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11340,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11341,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x38, 0x37, 0x36, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11342,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11343,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11344,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11345,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11346,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x2f, 0x41, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11347,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11348,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11349,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11350,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x36, 0x39, 0x34, 0x33, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11351,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11352,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11353,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11354,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11355,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11356,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11357,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11358,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11359,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11360,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11361,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11362,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11363,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11364,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11365,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11366,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11367,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11368,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11369,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11370,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11371,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11372,64,"style","Trailing whitespace is superfluous."," 0x38, 0x37, 0x36, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11373,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11374,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11375,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11376,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11377,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11378,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11379,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11380,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x30, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11381,64,"style","Trailing whitespace is superfluous."," 0x37, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11382,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11383,64,"style","Trailing whitespace is superfluous."," 0x38, 0x37, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11384,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11385,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11386,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11387,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11388,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11389,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11390,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11391,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11392,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11393,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11394,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x31, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11395,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11396,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11397,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11398,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11399,64,"style","Trailing whitespace is superfluous."," 0x37, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11400,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11401,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11402,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11403,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11404,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11405,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x20, 0x5b, 0x41, 0x6d, 0x65, 0x6e, 0x64, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11406,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11407,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11408,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11409,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11410,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11411,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11412,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11413,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11414,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x30, 0x30, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11415,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11416,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11417,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11418,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11419,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11420,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11421,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11422,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11423,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11424,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11425,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11426,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11427,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11428,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11429,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11430,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11431,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11432,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11433,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11434,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11435,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x37, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11436,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11437,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11438,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11439,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11440,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11441,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11442,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11443,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11444,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11445,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11446,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11447,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11448,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11449,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11450,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11451,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11452,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11453,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11454,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11455,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11456,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11457,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11458,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11459,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11460,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11461,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11462,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11463,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11464,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11465,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11466,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11467,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11468,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11469,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11470,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11471,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x37, 0x37, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11472,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11473,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x37, 0x37, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11474,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11475,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11476,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11477,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11478,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11479,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11480,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11481,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11482,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x36, 0x36, 0x33, 0x39, 0x32, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11483,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11484,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11485,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11486,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11487,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11488,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11489,64,"style","Trailing whitespace is superfluous."," 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11490,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11491,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11492,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11493,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11494,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x34, 0x31, 0x32, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11495,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11496,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11497,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11498,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11499,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11500,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11501,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11502,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11503,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11504,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11505,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11506,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11507,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11508,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11509,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11510,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11511,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11512,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x30, 0x30, 0x30, 0x30, 0x30, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11513,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11514,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11515,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11516,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11517,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11518,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11519,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11520,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11521,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11522,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11523,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11524,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11525,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11526,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x32, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11527,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11528,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11529,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11530,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11531,64,"style","Trailing whitespace is superfluous."," 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11532,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11533,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x34, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11534,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11535,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11536,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11537,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11538,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11539,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11540,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11541,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11542,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11543,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11544,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11545,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x30, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11546,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x39, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11547,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11548,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11549,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11550,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11551,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11552,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11553,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11554,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11555,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11556,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11557,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11558,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11559,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11560,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11561,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11562,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11563,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11564,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11565,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11566,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11567,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11568,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11569,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11570,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11571,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11572,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11573,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11574,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11575,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11576,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11577,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11578,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11579,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11580,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11581,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11582,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11583,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11584,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11585,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11586,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11587,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11588,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11589,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11590,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11591,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11592,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x31, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11593,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11594,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11595,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11596,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11597,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11598,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11599,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11600,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11601,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11602,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x30, 0x30, 0x33, 0x34, 0x32, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11603,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11604,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11605,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11606,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11607,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11608,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11609,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11610,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11611,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x35, 0x34, 0x31, 0x38, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11612,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11613,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11614,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11615,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11616,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11617,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11618,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11619,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11620,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11621,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11622,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x35, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11623,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11624,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11625,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11626,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11627,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11628,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11629,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11630,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11631,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x33, 0x34, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11632,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11633,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11634,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11635,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11636,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11637,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11638,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11639,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11640,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11641,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11642,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11643,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11644,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11645,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11646,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11647,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11648,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11649,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11650,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11651,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11652,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11653,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11654,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11655,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11656,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11657,64,"style","Trailing whitespace is superfluous."," 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11658,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11659,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11660,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11661,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11662,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11663,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11664,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11665,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11666,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11667,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11668,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11669,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11670,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x34, 0x54, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11671,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11672,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11673,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11674,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11675,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11676,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11677,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11678,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11679,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11680,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11681,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11682,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11683,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11684,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11685,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11686,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11687,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11688,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11689,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11690,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11691,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x30, 0x31, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11692,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11693,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11694,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11695,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11696,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11697,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11698,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11699,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11700,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11701,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11702,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11703,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11704,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11705,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11706,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11707,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11708,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11709,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11710,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11711,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11712,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11713,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11714,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11715,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11716,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x39, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11717,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11718,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11719,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11720,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11721,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11722,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11723,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11724,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11725,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11726,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11727,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11728,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11729,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11730,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11731,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11732,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11733,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11734,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11735,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11736,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x37, 0x35, 0x34, 0x31, 0x38, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11737,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11738,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11739,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11740,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11741,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11742,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11743,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11744,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11745,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11746,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x32, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11747,64,"style","Trailing whitespace is superfluous."," 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11748,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11749,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11750,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11751,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11752,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11753,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11754,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11755,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11756,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x31, 0x30, 0x30, 0x31, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11757,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11758,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11759,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11760,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11761,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11762,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11763,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11764,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11765,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x30, 0x31, 0x30, 0x30, 0x31, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11766,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11767,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11768,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11769,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11770,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11771,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11772,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11773,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11774,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11775,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11776,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x39, 0x39, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11777,64,"style","Trailing whitespace is superfluous."," 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11778,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11779,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11780,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11781,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x30, 0x31, 0x30, 0x30, 0x31, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11782,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11783,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11784,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x34, 0x36, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11785,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11786,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11787,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11788,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11789,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11790,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11791,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11792,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11793,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11794,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11795,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x31, 0x35, 0x54, 0x30, 0x30, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11796,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11797,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11798,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11799,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11800,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11801,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11802,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11803,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11804,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11805,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11806,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11807,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11808,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11809,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11810,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11811,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11812,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11813,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11814,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11815,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11816,64,"style","Trailing whitespace is superfluous."," 0x37, 0x34, 0x35, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11817,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11818,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11819,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11820,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11821,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11822,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11823,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11824,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11825,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11826,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11827,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11828,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11829,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11830,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11831,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11832,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11833,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11834,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11835,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11836,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11837,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11838,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11839,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11840,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11841,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x32, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11842,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11843,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11844,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11845,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11846,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11847,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11848,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11849,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11850,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11851,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x37, 0x34, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11852,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11853,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11854,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11855,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11856,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11857,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11858,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11859,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11860,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x39, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11861,64,"style","Trailing whitespace is superfluous."," 0x38, 0x36, 0x33, 0x34, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11862,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11863,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11864,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11865,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11866,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11867,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11868,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11869,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11870,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11871,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x39, 0x31, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11872,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11873,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11874,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11875,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11876,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11877,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11878,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11879,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11880,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11881,64,"style","Trailing whitespace is superfluous."," 0x37, 0x34, 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11882,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11883,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11884,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11885,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11886,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11887,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11888,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11889,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11890,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x34, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11891,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11892,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11893,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11894,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11895,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11896,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11897,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11898,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11899,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11900,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11901,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x32, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11902,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11903,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11904,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11905,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11906,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x34, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11907,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11908,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11909,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11910,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11911,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11912,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11913,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11914,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11915,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11916,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11917,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11918,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11919,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x39, 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11920,64,"style","Trailing whitespace is superfluous."," 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11921,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11922,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11923,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11924,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11925,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11926,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11927,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11928,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11929,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11930,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11931,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11932,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11933,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11934,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11935,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11936,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11937,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11938,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11939,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11940,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x39, 0x39, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11941,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11942,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11943,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11944,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11945,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11946,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11947,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11948,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11949,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11950,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11951,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11952,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11953,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11954,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11955,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11956,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11957,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11958,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11959,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11960,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11961,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11962,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11963,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11964,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11965,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x39, 0x39, 0x39, 0x2d, 0x30, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11966,64,"style","Trailing whitespace is superfluous."," 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11967,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11968,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11969,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11970,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11971,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11972,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11973,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11974,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11975,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11976,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x39, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11977,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11978,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11979,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11980,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11981,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11982,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11983,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11984,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11985,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x39, 0x39, 0x36, 0x35, 0x35, 0x30, 0x36, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11986,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11987,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11988,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11989,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11990,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11991,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11992,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11993,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11994,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11995,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11996,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11997,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x31, 0x36, 0x20, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11998,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11999,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12000,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12001,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12002,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12003,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12004,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12005,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12006,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12007,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x39, 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12008,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12009,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12010,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12011,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12012,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12013,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12014,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12015,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12016,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x39, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12017,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12018,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12019,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12020,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12021,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12022,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12023,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12024,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12025,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12026,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12027,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x39, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12028,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12029,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12030,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12031,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12032,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x39, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12033,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12034,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12035,64,"style","Trailing whitespace is superfluous."," 0x20, 0x37, 0x31, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12036,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12037,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12038,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12039,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12040,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12041,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12042,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12043,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12044,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12045,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12046,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12047,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x39, 0x54, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12048,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x34, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12049,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12050,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12051,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12052,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12053,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12054,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12055,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12056,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12057,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12058,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12059,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12060,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12061,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12062,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12063,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12064,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12065,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12066,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12067,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12068,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x30, 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12069,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12070,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12071,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12072,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12073,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12074,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12075,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12076,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12077,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12078,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12079,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12080,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12081,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12082,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12083,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12084,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12085,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12086,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12087,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12088,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12089,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12090,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12091,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12092,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12093,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x36, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12094,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12095,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12096,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12097,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12098,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12099,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12100,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12101,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12102,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12103,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12104,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12105,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12106,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12107,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12108,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12109,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12110,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12111,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12112,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12113,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x34, 0x32, 0x38, 0x31, 0x32, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12114,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12115,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12116,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12117,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12118,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12119,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12120,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12121,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12122,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12123,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12124,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12125,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12126,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12127,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12128,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12129,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12130,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12131,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12132,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12133,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x32, 0x30, 0x32, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12134,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12135,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12136,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12137,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12138,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12139,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12140,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12141,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12142,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x32, 0x30, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12143,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12144,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12145,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12146,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12147,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12148,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12149,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12150,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12151,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12152,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12153,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x39, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12154,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12155,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12156,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12157,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12158,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x32, 0x30, 0x32, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12159,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12160,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12161,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x31, 0x31, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12162,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12163,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12164,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12165,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12166,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12167,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12168,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12169,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12170,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12171,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12172,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x31, 0x36, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12173,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12174,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12175,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12176,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12177,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12178,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12179,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12180,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12181,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12182,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12183,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12184,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12185,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12186,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12187,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12188,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12189,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12190,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12191,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12192,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12193,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12194,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12195,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12196,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12197,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12198,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12199,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12200,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12201,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12202,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12203,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12204,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12205,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12206,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12207,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12208,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12209,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12210,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12211,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12212,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12213,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12214,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12215,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12216,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12217,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12218,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x33, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12219,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12220,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12221,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12222,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12223,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12224,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12225,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12226,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12227,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12228,64,"style","Trailing whitespace is superfluous."," 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x38, 0x39, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12229,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12230,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12231,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12232,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12233,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12234,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12235,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12236,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12237,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x38, 0x37, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12238,64,"style","Trailing whitespace is superfluous."," 0x38, 0x37, 0x39, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12239,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12240,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12241,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12242,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12243,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12244,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12245,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12246,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12247,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12248,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x30, 0x32, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12249,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12250,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12251,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12252,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12253,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12254,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12255,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12256,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12257,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12258,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12259,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12260,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12261,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12262,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12263,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12264,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12265,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12266,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12267,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12268,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12269,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12270,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12271,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12272,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12273,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12274,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12275,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12276,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12277,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12278,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x33, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12279,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12280,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12281,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12282,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12283,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12284,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12285,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12286,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x32, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12287,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12288,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12289,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12290,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12291,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12292,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12293,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12294,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12295,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12296,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x39, 0x39, 0x38, 0x2d, 0x31, 0x31, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12297,64,"style","Trailing whitespace is superfluous."," 0x33, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12298,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12299,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12300,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12301,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12302,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12303,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12304,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12305,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12306,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12307,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12308,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12309,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12310,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12311,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12312,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12313,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12314,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12315,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12316,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12317,64,"style","Trailing whitespace is superfluous."," 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x36, 0x37, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12318,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12319,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12320,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12321,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12322,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12323,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12324,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12325,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12326,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12327,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12328,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12329,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12330,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12331,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12332,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12333,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12334,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12335,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12336,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12337,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12338,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12339,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12340,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12341,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12342,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, 0x38, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12343,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12344,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12345,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12346,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12347,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12348,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12349,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12350,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12351,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12352,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12353,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x36, 0x36, 0x37, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12354,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12355,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12356,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12357,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12358,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12359,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12360,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12361,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12362,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x39, 0x38, 0x36, 0x38, 0x32, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12363,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12364,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12365,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12366,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12367,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12368,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12369,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12370,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12371,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12372,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12373,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x38, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12374,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12375,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12376,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12377,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12378,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12379,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12380,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12381,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12382,64,"style","Trailing whitespace is superfluous."," 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x36, 0x37, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12383,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12384,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12385,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12386,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12387,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12388,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12389,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12390,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12391,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x36, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12392,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12393,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12394,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12395,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12396,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12397,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12398,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12399,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12400,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12401,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12402,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, 0x38, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12403,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12404,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12405,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12406,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12407,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x36, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12409,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12410,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x38, 0x36, 0x20, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12411,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12412,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12413,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12414,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12415,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12416,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12417,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12418,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12419,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12420,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12421,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x31, 0x54, 0x30, 0x30, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12422,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12423,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12424,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12425,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12426,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12427,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12428,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12429,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12430,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12431,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12432,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12433,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12434,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12435,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12436,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12437,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12438,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12439,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12440,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12441,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12442,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x37, 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12443,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12444,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12445,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12446,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12447,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12448,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12449,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12450,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12451,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12452,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12453,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12454,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12455,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12456,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12457,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12458,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12459,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12460,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12461,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12462,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12463,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12464,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12465,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12466,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12467,64,"style","Trailing whitespace is superfluous."," 0x39, 0x38, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x36, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12468,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12469,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12470,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12471,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12472,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12473,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12474,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12475,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12476,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12477,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12478,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12479,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12480,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12481,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12482,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12483,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12484,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12485,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12486,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12487,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x35, 0x35, 0x31, 0x35, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12488,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12489,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12490,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12491,64,"style","Trailing whitespace is superfluous."," 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12492,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12493,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12494,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12495,64,"style","Trailing whitespace is superfluous."," 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12496,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12497,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12498,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12499,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x32, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12500,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12501,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12502,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12503,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12504,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12505,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12506,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12507,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12508,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12509,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12510,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12511,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12512,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12513,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12514,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12515,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12516,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12517,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12518,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12519,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12520,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12521,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12522,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12523,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12524,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12525,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12526,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12527,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12528,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12529,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x32, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12530,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12531,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12532,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12533,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12534,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12535,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12536,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x32, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12537,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12538,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12539,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12540,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12541,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12542,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12543,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12544,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12545,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12546,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12547,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12548,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x38, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12549,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x36, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12550,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12551,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12552,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12553,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12554,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12555,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12556,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12557,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12558,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12559,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12560,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12561,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12562,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12563,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12564,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12565,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12566,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12567,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12568,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x38, 0x34, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12569,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12570,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12571,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12572,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12573,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12574,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12575,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12576,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12577,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12578,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12579,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12580,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12581,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12582,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12583,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12584,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12585,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12586,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12587,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12588,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12589,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12590,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12591,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12592,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12593,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12594,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12595,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x31, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12596,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12597,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12598,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12599,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12600,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12601,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12602,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12603,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12604,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x39, 0x38, 0x34, 0x33, 0x30, 0x2d, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12605,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x31, 0x38, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12606,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12607,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12608,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12609,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12610,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12611,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12612,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12613,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12614,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x38, 0x35, 0x34, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12615,64,"style","Trailing whitespace is superfluous."," 0x38, 0x32, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12616,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12617,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12618,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12619,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12620,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12621,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12622,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12623,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12624,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12625,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x31, 0x33, 0x30, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12626,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12627,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12628,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12629,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12630,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12631,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12632,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12633,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x38, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12634,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12635,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12636,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12637,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12638,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12639,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12640,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12641,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12642,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12643,64,"style","Trailing whitespace is superfluous."," 0x34, 0x33, 0x30, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12644,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12645,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12646,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12647,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12648,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12649,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12650,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12651,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12652,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12653,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12654,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12655,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x37, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12656,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12657,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12658,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12659,64,"style","Trailing whitespace is superfluous."," 0x34, 0x33, 0x30, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12660,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12661,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12662,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12663,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12664,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12665,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12666,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12667,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12668,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12669,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12670,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12671,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12672,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12673,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x39, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12674,64,"style","Trailing whitespace is superfluous."," 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12675,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12676,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12677,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12678,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12679,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12680,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12681,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12682,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12683,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12684,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12685,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12686,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12687,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12688,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12689,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12690,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12691,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12692,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12693,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12694,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x30, 0x32, 0x32, 0x37, 0x36, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12695,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12696,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12697,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12698,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12699,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12700,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12701,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12702,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12703,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12704,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12705,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12706,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12707,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12708,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12709,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12710,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12711,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12712,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12713,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12714,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12715,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12716,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12717,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12718,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12719,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x39, 0x39, 0x37, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12720,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12721,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12722,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12723,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12724,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12725,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12726,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12727,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12728,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12729,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12730,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x32, 0x37, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12731,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12732,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12733,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12734,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12735,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12736,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12737,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12738,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12739,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x39, 0x37, 0x37, 0x32, 0x30, 0x32, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12740,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12741,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12742,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12743,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12744,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12745,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12746,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12747,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12748,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12749,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12750,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12751,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12752,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12753,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12754,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12755,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12756,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12757,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12758,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12759,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x30, 0x32, 0x32, 0x37, 0x36, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12760,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12761,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12762,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12763,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12764,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12765,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12766,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12767,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12768,64,"style","Trailing whitespace is superfluous."," 0x39, 0x37, 0x2d, 0x30, 0x30, 0x32, 0x32, 0x37, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12769,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12770,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12771,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12772,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12773,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12774,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12775,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12776,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12777,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12778,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12779,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x39, 0x39, 0x37, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12780,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12781,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12782,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12783,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12784,64,"style","Trailing whitespace is superfluous."," 0x39, 0x37, 0x2d, 0x30, 0x30, 0x32, 0x32, 0x37, 0x36, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12785,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12786,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12787,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x39, 0x35, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12788,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12789,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12790,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12791,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12792,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12793,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12794,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12795,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12796,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12797,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12798,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x31, 0x34, 0x54, 0x30, 0x30, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12799,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12800,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12801,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12802,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12803,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12804,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12805,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12806,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12807,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12808,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12809,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12810,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12811,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12812,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12813,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12814,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12815,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12816,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12817,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12818,64,"style","Trailing whitespace is superfluous."," 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12819,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x38, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12820,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12821,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12822,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12823,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12824,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12825,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12826,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12827,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12828,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12829,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12830,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12831,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12832,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12833,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12834,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12835,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12836,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12837,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12838,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12839,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12840,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12841,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12842,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12843,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12844,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12845,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12846,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12847,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12848,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12849,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12850,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12851,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12852,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12853,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12854,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x39, 0x37, 0x2d, 0x30, 0x30, 0x31, 0x34, 0x38, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12855,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12856,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12857,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12858,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12859,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12860,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12861,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12862,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12863,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x37, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12864,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x35, 0x35, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12865,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12866,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12867,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12868,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12869,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12870,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12871,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12872,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12873,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12874,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x33, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12875,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12876,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12877,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12878,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12879,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12880,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12881,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12882,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12883,64,"style","Trailing whitespace is superfluous."," 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12884,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12885,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12886,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12887,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12888,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12889,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12890,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12891,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12892,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12893,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x38, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12894,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12895,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12896,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12897,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12898,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12899,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12900,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12901,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12902,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12903,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12904,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12905,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12906,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12907,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12908,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12909,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x38, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12910,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12911,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12912,64,"style","Trailing whitespace is superfluous."," 0x38, 0x33, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12913,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12914,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12915,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12916,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12917,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12918,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12919,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12920,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12921,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12922,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x39, 0x37, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12923,64,"style","Trailing whitespace is superfluous."," 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12924,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12925,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12926,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12927,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12928,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12929,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12930,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12931,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12932,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12933,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12934,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12935,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12936,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12937,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12938,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12939,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12940,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12941,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12942,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12943,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x30, 0x31, 0x31, 0x39, 0x35, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12944,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12945,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12946,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12947,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12948,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12949,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12950,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12951,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12952,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12953,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12954,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12955,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12956,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12957,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12958,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12959,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12960,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12961,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12962,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12963,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12964,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12965,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12966,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12967,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12968,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x39, 0x39, 0x37, 0x2d, 0x30, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12969,64,"style","Trailing whitespace is superfluous."," 0x32, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12970,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12971,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12972,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12973,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12974,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12975,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12976,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12977,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12978,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12979,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12980,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12981,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12982,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12983,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12984,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12985,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12986,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12987,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12988,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x39, 0x37, 0x36, 0x32, 0x37, 0x38, 0x33, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12989,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12990,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12991,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12992,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12993,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12994,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12995,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12996,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12997,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12998,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12999,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13000,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x35, 0x36, 0x38, 0x20, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13001,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13002,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13003,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13004,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13005,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13006,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13007,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13008,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13009,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13010,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13011,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13012,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13013,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13014,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13015,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13016,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13017,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13018,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13019,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13020,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13021,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13022,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13023,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13024,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13025,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13026,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13027,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13028,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13029,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13030,64,"style","Trailing whitespace is superfluous."," 0x39, 0x37, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x33, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13031,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13032,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13033,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13034,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13035,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13036,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13037,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13038,64,"style","Trailing whitespace is superfluous."," 0x20, 0x35, 0x36, 0x38, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13039,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13040,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13041,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13042,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13043,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13044,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13045,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13046,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13047,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13048,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13049,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13050,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x33, 0x54, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13051,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x34, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13052,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13053,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13054,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13055,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13056,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13057,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13058,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13059,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13060,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13061,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13062,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13063,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13064,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13065,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13066,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13067,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13068,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13069,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13070,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13071,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x37, 0x37, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13072,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13073,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13074,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13075,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13076,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13077,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13078,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13079,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13080,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13081,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13082,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13083,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13084,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13085,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13086,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13087,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13088,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13089,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13090,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13091,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13092,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13093,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13094,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13095,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13096,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13097,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13098,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13099,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13100,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13101,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13102,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13103,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13104,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13105,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13106,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x39, 0x37, 0x2d, 0x30, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13107,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13108,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13109,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13110,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13111,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13112,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13113,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13114,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13115,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13116,64,"style","Trailing whitespace is superfluous."," 0x37, 0x35, 0x33, 0x34, 0x37, 0x37, 0x36, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13117,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13118,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13119,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13120,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13121,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13122,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13123,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13124,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13125,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13126,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13127,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13128,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13129,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13130,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13131,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13132,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13133,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13134,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13135,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13136,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x32, 0x37, 0x37, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13137,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13138,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13139,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13140,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13141,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13142,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13143,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13144,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13145,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x32, 0x37, 0x37, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13146,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13147,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13148,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13149,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13150,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13151,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13152,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13153,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13154,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13155,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13156,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x39, 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13157,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13158,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13159,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13160,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13161,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x32, 0x37, 0x37, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13162,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13163,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13164,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x31, 0x38, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13165,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13166,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13167,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13168,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13169,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13170,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13171,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13172,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13173,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13174,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13175,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x31, 0x34, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13176,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13177,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13178,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13179,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13180,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13181,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13182,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13183,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13184,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13185,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13186,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13187,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13188,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13189,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13190,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13191,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13192,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13193,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13194,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13195,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13196,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13197,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13198,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13199,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13200,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13201,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13202,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13203,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13204,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13205,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13206,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13207,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13208,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13209,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13210,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13211,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13212,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13213,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13214,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13215,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13216,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13217,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13218,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13219,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13220,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13221,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13222,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13223,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13224,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13225,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13226,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13227,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13228,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13229,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13230,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13231,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x39, 0x32, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13232,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13233,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13234,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13235,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13236,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13237,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13238,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13239,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13240,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x36, 0x36, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13241,64,"style","Trailing whitespace is superfluous."," 0x34, 0x34, 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13242,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13243,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13244,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13245,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13246,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13247,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13248,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13249,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13250,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13251,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x37, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13252,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13253,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13254,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13255,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13256,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13257,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13258,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13259,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13260,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13261,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13262,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13263,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13264,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13265,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13266,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13267,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13268,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13269,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13270,64,"style","Trailing whitespace is superfluous."," 0x39, 0x32, 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13271,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13272,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13273,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13274,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13275,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13276,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13277,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13278,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13279,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13280,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13281,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13282,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13283,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13284,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13285,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13286,64,"style","Trailing whitespace is superfluous."," 0x39, 0x32, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13287,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13288,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13289,64,"style","Trailing whitespace is superfluous."," 0x37, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13290,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13291,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13292,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13293,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13294,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13295,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13296,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13297,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13298,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13299,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x36, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x54, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13300,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13301,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13302,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13303,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13304,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13305,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13306,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13307,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13308,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13309,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13310,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13311,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13312,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13313,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13314,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13315,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13316,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13317,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13318,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13319,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13320,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x36, 0x31, 0x35, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13321,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13322,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13323,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13324,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13325,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13326,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13327,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13328,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13329,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13330,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13331,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13332,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13333,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13334,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13335,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13336,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13337,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13338,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13339,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13340,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13341,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13342,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13343,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13344,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13345,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x39, 0x39, 0x36, 0x2d, 0x30, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13346,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13347,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13348,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13349,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13350,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13351,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13352,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13353,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13354,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13355,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13356,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x31, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13357,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13358,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13359,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13360,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13361,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13362,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13363,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13364,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13365,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x39, 0x36, 0x36, 0x31, 0x31, 0x39, 0x36, 0x36, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13366,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13367,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13368,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13369,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13370,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13371,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13372,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13373,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13374,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13375,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13376,64,"style","Trailing whitespace is superfluous."," 0x32, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13377,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13378,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13379,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13380,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13381,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13382,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13383,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13384,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13385,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x36, 0x31, 0x35, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13386,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13387,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13388,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13389,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13390,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13391,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13392,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13393,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13394,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x31, 0x35, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13395,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13396,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13397,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13398,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13399,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13400,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13401,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13402,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13403,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13404,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13405,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x39, 0x39, 0x36, 0x2d, 0x30, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13406,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13407,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13408,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13409,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13410,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x31, 0x35, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13411,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13412,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13413,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x37, 0x32, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13414,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13415,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13416,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13417,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13418,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13419,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13420,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13421,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13422,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13423,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x36, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13424,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x31, 0x34, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13425,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13426,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13427,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13428,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13429,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13430,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13431,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13432,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13433,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13434,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13435,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13436,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13437,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13438,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13439,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13440,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13441,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13442,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13443,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13444,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x31, 0x33, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13445,64,"style","Trailing whitespace is superfluous."," 0x36, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13446,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13447,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13448,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13449,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13450,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13451,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13452,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13453,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13454,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13455,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13456,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13457,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13458,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13459,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13460,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13461,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13462,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13463,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13464,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13465,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13466,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13467,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13468,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13469,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13470,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13471,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13472,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13473,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13474,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13475,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13476,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13477,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13478,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13479,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13480,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x2d, 0x30, 0x31, 0x33, 0x35, 0x36, 0x33, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13481,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13482,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13483,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13484,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13485,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13486,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13487,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13488,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13489,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x36, 0x35, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13490,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x37, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13491,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13492,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13493,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13494,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13495,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13496,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13497,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13498,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13499,64,"style","Trailing whitespace is superfluous."," 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13500,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13501,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13502,64,"style","Trailing whitespace is superfluous."," 0x39, 0x37, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13503,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13504,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13505,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13506,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13507,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13508,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13509,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13510,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13511,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x31, 0x33, 0x35, 0x36, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13512,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13513,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13514,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13515,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13516,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13517,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13518,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13519,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13520,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x2d, 0x30, 0x31, 0x33, 0x35, 0x36, 0x33, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13521,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13522,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13523,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13524,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13525,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13526,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13527,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13528,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13529,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13530,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13531,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x39, 0x39, 0x36, 0x2d, 0x30, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13532,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13533,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13534,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13535,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13536,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x2d, 0x30, 0x31, 0x33, 0x35, 0x36, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13537,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13538,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13539,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x37, 0x20, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13540,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13541,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13542,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13543,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13544,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13545,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13546,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13547,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13548,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13549,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13550,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13551,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x39, 0x39, 0x36, 0x2d, 0x30, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13552,64,"style","Trailing whitespace is superfluous."," 0x31, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13553,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13554,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13555,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13556,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13557,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13558,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13559,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13560,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13561,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13562,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13563,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13564,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13565,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13566,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13567,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13568,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13569,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13570,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13571,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13572,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x2d, 0x30, 0x30, 0x32, 0x35, 0x35, 0x31, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13573,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13574,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13575,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13576,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13577,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13578,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13579,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13580,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13581,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13582,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13583,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13584,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13585,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13586,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13587,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13588,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13589,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13590,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13591,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13592,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13593,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13594,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13595,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13596,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13597,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, 0x36, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13598,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13599,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13600,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13601,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13602,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13603,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13604,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13605,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13606,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13607,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, 0x39, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13608,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x35, 0x35, 0x31, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13609,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13610,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13611,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13612,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13613,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13614,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13615,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13616,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13617,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x39, 0x36, 0x35, 0x31, 0x39, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13618,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13619,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13620,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13621,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13622,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13623,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13624,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13625,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13626,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13627,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13628,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x38, 0x35, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13629,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13630,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13631,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13632,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13633,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13634,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13635,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13636,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13637,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x2d, 0x30, 0x30, 0x32, 0x35, 0x35, 0x31, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13638,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13639,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13640,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13641,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13642,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13643,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13644,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13645,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13646,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x30, 0x32, 0x35, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13647,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13648,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13649,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13650,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13651,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13652,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13653,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13654,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13655,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13656,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13657,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, 0x36, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13658,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13659,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13660,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13661,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13662,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x30, 0x32, 0x35, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13663,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13664,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13665,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x38, 0x35, 0x20, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13666,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13667,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13668,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13669,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13670,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13671,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13672,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13673,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13674,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13675,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13676,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x34, 0x54, 0x30, 0x30, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13677,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13678,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13679,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13680,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13681,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13682,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13683,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13684,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13685,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13686,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13687,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13688,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13689,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13690,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13691,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13692,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13693,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13694,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13695,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13696,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x35, 0x37, 0x2d, 0x39, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13697,64,"style","Trailing whitespace is superfluous."," 0x39, 0x38, 0x34, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13698,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13699,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13700,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13701,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13702,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13703,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13704,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13705,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13706,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13707,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13708,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13709,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13710,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13711,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13712,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13713,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13714,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13715,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13716,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13717,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13718,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13719,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13720,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13721,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13722,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13723,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13724,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13725,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13726,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13727,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13728,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13729,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13730,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13731,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13732,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x39, 0x35, 0x2d, 0x30, 0x30, 0x39, 0x38, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13733,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13734,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13735,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13736,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13737,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13738,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13739,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13740,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13741,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13742,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x31, 0x32, 0x30, 0x32, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13743,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13744,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13745,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13746,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13747,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13748,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13749,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13750,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13751,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13752,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x33, 0x20, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13753,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13754,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13755,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13756,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13757,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13758,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13759,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13760,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13761,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x35, 0x37, 0x2d, 0x39, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13762,64,"style","Trailing whitespace is superfluous."," 0x39, 0x38, 0x34, 0x33, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13763,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13764,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13765,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13766,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13767,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13768,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13769,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13770,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, 0x39, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13771,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x38, 0x34, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13772,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13773,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13774,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13775,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13776,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13777,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13778,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13779,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13780,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13781,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13782,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13783,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13784,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13785,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13786,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, 0x39, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13787,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x38, 0x34, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13788,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13789,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13790,64,"style","Trailing whitespace is superfluous."," 0x20, 0x38, 0x33, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13791,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13792,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13793,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13794,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13795,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13796,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13797,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13798,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13799,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13800,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x39, 0x39, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13801,64,"style","Trailing whitespace is superfluous."," 0x34, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13802,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13803,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13804,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13805,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13806,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13807,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13808,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13809,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13810,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13811,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13812,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x43, 0x49, 0x4b, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13813,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13814,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13815,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13816,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13817,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13818,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13819,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13820,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13821,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13822,64,"style","Trailing whitespace is superfluous."," 0x43, 0x49, 0x4b, 0x3d, 0x45, 0x41, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13823,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13824,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13825,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x31, 0x30, 0x2d, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13826,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x73, 0x74, 0x61, 0x72, 0x74, 0x3d, 0x30, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13827,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13828,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13829,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13830,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13831,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13832,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13833,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13834,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13835,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13836,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13837,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13838,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13839,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13840,64,"style","Trailing whitespace is superfluous."," 0x43, 0x49, 0x4b, 0x3d, 0x45, 0x41, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13841,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13842,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13843,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x31, 0x30, 0x2d, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13844,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x73, 0x74, 0x61, 0x72, 0x74, 0x3d, 0x30, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13845,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13846,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13847,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x75, 0x74, 0x3d, 0x61, 0x74, 0x6f, 0x6d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13848,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x73, 0x65, 0x6c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13849,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x61, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13850,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6c, 0x69, 0x63, 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13851,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x6f, 0x6d, 0x2b, 0x78, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13852,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13853,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13854,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13855,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13856,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13857,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13858,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13859,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13860,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x43, 0x49, 0x4b, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13861,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13862,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x31, 0x30, 0x2d, 0x25, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13863,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13864,64,"style","Trailing whitespace is superfluous."," 0x65, 0x61, 0x3d, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13865,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x62, 0x3d, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13866,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13867,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13868,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13869,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x75, 0x74, 0x70, 0x75, 0x74, 0x3d, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13870,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x73, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13871,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13872,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x6e, 0x65, 0x78, 0x74, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13873,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x61, 0x70, 0x70, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13874,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x2f, 0x61, 0x74, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13875,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2b, 0x78, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13876,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13877,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x45, 0x4c, 0x45, 0x43, 0x54, 0x52, 0x4f, 0x4e, 0x49, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13878,64,"style","Trailing whitespace is superfluous."," 0x43, 0x20, 0x41, 0x52, 0x54, 0x53, 0x20, 0x49, 0x4e, 0x43, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13879,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x20, 0x20, 0x28, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13880,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x29, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13881,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13882,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13883,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x31, 0x2d, 0x32, 0x30, 0x54, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13884,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x35, 0x34, 0x3a, 0x32, 0x31, 0x2d, 0x30, 0x35, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13885,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13886,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x3c, 0x2f, 0x66, 0x65, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13887,74,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a)), date = structure(1579542861, class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13888,77,"style","Trailing whitespace is superfluous."," ""POSIXt""), tzone = ""GMT""), times = c(redirect = 0, namelookup = 0.08977, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13889,73,"style","Trailing whitespace is superfluous."," connect = 0.198839, pretransfer = 0.31077, starttransfer = 0.622565, ","trailing_whitespace_linter" +"vignettes/parsing.Rmd",16,35,"style","Use TRUE instead of the symbol T.","knitr::opts_chunk$set(collapse = T, comment = ""#>"")","T_and_F_symbol_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1,121,"style","Lines should not be more than 120 characters.","structure(list(url = ""/browse-edgar?action=getcompany&CIK=STX&owner=exclude&type=10-Q&dateb=&start=0&count=40&output=atom"", ","line_length_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1,124,"style","Trailing whitespace is superfluous.","structure(list(url = ""/browse-edgar?action=getcompany&CIK=STX&owner=exclude&type=10-Q&dateb=&start=0&count=40&output=atom"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2,78,"style","Trailing whitespace is superfluous."," status_code = 200L, headers = structure(list(`content-encoding` = ""gzip"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3,68,"style","Trailing whitespace is superfluous."," `content-type` = ""application/atom+xml"", server = ""Apache"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4,80,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff"", `x-frame-options` = ""SAMEORIGIN"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5,73,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `content-length` = ""4033"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",6,78,"style","Trailing whitespace is superfluous."," `cache-control` = ""no-cache"", date = ""Mon, 20 Jan 2020 17:54:51 GMT"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",7,61,"style","Trailing whitespace is superfluous."," connection = ""keep-alive"", vary = ""Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",8,88,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000 ; includeSubDomains ; preload"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",10,69,"style","Trailing whitespace is superfluous."," )), all_headers = list(list(status = 200L, version = ""HTTP/1.1"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",11,62,"style","Trailing whitespace is superfluous."," headers = structure(list(`content-encoding` = ""gzip"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",12,72,"style","Trailing whitespace is superfluous."," `content-type` = ""application/atom+xml"", server = ""Apache"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",13,84,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff"", `x-frame-options` = ""SAMEORIGIN"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",14,77,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `content-length` = ""4033"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",15,82,"style","Trailing whitespace is superfluous."," `cache-control` = ""no-cache"", date = ""Mon, 20 Jan 2020 17:54:51 GMT"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",16,65,"style","Trailing whitespace is superfluous."," connection = ""keep-alive"", vary = ""Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",17,118,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000 ; includeSubDomains ; preload""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",18,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",19,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",20,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",21,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",22,65,"style","Trailing whitespace is superfluous."," content = as.raw(c(0x3c, 0x3f, 0x78, 0x6d, 0x6c, 0x20, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",23,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x73, 0x69, 0x6f, 0x6e, 0x3d, 0x22, 0x31, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",24,64,"style","Trailing whitespace is superfluous."," 0x30, 0x22, 0x20, 0x65, 0x6e, 0x63, 0x6f, 0x64, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",25,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3d, 0x22, 0x49, 0x53, 0x4f, 0x2d, 0x38, 0x38, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",26,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x22, 0x20, 0x3f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",27,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x65, 0x65, 0x64, 0x20, 0x78, 0x6d, 0x6c, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",28,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",29,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x77, 0x33, 0x2e, 0x6f, 0x72, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",30,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x32, 0x30, 0x30, 0x35, 0x2f, 0x41, 0x74, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",31,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",32,64,"style","Trailing whitespace is superfluous."," 0x74, 0x68, 0x6f, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",33,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6d, 0x61, 0x69, 0x6c, 0x3e, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",34,64,"style","Trailing whitespace is superfluous."," 0x65, 0x62, 0x6d, 0x61, 0x73, 0x74, 0x65, 0x72, 0x40, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",35,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x3c, 0x2f, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",36,64,"style","Trailing whitespace is superfluous."," 0x61, 0x69, 0x6c, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",37,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x57, 0x65, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",38,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x73, 0x74, 0x65, 0x72, 0x3c, 0x2f, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",39,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",40,64,"style","Trailing whitespace is superfluous."," 0x61, 0x75, 0x74, 0x68, 0x6f, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",41,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",42,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x66, 0x6f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",43,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",44,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",45,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",46,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",47,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",48,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",49,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x79, 0x3e, 0x44, 0x55, 0x42, 0x4c, 0x49, 0x4e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",50,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x3c, 0x2f, 0x63, 0x69, 0x74, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",51,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",52,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x74, 0x61, 0x74, 0x65, 0x3e, 0x4c, 0x32, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",53,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x74, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",54,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",55,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x65, 0x65, 0x74, 0x31, 0x3e, 0x33, 0x38, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",56,64,"style","Trailing whitespace is superfluous."," 0x33, 0x39, 0x20, 0x46, 0x49, 0x54, 0x5a, 0x57, 0x49, 0x4c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",57,64,"style","Trailing whitespace is superfluous."," 0x4c, 0x49, 0x41, 0x4d, 0x20, 0x53, 0x51, 0x55, 0x41, 0x52, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",58,64,"style","Trailing whitespace is superfluous."," 0x45, 0x3c, 0x2f, 0x73, 0x74, 0x72, 0x65, 0x65, 0x74, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",59,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",60,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x7a, 0x69, 0x70, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",61,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x7a, 0x69, 0x70, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",62,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",63,64,"style","Trailing whitespace is superfluous."," 0x64, 0x64, 0x72, 0x65, 0x73, 0x73, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",64,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x64, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",65,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x73, 0x73, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",66,64,"style","Trailing whitespace is superfluous."," 0x22, 0x62, 0x75, 0x73, 0x69, 0x6e, 0x65, 0x73, 0x73, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",67,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",68,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x69, 0x74, 0x79, 0x3e, 0x44, 0x55, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",69,64,"style","Trailing whitespace is superfluous."," 0x42, 0x4c, 0x49, 0x4e, 0x20, 0x32, 0x3c, 0x2f, 0x63, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",70,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",71,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x70, 0x68, 0x6f, 0x6e, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",72,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x28, 0x33, 0x35, 0x33, 0x29, 0x20, 0x28, 0x31, 0x29, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",73,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x33, 0x34, 0x2d, 0x33, 0x31, 0x33, 0x36, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",74,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x70, 0x68, 0x6f, 0x6e, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",75,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",76,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x74, 0x65, 0x3e, 0x4c, 0x32, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",77,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",78,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",79,64,"style","Trailing whitespace is superfluous."," 0x65, 0x65, 0x74, 0x31, 0x3e, 0x33, 0x38, 0x2f, 0x33, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",80,64,"style","Trailing whitespace is superfluous."," 0x20, 0x46, 0x49, 0x54, 0x5a, 0x57, 0x49, 0x4c, 0x4c, 0x49, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",81,64,"style","Trailing whitespace is superfluous."," 0x41, 0x4d, 0x20, 0x53, 0x51, 0x55, 0x41, 0x52, 0x45, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",82,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x74, 0x72, 0x65, 0x65, 0x74, 0x31, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",83,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",84,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x7a, 0x69, 0x70, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",85,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x7a, 0x69, 0x70, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",86,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x61, 0x64, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",87,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x73, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",88,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",89,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",90,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x73, 0x73, 0x69, 0x67, 0x6e, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",91,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x73, 0x69, 0x63, 0x3e, 0x33, 0x35, 0x37, 0x32, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",92,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x73, 0x73, 0x69, 0x67, 0x6e, 0x65, 0x64, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",93,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x63, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",94,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x73, 0x73, 0x69, 0x67, 0x6e, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",95,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x73, 0x69, 0x63, 0x2d, 0x64, 0x65, 0x73, 0x63, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",96,64,"style","Trailing whitespace is superfluous."," 0x43, 0x4f, 0x4d, 0x50, 0x55, 0x54, 0x45, 0x52, 0x20, 0x53, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",97,64,"style","Trailing whitespace is superfluous."," 0x54, 0x4f, 0x52, 0x41, 0x47, 0x45, 0x20, 0x44, 0x45, 0x56, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",98,64,"style","Trailing whitespace is superfluous."," 0x49, 0x43, 0x45, 0x53, 0x3c, 0x2f, 0x61, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",99,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6e, 0x65, 0x64, 0x2d, 0x73, 0x69, 0x63, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",100,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x63, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",101,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x73, 0x73, 0x69, 0x67, 0x6e, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",102,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x73, 0x69, 0x63, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",103,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",104,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",105,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",106,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",107,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",108,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",109,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x53, 0x49, 0x43, 0x3d, 0x33, 0x35, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",110,64,"style","Trailing whitespace is superfluous."," 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",111,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",112,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",113,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x3c, 0x2f, 0x61, 0x73, 0x73, 0x69, 0x67, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",114,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x2d, 0x73, 0x69, 0x63, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",115,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",116,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",117,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x3c, 0x2f, 0x63, 0x69, 0x6b, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",118,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",119,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",120,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",121,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",122,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",123,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",124,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",125,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",126,64,"style","Trailing whitespace is superfluous."," 0x43, 0x49, 0x4b, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",127,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",128,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",129,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",130,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",131,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",132,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",133,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x64, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x53, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",134,64,"style","Trailing whitespace is superfluous."," 0x65, 0x61, 0x67, 0x61, 0x74, 0x65, 0x20, 0x54, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",135,64,"style","Trailing whitespace is superfluous."," 0x68, 0x6e, 0x6f, 0x6c, 0x6f, 0x67, 0x79, 0x20, 0x70, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",136,64,"style","Trailing whitespace is superfluous."," 0x63, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",137,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",138,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",139,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x2d, 0x79, 0x65, 0x61, 0x72, 0x2d, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",140,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x30, 0x37, 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",141,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x61, 0x6c, 0x2d, 0x79, 0x65, 0x61, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",142,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",143,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",144,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x73, 0x20, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",145,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x22, 0x33, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",146,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",147,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",148,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",149,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",150,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",151,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",152,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x53, 0x45, 0x41, 0x47, 0x41, 0x54, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",153,64,"style","Trailing whitespace is superfluous."," 0x45, 0x20, 0x54, 0x45, 0x43, 0x48, 0x4e, 0x4f, 0x4c, 0x4f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",154,64,"style","Trailing whitespace is superfluous."," 0x47, 0x59, 0x3c, 0x2f, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",155,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",156,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",157,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",158,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",159,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",160,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x36, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",161,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",162,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",163,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x53, 0x65, 0x61, 0x67, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",164,64,"style","Trailing whitespace is superfluous."," 0x20, 0x54, 0x65, 0x63, 0x68, 0x6e, 0x6f, 0x6c, 0x6f, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",165,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3c, 0x2f, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",166,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",167,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",168,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6e, 0x61, 0x6d, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",169,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",170,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",171,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x31, 0x32, 0x2d, 0x31, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",172,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",173,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",174,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x53, 0x45, 0x41, 0x47, 0x41, 0x54, 0x45, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",175,64,"style","Trailing whitespace is superfluous."," 0x54, 0x45, 0x43, 0x48, 0x4e, 0x4f, 0x4c, 0x4f, 0x47, 0x59, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",176,64,"style","Trailing whitespace is superfluous."," 0x20, 0x48, 0x4f, 0x4c, 0x44, 0x49, 0x4e, 0x47, 0x53, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",177,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",178,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",179,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",180,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",181,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",182,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6f, 0x66, 0x66, 0x69, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",183,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x4f, 0x66, 0x66, 0x69, 0x63, 0x65, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",184,64,"style","Trailing whitespace is superfluous."," 0x66, 0x20, 0x54, 0x65, 0x63, 0x68, 0x6e, 0x6f, 0x6c, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",185,64,"style","Trailing whitespace is superfluous."," 0x67, 0x79, 0x3c, 0x2f, 0x6f, 0x66, 0x66, 0x69, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",186,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",187,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x74, 0x65, 0x2d, 0x6c, 0x6f, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",188,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3e, 0x4c, 0x32, 0x3c, 0x2f, 0x73, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",189,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x2d, 0x6c, 0x6f, 0x63, 0x61, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",190,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",191,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x74, 0x61, 0x74, 0x65, 0x2d, 0x6c, 0x6f, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",192,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",193,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",194,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",195,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",196,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",197,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",198,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",199,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x53, 0x74, 0x61, 0x74, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",200,64,"style","Trailing whitespace is superfluous."," 0x4c, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",201,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",202,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",203,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x73, 0x74, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",204,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6c, 0x6f, 0x63, 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",205,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",206,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x74, 0x61, 0x74, 0x65, 0x2d, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",207,64,"style","Trailing whitespace is superfluous."," 0x66, 0x2d, 0x69, 0x6e, 0x63, 0x6f, 0x72, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",208,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x3e, 0x4c, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",209,64,"style","Trailing whitespace is superfluous."," 0x73, 0x74, 0x61, 0x74, 0x65, 0x2d, 0x6f, 0x66, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",210,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x63, 0x6f, 0x72, 0x70, 0x6f, 0x72, 0x61, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",211,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",212,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",213,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",214,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",215,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",216,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",217,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",218,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",219,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",220,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",221,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",222,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",223,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",224,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",225,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",226,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",227,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",228,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x36, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",229,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x30, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",230,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",231,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",232,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",233,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",234,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",235,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",236,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",237,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",238,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",239,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",240,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",241,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",242,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",243,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",244,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",245,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",246,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",247,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",248,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",249,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",250,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",251,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",252,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",253,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",254,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",255,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",256,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",257,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x31, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",258,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",259,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",260,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",261,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",262,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",263,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",264,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",265,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",266,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x36, 0x32, 0x38, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",267,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x31, 0x39, 0x30, 0x31, 0x33, 0x30, 0x39, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",268,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x36, 0x32, 0x38, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",269,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x31, 0x33, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",270,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",271,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",272,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",273,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",274,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",275,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",276,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",277,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",278,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",279,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x37, 0x36, 0x38, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",280,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",281,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",282,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",283,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",284,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",285,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",286,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",287,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",288,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",289,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x30, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",290,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",291,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",292,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",293,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",294,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",295,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",296,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",297,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",298,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",299,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",300,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",301,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x36, 0x32, 0x38, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",302,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x31, 0x33, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",303,64,"style","Trailing whitespace is superfluous."," 0x39, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",304,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",305,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",306,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",307,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",308,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",309,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",310,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",311,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",312,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",313,64,"style","Trailing whitespace is superfluous."," 0x36, 0x32, 0x38, 0x32, 0x38, 0x30, 0x2d, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",314,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x30, 0x39, 0x32, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",315,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",316,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",317,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",318,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",319,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",320,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",321,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",322,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x32, 0x38, 0x32, 0x38, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",323,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x30, 0x39, 0x32, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",324,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x32, 0x38, 0x32, 0x38, 0x30, 0x2d, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",325,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x33, 0x30, 0x39, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",326,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",327,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",328,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",329,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",330,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",331,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",332,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",333,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",334,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",335,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",336,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x31, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",337,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",338,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",339,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",340,64,"style","Trailing whitespace is superfluous."," 0x36, 0x32, 0x38, 0x32, 0x38, 0x30, 0x2d, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",341,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x30, 0x39, 0x32, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",342,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",343,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",344,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x30, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",345,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",346,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",347,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",348,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",349,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",350,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",351,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",352,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",353,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",354,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x31, 0x39, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",355,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x54, 0x31, 0x37, 0x3a, 0x32, 0x33, 0x3a, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",356,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",357,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",358,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",359,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",360,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",361,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",362,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",363,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",364,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",365,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",366,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",367,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",368,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",369,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",370,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",371,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",372,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",373,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",374,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",375,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x39, 0x2d, 0x31, 0x32, 0x39, 0x32, 0x38, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",376,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",377,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",378,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",379,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",380,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",381,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",382,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",383,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",384,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",385,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",386,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",387,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",388,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",389,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",390,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",391,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",392,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",393,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",394,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",395,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",396,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",397,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",398,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",399,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",400,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",401,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",402,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",403,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x2d, 0x33, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",404,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",405,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",406,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",407,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",408,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",409,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",410,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",411,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",412,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",413,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x32, 0x39, 0x32, 0x38, 0x34, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",414,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",415,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x32, 0x39, 0x32, 0x38, 0x34, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",416,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",417,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",418,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",419,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",420,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",421,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",422,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",423,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",424,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x31, 0x39, 0x37, 0x38, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",425,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",426,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",427,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",428,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",429,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",430,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",431,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",432,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",433,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",434,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",435,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x39, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",436,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",437,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",438,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",439,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",440,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",441,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",442,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",443,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",444,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",445,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",446,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",447,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",448,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x32, 0x39, 0x32, 0x38, 0x34, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",449,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",450,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",451,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",452,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",453,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",454,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",455,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",456,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",457,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",458,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",459,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x31, 0x32, 0x39, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",460,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",461,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",462,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",463,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",464,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",465,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",466,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",467,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",468,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x39, 0x31, 0x32, 0x39, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",469,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",470,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x31, 0x32, 0x39, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",471,64,"style","Trailing whitespace is superfluous."," 0x38, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",472,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",473,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",474,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",475,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",476,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",477,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",478,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",479,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",480,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",481,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",482,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x33, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",483,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",484,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",485,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",486,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x31, 0x32, 0x39, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",487,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",488,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",489,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x39, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",490,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",491,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",492,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",493,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",494,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",495,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",496,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",497,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",498,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",499,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",500,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",501,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x3a, 0x32, 0x38, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",502,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",503,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",504,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",505,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",506,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",507,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",508,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",509,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",510,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",511,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",512,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",513,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",514,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",515,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",516,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",517,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",518,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",519,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",520,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",521,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x30, 0x37, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",522,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",523,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",524,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",525,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",526,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",527,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",528,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",529,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",530,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",531,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",532,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",533,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",534,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",535,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",536,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",537,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",538,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",539,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",540,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",541,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",542,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",543,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",544,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",545,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",546,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",547,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",548,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",549,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",550,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",551,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",552,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",553,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",554,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",555,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",556,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",557,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",558,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x39, 0x30, 0x32, 0x37, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",559,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",560,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x32, 0x37, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",561,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",562,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",563,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",564,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",565,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",566,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",567,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",568,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",569,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",570,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x33, 0x37, 0x38, 0x33, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",571,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",572,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",573,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",574,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",575,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",576,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",577,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",578,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",579,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",580,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",581,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",582,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",583,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",584,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",585,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",586,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",587,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",588,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",589,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",590,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",591,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",592,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",593,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x32, 0x37, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",594,64,"style","Trailing whitespace is superfluous."," 0x37, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",595,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",596,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",597,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",598,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",599,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",600,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",601,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",602,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",603,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",604,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",605,64,"style","Trailing whitespace is superfluous."," 0x32, 0x37, 0x30, 0x30, 0x37, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",606,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",607,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",608,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",609,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",610,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",611,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",612,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",613,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x39, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",614,64,"style","Trailing whitespace is superfluous."," 0x32, 0x37, 0x30, 0x30, 0x37, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",615,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",616,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x37, 0x30, 0x30, 0x37, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",617,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",618,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",619,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",620,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",621,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",622,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",623,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",624,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",625,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",626,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",627,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x34, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",628,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",629,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",630,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",631,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",632,64,"style","Trailing whitespace is superfluous."," 0x32, 0x37, 0x30, 0x30, 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",633,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",634,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",635,64,"style","Trailing whitespace is superfluous."," 0x20, 0x38, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",636,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",637,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",638,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",639,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",640,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",641,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",642,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",643,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",644,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",645,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",646,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x36, 0x3a, 0x31, 0x30, 0x3a, 0x34, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",647,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",648,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",649,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",650,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",651,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",652,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",653,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",654,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",655,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",656,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",657,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",658,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",659,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",660,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",661,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",662,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",663,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",664,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",665,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",666,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x33, 0x31, 0x37, 0x31, 0x34, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",667,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",668,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",669,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",670,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",671,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",672,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",673,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",674,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",675,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",676,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",677,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",678,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",679,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",680,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",681,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",682,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",683,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",684,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",685,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",686,64,"style","Trailing whitespace is superfluous."," 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",687,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",688,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",689,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",690,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",691,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",692,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",693,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",694,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",695,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",696,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",697,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",698,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",699,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",700,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",701,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",702,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",703,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x38, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",704,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x31, 0x34, 0x33, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",705,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",706,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x37, 0x31, 0x34, 0x33, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",707,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",708,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",709,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",710,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",711,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",712,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",713,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",714,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",715,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x31, 0x38, 0x31, 0x31, 0x35, 0x37, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",716,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",717,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",718,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",719,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",720,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",721,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",722,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",723,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",724,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",725,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",726,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",727,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",728,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",729,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",730,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",731,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",732,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",733,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",734,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",735,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",736,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",737,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",738,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",739,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x37, 0x31, 0x34, 0x33, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",740,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",741,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",742,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",743,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",744,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",745,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",746,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",747,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",748,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",749,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",750,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x38, 0x2d, 0x33, 0x31, 0x37, 0x31, 0x34, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",751,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",752,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",753,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",754,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",755,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",756,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",757,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",758,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",759,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x38, 0x33, 0x31, 0x37, 0x31, 0x34, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",760,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",761,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x33, 0x31, 0x37, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",762,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",763,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",764,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",765,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",766,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",767,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",768,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",769,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",770,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",771,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",772,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",773,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",774,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",775,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",776,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",777,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x38, 0x2d, 0x33, 0x31, 0x37, 0x31, 0x34, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",778,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",779,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",780,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",781,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",782,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",783,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",784,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",785,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",786,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",787,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",788,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",789,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",790,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",791,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x32, 0x54, 0x31, 0x36, 0x3a, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",792,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3a, 0x32, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",793,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",794,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",795,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",796,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",797,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",798,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",799,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",800,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",801,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",802,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",803,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",804,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",805,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",806,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",807,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",808,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",809,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",810,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",811,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x31, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",812,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x38, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",813,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",814,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",815,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",816,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",817,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",818,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",819,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",820,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",821,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",822,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",823,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",824,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",825,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",826,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",827,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",828,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",829,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",830,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",831,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",832,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",833,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",834,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",835,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",836,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",837,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",838,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",839,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x31, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",840,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",841,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",842,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",843,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",844,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",845,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",846,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",847,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",848,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",849,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x38, 0x31, 0x34, 0x36, 0x35, 0x39, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",850,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",851,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x31, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",852,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",853,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",854,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",855,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",856,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",857,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",858,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",859,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",860,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x38, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",861,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x37, 0x30, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",862,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",863,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",864,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",865,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",866,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",867,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",868,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",869,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",870,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",871,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",872,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",873,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",874,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",875,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",876,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",877,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",878,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",879,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",880,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",881,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",882,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",883,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",884,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x38, 0x2d, 0x31, 0x34, 0x36, 0x35, 0x39, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",885,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",886,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",887,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",888,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",889,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",890,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",891,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",892,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",893,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",894,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",895,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",896,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",897,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",898,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",899,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",900,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",901,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",902,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",903,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",904,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x38, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",905,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",906,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",907,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",908,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",909,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",910,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",911,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",912,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",913,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",914,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",915,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",916,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",917,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",918,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x31, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",919,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",920,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",921,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",922,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",923,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",924,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",925,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",926,64,"style","Trailing whitespace is superfluous."," 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",927,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",928,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",929,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",930,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",931,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",932,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",933,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",934,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",935,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",936,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x31, 0x54, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",937,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x3a, 0x31, 0x36, 0x3a, 0x30, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",938,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",939,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",940,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",941,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",942,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",943,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",944,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",945,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",946,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",947,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",948,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",949,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",950,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",951,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",952,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",953,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",954,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",955,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",956,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",957,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x33, 0x35, 0x39, 0x32, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",958,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",959,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",960,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",961,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",962,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",963,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",964,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",965,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",966,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",967,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",968,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",969,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",970,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",971,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",972,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",973,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",974,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",975,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",976,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",977,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",978,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",979,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",980,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",981,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",982,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",983,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",984,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",985,64,"style","Trailing whitespace is superfluous."," 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",986,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",987,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",988,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",989,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",990,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",991,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",992,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",993,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",994,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x38, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",995,64,"style","Trailing whitespace is superfluous."," 0x33, 0x35, 0x39, 0x32, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",996,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",997,64,"style","Trailing whitespace is superfluous."," 0x32, 0x33, 0x35, 0x39, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",998,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",999,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1000,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1001,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1002,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1003,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1004,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1005,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1006,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x38, 0x35, 0x35, 0x35, 0x35, 0x38, 0x35, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1007,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1008,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1009,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1010,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1011,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1012,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1013,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1014,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1015,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1016,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1017,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1018,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1019,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1020,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1021,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1022,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1023,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1024,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1025,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1026,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1027,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1028,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1029,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1030,64,"style","Trailing whitespace is superfluous."," 0x33, 0x35, 0x39, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1031,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1032,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1033,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1034,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1035,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1036,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1037,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1038,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1039,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1040,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1041,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x32, 0x33, 0x35, 0x39, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1042,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1043,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1044,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1045,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1046,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1047,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1048,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1049,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1050,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x30, 0x32, 0x33, 0x35, 0x39, 0x32, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1051,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1052,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x32, 0x33, 0x35, 0x39, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1053,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1054,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1055,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1056,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1057,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1058,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1059,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1060,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1061,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1062,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1063,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x30, 0x31, 0x2d, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1064,64,"style","Trailing whitespace is superfluous."," 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1065,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1066,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1067,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1068,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x32, 0x33, 0x35, 0x39, 0x32, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1069,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1070,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1071,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1072,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1073,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1074,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1075,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1076,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1077,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1078,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1079,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1080,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1081,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1082,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x39, 0x54, 0x31, 0x36, 0x3a, 0x30, 0x37, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1083,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1084,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1085,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1086,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1087,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1088,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1089,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1090,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1091,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1092,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1093,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1094,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1095,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1096,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1097,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1098,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1099,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1100,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1101,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1102,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x33, 0x32, 0x33, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1103,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1104,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1105,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1106,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1107,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1108,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1109,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1110,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1111,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1112,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1113,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1114,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1115,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1116,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1117,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1118,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1119,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1120,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1121,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1122,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1123,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1124,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1125,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1126,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1127,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1128,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1129,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1130,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x37, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1131,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1132,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1133,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1134,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1135,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1136,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1137,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1138,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1139,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1140,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x33, 0x32, 0x33, 0x30, 0x34, 0x32, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1141,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1142,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x2d, 0x33, 0x32, 0x33, 0x30, 0x34, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1143,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1144,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1145,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1146,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1147,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1148,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1149,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1150,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1151,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x37, 0x31, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1152,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1153,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1154,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1155,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1156,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1157,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1158,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1159,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1160,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1161,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1162,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x36, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1163,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1164,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1165,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1166,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1167,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1168,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1169,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1170,64,"style","Trailing whitespace is superfluous."," 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1171,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1172,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1173,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1174,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1175,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x2d, 0x33, 0x32, 0x33, 0x30, 0x34, 0x32, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1176,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1177,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1178,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1179,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1180,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1181,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1182,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1183,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1184,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1185,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1186,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x33, 0x32, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1187,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x32, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1188,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1189,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1190,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1191,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1192,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1193,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1194,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1195,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x37, 0x33, 0x32, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1196,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x32, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1197,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x33, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1198,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x34, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1199,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1200,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1201,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1202,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1203,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1204,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1205,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1206,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1207,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1208,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1209,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x37, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1210,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1211,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1212,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1213,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x33, 0x32, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1214,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1215,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1216,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1217,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1218,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1219,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1220,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1221,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1222,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1223,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1224,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1225,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1226,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1227,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x37, 0x54, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1228,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x30, 0x37, 0x3a, 0x30, 0x38, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1229,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1230,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1231,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1232,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1233,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1234,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1235,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1236,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1237,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1238,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1239,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1240,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1241,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1242,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1243,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1244,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1245,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1246,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1247,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1248,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x38, 0x38, 0x35, 0x35, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1249,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1250,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1251,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1252,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1253,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1254,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1255,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1256,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1257,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1258,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1259,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1260,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1261,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1262,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1263,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1264,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1265,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1266,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1267,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1268,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1269,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1270,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1271,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1272,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1273,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1274,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1275,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x34, 0x2d, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1276,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1277,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1278,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1279,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1280,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1281,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1282,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1283,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1284,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1285,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x37, 0x31, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1286,64,"style","Trailing whitespace is superfluous."," 0x38, 0x35, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1287,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1288,64,"style","Trailing whitespace is superfluous."," 0x38, 0x38, 0x35, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1289,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1290,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1291,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1292,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1293,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1294,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1295,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1296,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1297,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x37, 0x39, 0x37, 0x31, 0x36, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1298,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1299,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1300,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1301,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1302,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1303,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1304,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1305,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1306,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1307,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1308,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1309,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1310,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1311,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1312,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1313,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1314,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1315,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1316,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1317,64,"style","Trailing whitespace is superfluous."," 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1318,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1319,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1320,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x31, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1321,64,"style","Trailing whitespace is superfluous."," 0x38, 0x35, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1322,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1323,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1324,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1325,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1326,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1327,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1328,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1329,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1330,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1331,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1332,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x38, 0x38, 0x35, 0x35, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1333,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1334,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1335,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1336,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1337,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1338,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1339,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1340,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1341,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x34, 0x38, 0x38, 0x35, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1342,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1343,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x31, 0x34, 0x38, 0x38, 0x35, 0x35, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1344,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1345,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1346,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1347,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1348,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1349,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1350,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1351,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1352,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1353,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1354,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x34, 0x2d, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1355,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1356,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1357,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1358,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1359,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x38, 0x38, 0x35, 0x35, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1360,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1361,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1362,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x38, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1363,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1364,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1365,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1366,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1367,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1368,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1369,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1370,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1371,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1372,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1373,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x54, 0x31, 0x37, 0x3a, 0x31, 0x39, 0x3a, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1374,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1375,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1376,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1377,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1378,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1379,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1380,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1381,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1382,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1383,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1384,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1385,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1386,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1387,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1388,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1389,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1390,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1391,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1392,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1393,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x31, 0x39, 0x37, 0x33, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1394,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1395,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1396,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1397,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1398,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1399,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1400,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1401,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1402,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1403,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1404,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1405,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1406,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1407,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1408,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1409,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1410,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1411,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1412,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1413,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1414,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1415,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1416,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1417,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1418,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1419,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1420,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1421,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x32, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1422,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1423,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1424,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1425,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1426,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1427,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1428,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1429,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1430,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1431,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x31, 0x39, 0x37, 0x33, 0x32, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1432,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1433,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x31, 0x39, 0x37, 0x33, 0x32, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1434,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1435,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1436,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1437,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1438,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1439,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1440,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1441,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1442,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x31, 0x37, 0x35, 0x34, 0x39, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1443,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1444,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1445,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1446,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1447,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1448,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1449,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1450,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1451,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1452,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1453,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1454,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1455,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1456,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1457,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1458,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1459,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1460,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1461,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1462,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1463,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1464,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1465,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1466,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x39, 0x37, 0x33, 0x32, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1467,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1468,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1469,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1470,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1471,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1472,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1473,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1474,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1475,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1476,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1477,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x31, 0x39, 0x37, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1478,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1479,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1480,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1481,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1482,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1483,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1484,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1485,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1486,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x37, 0x30, 0x31, 0x39, 0x37, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1487,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1488,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x31, 0x39, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1489,64,"style","Trailing whitespace is superfluous."," 0x33, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1490,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1491,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1492,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1493,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1494,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1495,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1496,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1497,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1498,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1499,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1500,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x32, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1501,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1502,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1503,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1504,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x31, 0x39, 0x37, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1505,64,"style","Trailing whitespace is superfluous."," 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1506,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1507,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1508,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1509,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1510,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1511,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1512,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1513,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1514,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1515,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1516,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1517,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1518,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x2d, 0x32, 0x36, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1519,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x3a, 0x31, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1520,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1521,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1522,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1523,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1524,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1525,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1526,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1527,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1528,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1529,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1530,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1531,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1532,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1533,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1534,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1535,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1536,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1537,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1538,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x37, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1539,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x39, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1540,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1541,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1542,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1543,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1544,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1545,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1546,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1547,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1548,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1549,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1550,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1551,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1552,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1553,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1554,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1555,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1556,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1557,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1558,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1559,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1560,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1561,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1562,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1563,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1564,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1565,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1566,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x38, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1567,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1568,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1569,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1570,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1571,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1572,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1573,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1574,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1575,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1576,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x36, 0x37, 0x35, 0x31, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1577,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1578,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x37, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1579,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1580,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1581,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1582,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1583,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1584,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1585,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1586,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1587,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1588,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x35, 0x38, 0x37, 0x31, 0x31, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1589,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1590,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1591,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1592,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1593,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1594,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1595,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1596,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1597,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1598,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1599,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1600,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1601,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1602,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1603,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1604,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1605,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1606,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1607,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1608,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1609,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1610,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1611,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x37, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1612,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1613,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1614,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1615,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1616,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1617,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1618,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1619,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1620,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1621,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1622,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1623,64,"style","Trailing whitespace is superfluous."," 0x37, 0x35, 0x31, 0x35, 0x39, 0x33, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1624,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1625,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1626,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1627,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1628,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1629,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1630,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1631,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1632,64,"style","Trailing whitespace is superfluous."," 0x37, 0x35, 0x31, 0x35, 0x39, 0x33, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1633,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1634,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x37, 0x35, 0x31, 0x35, 0x39, 0x33, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1635,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1636,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1637,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1638,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1639,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1640,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1641,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1642,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1643,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1644,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1645,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x38, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1646,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1647,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1648,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1649,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1650,64,"style","Trailing whitespace is superfluous."," 0x37, 0x35, 0x31, 0x35, 0x39, 0x33, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1651,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1652,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1653,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1654,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1655,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1656,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1657,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1658,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1659,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1660,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1661,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1662,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1663,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x31, 0x30, 0x2d, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1664,64,"style","Trailing whitespace is superfluous."," 0x38, 0x54, 0x31, 0x36, 0x3a, 0x31, 0x31, 0x3a, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1665,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1666,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1667,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1668,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1669,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1670,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1671,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1672,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1673,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1674,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1675,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1676,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1677,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1678,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1679,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1680,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1681,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1682,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1683,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1684,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x31, 0x31, 0x36, 0x32, 0x30, 0x31, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1685,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1686,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1687,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1688,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1689,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1690,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1691,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1692,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1693,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1694,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1695,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1696,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1697,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1698,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1699,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1700,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1701,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1702,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1703,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1704,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1705,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1706,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1707,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1708,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1709,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1710,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1711,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1712,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1713,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1714,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1715,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1716,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1717,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1718,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1719,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1720,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1721,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1722,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x36, 0x32, 0x30, 0x31, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1723,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1724,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x36, 0x32, 0x30, 0x31, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1725,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1726,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1727,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1728,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1729,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1730,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1731,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1732,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1733,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x36, 0x31, 0x36, 0x30, 0x36, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1734,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1735,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1736,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1737,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1738,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1739,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1740,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1741,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1742,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1743,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1744,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x38, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1745,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1746,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1747,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1748,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1749,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1750,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1751,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1752,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1753,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1754,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1755,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1756,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1757,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x36, 0x32, 0x30, 0x31, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1758,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1759,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1760,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1761,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1762,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1763,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1764,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1765,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1766,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1767,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1768,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x36, 0x2d, 0x31, 0x31, 0x36, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1769,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1770,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1771,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1772,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1773,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1774,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1775,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1776,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1777,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x36, 0x31, 0x31, 0x36, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1778,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1779,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x36, 0x2d, 0x31, 0x31, 0x36, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1780,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1781,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1782,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1783,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1784,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1785,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1786,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1787,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1788,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1789,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1790,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1791,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x32, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1792,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1793,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1794,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1795,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x36, 0x2d, 0x31, 0x31, 0x36, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1796,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1797,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1798,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x38, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1799,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1800,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1801,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1802,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1803,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1804,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1805,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1806,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1807,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1808,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1809,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x2d, 0x32, 0x39, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1810,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x3a, 0x35, 0x31, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1811,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1812,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1813,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1814,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1815,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1816,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1817,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1818,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1819,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1820,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1821,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1822,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1823,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1824,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1825,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1826,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1827,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1828,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1829,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1830,64,"style","Trailing whitespace is superfluous."," 0x32, 0x34, 0x36, 0x37, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1831,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1832,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1833,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1834,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1835,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1836,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1837,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1838,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1839,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1840,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1841,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1842,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1843,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1844,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1845,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1846,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1847,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1848,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1849,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1850,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1851,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1852,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1853,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1854,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1855,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1856,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1857,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x2d, 0x30, 0x31, 0x2d, 0x32, 0x39, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1858,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1859,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1860,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1861,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1862,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1863,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1864,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1865,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1866,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1867,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x36, 0x30, 0x39, 0x32, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1868,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1869,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x39, 0x32, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1870,64,"style","Trailing whitespace is superfluous."," 0x36, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1871,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1872,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1873,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1874,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1875,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1876,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1877,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1878,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1879,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x33, 0x34, 0x39, 0x32, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1880,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1881,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1882,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1883,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1884,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1885,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1886,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1887,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1888,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1889,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1890,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1891,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1892,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1893,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1894,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1895,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1896,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1897,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1898,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1899,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1900,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1901,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1902,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x39, 0x32, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1903,64,"style","Trailing whitespace is superfluous."," 0x36, 0x37, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1904,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1905,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1906,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1907,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1908,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1909,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1910,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1911,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1912,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1913,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1914,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x32, 0x34, 0x36, 0x37, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1915,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1916,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1917,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1918,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1919,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1920,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1921,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1922,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1923,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x32, 0x34, 0x36, 0x37, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1924,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1925,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x39, 0x32, 0x34, 0x36, 0x37, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1926,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1927,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1928,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1929,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1930,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1931,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1932,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1933,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1934,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1935,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1936,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x2d, 0x30, 0x31, 0x2d, 0x32, 0x39, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1937,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1938,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1939,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1940,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1941,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x32, 0x34, 0x36, 0x37, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1942,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1943,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1944,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x38, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1945,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1946,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1947,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1948,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1949,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1950,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1951,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1952,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1953,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1954,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x30, 0x31, 0x2d, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1955,64,"style","Trailing whitespace is superfluous."," 0x39, 0x54, 0x31, 0x36, 0x3a, 0x31, 0x30, 0x3a, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1956,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1957,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1958,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1959,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1960,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1961,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1962,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1963,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1964,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1965,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1966,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1967,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1968,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1969,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1970,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1971,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1972,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1973,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1974,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1975,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x30, 0x37, 0x34, 0x35, 0x33, 0x39, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1976,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1977,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1978,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1979,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1980,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1981,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1982,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1983,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1984,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1985,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1986,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1987,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1988,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1989,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1990,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1991,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1992,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1993,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1994,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1995,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1996,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1997,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1998,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1999,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2000,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2001,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2002,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2003,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x33, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2004,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2005,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2006,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2007,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2008,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2009,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2010,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2011,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2012,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2013,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x34, 0x35, 0x33, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2014,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2015,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x34, 0x35, 0x33, 0x39, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2016,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2017,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2018,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2019,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2020,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2021,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2022,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2023,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2024,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x35, 0x31, 0x31, 0x38, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2025,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2026,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2027,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2028,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2029,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2030,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2031,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2032,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2033,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2034,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2035,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2036,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2037,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2038,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2039,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2040,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2041,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2042,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2043,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2044,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2045,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2046,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2047,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2048,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x34, 0x35, 0x33, 0x39, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2049,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2050,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2051,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2052,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2053,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2054,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2055,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2056,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2057,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2058,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2059,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x37, 0x34, 0x35, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2060,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2061,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2062,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2063,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2064,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2065,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2066,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2067,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2068,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x35, 0x30, 0x37, 0x34, 0x35, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2069,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2070,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x37, 0x34, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2071,64,"style","Trailing whitespace is superfluous."," 0x33, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2072,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2073,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2074,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2075,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2076,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2077,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2078,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2079,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2080,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2081,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2082,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x33, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2083,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2084,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2085,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2086,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x37, 0x34, 0x35, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2087,64,"style","Trailing whitespace is superfluous."," 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2088,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2089,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2090,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2091,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2092,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2093,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2094,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2095,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2096,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2097,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2098,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2099,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2100,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x33, 0x30, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2101,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x3a, 0x34, 0x34, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2102,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2103,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2104,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2105,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2106,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2107,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2108,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2109,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2110,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2111,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2112,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2113,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2114,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2115,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2116,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2117,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2118,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2119,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2120,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2121,64,"style","Trailing whitespace is superfluous."," 0x32, 0x36, 0x34, 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2122,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2123,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2124,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2125,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2126,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2127,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2128,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2129,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2130,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2131,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2132,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2133,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2134,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2135,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2136,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2137,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2138,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2139,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2140,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2141,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2142,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2143,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2144,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2145,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2146,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2147,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2148,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x35, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2149,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2150,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2151,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2152,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2153,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2154,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2155,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2156,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2157,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2158,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x35, 0x30, 0x33, 0x32, 0x36, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2159,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2160,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x33, 0x32, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2161,64,"style","Trailing whitespace is superfluous."," 0x34, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2162,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2163,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2164,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2165,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2166,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2167,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2168,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2169,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2170,64,"style","Trailing whitespace is superfluous."," 0x38, 0x31, 0x39, 0x38, 0x32, 0x31, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2171,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2172,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2173,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2174,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2175,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2176,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2177,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2178,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2179,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2180,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2181,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2182,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2183,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2184,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2185,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2186,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2187,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2188,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2189,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2190,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2191,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2192,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2193,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x33, 0x32, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2194,64,"style","Trailing whitespace is superfluous."," 0x34, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2195,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2196,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2197,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2198,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2199,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2200,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2201,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2202,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2203,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2204,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2205,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x32, 0x36, 0x34, 0x32, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2206,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2207,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2208,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2209,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2210,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2211,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2212,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2213,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2214,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x32, 0x36, 0x34, 0x32, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2215,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2216,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x33, 0x32, 0x36, 0x34, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2217,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2218,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2219,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2220,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2221,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2222,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2223,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2224,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2225,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2226,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2227,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x35, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2228,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2229,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2230,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2231,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2232,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x32, 0x36, 0x34, 0x32, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2233,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2234,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2235,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2236,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2237,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2238,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2239,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2240,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2241,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2242,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2243,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2244,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2245,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2246,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x54, 0x31, 0x36, 0x3a, 0x35, 0x37, 0x3a, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2247,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2248,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2249,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2250,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2251,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2252,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2253,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2254,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2255,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2256,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2257,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2258,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2259,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2260,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2261,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2262,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2263,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2264,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2265,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2266,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x35, 0x37, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2267,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2268,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2269,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2270,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2271,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2272,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2273,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2274,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2275,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2276,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2277,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2278,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2279,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2280,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2281,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2282,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2283,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2284,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2285,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2286,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2287,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2288,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2289,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2290,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2291,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2292,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2293,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2294,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x33, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2295,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2296,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2297,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2298,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2299,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2300,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2301,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2302,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2303,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2304,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x35, 0x37, 0x31, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2305,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2306,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x35, 0x37, 0x31, 0x39, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2307,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2308,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2309,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2310,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2311,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2312,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2313,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2314,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2315,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x31, 0x35, 0x35, 0x36, 0x33, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2316,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2317,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2318,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2319,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2320,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2321,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2322,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2323,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2324,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2325,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2326,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2327,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2328,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2329,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2330,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2331,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2332,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2333,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2334,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2335,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2336,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2337,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2338,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2339,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x35, 0x37, 0x31, 0x39, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2340,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2341,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2342,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2343,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2344,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2345,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2346,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2347,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2348,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2349,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2350,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2351,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2352,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2353,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2354,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2355,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2356,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2357,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2358,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2359,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x31, 0x35, 0x30, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2360,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2361,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2362,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2363,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2364,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2365,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2366,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2367,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2368,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2369,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2370,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2371,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2372,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2373,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x33, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2374,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2375,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2376,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2377,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2378,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2379,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2380,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2381,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2382,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2383,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2384,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2385,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2386,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2387,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2388,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2389,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2390,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2391,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x30, 0x31, 0x2d, 0x33, 0x30, 0x54, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2392,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x34, 0x30, 0x3a, 0x33, 0x39, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2393,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2394,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2395,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2396,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2397,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2398,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2399,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2400,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2401,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2402,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2403,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2404,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2405,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2406,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2407,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2409,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2410,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2411,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2412,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x35, 0x36, 0x36, 0x36, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2413,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2414,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2415,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2416,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2417,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2418,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2419,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2420,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2421,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2422,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2423,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2424,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2425,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2426,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2427,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2428,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2429,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2430,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2431,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2432,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2433,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2434,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2435,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2436,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2437,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2438,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2439,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2440,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2441,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2442,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2443,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2444,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2445,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2446,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2447,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2448,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2449,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x34, 0x30, 0x37, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2450,64,"style","Trailing whitespace is superfluous."," 0x36, 0x36, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2451,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2452,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x36, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2453,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2454,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2455,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2456,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2457,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2458,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2459,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2460,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2461,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x31, 0x31, 0x38, 0x37, 0x36, 0x33, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2462,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2463,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2464,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2465,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2466,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2467,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2468,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2469,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2470,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2471,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2472,64,"style","Trailing whitespace is superfluous."," 0x30, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2473,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2474,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2475,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2476,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2477,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2478,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2479,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2480,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2481,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2482,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2483,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2484,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2485,64,"style","Trailing whitespace is superfluous."," 0x37, 0x35, 0x36, 0x36, 0x36, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2486,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2487,64,"style","Trailing whitespace is superfluous."," 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2488,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2489,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2490,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2491,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2492,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2493,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2494,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2495,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2496,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x37, 0x35, 0x36, 0x36, 0x36, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2497,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2498,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2499,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2500,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2501,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2502,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2503,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2504,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2505,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x34, 0x30, 0x37, 0x35, 0x36, 0x36, 0x36, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2506,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2507,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x37, 0x35, 0x36, 0x36, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2508,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2509,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2510,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2511,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2512,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2513,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2514,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2515,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2516,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2517,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2518,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2519,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2520,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2521,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2522,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2523,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x37, 0x35, 0x36, 0x36, 0x36, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2524,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2525,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2526,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x30, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2527,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2528,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2529,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2530,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2531,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2532,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2533,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2534,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2535,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2536,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2537,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x33, 0x31, 0x54, 0x31, 0x39, 0x3a, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2538,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3a, 0x33, 0x39, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2539,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2540,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2541,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2542,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2543,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2544,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2545,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2546,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2547,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2548,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2549,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2550,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2551,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2552,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2553,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2554,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2555,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2556,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2557,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x33, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2558,64,"style","Trailing whitespace is superfluous."," 0x36, 0x37, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2559,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2560,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2561,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2562,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2563,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2564,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2565,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2566,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2567,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2568,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2569,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2570,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2571,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2572,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2573,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2574,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2575,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2576,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2577,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2578,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2579,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2580,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2581,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2582,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2583,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2584,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2585,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2586,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2587,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2588,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2589,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2590,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2591,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2592,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2593,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2594,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2595,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x31, 0x34, 0x30, 0x33, 0x32, 0x36, 0x37, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2596,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2597,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x33, 0x32, 0x36, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2598,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2599,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2600,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2601,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2602,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2603,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2604,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2605,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2606,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x34, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2607,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x31, 0x34, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2608,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2609,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2610,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2611,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2612,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2613,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2614,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2615,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2616,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2617,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2618,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2619,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2620,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2621,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2622,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2623,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2624,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2625,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2626,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2627,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2628,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2629,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2630,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x33, 0x32, 0x36, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2631,64,"style","Trailing whitespace is superfluous."," 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2632,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2633,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2634,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2635,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2636,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2637,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2638,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2639,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2640,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2641,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2642,64,"style","Trailing whitespace is superfluous."," 0x33, 0x32, 0x36, 0x37, 0x34, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2643,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2644,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2645,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2646,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2647,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2648,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2649,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2650,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2651,64,"style","Trailing whitespace is superfluous."," 0x33, 0x32, 0x36, 0x37, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2652,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2653,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x32, 0x36, 0x37, 0x34, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2654,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2655,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2656,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2657,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2658,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2659,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2660,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2661,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2662,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2663,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2664,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2665,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2666,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2667,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2668,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2669,64,"style","Trailing whitespace is superfluous."," 0x33, 0x32, 0x36, 0x37, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2670,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2671,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2672,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2673,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2674,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2675,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2676,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2677,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2678,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2679,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2680,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2681,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2682,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, 0x34, 0x2d, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2683,64,"style","Trailing whitespace is superfluous."," 0x30, 0x54, 0x31, 0x36, 0x3a, 0x32, 0x35, 0x3a, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2684,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2685,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2686,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2687,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2688,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2689,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2690,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2691,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2692,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2693,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2694,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2695,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2696,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2697,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2698,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2699,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2700,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2701,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2702,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2703,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x30, 0x34, 0x36, 0x31, 0x32, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2704,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2705,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2706,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2707,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2708,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2709,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2710,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2711,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2712,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2713,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2714,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2715,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2716,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2717,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2718,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2719,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2720,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2721,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2722,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2723,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2724,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2725,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2726,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2727,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2728,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2729,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2730,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2731,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x32, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2732,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2733,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2734,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2735,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2736,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2737,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2738,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2739,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2740,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2741,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x34, 0x36, 0x31, 0x32, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2742,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2743,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x34, 0x36, 0x31, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2744,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2745,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2746,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2747,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2748,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2749,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2750,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2751,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2752,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x34, 0x35, 0x35, 0x33, 0x38, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2753,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2754,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2755,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2756,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2757,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2758,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2759,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2760,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2761,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2762,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2763,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x32, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2764,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2765,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2766,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2767,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2768,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2769,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2770,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2771,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2772,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2773,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2774,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2775,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2776,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x34, 0x36, 0x31, 0x32, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2777,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2778,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2779,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2780,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2781,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2782,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2783,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2784,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2785,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2786,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2787,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x34, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2788,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2789,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2790,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2791,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2792,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2793,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2794,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2795,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2796,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x34, 0x30, 0x30, 0x34, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2797,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2798,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2799,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2800,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2801,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2802,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2803,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2804,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2805,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2806,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2807,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2808,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2809,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2810,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x32, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2811,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2812,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2813,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2814,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x34, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2815,64,"style","Trailing whitespace is superfluous."," 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2816,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2817,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x32, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2818,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2819,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2820,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2821,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2822,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2823,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2824,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2825,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2826,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2827,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2828,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x31, 0x2d, 0x32, 0x38, 0x54, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2829,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x31, 0x36, 0x3a, 0x32, 0x37, 0x2d, 0x30, 0x35, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2830,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2831,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2832,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2833,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2834,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2835,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2836,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2837,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2838,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2839,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2840,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2841,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2842,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2843,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2844,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2845,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2846,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2847,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2848,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2849,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x38, 0x32, 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2850,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2851,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2852,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2853,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2854,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2855,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2856,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2857,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2858,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2859,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2860,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2861,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2862,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2863,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2864,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2865,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2866,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2867,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2868,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2869,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2870,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2871,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2872,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2873,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2874,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2875,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2876,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x33, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2877,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2878,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2879,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2880,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2881,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2882,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2883,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2884,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2885,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2886,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x31, 0x33, 0x30, 0x37, 0x38, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2887,64,"style","Trailing whitespace is superfluous."," 0x32, 0x32, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2888,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x37, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2889,64,"style","Trailing whitespace is superfluous."," 0x38, 0x32, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2890,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2891,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2892,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2893,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2894,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2895,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2896,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2897,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2898,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x31, 0x37, 0x37, 0x32, 0x34, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2899,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2900,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2901,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2902,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2903,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2904,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2905,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2906,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2907,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2908,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2909,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2910,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2911,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2912,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2913,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2914,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2915,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2916,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2917,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2918,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2919,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2920,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2921,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2922,64,"style","Trailing whitespace is superfluous."," 0x38, 0x38, 0x32, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2923,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2924,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2925,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2926,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2927,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2928,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2929,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2930,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2931,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2932,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2933,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x37, 0x38, 0x38, 0x32, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2934,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2935,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2936,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2937,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2938,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2939,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2940,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2941,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2942,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x30, 0x37, 0x38, 0x38, 0x32, 0x32, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2943,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2944,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x37, 0x38, 0x38, 0x32, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2945,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2946,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2947,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2948,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2949,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2950,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2951,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2952,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2953,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2954,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2955,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x31, 0x30, 0x2d, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2956,64,"style","Trailing whitespace is superfluous."," 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2957,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2958,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2959,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2960,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x37, 0x38, 0x38, 0x32, 0x32, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2961,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2962,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2963,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2964,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2965,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2966,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2967,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2968,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2969,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2970,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2971,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2972,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2973,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2974,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x32, 0x39, 0x54, 0x31, 0x37, 0x3a, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2975,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x35, 0x39, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2976,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2977,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2978,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2979,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2980,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2981,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2982,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2983,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2984,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2985,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2986,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2987,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2988,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2989,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2990,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2991,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2992,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2993,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2994,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x33, 0x36, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2995,64,"style","Trailing whitespace is superfluous."," 0x38, 0x36, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2996,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2997,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2998,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2999,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3000,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3001,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3002,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3003,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3004,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3005,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3006,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3007,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3008,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3009,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3010,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3011,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3012,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3013,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3014,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3015,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3016,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3017,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3018,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3019,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3020,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3021,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3022,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x32, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3023,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3024,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3025,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3026,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3027,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3028,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3029,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3030,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3031,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3032,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x33, 0x30, 0x33, 0x36, 0x30, 0x38, 0x36, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3033,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3034,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x33, 0x36, 0x30, 0x38, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3035,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3036,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3037,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3038,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3039,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3040,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3041,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3042,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3043,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x33, 0x38, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3044,64,"style","Trailing whitespace is superfluous."," 0x34, 0x37, 0x36, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3045,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3046,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3047,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3048,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3049,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3050,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3051,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3052,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3053,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3054,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x32, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3055,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3056,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3057,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3058,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3059,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3060,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3061,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3062,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3063,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3064,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3065,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3066,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3067,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x33, 0x36, 0x30, 0x38, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3068,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3069,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3070,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3071,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3072,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3073,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3074,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3075,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3076,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3077,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3078,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3079,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x38, 0x36, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3080,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3081,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3082,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3083,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3084,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3085,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3086,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3087,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x33, 0x30, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3088,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x38, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3089,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3090,64,"style","Trailing whitespace is superfluous."," 0x33, 0x36, 0x30, 0x38, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3091,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3092,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3093,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3094,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3095,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3096,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3097,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3098,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3099,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3100,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3101,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x32, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3102,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3103,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3104,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3105,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3106,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x38, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3107,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3108,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3109,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3110,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3111,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3112,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3113,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3114,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3115,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3116,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3117,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3118,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3119,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3120,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x38, 0x3a, 0x31, 0x36, 0x3a, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3121,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3122,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3123,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3124,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3125,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3126,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3127,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3128,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3129,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3130,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3131,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3132,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x2f, 0x41, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3133,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3134,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3135,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3136,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3137,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3138,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3139,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3140,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x36, 0x35, 0x34, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3141,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3142,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3143,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3144,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3145,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3146,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x6d, 0x65, 0x6e, 0x64, 0x3e, 0x5b, 0x41, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3147,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x64, 0x5d, 0x3c, 0x2f, 0x61, 0x6d, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3148,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3149,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3150,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3151,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3152,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3153,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3154,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3155,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3156,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3157,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3158,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3159,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3160,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3161,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3162,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3163,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3164,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3165,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3166,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3167,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3168,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3169,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3170,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3171,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3172,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3173,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3174,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3175,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3176,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3177,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3178,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3179,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3180,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3181,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x30, 0x30, 0x36, 0x35, 0x34, 0x31, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3182,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3183,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x30, 0x36, 0x35, 0x34, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3184,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3185,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3186,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3187,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3188,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3189,64,"style","Trailing whitespace is superfluous."," 0x41, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3190,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3191,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3192,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x33, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3193,64,"style","Trailing whitespace is superfluous."," 0x36, 0x33, 0x36, 0x32, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3194,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3195,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3196,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3197,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3198,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3199,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3200,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3201,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3202,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3203,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x30, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3204,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3205,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3206,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3207,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3208,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3209,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3210,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3211,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3212,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3213,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3214,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3215,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3216,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x36, 0x35, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3217,64,"style","Trailing whitespace is superfluous."," 0x31, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3218,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3219,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3220,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3221,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3222,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3223,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3224,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3225,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3226,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3227,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3228,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x35, 0x34, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3229,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3230,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3231,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3232,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3233,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3234,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3235,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3236,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x33, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3237,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x35, 0x34, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3238,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3239,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x36, 0x35, 0x34, 0x31, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3240,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3241,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3242,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3243,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3244,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3245,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3246,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3247,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3248,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3249,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3250,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3251,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3252,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3253,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3254,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3255,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x35, 0x34, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3256,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3257,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3258,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x30, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3259,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3260,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3261,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x2f, 0x41, 0x20, 0x5b, 0x41, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3262,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x64, 0x5d, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3263,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3264,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3265,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3266,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3267,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3268,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3269,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3270,64,"style","Trailing whitespace is superfluous."," 0x31, 0x54, 0x31, 0x37, 0x3a, 0x31, 0x36, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3271,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3272,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3273,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3274,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3275,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3276,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3277,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3278,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3279,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3280,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3281,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3282,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3283,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3284,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3285,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3286,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3287,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3288,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3289,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3290,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x34, 0x39, 0x37, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3291,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3292,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3293,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3294,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3295,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3296,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3297,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3298,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3299,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3300,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3301,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3302,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3303,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3304,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3305,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3306,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3307,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3308,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3309,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3310,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3311,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3312,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3313,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3314,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3315,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3316,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3317,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3318,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3319,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3320,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3321,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3322,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3323,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3324,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3325,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3326,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3327,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3328,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x34, 0x39, 0x37, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3329,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3330,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x35, 0x34, 0x39, 0x37, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3331,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3332,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3333,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3334,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3335,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3336,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3337,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3338,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3339,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x33, 0x35, 0x35, 0x34, 0x38, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3340,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3341,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3342,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3343,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3344,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3345,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3346,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3347,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3348,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3349,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3350,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x32, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3351,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3352,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3353,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3354,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3355,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3356,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3357,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3358,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3359,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3360,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3361,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3362,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3363,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x35, 0x34, 0x39, 0x37, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3364,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3365,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3366,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3367,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3368,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3369,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3370,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3371,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3372,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3373,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3374,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x34, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3375,64,"style","Trailing whitespace is superfluous."," 0x37, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3376,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3377,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3378,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3379,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3380,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3381,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3382,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3383,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x33, 0x30, 0x30, 0x35, 0x34, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3384,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3385,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3386,64,"style","Trailing whitespace is superfluous."," 0x39, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3387,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3388,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3389,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3390,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3391,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3392,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3393,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3394,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3395,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3396,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3397,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x32, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3398,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3399,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3400,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3401,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x34, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3402,64,"style","Trailing whitespace is superfluous."," 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3403,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3404,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x32, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3405,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3406,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3407,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3409,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3410,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3411,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3412,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3413,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3414,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3415,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x31, 0x2d, 0x32, 0x39, 0x54, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3416,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x34, 0x36, 0x3a, 0x30, 0x35, 0x2d, 0x30, 0x35, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3417,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3418,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3419,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3420,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3421,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3422,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3423,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3424,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3425,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3426,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3427,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3428,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3429,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3430,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3431,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3432,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3433,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3434,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3435,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3436,64,"style","Trailing whitespace is superfluous."," 0x37, 0x32, 0x37, 0x34, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3437,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3438,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3439,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3440,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3441,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3442,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3443,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3444,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3445,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3446,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3447,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3448,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3449,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3450,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3451,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3452,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3453,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3454,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3455,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3456,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3457,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3458,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3459,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3460,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3461,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3462,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3463,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x32, 0x2d, 0x31, 0x30, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3464,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3465,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3466,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3467,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3468,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3469,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3470,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3471,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3472,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3473,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x31, 0x32, 0x30, 0x37, 0x32, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3474,64,"style","Trailing whitespace is superfluous."," 0x34, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3475,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x37, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3476,64,"style","Trailing whitespace is superfluous."," 0x37, 0x34, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3477,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3478,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3479,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3480,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3481,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3482,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3483,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3484,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3485,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x31, 0x37, 0x31, 0x33, 0x39, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3486,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3487,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3488,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3489,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3490,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3491,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3492,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3493,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3494,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3495,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3496,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3497,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3498,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3499,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3500,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3501,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3502,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3503,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3504,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3505,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3506,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3507,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3508,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3509,64,"style","Trailing whitespace is superfluous."," 0x32, 0x37, 0x34, 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3510,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3511,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3512,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3513,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3514,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3515,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3516,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3517,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3518,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3519,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3520,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x37, 0x32, 0x37, 0x34, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3521,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3522,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3523,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3524,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3525,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3526,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3527,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3528,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3529,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x30, 0x37, 0x32, 0x37, 0x34, 0x34, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3530,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3531,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x2d, 0x30, 0x37, 0x32, 0x37, 0x34, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3532,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3533,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3534,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3535,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3536,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3537,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3538,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3539,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3540,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3541,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3542,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x32, 0x2d, 0x31, 0x30, 0x2d, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3543,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3544,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3545,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3546,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3547,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x37, 0x32, 0x37, 0x34, 0x34, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3548,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3549,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3550,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x31, 0x30, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3551,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3552,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3553,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3554,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3555,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3556,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3557,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3558,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3559,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3560,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x32, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3561,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x33, 0x31, 0x54, 0x31, 0x37, 0x3a, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3562,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x37, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3563,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3564,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3565,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3566,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3567,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3568,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3569,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3570,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3571,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3572,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3573,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3574,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3575,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3576,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3577,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3578,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3579,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3580,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3581,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x33, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3582,64,"style","Trailing whitespace is superfluous."," 0x34, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3583,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3584,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3585,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3586,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3587,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3588,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3589,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3590,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3591,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3592,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3593,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3594,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3595,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3596,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3597,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3598,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3599,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3600,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3601,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3602,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3603,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3604,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3605,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3606,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3607,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3608,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3609,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3610,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3611,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3612,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3613,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3614,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3615,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3616,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3617,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3618,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3619,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x32, 0x30, 0x33, 0x30, 0x37, 0x34, 0x34, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3620,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3621,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x33, 0x30, 0x37, 0x34, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3622,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3623,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3624,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3625,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3626,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3627,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3628,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3629,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3630,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x32, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3631,64,"style","Trailing whitespace is superfluous."," 0x36, 0x37, 0x30, 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3632,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3633,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3634,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3635,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3636,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3637,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3638,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3639,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3640,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3641,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3642,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3643,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3644,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3645,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3646,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3647,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3648,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3649,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3650,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3651,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3652,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3653,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3654,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x33, 0x30, 0x37, 0x34, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3655,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3656,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3657,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3658,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3659,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3660,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3661,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3662,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3663,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3664,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3665,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3666,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x34, 0x34, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3667,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3668,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3669,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3670,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3671,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3672,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3673,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3674,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x32, 0x30, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3675,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x34, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3676,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3677,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x37, 0x34, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3678,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3679,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3680,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3681,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3682,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3683,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3684,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3685,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3686,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3687,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3688,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3689,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3690,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3691,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3692,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3693,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x34, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3694,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3695,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3696,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3697,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3698,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3699,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3700,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3701,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3702,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3703,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3704,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3705,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3706,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x32, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3707,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x37, 0x3a, 0x32, 0x38, 0x3a, 0x30, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3708,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3709,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3710,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3711,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3712,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3713,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3714,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3715,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3716,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3717,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3718,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3719,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3720,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3721,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3722,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3723,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3724,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3725,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3726,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3727,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x30, 0x35, 0x38, 0x36, 0x31, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3728,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3729,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3730,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3731,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3732,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3733,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3734,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3735,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3736,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3737,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3738,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3739,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3740,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3741,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3742,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3743,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3744,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3745,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3746,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3747,64,"style","Trailing whitespace is superfluous."," 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3748,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3749,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3750,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3751,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3752,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3753,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3754,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x32, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3755,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3756,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3757,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3758,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3759,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3760,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3761,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3762,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3763,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3764,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3765,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x38, 0x36, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3766,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3767,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x38, 0x36, 0x31, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3768,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3769,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3770,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3771,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3772,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3773,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3774,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3775,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3776,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x31, 0x32, 0x35, 0x36, 0x32, 0x37, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3777,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3778,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3779,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3780,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3781,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3782,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3783,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3784,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3785,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3786,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3787,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3788,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3789,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3790,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3791,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3792,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3793,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3794,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3795,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3796,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3797,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3798,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3799,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3800,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x38, 0x36, 0x31, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3801,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3802,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3803,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3804,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3805,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3806,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3807,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3808,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3809,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3810,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3811,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x35, 0x38, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3812,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3813,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3814,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3815,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3816,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3817,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3818,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3819,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3820,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x31, 0x32, 0x30, 0x30, 0x35, 0x38, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3821,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3822,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x35, 0x38, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3823,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3824,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3825,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3826,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3827,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3828,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3829,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3830,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3831,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3832,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3833,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x32, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3834,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3835,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3836,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3837,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3838,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x35, 0x38, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3839,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3840,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3841,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x34, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3842,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3843,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3844,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3845,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3846,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3847,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3848,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3849,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3850,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3851,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3852,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x31, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3853,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x3a, 0x34, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3854,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3855,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3856,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3857,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3858,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3859,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3860,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3861,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3862,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3863,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3864,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3865,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3866,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3867,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3868,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3869,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3870,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3871,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3872,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3873,64,"style","Trailing whitespace is superfluous."," 0x38, 0x34, 0x38, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3874,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3875,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3876,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3877,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3878,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3879,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3880,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3881,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3882,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3883,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3884,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3885,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3886,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3887,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3888,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3889,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3890,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3891,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3892,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3893,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3894,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3895,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3896,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3897,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3898,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3899,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3900,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x37, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3901,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3902,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3903,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3904,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3905,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3906,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3907,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3908,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3909,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3910,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x31, 0x30, 0x35, 0x38, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3911,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3912,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x35, 0x38, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3913,64,"style","Trailing whitespace is superfluous."," 0x38, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3914,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3915,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3916,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3917,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3918,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3919,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3920,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3921,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3922,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x36, 0x32, 0x34, 0x32, 0x36, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3923,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3924,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3925,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3926,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3927,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3928,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3929,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3930,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3931,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3932,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3933,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3934,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3935,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3936,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3937,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3938,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3939,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3940,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3941,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3942,64,"style","Trailing whitespace is superfluous."," 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3943,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3944,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3945,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x35, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3946,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3947,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3948,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3949,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3950,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3951,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3952,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3953,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3954,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3955,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3956,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3957,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x38, 0x34, 0x38, 0x34, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3958,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3959,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3960,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3961,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3962,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3963,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3964,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3965,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3966,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x35, 0x38, 0x34, 0x38, 0x34, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3967,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3968,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x35, 0x38, 0x34, 0x38, 0x34, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3969,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3970,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3971,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3972,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3973,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3974,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3975,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3976,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3977,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3978,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3979,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x31, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3980,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3981,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3982,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3983,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3984,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x38, 0x34, 0x38, 0x34, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3985,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3986,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3987,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3988,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3989,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3990,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3991,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3992,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3993,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3994,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3995,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3996,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3997,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3998,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x37, 0x54, 0x31, 0x36, 0x3a, 0x34, 0x33, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3999,64,"style","Trailing whitespace is superfluous."," 0x34, 0x32, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4000,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4001,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4002,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4003,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4004,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4005,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4006,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4007,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4008,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4009,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4010,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4011,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4012,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4013,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4014,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4015,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4016,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4017,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4018,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x35, 0x33, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4019,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4020,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4021,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4022,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4023,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4024,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4025,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4026,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4027,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4028,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4029,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4030,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4031,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4032,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4033,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4034,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4035,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4036,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4037,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4038,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4039,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4040,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4041,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4042,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4043,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4044,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4045,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4046,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4047,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4048,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4049,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4050,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4051,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4052,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4053,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4054,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4055,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4056,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x32, 0x35, 0x33, 0x33, 0x30, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4057,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4058,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x32, 0x35, 0x33, 0x33, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4059,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4060,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4061,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4062,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4063,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4064,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4065,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4066,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4067,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x31, 0x38, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4068,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4069,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4070,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4071,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4072,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4073,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4074,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4075,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4076,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4077,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4078,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4079,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4080,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4081,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4082,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4083,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4084,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4085,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4086,64,"style","Trailing whitespace is superfluous."," 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4087,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4088,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4089,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4090,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4091,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x32, 0x35, 0x33, 0x33, 0x30, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4092,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4093,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4094,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4095,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4096,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4097,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4098,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4099,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4100,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4101,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4102,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4103,64,"style","Trailing whitespace is superfluous."," 0x33, 0x33, 0x30, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4104,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4105,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4106,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4107,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4108,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4109,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4110,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4111,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x31, 0x30, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4112,64,"style","Trailing whitespace is superfluous."," 0x33, 0x33, 0x30, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4113,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4114,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x33, 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4115,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4116,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4117,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4118,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4119,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4120,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4121,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4122,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4123,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4124,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4125,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x33, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4126,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4127,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4128,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4129,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4130,64,"style","Trailing whitespace is superfluous."," 0x33, 0x33, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4131,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4132,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4133,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4134,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4135,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4136,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4137,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4138,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4139,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4140,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4141,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4142,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4143,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x33, 0x54, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4144,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x3a, 0x35, 0x35, 0x3a, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4145,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4146,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4147,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4148,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4149,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4150,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4151,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4152,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4153,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4154,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4155,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4156,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4157,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4158,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4159,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4160,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4161,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4162,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4163,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4164,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x34, 0x38, 0x34, 0x31, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4165,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4166,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4167,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4168,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4169,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4170,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4171,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4172,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4173,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4174,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4175,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4176,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4177,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4178,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4179,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4180,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4181,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4182,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4183,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4184,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4185,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4186,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4187,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4188,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4189,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4190,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4191,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4192,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4193,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4194,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4195,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4196,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4197,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4198,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4199,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4200,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4201,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x31, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4202,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x34, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4203,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4204,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x38, 0x34, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4205,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4206,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4207,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4208,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4209,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4210,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4211,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4212,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4213,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x31, 0x35, 0x37, 0x31, 0x35, 0x31, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4214,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4215,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4216,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4217,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4218,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4219,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4220,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4221,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4222,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4223,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4224,64,"style","Trailing whitespace is superfluous."," 0x35, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4225,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4226,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4227,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4228,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4229,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4230,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4231,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4232,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4233,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4234,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4235,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4236,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4237,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x38, 0x34, 0x31, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4238,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4239,64,"style","Trailing whitespace is superfluous."," 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4240,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4241,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4242,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4243,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4244,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4245,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4246,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4247,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4248,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x30, 0x34, 0x38, 0x34, 0x31, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4249,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4250,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4251,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4252,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4253,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4254,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4255,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4256,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4257,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x31, 0x30, 0x30, 0x34, 0x38, 0x34, 0x31, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4258,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4259,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x30, 0x34, 0x38, 0x34, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4260,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4261,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4262,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4263,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4264,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4265,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4266,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4267,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4268,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4269,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4270,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4271,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4272,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4273,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4274,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4275,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x30, 0x34, 0x38, 0x34, 0x31, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4276,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4277,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4278,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x35, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4279,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4280,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4281,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4282,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4283,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4284,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4285,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4286,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4287,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4288,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4289,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x33, 0x54, 0x31, 0x37, 0x3a, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4290,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3a, 0x33, 0x31, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4291,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4292,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4293,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4294,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4295,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4296,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4297,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4298,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4299,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4300,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4301,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4302,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4303,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4304,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4305,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4306,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4307,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4308,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4309,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x35, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4310,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4311,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4312,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4313,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4314,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4315,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4316,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4317,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4318,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4319,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4320,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4321,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4322,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4323,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4324,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4325,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4326,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4327,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4328,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4329,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4330,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4331,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4332,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4333,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4334,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4335,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4336,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4337,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4338,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4339,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4340,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4341,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4342,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4343,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4344,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4345,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4346,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4347,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x31, 0x30, 0x30, 0x35, 0x35, 0x36, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4348,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4349,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x35, 0x35, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4350,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4351,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4352,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4353,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4354,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4355,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4356,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4357,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4358,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4359,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x37, 0x37, 0x39, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4360,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4361,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4362,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4363,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4364,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4365,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4366,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4367,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4368,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4369,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x32, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4370,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4371,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4372,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4373,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4374,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4375,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4376,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4377,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4378,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4379,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4380,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4381,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4382,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x35, 0x35, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4383,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4384,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4385,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4386,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4387,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4388,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4389,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4390,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4391,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4392,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4393,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4394,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x35, 0x36, 0x31, 0x32, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4395,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4396,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4397,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4398,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4399,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4400,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4401,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4402,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4403,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x35, 0x36, 0x31, 0x32, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4404,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4405,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x35, 0x36, 0x31, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4406,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4407,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4408,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4409,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4410,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4411,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4412,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4413,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4414,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4415,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4416,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4417,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4418,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4419,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4420,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4421,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x35, 0x36, 0x31, 0x32, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4422,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4423,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4424,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x32, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4425,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4426,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4427,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4428,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4429,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4430,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4431,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4432,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4433,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4434,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4435,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x54, 0x31, 0x36, 0x3a, 0x32, 0x38, 0x3a, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4436,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4437,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4438,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4439,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4440,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4441,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4442,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4443,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4444,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4445,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4446,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4447,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4448,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4449,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4450,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4451,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4452,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4453,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4454,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4455,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x32, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4456,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4457,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4458,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4459,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4460,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4461,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4462,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4463,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4464,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4465,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4466,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4467,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4468,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4469,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4470,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4471,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4472,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4473,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4474,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4475,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4476,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4477,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4478,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4479,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4480,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4481,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4482,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4483,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4484,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4485,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4486,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4487,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4488,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4489,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4490,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4491,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4492,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4493,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x35, 0x38, 0x32, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4494,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4495,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x32, 0x39, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4496,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4497,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4498,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4499,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4500,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4501,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4502,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4503,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4504,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x31, 0x30, 0x38, 0x30, 0x32, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4505,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4506,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4507,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4508,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4509,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4510,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4511,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4512,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4513,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4514,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4515,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4516,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4517,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4518,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4519,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4520,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4521,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4522,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4523,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4524,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x32, 0x39, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4525,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4526,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4527,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4528,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4529,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4530,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4531,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4532,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4533,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x30, 0x30, 0x32, 0x35, 0x38, 0x32, 0x39, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4534,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4535,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x32, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4536,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4537,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4538,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4539,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4540,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4541,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4542,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4543,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4544,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4545,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4546,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4547,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4548,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4549,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4550,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4551,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x32, 0x39, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4552,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4553,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4554,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x33, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4555,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4556,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4557,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4558,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4559,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4560,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4561,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4562,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4563,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4564,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4565,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x35, 0x54, 0x31, 0x37, 0x3a, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4566,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x32, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4567,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4568,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4569,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4570,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4571,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4572,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4573,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4574,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4575,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4576,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4577,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4578,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4579,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4580,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4581,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4582,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4583,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4584,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4585,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4586,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4587,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4588,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4589,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4590,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4591,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4592,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4593,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4594,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4595,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4596,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4597,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4598,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4599,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4600,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4601,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4602,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4603,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4604,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4605,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4606,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4607,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4608,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4609,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4610,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4611,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4612,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4613,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x31, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4614,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4615,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4616,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4617,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4618,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4619,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4620,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4621,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4622,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4623,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x30, 0x30, 0x30, 0x34, 0x32, 0x30, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4624,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4625,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, 0x34, 0x32, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4626,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4627,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4628,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4629,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4630,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4631,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4632,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4633,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4634,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x30, 0x35, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4635,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x36, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4636,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4637,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4638,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4639,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4640,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4641,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4642,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4643,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4644,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4645,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4646,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4647,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4648,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4649,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4650,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4651,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4652,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4653,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4654,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, 0x34, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4655,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4656,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4657,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4658,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4659,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4660,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4661,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4662,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4663,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x30, 0x30, 0x30, 0x34, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4664,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4665,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4666,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4667,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4668,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4669,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4670,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4671,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4672,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4673,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4674,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4675,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4676,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4677,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4678,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4679,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4680,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4681,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, 0x34, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4682,64,"style","Trailing whitespace is superfluous."," 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4683,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4684,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x33, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4685,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4686,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4687,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4688,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4689,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4690,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4691,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4692,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4693,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4694,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4695,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x31, 0x54, 0x31, 0x37, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4696,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x3a, 0x33, 0x33, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4697,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4698,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4699,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4700,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4701,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4702,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4703,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4704,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4705,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4706,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4707,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4708,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4709,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4710,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4711,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4712,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4713,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4714,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4715,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x30, 0x39, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4716,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x30, 0x38, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4717,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4718,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4719,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4720,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4721,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4722,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4723,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4724,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4725,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4726,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4727,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4728,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4729,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4730,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4731,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4732,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4733,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4734,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4735,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4736,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4737,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4738,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4739,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4740,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4741,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4742,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4743,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4744,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4745,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4746,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4747,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4748,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4749,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4750,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4751,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4752,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4753,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x30, 0x39, 0x30, 0x36, 0x32, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4754,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4755,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x30, 0x39, 0x2d, 0x30, 0x36, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4756,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4757,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4758,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4759,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4760,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4761,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4762,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4763,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4764,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4765,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x35, 0x37, 0x37, 0x38, 0x32, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4766,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4767,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4768,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4769,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4770,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4771,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4772,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4773,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4774,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4775,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x33, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4776,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4777,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4778,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4779,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4780,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4781,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4782,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4783,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4784,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x30, 0x39, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4785,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x30, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4786,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4787,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4788,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4789,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4790,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4791,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4792,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4793,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x30, 0x39, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4794,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x30, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4795,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x30, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4796,64,"style","Trailing whitespace is superfluous."," 0x36, 0x32, 0x35, 0x30, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4797,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4798,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4799,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4800,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4801,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4802,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4803,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4804,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4805,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4806,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4807,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x34, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4808,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4809,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4810,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4811,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x30, 0x39, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4812,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x30, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4813,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4814,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4815,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4816,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4817,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4818,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4819,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4820,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4821,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4822,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4823,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4824,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4825,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x34, 0x54, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4826,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x3a, 0x35, 0x39, 0x3a, 0x30, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4827,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4828,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4829,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4830,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4831,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4832,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4833,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4834,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4835,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4836,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4837,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4838,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4839,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4840,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4841,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4842,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4843,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4844,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4845,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4846,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x30, 0x33, 0x35, 0x33, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4847,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4848,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4849,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4850,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4851,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4852,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4853,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4854,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4855,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4856,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4857,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4858,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4859,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4860,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4861,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4862,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4863,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4864,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4865,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4866,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4867,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4868,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4869,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4870,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4871,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4872,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4873,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4874,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4875,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4876,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4877,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4878,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4879,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4880,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4881,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4882,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4883,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4884,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x35, 0x33, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4885,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4886,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x33, 0x35, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4887,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4888,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4889,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4890,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4891,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4892,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4893,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4894,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4895,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x39, 0x37, 0x39, 0x39, 0x33, 0x37, 0x31, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4896,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4897,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4898,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4899,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4900,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4901,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4902,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4903,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4904,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4905,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4906,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4907,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4908,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4909,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4910,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4911,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4912,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4913,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4914,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4915,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x33, 0x35, 0x33, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4916,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4917,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4918,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4919,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4920,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4921,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4922,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4923,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4924,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x33, 0x35, 0x33, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4925,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4926,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x30, 0x33, 0x35, 0x33, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4927,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4928,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4929,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4930,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4931,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4932,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4933,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4934,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4935,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4936,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4937,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x36, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4938,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4939,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4940,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4941,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4942,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x33, 0x35, 0x33, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4943,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4944,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4945,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4946,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4947,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4948,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4949,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4950,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4951,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4952,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4953,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4954,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4955,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4956,64,"style","Trailing whitespace is superfluous."," 0x35, 0x54, 0x32, 0x31, 0x3a, 0x34, 0x39, 0x3a, 0x33, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4957,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4958,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4959,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4960,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4961,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4962,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4963,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4964,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4965,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4966,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4967,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4968,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4969,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4970,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4971,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4972,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4973,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4974,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4975,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4976,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x2d, 0x30, 0x32, 0x34, 0x31, 0x35, 0x33, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4977,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4978,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4979,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4980,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4981,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4982,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4983,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4984,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4985,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4986,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4987,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4988,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4989,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4990,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4991,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4992,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4993,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4994,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4995,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4996,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4997,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4998,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4999,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5000,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5001,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5002,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5003,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5004,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x31, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5005,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5006,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5007,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5008,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5009,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5010,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5011,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5012,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5013,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5014,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x34, 0x31, 0x35, 0x33, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5015,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5016,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x34, 0x31, 0x35, 0x33, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5017,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5018,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5019,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5020,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5021,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5022,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5023,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5024,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5025,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x39, 0x35, 0x38, 0x36, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5026,64,"style","Trailing whitespace is superfluous."," 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5027,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5028,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5029,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5030,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5031,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5032,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5033,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5034,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5035,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5036,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5037,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5038,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5039,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5040,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5041,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5042,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5043,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5044,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5045,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x32, 0x34, 0x31, 0x35, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5046,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5047,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5048,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5049,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5050,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5051,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5052,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5053,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5054,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x30, 0x32, 0x34, 0x31, 0x35, 0x33, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5055,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5056,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x2d, 0x30, 0x32, 0x34, 0x31, 0x35, 0x33, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5057,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5058,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5059,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5060,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5061,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5062,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5063,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5064,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5065,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5066,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5067,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5068,64,"style","Trailing whitespace is superfluous."," 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5069,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5070,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5071,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5072,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x32, 0x34, 0x31, 0x35, 0x33, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5073,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5074,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5075,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5076,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5077,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5078,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5079,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5080,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5081,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5082,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5083,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5084,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5085,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5086,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x54, 0x31, 0x37, 0x3a, 0x30, 0x37, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5087,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5088,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5089,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5090,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5091,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5092,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5093,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5094,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5095,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5096,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5097,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5098,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5099,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5100,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5101,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5102,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5103,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5104,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5105,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5106,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x32, 0x32, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5107,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5108,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5109,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5110,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5111,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5112,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5113,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5114,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5115,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5116,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5117,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5118,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5119,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5120,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5121,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5122,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5123,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5124,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5125,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5126,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5127,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5128,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5129,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5130,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5131,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5132,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5133,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5134,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x33, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5135,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5136,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5137,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5138,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5139,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5140,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5141,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5142,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5143,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5144,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x32, 0x32, 0x30, 0x34, 0x32, 0x31, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5145,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5146,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x32, 0x32, 0x30, 0x34, 0x32, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5147,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5148,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5149,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5150,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5151,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5152,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5153,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5154,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5155,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x38, 0x31, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5156,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5157,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5158,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5159,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5160,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5161,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5162,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5163,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5164,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5165,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5166,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5167,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5168,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5169,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5170,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5171,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5172,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5173,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5174,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5175,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x32, 0x32, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5176,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5177,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5178,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5179,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5180,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5181,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5182,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5183,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5184,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x30, 0x38, 0x32, 0x32, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5185,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5186,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x32, 0x32, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5187,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5188,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5189,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5190,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5191,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5192,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5193,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5194,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5195,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5196,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5197,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5198,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x33, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5199,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5200,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5201,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5202,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x32, 0x32, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5203,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5204,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5205,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5206,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5207,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5208,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5209,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5210,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5211,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5212,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5213,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5214,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5215,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5216,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x33, 0x30, 0x54, 0x31, 0x37, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5217,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x3a, 0x33, 0x33, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5218,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5219,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5220,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5221,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5222,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5223,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5224,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5225,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5226,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5227,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5228,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5229,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5230,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5231,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5232,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5233,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5234,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5235,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5236,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5237,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x39, 0x37, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5238,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5239,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5240,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5241,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5242,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5243,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5244,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5245,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5246,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5247,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5248,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5249,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5250,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5251,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5252,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5253,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5254,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5255,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5256,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5257,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5258,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5259,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5260,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5261,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5262,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5263,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5264,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x2d, 0x30, 0x34, 0x2d, 0x32, 0x39, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5265,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5266,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5267,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5268,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5269,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5270,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5271,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5272,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5273,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5274,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x30, 0x38, 0x30, 0x39, 0x35, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5275,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5276,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5277,64,"style","Trailing whitespace is superfluous."," 0x39, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5278,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5279,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5280,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5281,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5282,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5283,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5284,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5285,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5286,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x36, 0x30, 0x39, 0x37, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5287,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5288,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5289,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5290,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5291,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5292,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5293,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5294,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5295,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5296,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5297,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5298,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5299,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5300,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5301,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5302,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5303,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5304,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5305,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5306,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x37, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5307,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5308,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5309,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5310,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5311,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5312,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5313,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5314,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x38, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5315,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x37, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5316,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5317,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x39, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5318,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5319,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5320,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5321,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5322,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5323,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5324,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5325,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5326,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5327,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5328,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x2d, 0x32, 0x39, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5329,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5330,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5331,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5332,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5333,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5334,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5335,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5336,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5337,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5338,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5339,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5340,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5341,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5342,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5343,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5344,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5345,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5346,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x30, 0x34, 0x2d, 0x32, 0x39, 0x54, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5347,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x33, 0x39, 0x3a, 0x33, 0x37, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5348,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5349,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5350,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5351,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5352,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5353,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5354,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5355,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5356,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5357,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5358,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5359,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5360,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5361,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5362,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5363,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5364,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5365,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5366,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5367,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x35, 0x35, 0x34, 0x38, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5368,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5369,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5370,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5371,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5372,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5373,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5374,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5375,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5376,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5377,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5378,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5379,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5380,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5381,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5382,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5383,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5384,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5385,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5386,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5387,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5388,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5389,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5390,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5391,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5392,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5393,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5394,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x38, 0x2d, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5395,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5396,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5397,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5398,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5399,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5400,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5401,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5402,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5403,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5404,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x38, 0x30, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5405,64,"style","Trailing whitespace is superfluous."," 0x35, 0x34, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5406,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5407,64,"style","Trailing whitespace is superfluous."," 0x35, 0x35, 0x34, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5408,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5409,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5410,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5411,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5412,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5413,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5414,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5415,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5416,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x35, 0x36, 0x31, 0x37, 0x32, 0x35, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5417,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5418,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5419,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5420,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5421,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5422,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5423,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5424,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5425,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5426,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5427,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5428,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5429,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5430,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5431,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5432,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5433,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5434,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5435,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5436,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x35, 0x34, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5437,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5438,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5439,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5440,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5441,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5442,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5443,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5444,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x38, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5445,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x35, 0x34, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5446,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5447,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x35, 0x35, 0x34, 0x38, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5448,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5449,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5450,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5451,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5452,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5453,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5454,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5455,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5456,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5457,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5458,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x30, 0x31, 0x2d, 0x33, 0x30, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5459,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5460,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5461,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5462,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5463,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x35, 0x34, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5464,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5465,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5466,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5467,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5468,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5469,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5470,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5471,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5472,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5473,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5474,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5475,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5476,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x2d, 0x30, 0x31, 0x2d, 0x33, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5477,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x36, 0x3a, 0x35, 0x38, 0x3a, 0x35, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5478,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5479,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5480,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5481,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5482,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5483,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5484,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5485,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5486,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5487,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5488,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5489,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5490,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5491,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5492,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5493,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5494,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5495,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5496,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5497,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x32, 0x32, 0x38, 0x30, 0x35, 0x36, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5498,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5499,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5500,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5501,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5502,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5503,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5504,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5505,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5506,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5507,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5508,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5509,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5510,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5511,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5512,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5513,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5514,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5515,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5516,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5517,64,"style","Trailing whitespace is superfluous."," 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5518,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5519,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5520,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5521,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5522,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5523,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5524,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5525,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5526,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5527,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5528,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5529,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5530,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5531,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5532,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5533,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5534,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x37, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5535,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x30, 0x35, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5536,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5537,64,"style","Trailing whitespace is superfluous."," 0x32, 0x32, 0x38, 0x30, 0x35, 0x36, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5538,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5539,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5540,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5541,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5542,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5543,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5544,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5545,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5546,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x37, 0x31, 0x31, 0x39, 0x36, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5547,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5548,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5549,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5550,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5551,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5552,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5553,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5554,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5555,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5556,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5557,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5558,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5559,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5560,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5561,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5562,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5563,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5564,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5565,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5566,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x32, 0x32, 0x38, 0x30, 0x35, 0x36, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5567,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5568,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5569,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5570,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5571,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5572,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5573,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5574,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5575,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x32, 0x32, 0x38, 0x30, 0x35, 0x36, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5576,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5577,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x32, 0x32, 0x38, 0x30, 0x35, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5578,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5579,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5580,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5581,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5582,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5583,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5584,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5585,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5586,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5587,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5588,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x31, 0x30, 0x2d, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5589,64,"style","Trailing whitespace is superfluous."," 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5590,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5591,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5592,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5593,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x32, 0x32, 0x38, 0x30, 0x35, 0x36, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5594,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5595,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5596,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5597,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5598,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5599,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5600,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5601,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5602,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5603,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5604,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5605,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5606,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5607,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x39, 0x54, 0x31, 0x34, 0x3a, 0x32, 0x37, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5608,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5609,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5610,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5611,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5612,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5613,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5614,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5615,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5616,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5617,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5618,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5619,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5620,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5621,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5622,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5623,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5624,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5625,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5626,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5627,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x37, 0x2d, 0x31, 0x30, 0x31, 0x35, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5628,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5629,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5630,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5631,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5632,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5633,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5634,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5635,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5636,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5637,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5638,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5639,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5640,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5641,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5642,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5643,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5644,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5645,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5646,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5647,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5648,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5649,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5650,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5651,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5652,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5653,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5654,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5655,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5656,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5657,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5658,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5659,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5660,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5661,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5662,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5663,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5664,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5665,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x30, 0x31, 0x35, 0x34, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5666,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5667,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x31, 0x30, 0x31, 0x35, 0x34, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5668,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5669,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5670,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5671,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5672,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5673,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5674,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5675,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5676,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x37, 0x38, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5677,64,"style","Trailing whitespace is superfluous."," 0x37, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5678,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5679,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5680,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5681,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5682,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5683,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5684,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5685,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5686,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5687,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5688,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5689,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5690,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5691,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5692,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5693,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5694,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5695,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5696,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x2d, 0x31, 0x30, 0x31, 0x35, 0x34, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5697,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5698,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5699,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5700,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5701,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5702,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5703,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5704,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5705,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x30, 0x37, 0x31, 0x30, 0x31, 0x35, 0x34, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5706,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5707,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x37, 0x2d, 0x31, 0x30, 0x31, 0x35, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5708,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5709,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5710,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5711,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5712,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5713,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5714,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5715,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5716,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5717,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5718,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5719,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5720,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5721,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5722,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5723,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x2d, 0x31, 0x30, 0x31, 0x35, 0x34, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5724,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5725,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5726,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5727,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5728,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5729,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5730,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5731,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5732,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5733,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5734,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5735,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5736,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5737,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x33, 0x54, 0x31, 0x37, 0x3a, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5738,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x33, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5739,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5740,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5741,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5742,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5743,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5744,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5745,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5746,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5747,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5748,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5749,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5750,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5751,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5752,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5753,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5754,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5755,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5756,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5757,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5758,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5759,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5760,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5761,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5762,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5763,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5764,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5765,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5766,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5767,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5768,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5769,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5770,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5771,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5772,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5773,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5774,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5775,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5776,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5777,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5778,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5779,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5780,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5781,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5782,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5783,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5784,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5785,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5786,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5787,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5788,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5789,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5790,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5791,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5792,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5793,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5794,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5795,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x30, 0x37, 0x30, 0x31, 0x39, 0x34, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5796,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5797,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x39, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5798,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5799,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5800,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5801,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5802,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5803,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5804,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5805,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5806,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x37, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5807,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x36, 0x36, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5808,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5809,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5810,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5811,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5812,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5813,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5814,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5815,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5816,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5817,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5818,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5819,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5820,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5821,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5822,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5823,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5824,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5825,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5826,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5827,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5828,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5829,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5830,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5831,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5832,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5833,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5834,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5835,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x30, 0x37, 0x30, 0x31, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5836,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5837,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5838,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5839,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5840,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5841,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5842,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5843,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5844,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5845,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5846,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5847,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5848,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5849,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5850,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5851,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5852,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5853,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5854,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5855,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5856,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5857,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5858,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5859,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5860,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5861,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5862,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5863,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5864,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5865,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5866,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5867,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x32, 0x54, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5868,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x33, 0x30, 0x3a, 0x30, 0x33, 0x2d, 0x30, 0x35, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5869,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5870,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5871,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5872,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5873,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5874,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5875,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5876,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5877,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5878,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x43, 0x49, 0x4b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5879,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5880,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5881,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5882,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5883,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5884,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5885,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5886,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5887,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5888,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x43, 0x49, 0x4b, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5889,64,"style","Trailing whitespace is superfluous."," 0x53, 0x54, 0x58, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5890,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5891,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5892,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x2d, 0x51, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5893,64,"style","Trailing whitespace is superfluous."," 0x73, 0x74, 0x61, 0x72, 0x74, 0x3d, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5894,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5895,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5896,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5897,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5898,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5899,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5900,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5901,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5902,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5903,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5904,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5905,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5906,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x43, 0x49, 0x4b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5907,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x53, 0x54, 0x58, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5908,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5909,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5910,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x31, 0x30, 0x2d, 0x51, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5911,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x73, 0x74, 0x61, 0x72, 0x74, 0x3d, 0x30, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5912,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5913,64,"style","Trailing whitespace is superfluous."," 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x75, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5914,64,"style","Trailing whitespace is superfluous."," 0x75, 0x74, 0x3d, 0x61, 0x74, 0x6f, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5915,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x73, 0x65, 0x6c, 0x66, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5916,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x61, 0x70, 0x70, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5917,64,"style","Trailing whitespace is superfluous."," 0x69, 0x63, 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x2f, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5918,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x2b, 0x78, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5919,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5920,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5921,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5922,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5923,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5924,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5925,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5926,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5927,64,"style","Trailing whitespace is superfluous."," 0x43, 0x49, 0x4b, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5928,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5929,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x31, 0x30, 0x2d, 0x51, 0x25, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5930,64,"style","Trailing whitespace is superfluous."," 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5931,64,"style","Trailing whitespace is superfluous."," 0x61, 0x3d, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5932,64,"style","Trailing whitespace is superfluous."," 0x65, 0x62, 0x3d, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5933,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5934,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5935,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x34, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5936,64,"style","Trailing whitespace is superfluous."," 0x75, 0x74, 0x70, 0x75, 0x74, 0x3d, 0x61, 0x74, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5937,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x73, 0x74, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5938,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x34, 0x30, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5939,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x78, 0x74, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5940,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x70, 0x70, 0x6c, 0x69, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5941,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2f, 0x61, 0x74, 0x6f, 0x6d, 0x2b, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5942,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5943,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5944,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x61, 0x74, 0x65, 0x20, 0x54, 0x65, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5945,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6f, 0x6c, 0x6f, 0x67, 0x79, 0x20, 0x70, 0x6c, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5946,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x28, 0x30, 0x30, 0x30, 0x31, 0x31, 0x33, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5947,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x29, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5948,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5949,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5950,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x2d, 0x32, 0x30, 0x54, 0x31, 0x32, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5951,64,"style","Trailing whitespace is superfluous."," 0x35, 0x34, 0x3a, 0x35, 0x31, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5952,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5953,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x3c, 0x2f, 0x66, 0x65, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5954,68,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a)), date = structure(1579542891, class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5955,77,"style","Trailing whitespace is superfluous."," ""POSIXt""), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.7e-05, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5956,72,"style","Trailing whitespace is superfluous."," connect = 2.8e-05, pretransfer = 8.2e-05, starttransfer = 0.473137, ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/edgarWebR/email-body b/.dev/revdep_emails/edgarWebR/email-body new file mode 100644 index 000000000..f93a59432 --- /dev/null +++ b/.dev/revdep_emails/edgarWebR/email-body @@ -0,0 +1,27 @@ +Hello Micah J Waldstein! Thank you for using {lintr} in your package {edgarWebR}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/mwaldstein/edgarWebR using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 20s on CRAN vs. 380s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/epigraphdb/attachments/epigraphdb.warnings b/.dev/revdep_emails/epigraphdb/attachments/epigraphdb.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/epigraphdb/attachments/epigraphdb.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/epigraphdb/email-body b/.dev/revdep_emails/epigraphdb/email-body new file mode 100644 index 000000000..ac4451901 --- /dev/null +++ b/.dev/revdep_emails/epigraphdb/email-body @@ -0,0 +1,27 @@ +Hello Yi Liu! Thank you for using {lintr} in your package {epigraphdb}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/MRCIEU/epigraphdb-r using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 17s on CRAN vs. 9s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/fakemake/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/fakemake/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..9da57e81d --- /dev/null +++ b/.dev/revdep_emails/fakemake/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,2 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/makelists.R",16,28,"style","Commas should never have a space before."," testing = ,","commas_linter" diff --git a/.dev/revdep_emails/fakemake/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/fakemake/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..8c8fe2df2 --- /dev/null +++ b/.dev/revdep_emails/fakemake/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,2 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/makelists.R",78,31,"style","Any function spanning multiple lines should use curly braces."," index <- which(sapply(ml, function(x) target %in% x[[""prerequisites""]] ||","brace_linter" diff --git a/.dev/revdep_emails/fakemake/email-body b/.dev/revdep_emails/fakemake/email-body new file mode 100644 index 000000000..502ae85da --- /dev/null +++ b/.dev/revdep_emails/fakemake/email-body @@ -0,0 +1,27 @@ +Hello Andreas Dominik Cullmann! Thank you for using {lintr} in your package {fakemake}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://gitlab.com/fvafrcu/fakemake using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 13s on CRAN vs. 7s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/fixtuRes/attachments/fixtuRes.warnings b/.dev/revdep_emails/fixtuRes/attachments/fixtuRes.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/fixtuRes/attachments/fixtuRes.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/fixtuRes/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/fixtuRes/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..c7f5c21af --- /dev/null +++ b/.dev/revdep_emails/fixtuRes/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,3 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/vectors.R",202,3,"warning","local variable β€˜differences_conversion_function’ assigned but may not be used"," differences_conversion_function <- switch(","object_usage_linter" +"vignettes/configuration.R",1,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" diff --git a/.dev/revdep_emails/fixtuRes/email-body b/.dev/revdep_emails/fixtuRes/email-body new file mode 100644 index 000000000..c25dedce0 --- /dev/null +++ b/.dev/revdep_emails/fixtuRes/email-body @@ -0,0 +1,27 @@ +Hello Jakub Nowicki! Thank you for using {lintr} in your package {fixtuRes}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/jakubnowicki/fixtuRes using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 8s on CRAN vs. 5s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/fst/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/fst/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..d86cf0fd7 --- /dev/null +++ b/.dev/revdep_emails/fst/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,12 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/fst_table.R",345,13,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!drop | ncol(x) > 1) return(x)","vector_logic_linter" +"R/fst.R",170,1,"style","Variable and function name style should be snake_case or symbols.","write.fst <- function(x, path, compress = 50, uniform_encoding = TRUE) {","object_name_linter" +"R/fst.R",251,21,"style","Variable and function name style should be snake_case or symbols."," attr(res_table, ""row.names"") <- base::.set_row_names(nr_of_rows)","object_name_linter" +"R/hash.R",36,65,"style","Trailing semicolons are not needed."," stop(""Please specify an integer value for the hash seed."");","semicolon_linter" +"R/hash.R",42,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.logical(block_hash) | length(block_hash) != 1) {","vector_logic_linter" +"R/hash.R",43,69,"style","Trailing semicolons are not needed."," stop(""Please specify a logical value for parameter block_hash."");","semicolon_linter" +"R/hash.R",47,62,"style","Trailing semicolons are not needed."," stop(""Please specify a raw vector as input parameter x."");","semicolon_linter" +"tests/testthat/test_factor.R",21,5,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," ) }","brace_linter" +"tests/testthat/test_fst.R",23,5,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," ) }","brace_linter" +"tests/testthat/test_fst.R",30,7,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," ) }","brace_linter" +"tests/testthat/test_meta.R",223,17,"style","Use FALSE instead of the symbol F."," setkey(x, L, F, N)","T_and_F_symbol_linter" diff --git a/.dev/revdep_emails/fst/email-body b/.dev/revdep_emails/fst/email-body new file mode 100644 index 000000000..933d58f57 --- /dev/null +++ b/.dev/revdep_emails/fst/email-body @@ -0,0 +1,27 @@ +Hello Mark Klik! Thank you for using {lintr} in your package {fst}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/fstpackage/fst using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 22s on CRAN vs. 13s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/geofacet/email-body b/.dev/revdep_emails/geofacet/email-body new file mode 100644 index 000000000..5941db735 --- /dev/null +++ b/.dev/revdep_emails/geofacet/email-body @@ -0,0 +1,27 @@ +Hello Ryan Hafen! Thank you for using {lintr} in your package {geofacet}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/hafen/geofacet using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 0s on CRAN vs. 0s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/geogrid/email-body b/.dev/revdep_emails/geogrid/email-body new file mode 100644 index 000000000..8ebbddd1a --- /dev/null +++ b/.dev/revdep_emails/geogrid/email-body @@ -0,0 +1,27 @@ +Hello Joseph Bailey! Thank you for using {lintr} in your package {geogrid}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/jbaileyh/geogrid using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 0s on CRAN vs. 0s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/ggRandomForests/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/ggRandomForests/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..1cfa3f9b3 --- /dev/null +++ b/.dev/revdep_emails/ggRandomForests/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,12 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/gg_error.R",233,1,"style","Variable and function name style should be snake_case.","gg_error.randomForest.formula <- gg_error.randomForest","object_name_linter" +"R/kaplan.R",113,31,"style","Place a space before left parenthesis, except in a function call."," lag_s <- c(1, gg_dta$surv)[-(dim(gg_dta)[1] + 1)]","spaces_left_parentheses_linter" +"R/kaplan.R",114,31,"style","Place a space before left parenthesis, except in a function call."," lag_t <- c(0, gg_dta$time)[-(dim(gg_dta)[1] + 1)]","spaces_left_parentheses_linter" +"R/nelson.R",134,36,"style","Place a space before left parenthesis, except in a function call."," lag_surv <- c(1, gg_dta$surv)[-(dim(gg_dta)[1] + 1)]","spaces_left_parentheses_linter" +"R/nelson.R",135,36,"style","Place a space before left parenthesis, except in a function call."," lag_time <- c(0, gg_dta$time)[-(dim(gg_dta)[1] + 1)]","spaces_left_parentheses_linter" +"R/plot.gg_interaction.R",121,56,"style","Trailing whitespace is superfluous."," stop(""gg_interaction expects a rfsrc object, or a ","trailing_whitespace_linter" +"R/plot.gg_variable.R",283,58,"style","Trailing whitespace is superfluous."," ""Mismatched variable types for panel plots... ","trailing_whitespace_linter" +"R/plot.gg_variable.R",360,48,"style","Trailing whitespace is superfluous."," warning(""Mismatched variable types... ","trailing_whitespace_linter" +"tests/testthat/test_gg_error.R",42,14,"style","Variable and function name style should be snake_case."," rfsrc_iris$err.rate <- NULL","object_name_linter" +"tests/testthat/test_gg_error.R",101,11,"style","Variable and function name style should be snake_case."," rf_iris$err.rate <- NULL","object_name_linter" +"tests/testthat/test_gg_partial.R",73,18,"style","Variable and function name style should be snake_case."," partial_boston$xvar.names <- ""lstat""","object_name_linter" diff --git a/.dev/revdep_emails/ggRandomForests/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/ggRandomForests/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..a406c67bc --- /dev/null +++ b/.dev/revdep_emails/ggRandomForests/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,357 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/cache_rfsrc_datasets.R",89,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/cache_rfsrc_datasets.R",92,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/cache_rfsrc_datasets.R",179,5,"style","Either both or neither branch in `if`/`else` should use curly braces."," else{","brace_linter" +"R/cache_rfsrc_datasets.R",179,9,"style","There should be a space before an opening curly brace."," else{","brace_linter" +"R/cache_rfsrc_datasets.R",305,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" +"R/calc_roc.R",63,12,"style","Variable and function name style should be snake_case or symbols."," which.outcome = ""all"",","object_name_linter" +"R/calc_roc.R",72,32,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(arg_list$oob) & is.logical(arg_list$oob))","vector_logic_linter" +"R/calc_roc.R",89,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/calc_roc.R",91,7,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- 1","object_name_linter" +"R/calc_roc.R",125,22,"style","Variable and function name style should be snake_case or symbols."," which.outcome = ""all"",","object_name_linter" +"R/calc_roc.R",136,12,"style","Variable and function name style should be snake_case or symbols."," which.outcome = 1,","object_name_linter" +"R/calc_roc.R",143,7,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- 1","object_name_linter" +"R/combine.gg_partial.R",95,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((!inherits(x, ""gg_partial_list"") &","vector_logic_linter" +"R/combine.gg_partial.R",96,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !inherits(x, ""gg_partial"")) &","vector_logic_linter" +"R/combine.gg_partial.R",97,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," (!inherits(y, ""gg_partial_list"") &","vector_logic_linter" +"R/gg_error.R",225,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_minimal_depth.R",135,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_minimal_vimp.R",128,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_minimal_vimp.R",134,34,"warning","1:dim(...)[1] is likely to be wrong in the empty edge case. Use seq_len() instead."," rnk_md$depth <- rnk_vm$vimp <- 1:dim(rnk_md)[1]","seq_linter" +"R/gg_minimal_vimp.R",143,18,"warning","1:dim(...)[1] is likely to be wrong in the empty edge case. Use seq_len() instead."," rnk_vm$vimp <- 1:dim(rnk_vm)[1]","seq_linter" +"R/gg_partial_coplot.R",115,5,"style","Either both or neither branch in `if`/`else` should use curly braces."," else{","brace_linter" +"R/gg_partial_coplot.R",115,9,"style","There should be a space before an opening curly brace."," else{","brace_linter" +"R/gg_partial.R",222,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_partial.R",232,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_partial.R",257,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",152,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",157,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.vector(grp) | is.factor(grp)) {","vector_logic_linter" +"R/gg_rfsrc.R",163,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",184,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",187,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",190,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",203,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",230,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",248,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",255,36,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(arg_list$conf.int) & missing(by)) {","vector_logic_linter" +"R/gg_rfsrc.R",266,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",279,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",285,7,"style","Either both or neither branch in `if`/`else` should use curly braces."," else{","brace_linter" +"R/gg_rfsrc.R",285,11,"style","There should be a space before an opening curly brace."," else{","brace_linter" +"R/gg_rfsrc.R",308,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",317,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",327,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",352,47,"style","Use TRUE instead of the symbol T."," replace = T)","T_and_F_symbol_linter" +"R/gg_rfsrc.R",375,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",413,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",418,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.vector(grp) | is.factor(grp)) {","vector_logic_linter" +"R/gg_rfsrc.R",424,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",451,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",463,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",481,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_roc.R",69,34,"style","Variable and function name style should be snake_case or symbols.","gg_roc.rfsrc <- function(object, which.outcome, oob, ...) {","object_name_linter" +"R/gg_roc.R",70,71,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (sum(inherits(object, c(""rfsrc"", ""grow""), TRUE) == c(1, 2)) != 2 &","vector_logic_linter" +"R/gg_roc.R",71,74,"warning","Conditional expressions require scalar logical operators (&& and ||)"," sum(inherits(object, c(""rfsrc"", ""predict""), TRUE) == c(1, 2)) != 2 &","vector_logic_linter" +"R/gg_roc.R",85,5,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- ""all""","object_name_linter" +"R/gg_roc.R",101,28,"style","Variable and function name style should be snake_case or symbols.","gg_roc <- function(object, which.outcome, oob, ...) {","object_name_linter" +"R/gg_roc.R",106,41,"style","Variable and function name style should be snake_case or symbols.","gg_roc.randomForest <- function(object, which.outcome, oob, ...) {","object_name_linter" +"R/gg_roc.R",116,5,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- ""all""","object_name_linter" +"R/gg_variable.R",163,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_variable.R",195,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_variable.R",236,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_variable.R",257,3,"warning","local variable β€˜oob’ assigned but may not be used"," oob <- if (!is.null(arg_list$oob)) {","object_usage_linter" +"R/gg_variable.R",259,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_vimp.R",107,71,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (sum(inherits(object, c(""rfsrc"", ""grow""), TRUE) == c(1, 2)) != 2 &","vector_logic_linter" +"R/gg_vimp.R",119,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_vimp.R",148,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_vimp.R",158,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_vimp.R",165,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_vimp.R",177,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_vimp.R",187,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_vimp.R",223,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_vimp.R",232,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_vimp.R",257,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_vimp.R",267,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_vimp.R",274,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_vimp.R",286,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_vimp.R",295,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/kaplan.R",59,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/kaplan.R",71,3,"warning","local variable β€˜delta_time’ assigned but may not be used"," delta_time <- sapply(2:length(times), function(ind) {","object_usage_linter" +"R/kaplan.R",124,15,"warning","1:dim(...)[1] is likely to be wrong in the empty edge case. Use seq_len() instead."," for (ind in 1:dim(gg_dta)[1]) {","seq_linter" +"R/nelson.R",74,5,"warning","local variable β€˜srv’ assigned but may not be used"," srv <-","object_usage_linter" +"R/nelson.R",78,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/nelson.R",94,5,"warning","local variable β€˜delta_time’ assigned but may not be used"," delta_time <- sapply(2:length(times), function(ind) {","object_usage_linter" +"R/nelson.R",145,17,"warning","1:dim(...)[1] is likely to be wrong in the empty edge case. Use seq_len() instead."," for (ind in 1:dim(gg_dta)[1]) {","seq_linter" +"R/plot.gg_error.R",131,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_interaction.R",145,20,"warning","1:dim(...)[1] is likely to be wrong in the empty edge case. Use seq_len() instead."," gg_dta$rank <- 1:dim(gg_dta)[1]","seq_linter" +"R/plot.gg_interaction.R",184,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/plot.gg_interaction.R",185,39,"warning","1:dim(...)[1] is likely to be wrong in the empty edge case. Use seq_len() instead."," gg_dta <- data.frame(cbind(rank = 1:dim(object)[1],","seq_linter" +"R/plot.gg_minimal_depth.R",128,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.numeric(arg_set$nvar) & arg_set$nvar > 1) {","vector_logic_linter" +"R/plot.gg_minimal_depth.R",179,18,"warning","1:dim(...)[1] is likely to be wrong in the empty edge case. Use seq_len() instead."," vsel$rank <- 1:dim(vsel)[1]","seq_linter" +"R/plot.gg_minimal_depth.R",219,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_minimal_vimp.R",132,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_partial_list.R",194,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_partial_list.R",208,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_partial_list.R",212,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_partial_list.R",220,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_partial.R",182,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_partial.R",202,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_partial.R",205,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_partial.R",255,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_partial.R",259,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_rfsrc.R",116,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (inherits(gg_dta, ""class"") |","vector_logic_linter" +"R/plot.gg_rfsrc.R",135,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_rfsrc.R",152,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_rfsrc.R",174,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_rfsrc.R",184,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_rfsrc.R",200,39,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (inherits(gg_dta, ""regr"") |","vector_logic_linter" +"R/plot.gg_rfsrc.R",204,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_rfsrc.R",216,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_roc.R",67,28,"style","Variable and function name style should be snake_case or symbols.","plot.gg_roc <- function(x, which.outcome = NULL, ...) {","object_name_linter" +"R/plot.gg_roc.R",76,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (crv > 2 & is.null(which.outcome)) {","vector_logic_linter" +"R/plot.gg_roc.R",81,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_roc.R",83,11,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- 2","object_name_linter" +"R/plot.gg_roc.R",86,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_roc.R",93,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (crv > 2 & is.null(which.outcome)) {","vector_logic_linter" +"R/plot.gg_roc.R",98,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_roc.R",100,11,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- 2","object_name_linter" +"R/plot.gg_roc.R",133,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_survival.R",83,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_survival.R",121,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",177,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",217,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",260,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",271,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",279,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",309,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",316,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",330,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",353,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",357,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",372,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",381,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",396,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",423,17,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",431,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",450,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",470,19,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",483,17,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",500,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",511,17,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",531,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",539,17,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",546,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_vimp.R",96,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.numeric(arg_set$nvar) & arg_set$nvar > 1) {","vector_logic_linter" +"R/plot.gg_vimp.R",119,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_vimp.R",143,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(gg_dta$set) | length(unique(gg_dta$set)) < 2) {","vector_logic_linter" +"R/plot.gg_vimp.R",146,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/quantile_pts.R",64,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"tests/testthat/test_gg_error.R",113,3,"style","Variable and function name style should be snake_case or symbols."," Boston$chas <- as.logical(Boston$chas)","object_name_linter" +"tests/testthat/test_gg_error.R",159,3,"style","Variable and function name style should be snake_case or symbols."," Boston$chas <- as.logical(Boston$chas)","object_name_linter" +"tests/testthat/test_gg_interaction.R",51,3,"style","Variable and function name style should be snake_case or symbols."," Boston$chas <- as.logical(Boston$chas)","object_name_linter" +"tests/testthat/test_gg_roc.R",15,3,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- 1","object_name_linter" +"tests/testthat/test_gg_roc.R",69,3,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- 1","object_name_linter" +"tests/testthat/test_gg_vimp.R",125,15,"warning","1:dim(...)[2] is likely to be wrong in the empty edge case. Use seq_len() instead."," for (ind in 1:dim(pbc)[2]) {","seq_linter" +"tests/testthat/test_gg_vimp.R",132,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"tests/testthat/test_gg_vimp.R",225,3,"style","Variable and function name style should be snake_case or symbols."," Boston$chas <- as.logical(Boston$chas)","object_name_linter" +"tests/testthat/test_surface_matrix.R",17,3,"style","Variable and function name style should be snake_case or symbols."," rm.tmp <- do.call(c, lapply(rm_pts,","object_name_linter" +"tests/testthat/test_survival_datasets.R",21,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"vignettes/ggrfRegression.Rmd",37,81,"style","Lines should not be more than 80 characters.","# set global chunk options for knitr. These can be changed in the header for each individual R code chunk","line_length_linter" +"vignettes/ggrfRegression.Rmd",39,28,"style","Only use double-quotes."," fig.align = 'center',","single_quotes_linter" +"vignettes/ggrfRegression.Rmd",41,27,"style","Only use double-quotes."," fig.show = 'hold',","single_quotes_linter" +"vignettes/ggrfRegression.Rmd",44,23,"style","Only use double-quotes."," size = 'footnotesize',","single_quotes_linter" +"vignettes/ggrfRegression.Rmd",48,81,"style","Lines should not be more than 80 characters."," echo = FALSE, # Change this to TRUE if you want to see all the code examples","line_length_linter" +"vignettes/ggrfRegression.Rmd",55,63,"style","Trailing whitespace is superfluous.","options(object.size = Inf, expressions = 100000, memory = Inf, ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",73,46,"style","Trailing whitespace is superfluous.","library(""plot3D"") # for 3d surfaces. ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",79,73,"style","Trailing whitespace is superfluous.","library(""randomForestSRC"") # random forests for survival, regression and ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",86,50,"style","Trailing whitespace is superfluous.","## Set open circle for censored, and x for events ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",87,1,"style","Variable and function name style should be snake_case or symbols.","event.marks <- c(1, 4)","object_name_linter" +"vignettes/ggrfRegression.Rmd",88,1,"style","Variable and function name style should be snake_case or symbols.","event.labels <- c(FALSE, TRUE)","object_name_linter" +"vignettes/ggrfRegression.Rmd",91,1,"style","Variable and function name style should be snake_case or symbols.","strCol <- brewer.pal(3, ""Set1"")[c(2,1,3)]","object_name_linter" +"vignettes/ggrfRegression.Rmd",91,37,"style","Commas should always have a space after.","strCol <- brewer.pal(3, ""Set1"")[c(2,1,3)]","commas_linter" +"vignettes/ggrfRegression.Rmd",91,39,"style","Commas should always have a space after.","strCol <- brewer.pal(3, ""Set1"")[c(2,1,3)]","commas_linter" +"vignettes/ggrfRegression.Rmd",128,21,"style","Put spaces around all infix operators.","data(Boston, package=""MASS"")","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",131,1,"style","Variable and function name style should be snake_case or symbols.","Boston$chas <- as.logical(Boston$chas)","object_name_linter" +"vignettes/ggrfRegression.Rmd",135,29,"style","Trailing whitespace is superfluous.","cls <- sapply(Boston, class) ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",136,2,"style","Trailing whitespace is superfluous.","# ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",137,8,"style","Trailing whitespace is superfluous.","lbls <- ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",168,1,"style","Variable and function name style should be snake_case or symbols.","dta.labs <- data.frame(cbind(Variable=names(cls), Description=lbls, type=cls))","object_name_linter" +"vignettes/ggrfRegression.Rmd",168,38,"style","Put spaces around all infix operators.","dta.labs <- data.frame(cbind(Variable=names(cls), Description=lbls, type=cls))","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",168,62,"style","Put spaces around all infix operators.","dta.labs <- data.frame(cbind(Variable=names(cls), Description=lbls, type=cls))","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",168,73,"style","Put spaces around all infix operators.","dta.labs <- data.frame(cbind(Variable=names(cls), Description=lbls, type=cls))","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",171,1,"style","Variable and function name style should be snake_case or symbols.","st.labs <- as.character(dta.labs$Description)","object_name_linter" +"vignettes/ggrfRegression.Rmd",172,7,"style","Variable and function name style should be snake_case or symbols.","names(st.labs) <- names(cls)","object_name_linter" +"vignettes/ggrfRegression.Rmd",175,16,"style","Trailing whitespace is superfluous.","kable(dta.labs, ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",176,25,"style","Trailing whitespace is superfluous."," row.names = FALSE, ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",177,14,"style","Put spaces around all infix operators."," caption=""`Boston` housing data dictionary."",","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",194,12,"style","Put spaces around all infix operators.","ggplot(dta)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",195,19,"style","Put spaces around all infix operators."," geom_point(alpha=0.4, aes(x=medv, y=value, color=chas))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",195,30,"style","Put spaces around all infix operators."," geom_point(alpha=0.4, aes(x=medv, y=value, color=chas))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",195,38,"style","Put spaces around all infix operators."," geom_point(alpha=0.4, aes(x=medv, y=value, color=chas))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",195,51,"style","Put spaces around all infix operators."," geom_point(alpha=0.4, aes(x=medv, y=value, color=chas))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",195,58,"style","Put spaces around all infix operators."," geom_point(alpha=0.4, aes(x=medv, y=value, color=chas))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",196,20,"style","Put spaces around all infix operators."," geom_smooth(aes(x=medv, y=value), se=FALSE)+ ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",196,28,"style","Put spaces around all infix operators."," geom_smooth(aes(x=medv, y=value), se=FALSE)+ ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",196,39,"style","Put spaces around all infix operators."," geom_smooth(aes(x=medv, y=value), se=FALSE)+ ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",196,46,"style","Put spaces around all infix operators."," geom_smooth(aes(x=medv, y=value), se=FALSE)+ ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",196,47,"style","Trailing whitespace is superfluous."," geom_smooth(aes(x=medv, y=value), se=FALSE)+ ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",197,9,"style","Put spaces around all infix operators."," labs(y="""", x=st.labs[""medv""]) +","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",197,15,"style","Put spaces around all infix operators."," labs(y="""", x=st.labs[""medv""]) +","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",198,29,"style","Put spaces around all infix operators."," scale_color_brewer(palette=""Set2"")+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",198,37,"style","Put spaces around all infix operators."," scale_color_brewer(palette=""Set2"")+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",199,31,"style","Put spaces around all infix operators."," facet_wrap(~variable, scales=""free_y"", ncol=3)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",199,46,"style","Put spaces around all infix operators."," facet_wrap(~variable, scales=""free_y"", ncol=3)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",216,1,"style","Variable and function name style should be snake_case or symbols.","rfsrc_Boston <- rfsrc(medv~., data=Boston, ","object_name_linter" +"vignettes/ggrfRegression.Rmd",216,27,"style","Put spaces around all infix operators.","rfsrc_Boston <- rfsrc(medv~., data=Boston, ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",216,35,"style","Put spaces around all infix operators.","rfsrc_Boston <- rfsrc(medv~., data=Boston, ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",216,43,"style","Trailing whitespace is superfluous.","rfsrc_Boston <- rfsrc(medv~., data=Boston, ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",235,29,"style","Commas should always have a space after.","class(gg_e) <- c(""gg_error"",class(gg_e))","commas_linter" +"vignettes/ggrfRegression.Rmd",247,35,"style","Put spaces around all infix operators.","plot(gg_rfsrc(rfsrc_Boston), alpha=.5)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",247,39,"style","Put spaces around all infix operators.","plot(gg_rfsrc(rfsrc_Boston), alpha=.5)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",248,23,"style","Put spaces around all infix operators."," coord_cartesian(ylim=c(5,49))","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",248,28,"style","Commas should always have a space after."," coord_cartesian(ylim=c(5,49))","commas_linter" +"vignettes/ggrfRegression.Rmd",267,33,"style","Put spaces around all infix operators.","plot(gg_vimp(rfsrc_Boston), lbls=st.labs)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",288,1,"style","Variable and function name style should be snake_case or symbols.","varsel_Boston <- var.select(rfsrc_Boston)","object_name_linter" +"vignettes/ggrfRegression.Rmd",294,17,"style","Put spaces around all infix operators.","plot(gg_md, lbls=st.labs)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",330,39,"style","Trailing whitespace is superfluous.","# plotted in minimal depth rank order. ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",334,16,"style","Put spaces around all infix operators.","plot(gg_v, xvar=xvar, panel=TRUE, alpha=.5)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",334,28,"style","Put spaces around all infix operators.","plot(gg_v, xvar=xvar, panel=TRUE, alpha=.5)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",334,40,"style","Put spaces around all infix operators.","plot(gg_v, xvar=xvar, panel=TRUE, alpha=.5)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",334,44,"style","Put spaces around all infix operators.","plot(gg_v, xvar=xvar, panel=TRUE, alpha=.5)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",335,9,"style","Put spaces around all infix operators."," labs(y=st.labs[""medv""], x="""")","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",335,28,"style","Put spaces around all infix operators."," labs(y=st.labs[""medv""], x="""")","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",343,16,"style","Put spaces around all infix operators.","plot(gg_v, xvar=""chas"", alpha=.4)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",343,30,"style","Put spaces around all infix operators.","plot(gg_v, xvar=""chas"", alpha=.4)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",343,34,"style","Put spaces around all infix operators.","plot(gg_v, xvar=""chas"", alpha=.4)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",344,9,"style","Put spaces around all infix operators."," labs(y=st.labs[""medv""])","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",362,1,"style","Variable and function name style should be snake_case or symbols.","partial_Boston <- plot.variable(rfsrc_Boston,","object_name_linter" +"vignettes/ggrfRegression.Rmd",363,37,"style","Put spaces around all infix operators."," xvar=gg_md$topvars,","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",364,40,"style","Put spaces around all infix operators."," partial=TRUE, sorted=FALSE,","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",364,53,"style","Put spaces around all infix operators."," partial=TRUE, sorted=FALSE,","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",365,51,"style","Do not place spaces before parentheses."," show.plots = FALSE )","spaces_inside_linter" +"vignettes/ggrfRegression.Rmd",371,17,"style","Put spaces around all infix operators.","plot(gg_p, panel=TRUE) +","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",372,9,"style","Put spaces around all infix operators."," labs(y=st.labs[""medv""], x="""") +","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",372,28,"style","Put spaces around all infix operators."," labs(y=st.labs[""medv""], x="""") +","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",373,24,"style","Only use double-quotes."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)","single_quotes_linter" +"vignettes/ggrfRegression.Rmd",373,40,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",373,41,"style","Only use double-quotes."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)","single_quotes_linter" +"vignettes/ggrfRegression.Rmd",373,52,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",390,1,"style","Variable and function name style should be snake_case or symbols.","interaction_Boston <- find.interaction(rfsrc_Boston)","object_name_linter" +"vignettes/ggrfRegression.Rmd",393,41,"style","Trailing whitespace is superfluous.","plot(gg_interaction(interaction_Boston), ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",394,10,"style","Put spaces around all infix operators."," xvar=gg_md$topvars, panel=TRUE)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",394,31,"style","Put spaces around all infix operators."," xvar=gg_md$topvars, panel=TRUE)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",408,63,"style","Trailing whitespace is superfluous.","# Find the rm variable points to create 6 intervals of roughly ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",410,52,"style","Put spaces around all infix operators.","rm_pts <- quantile_pts(rfsrc_Boston$xvar$rm, groups=6, ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",410,55,"style","Trailing whitespace is superfluous.","rm_pts <- quantile_pts(rfsrc_Boston$xvar$rm, groups=6, ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",411,33,"style","Put spaces around all infix operators."," intervals=TRUE)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",414,43,"style","Put spaces around all infix operators.","rm_grp <- cut(rfsrc_Boston$xvar$rm, breaks=rm_pts)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",419,49,"style","Trailing whitespace is superfluous.","# Modify the labels for descriptive panel titles ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",420,39,"style","Trailing whitespace is superfluous.","levels(gg_v$rm_grp) <- paste(""rm in "", ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",421,54,"style","Put spaces around all infix operators."," levels(gg_v$rm_grp), sep="""")","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",423,41,"style","Trailing whitespace is superfluous.","# Create a variable dependence (co)plot, ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",425,27,"style","Put spaces around all infix operators.","plot(gg_v, xvar = ""lstat"")+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",426,48,"style","Trailing whitespace is superfluous."," # method = ""loess"", span=1.5, se = FALSE) + ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",427,30,"style","Put spaces around all infix operators."," labs(y = st.labs[""medv""], x=st.labs[""lstat""]) + ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",427,50,"style","Trailing whitespace is superfluous."," labs(y = st.labs[""medv""], x=st.labs[""lstat""]) + ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",428,36,"style","Trailing whitespace is superfluous."," theme(legend.position = ""none"") + ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",429,41,"style","Trailing whitespace is superfluous."," scale_color_brewer(palette = ""Set3"") + ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",439,66,"style","Trailing whitespace is superfluous.","# Find the lstat variable points to create 6 intervals of roughly ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",441,58,"style","Put spaces around all infix operators.","lstat_pts <- quantile_pts(rfsrc_Boston$xvar$lstat, groups=6, intervals=TRUE)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",441,71,"style","Put spaces around all infix operators.","lstat_pts <- quantile_pts(rfsrc_Boston$xvar$lstat, groups=6, intervals=TRUE)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",444,49,"style","Put spaces around all infix operators.","lstat_grp <- cut(rfsrc_Boston$xvar$lstat, breaks=lstat_pts)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",449,49,"style","Trailing whitespace is superfluous.","# Modify the labels for descriptive panel titles ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",450,77,"style","Commas should always have a space after.","levels(gg_v$lstat_grp) <- paste(""lstat in "", levels(gg_v$lstat_grp), "" (%)"",sep="""")","commas_linter" +"vignettes/ggrfRegression.Rmd",450,80,"style","Put spaces around all infix operators.","levels(gg_v$lstat_grp) <- paste(""lstat in "", levels(gg_v$lstat_grp), "" (%)"",sep="""")","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",450,81,"style","Lines should not be more than 80 characters.","levels(gg_v$lstat_grp) <- paste(""lstat in "", levels(gg_v$lstat_grp), "" (%)"",sep="""")","line_length_linter" +"vignettes/ggrfRegression.Rmd",453,36,"style","Put spaces around all infix operators.","plot(gg_v, xvar = ""rm"", alpha = .5)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",454,47,"style","Trailing whitespace is superfluous."," #method = ""loess"", span=1.5, , se = FALSE) + ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",455,30,"style","Put spaces around all infix operators."," labs(y = st.labs[""medv""], x=st.labs[""rm""]) + ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",455,47,"style","Trailing whitespace is superfluous."," labs(y = st.labs[""medv""], x=st.labs[""rm""]) + ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",456,36,"style","Trailing whitespace is superfluous."," theme(legend.position = ""none"") + ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",457,41,"style","Trailing whitespace is superfluous."," scale_color_brewer(palette = ""Set3"") + ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",459,68,"style","Trailing whitespace is superfluous."," #scale_shape_manual(values = event.marks, labels = event.labels)+ ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",482,1,"style","Variable and function name style should be snake_case or symbols.","partial_coplot_Boston <- gg_partial_coplot(rfsrc_Boston, xvar=""lstat"", ","object_name_linter" +"vignettes/ggrfRegression.Rmd",482,62,"style","Put spaces around all infix operators.","partial_coplot_Boston <- gg_partial_coplot(rfsrc_Boston, xvar=""lstat"", ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",482,71,"style","Trailing whitespace is superfluous.","partial_coplot_Boston <- gg_partial_coplot(rfsrc_Boston, xvar=""lstat"", ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",483,50,"style","Put spaces around all infix operators."," groups=rm_grp,","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",484,54,"style","Put spaces around all infix operators."," show.plots=FALSE)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",493,36,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston, aes(x=lstat, y=yhat, col=group))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",493,45,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston, aes(x=lstat, y=yhat, col=group))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",493,55,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston, aes(x=lstat, y=yhat, col=group))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",493,63,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston, aes(x=lstat, y=yhat, col=group))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",494,15,"style","Put spaces around all infix operators."," geom_point()+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",495,24,"style","Only use double-quotes."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE, alpha=.25)+","single_quotes_linter" +"vignettes/ggrfRegression.Rmd",495,40,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE, alpha=.25)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",495,41,"style","Only use double-quotes."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE, alpha=.25)+","single_quotes_linter" +"vignettes/ggrfRegression.Rmd",495,52,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE, alpha=.25)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",495,65,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE, alpha=.25)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",495,70,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE, alpha=.25)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",496,9,"style","Put spaces around all infix operators."," labs(x=st.labs[""lstat""], y=st.labs[""medv""],","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",496,29,"style","Put spaces around all infix operators."," labs(x=st.labs[""lstat""], y=st.labs[""medv""],","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",497,13,"style","Put spaces around all infix operators."," color=""Room"", shape=""Room"")+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",497,27,"style","Put spaces around all infix operators."," color=""Room"", shape=""Room"")+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",497,35,"style","Put spaces around all infix operators."," color=""Room"", shape=""Room"")+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",498,29,"style","Put spaces around all infix operators."," scale_color_brewer(palette=""Set1"")","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",508,1,"style","Variable and function name style should be snake_case or symbols.","partial_coplot_Boston2 <- gg_partial_coplot(rfsrc_Boston, xvar=""rm"", ","object_name_linter" +"vignettes/ggrfRegression.Rmd",508,63,"style","Put spaces around all infix operators.","partial_coplot_Boston2 <- gg_partial_coplot(rfsrc_Boston, xvar=""rm"", ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",508,69,"style","Trailing whitespace is superfluous.","partial_coplot_Boston2 <- gg_partial_coplot(rfsrc_Boston, xvar=""rm"", ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",509,51,"style","Put spaces around all infix operators."," groups=lstat_grp,","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",510,55,"style","Put spaces around all infix operators."," show.plots=FALSE)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",516,37,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston2, aes(x=rm, y=yhat, col=group))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",516,43,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston2, aes(x=rm, y=yhat, col=group))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",516,53,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston2, aes(x=rm, y=yhat, col=group))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",516,61,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston2, aes(x=rm, y=yhat, col=group))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",517,15,"style","Put spaces around all infix operators."," geom_point()+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",518,24,"style","Only use double-quotes."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)+","single_quotes_linter" +"vignettes/ggrfRegression.Rmd",518,40,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",518,41,"style","Only use double-quotes."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)+","single_quotes_linter" +"vignettes/ggrfRegression.Rmd",518,52,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",518,59,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",519,9,"style","Put spaces around all infix operators."," labs(x=st.labs[""rm""], y=st.labs[""medv""], ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",519,26,"style","Put spaces around all infix operators."," labs(x=st.labs[""rm""], y=st.labs[""medv""], ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",519,43,"style","Trailing whitespace is superfluous."," labs(x=st.labs[""rm""], y=st.labs[""medv""], ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",520,13,"style","Put spaces around all infix operators."," color=""Lower Status"", shape=""Lower Status"")+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",520,35,"style","Put spaces around all infix operators."," color=""Lower Status"", shape=""Lower Status"")+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",520,51,"style","Put spaces around all infix operators."," color=""Lower Status"", shape=""Lower Status"")+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",521,29,"style","Put spaces around all infix operators."," scale_color_brewer(palette=""Set1"")","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",533,52,"style","Put spaces around all infix operators.","rm_pts <- quantile_pts(rfsrc_Boston$xvar$rm, groups=49, intervals = TRUE)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",542,13,"style","Variable and function name style should be snake_case or symbols.","system.time(partial_Boston_surf <- lapply(rm_pts, function(ct){","object_name_linter" +"vignettes/ggrfRegression.Rmd",542,63,"style","There should be a space before an opening curly brace.","system.time(partial_Boston_surf <- lapply(rm_pts, function(ct){","brace_linter" +"vignettes/ggrfRegression.Rmd",542,63,"style","There should be a space between a right parenthesis and a body expression.","system.time(partial_Boston_surf <- lapply(rm_pts, function(ct){","paren_body_linter" +"vignettes/ggrfRegression.Rmd",543,3,"style","Variable and function name style should be snake_case or symbols."," rfsrc_Boston$xvar$rm <- ct","object_name_linter" +"vignettes/ggrfRegression.Rmd",545,47,"style","Trailing whitespace is superfluous."," npts = 50, show.plots = FALSE, ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",548,29,"style","Trailing whitespace is superfluous.","# user system elapsed ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",549,29,"style","Trailing whitespace is superfluous.","# 1109.641 76.516 1199.732 ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",557,1,"style","Variable and function name style should be snake_case or symbols.","rm.tmp <- do.call(c,lapply(rm_pts, ","object_name_linter" +"vignettes/ggrfRegression.Rmd",557,21,"style","Commas should always have a space after.","rm.tmp <- do.call(c,lapply(rm_pts, ","commas_linter" +"vignettes/ggrfRegression.Rmd",557,35,"style","Trailing whitespace is superfluous.","rm.tmp <- do.call(c,lapply(rm_pts, ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",558,41,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," function(grp){rep(grp, 50)}))","brace_linter" +"vignettes/ggrfRegression.Rmd",558,41,"style","There should be a space before an opening curly brace."," function(grp){rep(grp, 50)}))","brace_linter" +"vignettes/ggrfRegression.Rmd",558,41,"style","There should be a space between a right parenthesis and a body expression."," function(grp){rep(grp, 50)}))","paren_body_linter" +"vignettes/ggrfRegression.Rmd",560,46,"style","Trailing whitespace is superfluous.","# Convert the list of plot.variable output to ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",561,31,"style","Commas should always have a space after.","partial_surf <- do.call(rbind,lapply(partial_Boston_surf, gg_partial))","commas_linter" +"vignettes/ggrfRegression.Rmd",567,27,"style","Put spaces around all infix operators.","ggplot(partial_surf, aes(x=lstat, y=rm, z=yhat))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",567,36,"style","Put spaces around all infix operators.","ggplot(partial_surf, aes(x=lstat, y=rm, z=yhat))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",567,42,"style","Put spaces around all infix operators.","ggplot(partial_surf, aes(x=lstat, y=rm, z=yhat))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",567,49,"style","Put spaces around all infix operators.","ggplot(partial_surf, aes(x=lstat, y=rm, z=yhat))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",568,55,"style","Put spaces around all infix operators."," stat_contour(aes(colour = ..level..), binwidth = .5)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",569,9,"style","Put spaces around all infix operators."," labs(x=st.labs[""lstat""], y=st.labs[""rm""], ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",569,29,"style","Put spaces around all infix operators."," labs(x=st.labs[""lstat""], y=st.labs[""rm""], ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",569,44,"style","Trailing whitespace is superfluous."," labs(x=st.labs[""lstat""], y=st.labs[""rm""], ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",570,13,"style","Put spaces around all infix operators."," color=""Median Home Values"")+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",570,35,"style","Put spaces around all infix operators."," color=""Median Home Values"")+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",571,33,"style","Put spaces around all infix operators."," scale_colour_gradientn(colours=topo.colors(10))","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",580,15,"style","Commas should always have a space after.","par(mai = c(0,0,0,0))","commas_linter" +"vignettes/ggrfRegression.Rmd",580,17,"style","Commas should always have a space after.","par(mai = c(0,0,0,0))","commas_linter" +"vignettes/ggrfRegression.Rmd",580,19,"style","Commas should always have a space after.","par(mai = c(0,0,0,0))","commas_linter" +"vignettes/ggrfRegression.Rmd",589,9,"style","Put spaces around all infix operators.","surf3D(x=srf$x, y=srf$y, z=srf$z, col=topo.colors(10),","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",589,18,"style","Put spaces around all infix operators.","surf3D(x=srf$x, y=srf$y, z=srf$z, col=topo.colors(10),","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",589,27,"style","Put spaces around all infix operators.","surf3D(x=srf$x, y=srf$y, z=srf$z, col=topo.colors(10),","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",589,38,"style","Put spaces around all infix operators.","surf3D(x=srf$x, y=srf$y, z=srf$z, col=topo.colors(10),","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",590,14,"style","Put spaces around all infix operators."," colkey=FALSE, border = ""black"", bty=""b2"", ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",590,43,"style","Put spaces around all infix operators."," colkey=FALSE, border = ""black"", bty=""b2"", ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",590,49,"style","Trailing whitespace is superfluous."," colkey=FALSE, border = ""black"", bty=""b2"", ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",591,34,"style","Trailing whitespace is superfluous."," shade = 0.5, expand = 0.5, ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",593,12,"style","Put spaces around all infix operators."," xlab=""Lower Status"", ylab=""Average Rooms"", zlab=""Median Value""","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",593,33,"style","Put spaces around all infix operators."," xlab=""Lower Status"", ylab=""Average Rooms"", zlab=""Median Value""","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",593,55,"style","Put spaces around all infix operators."," xlab=""Lower Status"", ylab=""Average Rooms"", zlab=""Median Value""","infix_spaces_linter" diff --git a/.dev/revdep_emails/ggRandomForests/email-body b/.dev/revdep_emails/ggRandomForests/email-body new file mode 100644 index 000000000..be7f0ee30 --- /dev/null +++ b/.dev/revdep_emails/ggRandomForests/email-body @@ -0,0 +1,27 @@ +Hello John Ehrlinger! Thank you for using {lintr} in your package {ggRandomForests}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/ehrlinger/ggRandomForests using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 90s on CRAN vs. 59s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/ggcharts/attachments/ggcharts.warnings b/.dev/revdep_emails/ggcharts/attachments/ggcharts.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/ggcharts/attachments/ggcharts.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/ggcharts/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/ggcharts/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..652215dab --- /dev/null +++ b/.dev/revdep_emails/ggcharts/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,3 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/zzz.R",1,1,"style","Variable and function name style should be snake_case.",".onLoad <- function(libname, pkgname) {","object_name_linter" +"R/zzz.R",43,1,"style","Variable and function name style should be snake_case.",".onUnload <- function(libpath) {","object_name_linter" diff --git a/.dev/revdep_emails/ggcharts/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/ggcharts/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..d22aa5cde --- /dev/null +++ b/.dev/revdep_emails/ggcharts/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,5 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/bar_chart.R",81,14,"warning","possible error in post_process_plot(plot = p, is_sorted = sort, horizontal = horizontal, facet = !!facet, fill = has_fill, highlight = highlight, color = bar_color, other = other, threshold = threshold): unused arguments (other = other, threshold = threshold)","bar_chart <- function(data, x, y, facet = NULL, ..., bar_color = ""auto"",","object_usage_linter" +"R/lollipop_chart.R",83,19,"warning","possible error in post_process_plot(plot = p, is_sorted = TRUE, horizontal = horizontal, facet = !!facet, fill = FALSE, highlight = highlight, color = line_color, other = other, threshold = threshold): unused arguments (other = other, threshold = threshold)","lollipop_chart <- function(data, x, y, facet = NULL, ..., line_size = 0.75,","object_usage_linter" +"R/post_process_plot.R",47,13,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (other & !is.null(threshold)) {","vector_logic_linter" +"vignettes/customize.Rmd",52,101,"style","Lines should not be more than 100 characters."," y = ""Developers Who are Developing with the Language but\nHave not Expressed Interest in Continuing to Do so"",","line_length_linter" diff --git a/.dev/revdep_emails/ggcharts/email-body b/.dev/revdep_emails/ggcharts/email-body new file mode 100644 index 000000000..3242ac753 --- /dev/null +++ b/.dev/revdep_emails/ggcharts/email-body @@ -0,0 +1,27 @@ +Hello Thomas Neitmann! Thank you for using {lintr} in your package {ggcharts}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/thomas-neitmann/ggcharts using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 18s on CRAN vs. 12s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/ggfortify/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/ggfortify/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..172b5ab90 --- /dev/null +++ b/.dev/revdep_emails/ggfortify/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,118 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/base_fortify_list.R",7,1,"style","Variable and function name style should be snake_case.","fortify.list <- function(model, data = NULL, ...) {","object_name_linter" +"R/base_fortify_list.R",31,1,"style","Variable and function name style should be snake_case.","autoplot.list <- function(object, data = NULL,","object_name_linter" +"R/base_fortify_ts.R",88,1,"style","Variable and function name style should be snake_case.","fortify.timeSeries <- fortify.ts","object_name_linter" +"R/base_fortify_ts.R",91,1,"style","Variable and function name style should be snake_case.","fortify.irts <- fortify.ts","object_name_linter" +"R/base_fortify_ts.R",269,1,"style","Variable and function name style should be snake_case.","autoplot.zooreg <- autoplot.ts","object_name_linter" +"R/base_fortify_ts.R",272,1,"style","Variable and function name style should be snake_case.","autoplot.xts <- autoplot.ts","object_name_linter" +"R/base_fortify_ts.R",275,1,"style","Variable and function name style should be snake_case.","autoplot.timeSeries <- autoplot.ts","object_name_linter" +"R/base_fortify_ts.R",278,1,"style","Variable and function name style should be snake_case.","autoplot.irts <- autoplot.ts","object_name_linter" +"R/base_fortify_ts.R",391,1,"style","Variable and function name style should be snake_case.","fortify.ar <- fortify.tsmodel","object_name_linter" +"R/base_fortify_ts.R",394,1,"style","Variable and function name style should be snake_case.","fortify.Arima <- fortify.tsmodel","object_name_linter" +"R/base_fortify_ts.R",397,1,"style","Variable and function name style should be snake_case.","fortify.tsmodel <- fortify.tsmodel","object_name_linter" +"R/base_fortify_ts.R",400,1,"style","Variable and function name style should be snake_case.","fortify.HoltWinters <- fortify.tsmodel","object_name_linter" +"R/base_fortify_ts.R",403,1,"style","Variable and function name style should be snake_case.","fortify.fracdiff <- fortify.tsmodel","object_name_linter" +"R/base_fortify_ts.R",406,1,"style","Variable and function name style should be snake_case.","fortify.nnetar <- fortify.tsmodel","object_name_linter" +"R/base_fortify_ts.R",409,1,"style","Variable and function name style should be snake_case.","fortify.fGARCH <- fortify.tsmodel","object_name_linter" +"R/base_fortify_ts.R",412,1,"style","Variable and function name style should be snake_case.","fortify.dlmFiltered <- fortify.tsmodel","object_name_linter" +"R/base_fortify_ts.R",415,1,"style","Variable and function name style should be snake_case.","fortify.KFS <- fortify.tsmodel","object_name_linter" +"R/base_fortify_ts.R",457,1,"style","Variable and function name style should be snake_case.","autoplot.tsmodel <- function(object, data = NULL,","object_name_linter" +"R/base_fortify_ts.R",499,1,"style","Variable and function name style should be snake_case.","autoplot.ar <- autoplot.tsmodel","object_name_linter" +"R/base_fortify_ts.R",502,1,"style","Variable and function name style should be snake_case.","autoplot.Arima <- autoplot.tsmodel","object_name_linter" +"R/base_fortify_ts.R",505,1,"style","Variable and function name style should be snake_case.","autoplot.HoltWinters <- autoplot.tsmodel","object_name_linter" +"R/base_fortify_ts.R",508,1,"style","Variable and function name style should be snake_case.","autoplot.fracdiff <- autoplot.tsmodel","object_name_linter" +"R/base_fortify_ts.R",511,1,"style","Variable and function name style should be snake_case.","autoplot.nnetar <- autoplot.tsmodel","object_name_linter" +"R/base_fortify_ts.R",514,1,"style","Variable and function name style should be snake_case.","autoplot.fGARCH <- autoplot.tsmodel","object_name_linter" +"R/base_fortify_ts.R",517,1,"style","Variable and function name style should be snake_case.","autoplot.dlmFiltered <- autoplot.tsmodel","object_name_linter" +"R/base_fortify_ts.R",520,1,"style","Variable and function name style should be snake_case.","autoplot.KFS <- autoplot.tsmodel","object_name_linter" +"R/fortify_base.R",20,1,"style","Variable and function name style should be snake_case.","fortify.table <- function(model, data, ...) {","object_name_linter" +"R/fortify_base.R",38,1,"style","Variable and function name style should be snake_case.","fortify.matrix <- function(model, data = NULL, compat = FALSE, ...) {","object_name_linter" +"R/fortify_base.R",91,15,"style","Variable and function name style should be snake_case."," fortified$Index <- rownames(fortified)","object_name_linter" +"R/fortify_basis.R",24,1,"style","Variable and function name style should be snake_case.","as_tibble.basis <- function(x, ...) {","object_name_linter" +"R/fortify_changepoint.R",21,1,"style","Variable and function name style should be snake_case.","fortify.cpt <- function(model, data = NULL,","object_name_linter" +"R/fortify_changepoint.R",56,1,"style","Variable and function name style should be snake_case.","fortify.breakpoints <- fortify.cpt","object_name_linter" +"R/fortify_changepoint.R",59,1,"style","Variable and function name style should be snake_case.","fortify.breakpointsfull <- fortify.cpt","object_name_linter" +"R/fortify_changepoint.R",111,1,"style","Variable and function name style should be snake_case.","autoplot.breakpoints <- function(object, data = NULL,","object_name_linter" +"R/fortify_changepoint.R",129,1,"style","Variable and function name style should be snake_case.","fortify.breakpointsfull <- fortify.breakpoints","object_name_linter" +"R/fortify_cluster.R",13,1,"style","Variable and function name style should be snake_case.","fortify.kmeans <- function(model, data = NULL, ...) {","object_name_linter" +"R/fortify_cluster.R",43,1,"style","Variable and function name style should be snake_case.","autoplot.kmeans <- function(object, data = NULL,","object_name_linter" +"R/fortify_cluster.R",67,1,"style","Variable and function name style should be snake_case.","fortify.partition <- fortify.kmeans","object_name_linter" +"R/fortify_cluster.R",70,1,"style","Variable and function name style should be snake_case.","fortify.clara <- fortify.partition","object_name_linter" +"R/fortify_cluster.R",73,1,"style","Variable and function name style should be snake_case.","fortify.fanny <- fortify.partition","object_name_linter" +"R/fortify_cluster.R",76,1,"style","Variable and function name style should be snake_case.","fortify.pam <- fortify.partition","object_name_linter" +"R/fortify_cluster.R",79,1,"style","Variable and function name style should be snake_case.","autoplot.partition <- autoplot.kmeans","object_name_linter" +"R/fortify_cluster.R",82,1,"style","Variable and function name style should be snake_case.","autoplot.clara <- autoplot.partition","object_name_linter" +"R/fortify_cluster.R",85,1,"style","Variable and function name style should be snake_case.","autoplot.fanny <- autoplot.partition","object_name_linter" +"R/fortify_cluster.R",88,1,"style","Variable and function name style should be snake_case.","autoplot.pam <- autoplot.partition","object_name_linter" +"R/fortify_cluster.R",103,1,"style","Variable and function name style should be snake_case.","fortify.silhouette <- function(model, data = NULL, ...) {","object_name_linter" +"R/fortify_cluster.R",138,1,"style","Variable and function name style should be snake_case.","autoplot.silhouette <- function(object, colour = ""red"",","object_name_linter" +"R/fortify_forecast.R",18,14,"style","Variable and function name style should be snake_case."," forecasted$Index <- get.dtindex(model$mean, is.date = is.date)","object_name_linter" +"R/fortify_forecast.R",96,1,"style","Variable and function name style should be snake_case.","fortify.ets <- function(model, data = NULL, ...) {","object_name_linter" +"R/fortify_forecast.R",144,1,"style","Variable and function name style should be snake_case.","fortify.bats <- fortify.ets","object_name_linter" +"R/fortify_forecast.R",147,1,"style","Variable and function name style should be snake_case.","autoplot.ets <- autoplot.ts","object_name_linter" +"R/fortify_forecast.R",150,1,"style","Variable and function name style should be snake_case.","autoplot.bats <- autoplot.ts","object_name_linter" +"R/fortify_glmnet.R",9,1,"style","Variable and function name style should be snake_case.","fortify.glmnet <- function(model, data = NULL, ...) {","object_name_linter" +"R/fortify_glmnet.R",95,1,"style","Variable and function name style should be snake_case.","fortify.cv.glmnet <- function(model, data = NULL, ...) {","object_name_linter" +"R/fortify_MSwM.R",15,1,"style","Variable and function name style should be snake_case.","fortify.MSM.lm <- function(model, data = NULL, melt = FALSE, ...) {","object_name_linter" +"R/fortify_MSwM.R",28,10,"style","Variable and function name style should be snake_case."," md$Index <- factor(md$Index, levels = idx)","object_name_linter" +"R/fortify_MSwM.R",29,10,"style","Variable and function name style should be snake_case."," md$Model <- rep(k, nrow(md))","object_name_linter" +"R/fortify_MSwM.R",30,10,"style","Variable and function name style should be snake_case."," md$ProbableModel <- probable","object_name_linter" +"R/fortify_MSwM.R",34,7,"style","Variable and function name style should be snake_case."," d$Model <- as.factor(d$Model)","object_name_linter" +"R/fortify_performance.R",7,1,"style","Variable and function name style should be snake_case.","fortify.performance <- function(model, data = NULL, ...) {","object_name_linter" +"R/fortify_performance.R",60,1,"style","Variable and function name style should be snake_case.","autoplot.performance <- function(object, p = NULL,","object_name_linter" +"R/fortify_raster.R",9,1,"style","Variable and function name style should be snake_case.","fortify.RasterCommon <- function(model, data = NULL, maxpixels = 100000,","object_name_linter" +"R/fortify_raster.R",49,1,"style","Variable and function name style should be snake_case.","fortify.RasterLayer <- fortify.RasterCommon","object_name_linter" +"R/fortify_raster.R",52,1,"style","Variable and function name style should be snake_case.","fortify.RasterBrick <- fortify.RasterCommon","object_name_linter" +"R/fortify_raster.R",55,1,"style","Variable and function name style should be snake_case.","fortify.RasterStack <- fortify.RasterCommon","object_name_linter" +"R/fortify_raster.R",95,1,"style","Variable and function name style should be snake_case.","autoplot.RasterLayer <- autoplot.RasterCommon","object_name_linter" +"R/fortify_raster.R",98,1,"style","Variable and function name style should be snake_case.","autoplot.RasterBrick <- autoplot.RasterCommon","object_name_linter" +"R/fortify_raster.R",101,1,"style","Variable and function name style should be snake_case.","autoplot.RasterStack <- autoplot.RasterCommon","object_name_linter" +"R/fortify_spatial.R",8,1,"style","Variable and function name style should be snake_case.","fortify.SpatialCommon <- function(model, data = NULL,","object_name_linter" +"R/fortify_spatial.R",39,1,"style","Variable and function name style should be snake_case.","fortify.SpatialPoints <- fortify.SpatialCommon","object_name_linter" +"R/fortify_spatial.R",42,1,"style","Variable and function name style should be snake_case.","fortify.SpatialPointsDataFrame <- fortify.SpatialCommon","object_name_linter" +"R/fortify_spatial.R",45,1,"style","Variable and function name style should be snake_case.","fortify.SpatialLines <- fortify.SpatialCommon","object_name_linter" +"R/fortify_spatial.R",135,1,"style","Variable and function names should not be longer than 30 characters.","autoplot.SpatialPointsDataFrame <- autoplot.SpatialCommon","object_length_linter" +"R/fortify_spatial.R",135,1,"style","Variable and function name style should be snake_case.","autoplot.SpatialPointsDataFrame <- autoplot.SpatialCommon","object_name_linter" +"R/fortify_spatial.R",138,1,"style","Variable and function name style should be snake_case.","autoplot.SpatialPoints <- autoplot.SpatialCommon","object_name_linter" +"R/fortify_spatial.R",141,1,"style","Variable and function name style should be snake_case.","autoplot.Line <- autoplot.SpatialCommon","object_name_linter" +"R/fortify_spatial.R",144,1,"style","Variable and function name style should be snake_case.","autoplot.Lines <- autoplot.SpatialCommon","object_name_linter" +"R/fortify_spatial.R",147,1,"style","Variable and function name style should be snake_case.","autoplot.SpatialLines <- autoplot.SpatialCommon","object_name_linter" +"R/fortify_spatial.R",150,1,"style","Variable and function name style should be snake_case.","autoplot.SpatialLinesDataFrame <- autoplot.SpatialCommon","object_name_linter" +"R/fortify_spatial.R",153,1,"style","Variable and function name style should be snake_case.","autoplot.Polygon <- autoplot.SpatialCommon","object_name_linter" +"R/fortify_spatial.R",156,1,"style","Variable and function name style should be snake_case.","autoplot.Polygons <- autoplot.SpatialCommon","object_name_linter" +"R/fortify_spatial.R",159,1,"style","Variable and function name style should be snake_case.","autoplot.SpatialPolygons <- autoplot.SpatialCommon","object_name_linter" +"R/fortify_spatial.R",162,1,"style","Variable and function names should not be longer than 30 characters.","autoplot.SpatialPolygonsDataFrame <- autoplot.SpatialCommon","object_length_linter" +"R/fortify_spatial.R",162,1,"style","Variable and function name style should be snake_case.","autoplot.SpatialPolygonsDataFrame <- autoplot.SpatialCommon","object_name_linter" +"R/fortify_stats_density.R",9,1,"style","Variable and function name style should be snake_case.","fortify.density <- function(model, data = NULL, ...) {","object_name_linter" +"R/fortify_stats_lm.R",335,1,"style","Variable and function name style should be snake_case.","autoplot.glm <- autoplot.lm","object_name_linter" +"R/fortify_stats.R",2,1,"style","Variable and function name style should be snake_case.","fortify.stl <- fortify.ts","object_name_linter" +"R/fortify_stats.R",5,1,"style","Variable and function name style should be snake_case.","fortify.decomposed.ts <- fortify.ts","object_name_linter" +"R/fortify_stats.R",8,1,"style","Variable and function name style should be snake_case.","autoplot.stl <- autoplot.ts","object_name_linter" +"R/fortify_stats.R",11,1,"style","Variable and function name style should be snake_case.","autoplot.decomposed.ts <- autoplot.ts","object_name_linter" +"R/fortify_stats.R",28,1,"style","Variable and function name style should be snake_case.","fortify.acf <- function(model, data = NULL,","object_name_linter" +"R/fortify_stats.R",57,1,"style","Variable and function name style should be snake_case.","autoplot.acf <- function(object,","object_name_linter" +"R/fortify_stats.R",98,1,"style","Variable and function name style should be snake_case.","fortify.spec <- function(model, data = NULL, ...) {","object_name_linter" +"R/fortify_stats.R",114,1,"style","Variable and function name style should be snake_case.","autoplot.spec <- function(object,","object_name_linter" +"R/fortify_stats.R",140,1,"style","Variable and function name style should be snake_case.","fortify.prcomp <- function(model, data = NULL, ...) {","object_name_linter" +"R/fortify_stats.R",160,1,"style","Variable and function name style should be snake_case.","fortify.princomp <- fortify.prcomp","object_name_linter" +"R/fortify_stats.R",172,1,"style","Variable and function name style should be snake_case.","fortify.factanal <- function(model, data = NULL, ...) {","object_name_linter" +"R/fortify_stats.R",194,1,"style","Variable and function name style should be snake_case.","fortify.lfda <- function(model, data = NULL, ...) {","object_name_linter" +"R/fortify_stats.R",252,1,"style","Variable and function name style should be snake_case.","autoplot.pca_common <- function(object, data = NULL,","object_name_linter" +"R/fortify_stats.R",345,1,"style","Variable and function name style should be snake_case.","autoplot.prcomp <- autoplot.pca_common","object_name_linter" +"R/fortify_stats.R",348,1,"style","Variable and function name style should be snake_case.","autoplot.princomp <- autoplot.pca_common","object_name_linter" +"R/fortify_stats.R",351,1,"style","Variable and function name style should be snake_case.","autoplot.factanal <- autoplot.pca_common","object_name_linter" +"R/fortify_stats.R",354,1,"style","Variable and function name style should be snake_case.","autoplot.lfda <- autoplot.pca_common","object_name_linter" +"R/fortify_stats.R",365,1,"style","Variable and function name style should be snake_case.","fortify.dist <- function(model, data = NULL, ...) {","object_name_linter" +"R/fortify_stats.R",371,1,"style","Variable and function name style should be snake_case.","autoplot.dist <- autoplot.matrix","object_name_linter" +"R/fortify_stats.R",385,1,"style","Variable and function name style should be snake_case.","fortify.stepfun <- function(model, data, ...) {","object_name_linter" +"R/fortify_stats.R",418,1,"style","Variable and function name style should be snake_case.","autoplot.stepfun <- function(object,","object_name_linter" +"R/fortify_surv.R",282,1,"style","Variable and function name style should be snake_case.","fortify.aareg <- function(model, data = NULL,","object_name_linter" +"R/fortify_vars.R",26,21,"style","There should be a space between right parenthesis and an opening curly brace."," for (col in cols){","paren_brace_linter" +"R/fortify_vars.R",28,12,"style","Variable and function name style should be snake_case."," pred$Index <- dtindex.cont","object_name_linter" +"R/fortify_vars.R",37,21,"style","There should be a space between right parenthesis and an opening curly brace."," for (col in cols){","paren_brace_linter" +"R/fortify_vars.R",41,10,"style","Variable and function name style should be snake_case."," pred$Index <- dtindex.cont","object_name_linter" +"R/plotlib.R",457,1,"style","Variable and function name style should be snake_case.","autoplot.ggplot <- function(object, ...) {","object_name_linter" +"R/plotlib.R",468,1,"style","Variable and function name style should be snake_case.","autoplot.ggmultiplot <- function(object, ...) {","object_name_linter" +"R/tslib.R",130,3,"style","Variable and function name style should be snake_case."," with.ci.ma <- with.ci && ci.type == ""ma"" && x$type == ""correlation""","object_name_linter" +"R/tslib.R",134,5,"style","Variable and function name style should be snake_case."," with.ci.ma <- FALSE","object_name_linter" +"tests/testthat/test-raster.R",35,7,"style","Variable and function name style should be snake_case."," exp$layer.2 <- exp$layer","object_name_linter" diff --git a/.dev/revdep_emails/ggfortify/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/ggfortify/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..89239abb7 --- /dev/null +++ b/.dev/revdep_emails/ggfortify/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,190 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/base_fortify_list.R",54,25,"style","Any function spanning multiple lines should use curly braces."," p <- lapply(object, function(x) autoplot(x, data = data, nrow = nrow,","brace_linter" +"R/fortify_basis.R",25,13,"style","Variable and function name style should be snake_case or symbols."," attr(x, ""basis.class"") <- attr(x, ""class"")","object_name_linter" +"R/fortify_basis.R",87,5,"style","Variable and function name style should be snake_case or symbols."," all.knots <- c(attr(object, ""Boundary.knots""),","object_name_linter" +"R/fortify_glmnet.R",69,3,"style","Variable and function name style should be snake_case or symbols."," label.data$label_y <- rep(max(plot.data$value), nrow(label.data))","object_name_linter" +"R/fortify_glmnet.R",115,33,"style","Variable and function name style should be snake_case or symbols."," sign.lambda = 1,","object_name_linter" +"R/fortify_stats_lm.R",150,15,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (label & label.n > 0) {","vector_logic_linter" +"R/fortify_stats.R",283,5,"style","Either both or neither branch in `if`/`else` should use curly braces."," if (is.null(attr(object, ""covariance""))) {","brace_linter" +"R/fortify_stats.R",319,5,"style","Variable and function name style should be snake_case or symbols."," loadings.data$rownames <- rownames(loadings.data)","object_name_linter" +"R/fortify_stats.R",328,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(ve) | !variance_percentage) {","vector_logic_linter" +"R/fortify_stats.R",433,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nrow(plot.data) >= 3 & !is.null(shape)) {","vector_logic_linter" +"R/fortify_surv.R",99,5,"style","`else` should come on the same line as the previous `}`."," else if (!is.function(fun)) {","brace_linter" +"R/fortify_surv.R",233,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (missing(conf.int.fill) & !is.null(surv.colour)) {","vector_logic_linter" +"R/plotlib.R",350,1,"style","Variable and function name style should be snake_case or symbols.","get.layout <- function(nplots, ncol, nrow) {","object_name_linter" +"R/plotlib.R",592,5,"style","Variable and function name style should be snake_case or symbols."," loadings.data[, 1L:2L] <- loadings.data[, 1L:2L] * scaler * 0.8","object_name_linter" +"R/tslib.R",224,3,"style","Either both or neither branch in `if`/`else` should use curly braces."," if (length(x) %% 2 == 0) {","brace_linter" +"R/tslib.R",229,3,"style","`else` should come on the same line as the previous `}`."," else y <- y[seq_along(x)]","brace_linter" +"tests/testthat/test-stats-lm.R",563,31,"style","Put spaces around all infix operators."," p <- autoplot(lm(Petal.Width~Petal.Length, data = iris), size = 5)","infix_spaces_linter" +"tests/testthat/test-surv.R",166,45,"style","Use TRUE instead of the symbol T."," fortified <- fortify(fit, surv.connect = T)","T_and_F_symbol_linter" +"vignettes/basics.Rmd",8,25,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/basics-', warning=FALSE)","infix_spaces_linter" +"vignettes/basics.Rmd",8,39,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/basics-', warning=FALSE)","infix_spaces_linter" +"vignettes/basics.Rmd",8,51,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/basics-', warning=FALSE)","infix_spaces_linter" +"vignettes/basics.Rmd",8,52,"style","Only use double-quotes.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/basics-', warning=FALSE)","single_quotes_linter" +"vignettes/basics.Rmd",8,78,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/basics-', warning=FALSE)","infix_spaces_linter" +"vignettes/basics.Rmd",8,81,"style","Lines should not be more than 80 characters.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/basics-', warning=FALSE)","line_length_linter" +"vignettes/basics.Rmd",32,37,"style","Only use double-quotes.","autoplot(AirPassengers, ts.colour = 'blue')","single_quotes_linter" +"vignettes/basics.Rmd",46,13,"style","Only use double-quotes.","p + ggtitle('AirPassengers') + xlab('Year') + ylab('Passengers')","single_quotes_linter" +"vignettes/basics.Rmd",46,37,"style","Only use double-quotes.","p + ggtitle('AirPassengers') + xlab('Year') + ylab('Passengers')","single_quotes_linter" +"vignettes/basics.Rmd",46,52,"style","Only use double-quotes.","p + ggtitle('AirPassengers') + xlab('Year') + ylab('Passengers')","single_quotes_linter" +"vignettes/basics.Rmd",50,49,"style","Trailing whitespace is superfluous.","# these common options are supported as keywords ","trailing_whitespace_linter" +"vignettes/basics.Rmd",51,33,"style","Only use double-quotes.","autoplot(AirPassengers, title = 'AirPassengers', xlab = 'Year', ylab = 'Passengers')","single_quotes_linter" +"vignettes/basics.Rmd",51,57,"style","Only use double-quotes.","autoplot(AirPassengers, title = 'AirPassengers', xlab = 'Year', ylab = 'Passengers')","single_quotes_linter" +"vignettes/basics.Rmd",51,72,"style","Only use double-quotes.","autoplot(AirPassengers, title = 'AirPassengers', xlab = 'Year', ylab = 'Passengers')","single_quotes_linter" +"vignettes/basics.Rmd",51,81,"style","Lines should not be more than 80 characters.","autoplot(AirPassengers, title = 'AirPassengers', xlab = 'Year', ylab = 'Passengers')","line_length_linter" +"vignettes/basics.Rmd",74,17,"style","Put spaces around all infix operators.","ggplot(df, aes(x= cluster, fill = cluster)) + geom_bar()","infix_spaces_linter" +"vignettes/basics.Rmd",82,40,"style","Trailing whitespace is superfluous.","res <- lm(Volume ~ Girth, data = trees) ","trailing_whitespace_linter" +"vignettes/basics.Rmd",155,5,"style","Only use double-quotes.","new('ggmultiplot', plots = list(p1, p2))","single_quotes_linter" +"vignettes/basics.Rmd",161,5,"style","Only use double-quotes.","new('ggmultiplot', plots = list(p1, p2), ncol = 1)","single_quotes_linter" +"vignettes/plot_dist.Rmd",8,25,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/dist-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_dist.Rmd",8,39,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/dist-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_dist.Rmd",8,51,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/dist-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_dist.Rmd",8,52,"style","Only use double-quotes.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/dist-', warning=FALSE)","single_quotes_linter" +"vignettes/plot_dist.Rmd",8,76,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/dist-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_dist.Rmd",8,81,"style","Lines should not be more than 80 characters.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/dist-', warning=FALSE)","line_length_linter" +"vignettes/plot_dist.Rmd",27,67,"style","Only use double-quotes.","ggdistribution(pnorm, seq(-3, 3, 0.1), mean = 0, sd = 1, colour = 'red')","single_quotes_linter" +"vignettes/plot_dist.Rmd",28,54,"style","Only use double-quotes.","ggdistribution(dpois, seq(0, 20), lambda = 9, fill = 'blue')","single_quotes_linter" +"vignettes/plot_dist.Rmd",34,63,"style","Only use double-quotes.","p <- ggdistribution(dchisq, seq(0, 20, 0.1), df = 7, colour = 'blue')","single_quotes_linter" +"vignettes/plot_dist.Rmd",35,63,"style","Only use double-quotes.","p <- ggdistribution(dchisq, seq(0, 20, 0.1), df = 9, colour = 'green', p = p)","single_quotes_linter" +"vignettes/plot_dist.Rmd",36,59,"style","Only use double-quotes.","ggdistribution(dchisq, seq(0, 20, 0.1), df = 11, colour = 'red', p = p)","single_quotes_linter" +"vignettes/plot_dist.Rmd",44,39,"style","Only use double-quotes.","autoplot(density(rnorm(1:50)), fill = 'green')","single_quotes_linter" +"vignettes/plot_lm.Rmd",8,25,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=8, fig.height=6, fig.path='figures/lm-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_lm.Rmd",8,39,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=8, fig.height=6, fig.path='figures/lm-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_lm.Rmd",8,51,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=8, fig.height=6, fig.path='figures/lm-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_lm.Rmd",8,52,"style","Only use double-quotes.","opts_chunk$set(fig.width=8, fig.height=6, fig.path='figures/lm-', warning=FALSE)","single_quotes_linter" +"vignettes/plot_lm.Rmd",8,74,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=8, fig.height=6, fig.path='figures/lm-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_lm.Rmd",57,35,"style","Only use double-quotes.","autoplot(m, which = 1:6, colour = 'dodgerblue3',","single_quotes_linter" +"vignettes/plot_lm.Rmd",58,26,"style","Only use double-quotes."," smooth.colour = 'black', smooth.linetype = 'dashed',","single_quotes_linter" +"vignettes/plot_lm.Rmd",58,53,"style","Only use double-quotes."," smooth.colour = 'black', smooth.linetype = 'dashed',","single_quotes_linter" +"vignettes/plot_lm.Rmd",59,22,"style","Only use double-quotes."," ad.colour = 'blue',","single_quotes_linter" +"vignettes/plot_lm.Rmd",60,54,"style","Only use double-quotes."," label.size = 3, label.n = 5, label.colour = 'blue',","single_quotes_linter" +"vignettes/plot_lm.Rmd",68,19,"style","Only use double-quotes."," colour = 'Species', label.size = 3)","single_quotes_linter" +"vignettes/plot_lm.Rmd",83,24,"style","Only use double-quotes.","autoplot(fit, colour = 'blue')","single_quotes_linter" +"vignettes/plot_map.Rmd",8,25,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=3, fig.height=3, fig.path='figures/map-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_map.Rmd",8,39,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=3, fig.height=3, fig.path='figures/map-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_map.Rmd",8,51,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=3, fig.height=3, fig.path='figures/map-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_map.Rmd",8,52,"style","Only use double-quotes.","opts_chunk$set(fig.width=3, fig.height=3, fig.path='figures/map-', warning=FALSE)","single_quotes_linter" +"vignettes/plot_map.Rmd",8,75,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=3, fig.height=3, fig.path='figures/map-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_map.Rmd",8,81,"style","Lines should not be more than 80 characters.","opts_chunk$set(fig.width=3, fig.height=3, fig.path='figures/map-', warning=FALSE)","line_length_linter" +"vignettes/plot_map.Rmd",21,25,"style","Only use double-quotes.","jp <- ggplot2::map_data('world2', 'japan')","single_quotes_linter" +"vignettes/plot_map.Rmd",21,35,"style","Only use double-quotes.","jp <- ggplot2::map_data('world2', 'japan')","single_quotes_linter" +"vignettes/plot_map.Rmd",32,12,"style","Only use double-quotes.","jp <- map('world2', 'japan', plot = FALSE, fill = TRUE)","single_quotes_linter" +"vignettes/plot_map.Rmd",32,22,"style","Only use double-quotes.","jp <- map('world2', 'japan', plot = FALSE, fill = TRUE)","single_quotes_linter" +"vignettes/plot_map.Rmd",36,26,"style","Only use double-quotes.","p <- autoplot(jp, geom = 'polygon', fill = 'subregion') + ","single_quotes_linter" +"vignettes/plot_map.Rmd",36,44,"style","Only use double-quotes.","p <- autoplot(jp, geom = 'polygon', fill = 'subregion') + ","single_quotes_linter" +"vignettes/plot_map.Rmd",36,58,"style","Trailing whitespace is superfluous.","p <- autoplot(jp, geom = 'polygon', fill = 'subregion') + ","trailing_whitespace_linter" +"vignettes/plot_map.Rmd",37,24,"style","Put spaces around all infix operators."," theme(legend.position=""none"")","infix_spaces_linter" +"vignettes/plot_map.Rmd",44,15,"style","Only use double-quotes.","cities <- get('world.cities')","single_quotes_linter" +"vignettes/plot_map.Rmd",45,40,"style","Only use double-quotes.","cities <- cities[cities$country.etc == 'Japan', ]","single_quotes_linter" +"vignettes/plot_map.Rmd",49,25,"style","Only use double-quotes."," colour = 'blue', size = 0.1)","single_quotes_linter" +"vignettes/plot_map.Rmd",55,40,"style","Only use double-quotes.","p + geom_point(data = cities, colour = 'blue', size = 0.1)","single_quotes_linter" +"vignettes/plot_map.Rmd",81,28,"style","Only use double-quotes."," label = c('Tokyo', 'Osaka'),","single_quotes_linter" +"vignettes/plot_map.Rmd",81,37,"style","Only use double-quotes."," label = c('Tokyo', 'Osaka'),","single_quotes_linter" +"vignettes/plot_map.Rmd",85,30,"style","Only use double-quotes.","autoplot(df, p = p, colour = 'red', size = 10)","single_quotes_linter" +"vignettes/plot_map.Rmd",91,30,"style","Only use double-quotes.","autoplot(df, p = p, colour = 'red', size = 'population') +","single_quotes_linter" +"vignettes/plot_map.Rmd",91,44,"style","Only use double-quotes.","autoplot(df, p = p, colour = 'red', size = 'population') +","single_quotes_linter" +"vignettes/plot_map.Rmd",104,30,"style","Only use double-quotes.","autoplot(df, p = p, colour = 'red', size = 'population') + ","single_quotes_linter" +"vignettes/plot_map.Rmd",104,44,"style","Only use double-quotes.","autoplot(df, p = p, colour = 'red', size = 'population') + ","single_quotes_linter" +"vignettes/plot_map.Rmd",104,59,"style","Trailing whitespace is superfluous.","autoplot(df, p = p, colour = 'red', size = 'population') + ","trailing_whitespace_linter" +"vignettes/plot_pca.Rmd",8,25,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/pca-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_pca.Rmd",8,39,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/pca-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_pca.Rmd",8,51,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/pca-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_pca.Rmd",8,52,"style","Only use double-quotes.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/pca-', warning=FALSE)","single_quotes_linter" +"vignettes/plot_pca.Rmd",8,75,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/pca-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_pca.Rmd",8,81,"style","Lines should not be more than 80 characters.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/pca-', warning=FALSE)","line_length_linter" +"vignettes/plot_pca.Rmd",28,41,"style","Only use double-quotes.","autoplot(pca_res, data = iris, colour = 'Species')","single_quotes_linter" +"vignettes/plot_pca.Rmd",34,41,"style","Only use double-quotes.","autoplot(pca_res, data = iris, colour = 'Species', label = TRUE, label.size = 3)","single_quotes_linter" +"vignettes/plot_pca.Rmd",40,41,"style","Only use double-quotes.","autoplot(pca_res, data = iris, colour = 'Species', shape = FALSE, label.size = 3)","single_quotes_linter" +"vignettes/plot_pca.Rmd",40,81,"style","Lines should not be more than 80 characters.","autoplot(pca_res, data = iris, colour = 'Species', shape = FALSE, label.size = 3)","line_length_linter" +"vignettes/plot_pca.Rmd",46,41,"style","Only use double-quotes.","autoplot(pca_res, data = iris, colour = 'Species', loadings = TRUE)","single_quotes_linter" +"vignettes/plot_pca.Rmd",52,41,"style","Only use double-quotes.","autoplot(pca_res, data = iris, colour = 'Species',","single_quotes_linter" +"vignettes/plot_pca.Rmd",53,45,"style","Only use double-quotes."," loadings = TRUE, loadings.colour = 'blue',","single_quotes_linter" +"vignettes/plot_pca.Rmd",70,1,"style","Variable and function name style should be snake_case or symbols.","d.factanal <- factanal(state.x77, factors = 3, scores = 'regression')","object_name_linter" +"vignettes/plot_pca.Rmd",70,57,"style","Only use double-quotes.","d.factanal <- factanal(state.x77, factors = 3, scores = 'regression')","single_quotes_linter" +"vignettes/plot_pca.Rmd",71,49,"style","Only use double-quotes.","autoplot(d.factanal, data = state.x77, colour = 'Income')","single_quotes_linter" +"vignettes/plot_pca.Rmd",106,55,"style","Only use double-quotes.","autoplot(pam(iris[-5], 3), frame = TRUE, frame.type = 'norm')","single_quotes_linter" +"vignettes/plot_pca.Rmd",128,49,"style","Put spaces around all infix operators.","model <- lfda(iris[-5], iris[, 5], r = 3, metric=""plain"")","infix_spaces_linter" +"vignettes/plot_pca.Rmd",129,59,"style","Only use double-quotes.","autoplot(model, data = iris, frame = TRUE, frame.colour = 'Species')","single_quotes_linter" +"vignettes/plot_pca.Rmd",134,61,"style","Put spaces around all infix operators.","model <- self(iris[-5], iris[, 5], beta = 0.1, r = 3, metric=""plain"")","infix_spaces_linter" +"vignettes/plot_pca.Rmd",135,59,"style","Only use double-quotes.","autoplot(model, data = iris, frame = TRUE, frame.colour = 'Species')","single_quotes_linter" +"vignettes/plot_pca.Rmd",175,37,"style","Only use double-quotes.","autoplot(isoMDS(eurodist), colour = 'orange', size = 4, shape = 3)","single_quotes_linter" +"vignettes/plot_pca.Rmd",181,58,"style","Only use double-quotes.","autoplot(sammon(eurodist), shape = FALSE, label.colour = 'blue', label.size = 3)","single_quotes_linter" +"vignettes/plot_surv.Rmd",8,25,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/surv-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_surv.Rmd",8,39,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/surv-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_surv.Rmd",8,51,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/surv-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_surv.Rmd",8,52,"style","Only use double-quotes.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/surv-', warning=FALSE)","single_quotes_linter" +"vignettes/plot_surv.Rmd",8,76,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/surv-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_surv.Rmd",8,81,"style","Lines should not be more than 80 characters.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/surv-', warning=FALSE)","line_length_linter" +"vignettes/plot_surv.Rmd",27,31,"style","Only use double-quotes.","autoplot(fit, surv.linetype = 'dashed', conf.int = FALSE,","single_quotes_linter" +"vignettes/plot_surv.Rmd",28,25,"style","Only use double-quotes."," censor.shape = '*', censor.size = 5, facets = TRUE, ncol = 2)","single_quotes_linter" +"vignettes/plot_surv.Rmd",30,70,"style","Only use double-quotes.","autoplot(survfit(Surv(time, status) ~ 1, data = lung), surv.colour = 'orange', censor.colour = 'red')","single_quotes_linter" +"vignettes/plot_surv.Rmd",30,81,"style","Lines should not be more than 80 characters.","autoplot(survfit(Surv(time, status) ~ 1, data = lung), surv.colour = 'orange', censor.colour = 'red')","line_length_linter" +"vignettes/plot_surv.Rmd",30,96,"style","Only use double-quotes.","autoplot(survfit(Surv(time, status) ~ 1, data = lung), surv.colour = 'orange', censor.colour = 'red')","single_quotes_linter" +"vignettes/plot_surv.Rmd",32,64,"style","Only use double-quotes.","autoplot(survfit(Surv(time, status) ~ sex, data = lung), fun = 'event')","single_quotes_linter" +"vignettes/plot_surv.Rmd",34,1,"style","Variable and function name style should be snake_case or symbols.","d.coxph <- survfit(coxph(Surv(time, status) ~ sex, data = lung))","object_name_linter" +"vignettes/plot_surv.Rmd",35,35,"style","Only use double-quotes.","autoplot(d.coxph, surv.linetype = 'dashed', surv.colour = 'blue',","single_quotes_linter" +"vignettes/plot_surv.Rmd",35,59,"style","Only use double-quotes.","autoplot(d.coxph, surv.linetype = 'dashed', surv.colour = 'blue',","single_quotes_linter" +"vignettes/plot_surv.Rmd",36,26,"style","Only use double-quotes."," conf.int.fill = 'dodgerblue3', conf.int.alpha = 0.5, censor = FALSE)","single_quotes_linter" +"vignettes/plot_ts.Rmd",8,25,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/ts-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_ts.Rmd",8,39,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/ts-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_ts.Rmd",8,51,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/ts-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_ts.Rmd",8,52,"style","Only use double-quotes.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/ts-', warning=FALSE)","single_quotes_linter" +"vignettes/plot_ts.Rmd",8,74,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/ts-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_ts.Rmd",25,37,"style","Only use double-quotes.","autoplot(AirPassengers, ts.colour = 'red', ts.linetype = 'dashed')","single_quotes_linter" +"vignettes/plot_ts.Rmd",25,58,"style","Only use double-quotes.","autoplot(AirPassengers, ts.colour = 'red', ts.linetype = 'dashed')","single_quotes_linter" +"vignettes/plot_ts.Rmd",51,45,"style","Only use double-quotes.","autoplot(as.xts(AirPassengers), ts.colour = 'green')","single_quotes_linter" +"vignettes/plot_ts.Rmd",54,53,"style","Only use double-quotes.","autoplot(as.timeSeries(AirPassengers), ts.colour = ('dodgerblue3'))","single_quotes_linter" +"vignettes/plot_ts.Rmd",62,35,"style","Only use double-quotes.","autoplot(AirPassengers, ts.geom = 'bar', fill = 'blue')","single_quotes_linter" +"vignettes/plot_ts.Rmd",62,49,"style","Only use double-quotes.","autoplot(AirPassengers, ts.geom = 'bar', fill = 'blue')","single_quotes_linter" +"vignettes/plot_ts.Rmd",66,35,"style","Only use double-quotes.","autoplot(AirPassengers, ts.geom = 'ribbon', fill = 'green')","single_quotes_linter" +"vignettes/plot_ts.Rmd",66,52,"style","Only use double-quotes.","autoplot(AirPassengers, ts.geom = 'ribbon', fill = 'green')","single_quotes_linter" +"vignettes/plot_ts.Rmd",70,35,"style","Only use double-quotes.","autoplot(AirPassengers, ts.geom = 'point', shape = 3)","single_quotes_linter" +"vignettes/plot_ts.Rmd",76,81,"style","Lines should not be more than 80 characters.","mts <- ts(data.frame(a = c(1, 2, 3, 4, 4, 3), b = c(3, 2, 3, 2, 2, 1)), start = 2010)","line_length_linter" +"vignettes/plot_ts.Rmd",77,25,"style","Only use double-quotes.","autoplot(mts, ts.geom = 'bar', facets = FALSE)","single_quotes_linter" +"vignettes/plot_ts.Rmd",81,25,"style","Only use double-quotes.","autoplot(mts, ts.geom = 'bar', facets = FALSE, stacked = TRUE)","single_quotes_linter" +"vignettes/plot_ts.Rmd",85,25,"style","Only use double-quotes.","autoplot(mts, ts.geom = 'ribbon', facets = FALSE)","single_quotes_linter" +"vignettes/plot_ts.Rmd",89,25,"style","Only use double-quotes.","autoplot(mts, ts.geom = 'ribbon', facets = FALSE, stacked = TRUE)","single_quotes_linter" +"vignettes/plot_ts.Rmd",98,1,"style","Variable and function name style should be snake_case or symbols.","d.arima <- auto.arima(AirPassengers)","object_name_linter" +"vignettes/plot_ts.Rmd",99,1,"style","Variable and function name style should be snake_case or symbols.","d.forecast <- forecast(d.arima, level = c(95), h = 50)","object_name_linter" +"vignettes/plot_ts.Rmd",106,34,"style","Only use double-quotes.","autoplot(d.forecast, ts.colour = 'firebrick1', predict.colour = 'red',","single_quotes_linter" +"vignettes/plot_ts.Rmd",106,65,"style","Only use double-quotes.","autoplot(d.forecast, ts.colour = 'firebrick1', predict.colour = 'red',","single_quotes_linter" +"vignettes/plot_ts.Rmd",107,29,"style","Only use double-quotes."," predict.linetype = 'dashed', conf.int = FALSE)","single_quotes_linter" +"vignettes/plot_ts.Rmd",116,1,"style","Variable and function name style should be snake_case or symbols.","d.vselect <- VARselect(Canada, lag.max = 5, type = 'const')$selection[1]","object_name_linter" +"vignettes/plot_ts.Rmd",116,52,"style","Only use double-quotes.","d.vselect <- VARselect(Canada, lag.max = 5, type = 'const')$selection[1]","single_quotes_linter" +"vignettes/plot_ts.Rmd",117,1,"style","Variable and function name style should be snake_case or symbols.","d.var <- VAR(Canada, p = d.vselect, type = 'const')","object_name_linter" +"vignettes/plot_ts.Rmd",117,44,"style","Only use double-quotes.","d.var <- VAR(Canada, p = d.vselect, type = 'const')","single_quotes_linter" +"vignettes/plot_ts.Rmd",123,52,"style","Only use double-quotes.","autoplot(predict(d.var, n.ahead = 50), ts.colour = 'dodgerblue4',","single_quotes_linter" +"vignettes/plot_ts.Rmd",124,27,"style","Only use double-quotes."," predict.colour = 'blue', predict.linetype = 'dashed')","single_quotes_linter" +"vignettes/plot_ts.Rmd",124,54,"style","Only use double-quotes."," predict.colour = 'blue', predict.linetype = 'dashed')","single_quotes_linter" +"vignettes/plot_ts.Rmd",139,51,"style","Only use double-quotes.","autoplot(cpt.meanvar(AirPassengers), cpt.colour = 'blue', cpt.linetype = 'solid')","single_quotes_linter" +"vignettes/plot_ts.Rmd",139,74,"style","Only use double-quotes.","autoplot(cpt.meanvar(AirPassengers), cpt.colour = 'blue', cpt.linetype = 'solid')","single_quotes_linter" +"vignettes/plot_ts.Rmd",139,81,"style","Lines should not be more than 80 characters.","autoplot(cpt.meanvar(AirPassengers), cpt.colour = 'blue', cpt.linetype = 'solid')","line_length_linter" +"vignettes/plot_ts.Rmd",149,45,"style","Only use double-quotes.","autoplot(breakpoints(Nile ~ 1), ts.colour = 'blue', ts.linetype = 'dashed',","single_quotes_linter" +"vignettes/plot_ts.Rmd",149,67,"style","Only use double-quotes.","autoplot(breakpoints(Nile ~ 1), ts.colour = 'blue', ts.linetype = 'dashed',","single_quotes_linter" +"vignettes/plot_ts.Rmd",150,23,"style","Only use double-quotes."," cpt.colour = 'dodgerblue3', cpt.linetype = 'solid')","single_quotes_linter" +"vignettes/plot_ts.Rmd",150,53,"style","Only use double-quotes."," cpt.colour = 'dodgerblue3', cpt.linetype = 'solid')","single_quotes_linter" +"vignettes/plot_ts.Rmd",159,24,"style","There should be a space before an opening curly brace.","form <- function(theta){","brace_linter" +"vignettes/plot_ts.Rmd",159,24,"style","There should be a space between a right parenthesis and a body expression.","form <- function(theta){","paren_body_linter" +"vignettes/plot_ts.Rmd",160,3,"warning","no visible global function definition for β€˜dlmModPoly’"," dlmModPoly(order = 1, dV = exp(theta[1]), dW = exp(theta[2]))","object_usage_linter" +"vignettes/plot_ts.Rmd",172,34,"style","Only use double-quotes.","autoplot(filtered, ts.linetype = 'dashed', fitted.colour = 'blue')","single_quotes_linter" +"vignettes/plot_ts.Rmd",172,60,"style","Only use double-quotes.","autoplot(filtered, ts.linetype = 'dashed', fitted.colour = 'blue')","single_quotes_linter" +"vignettes/plot_ts.Rmd",187,32,"style","Only use double-quotes.","autoplot(smoothed, ts.colour = 'blue', p = p)","single_quotes_linter" +"vignettes/plot_ts.Rmd",197,25,"style","Put spaces around all infix operators."," Nile ~ SSMtrend(degree=1, Q=matrix(NA)), H=matrix(NA)","infix_spaces_linter" +"vignettes/plot_ts.Rmd",197,30,"style","Put spaces around all infix operators."," Nile ~ SSMtrend(degree=1, Q=matrix(NA)), H=matrix(NA)","infix_spaces_linter" +"vignettes/plot_ts.Rmd",197,45,"style","Put spaces around all infix operators."," Nile ~ SSMtrend(degree=1, Q=matrix(NA)), H=matrix(NA)","infix_spaces_linter" +"vignettes/plot_ts.Rmd",199,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/plot_ts.Rmd",200,20,"style","Put spaces around all infix operators.","fit <- fitSSM(model=model, inits=c(log(var(Nile)),log(var(Nile))), method=""BFGS"")","infix_spaces_linter" +"vignettes/plot_ts.Rmd",200,33,"style","Put spaces around all infix operators.","fit <- fitSSM(model=model, inits=c(log(var(Nile)),log(var(Nile))), method=""BFGS"")","infix_spaces_linter" +"vignettes/plot_ts.Rmd",200,51,"style","Commas should always have a space after.","fit <- fitSSM(model=model, inits=c(log(var(Nile)),log(var(Nile))), method=""BFGS"")","commas_linter" +"vignettes/plot_ts.Rmd",200,74,"style","Put spaces around all infix operators.","fit <- fitSSM(model=model, inits=c(log(var(Nile)),log(var(Nile))), method=""BFGS"")","infix_spaces_linter" +"vignettes/plot_ts.Rmd",200,81,"style","Lines should not be more than 80 characters.","fit <- fitSSM(model=model, inits=c(log(var(Nile)),log(var(Nile))), method=""BFGS"")","line_length_linter" +"vignettes/plot_ts.Rmd",208,37,"style","Put spaces around all infix operators.","filtered <- KFS(fit$model, filtering=""mean"", smoothing='none')","infix_spaces_linter" +"vignettes/plot_ts.Rmd",208,55,"style","Put spaces around all infix operators.","filtered <- KFS(fit$model, filtering=""mean"", smoothing='none')","infix_spaces_linter" +"vignettes/plot_ts.Rmd",208,56,"style","Only use double-quotes.","filtered <- KFS(fit$model, filtering=""mean"", smoothing='none')","single_quotes_linter" +"vignettes/plot_ts.Rmd",215,33,"style","Put spaces around all infix operators.","trend <- signal(smoothed, states=""trend"")","infix_spaces_linter" +"vignettes/plot_ts.Rmd",223,29,"style","Only use double-quotes.","autoplot(trend, ts.colour = 'blue', p = p)","single_quotes_linter" +"vignettes/plot_ts.Rmd",237,40,"style","Only use double-quotes.","autoplot(stl(AirPassengers, s.window = 'periodic'), ts.colour = 'blue')","single_quotes_linter" +"vignettes/plot_ts.Rmd",237,65,"style","Only use double-quotes.","autoplot(stl(AirPassengers, s.window = 'periodic'), ts.colour = 'blue')","single_quotes_linter" +"vignettes/plot_ts.Rmd",249,60,"style","Only use double-quotes.","autoplot(acf(AirPassengers, plot = FALSE), conf.int.fill = '#0000FF', conf.int.value = 0.8, conf.int.type = 'ma')","single_quotes_linter" +"vignettes/plot_ts.Rmd",249,81,"style","Lines should not be more than 80 characters.","autoplot(acf(AirPassengers, plot = FALSE), conf.int.fill = '#0000FF', conf.int.value = 0.8, conf.int.type = 'ma')","line_length_linter" +"vignettes/plot_ts.Rmd",249,109,"style","Only use double-quotes.","autoplot(acf(AirPassengers, plot = FALSE), conf.int.fill = '#0000FF', conf.int.value = 0.8, conf.int.type = 'ma')","single_quotes_linter" diff --git a/.dev/revdep_emails/ggfortify/email-body b/.dev/revdep_emails/ggfortify/email-body new file mode 100644 index 000000000..2290841a4 --- /dev/null +++ b/.dev/revdep_emails/ggfortify/email-body @@ -0,0 +1,27 @@ +Hello Yuan Tang! Thank you for using {lintr} in your package {ggfortify}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/sinhrks/ggfortify using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 67s on CRAN vs. 38s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/ggthemes/attachments/ggthemes.warnings b/.dev/revdep_emails/ggthemes/attachments/ggthemes.warnings new file mode 100644 index 000000000..82e46410d --- /dev/null +++ b/.dev/revdep_emails/ggthemes/attachments/ggthemes.warnings @@ -0,0 +1,2 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Trying to remove β€˜snake_case_linter’, β€˜camel_case_linter’ and β€˜multiple_dots_linter’, which are not in `defaults`. diff --git a/.dev/revdep_emails/ggthemes/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/ggthemes/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..63b0ec688 --- /dev/null +++ b/.dev/revdep_emails/ggthemes/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,2 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/utils.R",10,1,"style","Variable and function name style should be snake_case.","""%||%"" <- function(a, b) {","object_name_linter" diff --git a/.dev/revdep_emails/ggthemes/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/ggthemes/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..29295fec8 --- /dev/null +++ b/.dev/revdep_emails/ggthemes/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,48 @@ +"filename","line_number","column_number","type","message","line","linter" +"data-raw/build.R",9,1,"style","Variable and function name style should be snake_case or symbols.","utf8ToPch <- function(x) {","object_name_linter" +"data-raw/build.R",15,20,"warning","no visible global function definition for β€˜map_int’"," as.integer(-1L * map_int(x, ~ utf8ToInt(.x)[[1]]))","object_usage_linter" +"data-raw/build.R",26,7,"warning","no visible global function definition for β€˜tibble’"," tibble(name = out$colors$schemes[[i]]) %>%","object_usage_linter" +"data-raw/build.R",27,7,"warning","no visible global function definition for β€˜left_join’"," left_join(out$colors$names, by = ""name"")","object_usage_linter" +"data-raw/build.R",29,17,"warning","no visible global function definition for β€˜select’"," out$shapes <- select(map_dfr(out$shapes, as_tibble), -comment) %>%","object_usage_linter" +"data-raw/build.R",30,5,"warning","no visible global function definition for β€˜mutate’"," mutate(pch = utf8ToPch(character))","object_usage_linter" +"data-raw/build.R",53,23,"warning","no visible global function definition for β€˜map_chr’"," out$bg <- set_names(map_chr(out$bg, ""value""), map_chr(out$bg, ""name""))","object_usage_linter" +"data-raw/build.R",53,23,"warning","no visible global function definition for β€˜map_chr’"," out$bg <- set_names(map_chr(out$bg, ""value""), map_chr(out$bg, ""name""))","object_usage_linter" +"data-raw/build.R",85,17,"warning","no visible global function definition for β€˜tibble’"," out$colors <- tibble(value = rev(map_chr(xml_children(x), xml_text)))","object_usage_linter" +"data-raw/build.R",85,36,"warning","no visible global function definition for β€˜map_chr’"," out$colors <- tibble(value = rev(map_chr(xml_children(x), xml_text)))","object_usage_linter" +"data-raw/build.R",90,3,"warning","local variable β€˜classic’ assigned but may not be used"," classic <- read_xml(here(""data-raw"", ""theme-data"", ""tableau-classic.xml"")) %>%","object_usage_linter" +"data-raw/build.R",104,7,"warning","no visible global function definition for β€˜mutate’"," mutate(pch = utf8ToPch(character))","object_usage_linter" +"data-raw/build.R",153,5,"warning","no visible global function definition for β€˜mutate’"," mutate(pch = utf8ToPch(character))","object_usage_linter" +"data-raw/build.R",163,17,"warning","no visible global function definition for β€˜mutate’"," out$shapes <- mutate(out$shapes, pch = utf8ToPch(character))","object_usage_linter" +"data-raw/build.R",171,17,"warning","no visible global function definition for β€˜mutate’"," out$shapes <- mutate(out$shapes, pch = utf8ToPch(character))","object_usage_linter" +"data-raw/build.R",178,28,"warning","no visible global function definition for β€˜mutate’"," out$cleveland$default <- mutate(map_dfr(out$cleveland$default, as_tibble),","object_usage_linter" +"data-raw/build.R",182,21,"warning","no visible global function definition for β€˜map_df’"," out$circlefill <- map_df(out$circlefill, as_tibble) %>%","object_usage_linter" +"data-raw/build.R",183,5,"warning","no visible global function definition for β€˜mutate’"," mutate(pch = utf8ToPch(character))","object_usage_linter" +"data-raw/canva_palette.R",3,81,"style","Lines should not be more than 80 characters.","#' #' The color list is from http://makeadifferencewithdata.com/2017/01/150-paletas-colores-tableau/,","line_length_linter" +"data-raw/canva_palette.R",4,81,"style","Lines should not be more than 80 characters.","#' #' and referenced here: https://policyviz.com/2017/01/12/150-color-palettes-for-excel/.","line_length_linter" +"data-raw/canva_palette.R",10,81,"style","Lines should not be more than 80 characters.","#' color_palettes_url <- ""http://makeadifferencewithdata.com/wp-content/uploads/2016/12/color-palettes.txt""","line_length_linter" +"data-raw/canva_palette.R",34,81,"style","Lines should not be more than 80 characters.","#' duplicated(names(canva_palettes))] <- ""Vintage charm 2""","line_length_linter" +"data-raw/clean-colors.R",4,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" +"data-raw/excel_themes.R",8,81,"style","Lines should not be more than 80 characters.","# - https://support.office.com/en-us/article/change-a-theme-and-make-it-the-default-in-word-or-excel-c846f997-968e-4daa-b2d4-42bd2afef904?ui=en-US&rs=en-US&ad=US","line_length_linter" +"data-raw/excel_themes.R",10,81,"style","Lines should not be more than 80 characters.","# - https://support.office.com/en-us/article/open-xml-formats-and-file-name-extensions-5200d93c-3449-4380-8e11-31ef14555b18","line_length_linter" +"data-raw/excel_themes.R",16,81,"style","Lines should not be more than 80 characters.","theme_dir <- ""/Applications/Microsoft Excel.app/Contents/Resources/Office Themes""","line_length_linter" +"data-raw/excel_themes.R",30,3,"warning","no visible global function definition for β€˜set_names’"," set_names(list(val), name)","object_usage_linter" +"data-raw/excel_themes.R",33,1,"style","Variable and function name style should be snake_case or symbols.","process_clrScheme <- function(x) {","object_name_linter" +"data-raw/excel_themes.R",35,13,"warning","no visible global function definition for β€˜flatten_chr’"," colors <- flatten_chr(map(xml_children(x), process_color))","object_usage_linter" +"data-raw/excel_themes.R",39,37,"warning","no visible global function definition for β€˜str_subset’"," unname(colors[str_subset(names(colors), ""^accent"")])),","object_usage_linter" +"data-raw/libreoffice_palettes.R",7,81,"style","Lines should not be more than 80 characters.","# https://design.blog.documentfoundation.org/2016/11/11/additions-to-libreoffice/","line_length_linter" +"data-raw/libreoffice_palettes.R",18,3,"warning","no visible global function definition for β€˜tibble’"," tibble(name = xml_attr(x, ""name""),","object_usage_linter" +"data-raw/libreoffice_palettes.R",23,3,"warning","local variable β€˜name’ assigned but may not be used"," name <- tools::file_path_sans_ext(basename(path))","object_usage_linter" +"data-raw/libreoffice_palettes.R",43,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" +"R/economist.R",11,31,"style","Put spaces around all infix operators.","economist_pal <- function(fill=TRUE) {","infix_spaces_linter" +"R/few.R",87,50,"style","Put spaces around all infix operators.","theme_few <- function(base_size = 12, base_family="""") {","infix_spaces_linter" +"R/gdocs.R",9,52,"style","Put spaces around all infix operators.","theme_gdocs <- function(base_size = 12, base_family=""sans"") {","infix_spaces_linter" +"R/scales.R",31,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/shapes.R",168,40,"style","Put spaces around all infix operators.","scale_shape_tremmel <- function(overlap=FALSE, alt=TRUE, ...) {","infix_spaces_linter" +"R/shapes.R",168,51,"style","Put spaces around all infix operators.","scale_shape_tremmel <- function(overlap=FALSE, alt=TRUE, ...) {","infix_spaces_linter" +"R/stata.R",14,29,"style","Put spaces around all infix operators.","stata_pal <- function(scheme=""s2color"") {","infix_spaces_linter" +"R/stata.R",32,38,"style","Put spaces around all infix operators.","scale_colour_stata <- function(scheme=""s2color"", ...) {","infix_spaces_linter" +"R/stata.R",38,36,"style","Put spaces around all infix operators.","scale_fill_stata <- function(scheme=""s2color"", ...) {","infix_spaces_linter" +"R/stata.R",125,38,"style","Put spaces around all infix operators.","theme_stata_colors <- function(scheme=""s2color"") {","infix_spaces_linter" +"R/stata.R",232,31,"style","Put spaces around all infix operators."," scheme=""s2color"") {","infix_spaces_linter" +"R/theme-foundation.R",21,39,"style","Put spaces around all infix operators.","theme_foundation <- function(base_size=12, base_family="""") {","infix_spaces_linter" +"R/theme-foundation.R",21,55,"style","Put spaces around all infix operators.","theme_foundation <- function(base_size=12, base_family="""") {","infix_spaces_linter" diff --git a/.dev/revdep_emails/ggthemes/email-body b/.dev/revdep_emails/ggthemes/email-body new file mode 100644 index 000000000..7cf42c699 --- /dev/null +++ b/.dev/revdep_emails/ggthemes/email-body @@ -0,0 +1,27 @@ +Hello Jeffrey B. Arnold! Thank you for using {lintr} in your package {ggthemes}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/jrnold/ggthemes using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 52s on CRAN vs. 36s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/healthcareai/attachments/healthcareai.warnings b/.dev/revdep_emails/healthcareai/attachments/healthcareai.warnings new file mode 100644 index 000000000..182961f94 --- /dev/null +++ b/.dev/revdep_emails/healthcareai/attachments/healthcareai.warnings @@ -0,0 +1,2 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Trying to remove β€˜camel_case_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/healthcareai/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/healthcareai/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..d1f7b6cc8 --- /dev/null +++ b/.dev/revdep_emails/healthcareai/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,149 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/db_connections.R",33,44,"style","Put spaces around all infix operators."," trusted=TRUE,","infix_spaces_linter" +"R/db_connections.R",44,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!missing(user_id) & !missing(password))","vector_logic_linter" +"R/db_connections.R",59,32,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (!missing(user_id) & !missing(password)) {","vector_logic_linter" +"R/find_unique_columns.R",39,22,"style","Any function spanning multiple lines should use curly braces."," dplyr::select_if(function(col)","brace_linter" +"R/missingness.R",32,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.matrix(d) | (is.vector(d) && !is.list(d)))","vector_logic_linter" +"R/pip.R",221,43,"style","Any function spanning multiple lines should use curly braces."," d <- purrr::map_df(names(split_vars), function(v)","brace_linter" +"R/plot_predictions.R",246,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.numeric(text_size) & !is.logical(text_size))","vector_logic_linter" +"R/plot_predictions.R",264,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.numeric(text_angle) & !is.logical(text_angle))","vector_logic_linter" +"R/predict.R",413,12,"style","Either both or neither branch in `if`/`else` should use curly braces."," } else if (mi$m_class == ""Multiclass"") {","brace_linter" +"R/prep_data.R",354,41,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (remove_near_zero_variance < 0 | remove_near_zero_variance > 1)","vector_logic_linter" +"R/save_load.R",55,44,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(attr(x, ""recipe"")$template) | !is.null(attr(x, ""recipe"")$orig_data))","vector_logic_linter" +"R/setup_hyperparameters.R",78,43,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (model_class == ""classification"" | model_class == ""multiclass"") {","vector_logic_linter" +"R/training_setup.R",272,21,"style","Any function spanning multiple lines should use curly braces.","character_in_quo <- function(x)","brace_linter" +"R/utilities.R",31,22,"style","Any function spanning multiple lines should use curly braces."," lapply(names(ref), function(v)","brace_linter" +"R/utilities.R",53,49,"style","Either both or neither branch in `if`/`else` should use curly braces."," if (!length(new_levels[[.x]])) return(NULL) else {","brace_linter" +"tests/testthat/test-hcai-impute.R",9,58,"style","Use TRUE instead of the symbol T."," vendorID = sample(1:9, size = n, replace = T),","T_and_F_symbol_linter" +"tests/testthat/test-hcai-impute.R",12,67,"style","Use TRUE instead of the symbol T."," heat = sample(c(""Cold"", ""Hot""), size = n, replace = T),","T_and_F_symbol_linter" +"tests/testthat/test-hcai-impute.R",14,54,"style","Use TRUE instead of the symbol T."," size = n, replace = T)","T_and_F_symbol_linter" +"tests/testthat/test-impute.r",11,68,"style","Use TRUE instead of the symbol T."," fur = sample(c(""Long"", ""Short""), size = n, replace = T),","T_and_F_symbol_linter" +"tests/testthat/test-impute.r",13,50,"style","Use TRUE instead of the symbol T."," size = n, replace = T)","T_and_F_symbol_linter" +"tests/testthat/test-PCA.R",9,69,"style","Use TRUE instead of the symbol T."," genre = sample(c(""Rock"", ""Jazz"", ""Country""), size = n, replace = T),","T_and_F_symbol_linter" +"tests/testthat/test-PCA.R",11,42,"style","Use TRUE instead of the symbol T."," size = n, replace = T),","T_and_F_symbol_linter" +"tests/testthat/test-PCA.R",12,54,"style","Use TRUE instead of the symbol T."," guitar_flag = sample(c(0, 1), size = n, replace = T),","T_and_F_symbol_linter" +"tests/testthat/test-PCA.R",13,56,"style","Use TRUE instead of the symbol T."," drum_flag = sample(c(0, 1, NA), size = n, replace = T,","T_and_F_symbol_linter" +"tests/testthat/test-PCA.R",21,78,"style","Use TRUE instead of the symbol T."," state = sample(c(""NY"", ""MA"", ""CT"", ""CA"", ""VT"", ""NH""), size = n, replace = T,","T_and_F_symbol_linter" +"tests/testthat/test-pip.R",59,16,"style","Any function spanning multiple lines should use curly braces."," max_count <- function(d)","brace_linter" +"tests/testthat/test-prep_data_utils.R",10,57,"style","Use TRUE instead of the symbol T."," tuba_flag = sample(c(0, 1), size = n, replace = T),","T_and_F_symbol_linter" +"tests/testthat/test-prep_data_utils.R",11,61,"style","Use TRUE instead of the symbol T."," drum_flag = sample(c(0, 1, NA), size = n, replace = T),","T_and_F_symbol_linter" +"tests/testthat/test-prep_data_utils.R",13,47,"style","Use TRUE instead of the symbol T."," size = n, replace = T),","T_and_F_symbol_linter" +"tests/testthat/test-prep_data.R",14,69,"style","Use TRUE instead of the symbol T."," genre = sample(c(""Rock"", ""Jazz"", ""Country""), size = n, replace = T),","T_and_F_symbol_linter" +"tests/testthat/test-prep_data.R",16,42,"style","Use TRUE instead of the symbol T."," size = n, replace = T, prob = c(4, 4, 4, 6)),","T_and_F_symbol_linter" +"tests/testthat/test-prep_data.R",17,54,"style","Use TRUE instead of the symbol T."," guitar_flag = sample(c(0, 1), size = n, replace = T),","T_and_F_symbol_linter" +"tests/testthat/test-prep_data.R",18,56,"style","Use TRUE instead of the symbol T."," drum_flag = sample(c(0, 1, NA), size = n, replace = T,","T_and_F_symbol_linter" +"tests/testthat/test-prep_data.R",26,78,"style","Use TRUE instead of the symbol T."," state = sample(c(""NY"", ""MA"", ""CT"", ""CA"", ""VT"", ""NH""), size = n, replace = T,","T_and_F_symbol_linter" +"tests/testthat/test-tune_models.R",295,18,"style","Any function spanning multiple lines should use curly braces."," phi_present <- function(messages)","brace_linter" +"vignettes/site_only/best_levels.Rmd",41,17,"style","Trailing whitespace is superfluous.","meds <- tribble( ","trailing_whitespace_linter" +"vignettes/site_only/best_levels.Rmd",50,13,"style","Trailing whitespace is superfluous.","pima_meds <- ","trailing_whitespace_linter" +"vignettes/site_only/best_levels.Rmd",54,79,"style","Trailing whitespace is superfluous."," medication = sample(x = meds$name, size = sample(0:4, 1), replace = FALSE, ","trailing_whitespace_linter" +"vignettes/site_only/best_levels.Rmd",72,22,"style","Trailing whitespace is superfluous.","pima_diabetes_meds <- ","trailing_whitespace_linter" +"vignettes/site_only/best_levels.Rmd",76,81,"style","Trailing whitespace is superfluous."," # Data frame with id, the high-cardinality factor, and (optionally) a column ","trailing_whitespace_linter" +"vignettes/site_only/best_levels.Rmd",103,30,"style","Trailing whitespace is superfluous.","pima_diabetes_med_duration <- ","trailing_whitespace_linter" +"vignettes/site_only/best_levels.Rmd",166,28,"style","Trailing whitespace is superfluous.","new_patient_med_duration <- ","trailing_whitespace_linter" +"vignettes/site_only/best_levels.Rmd",167,35,"style","Trailing whitespace is superfluous."," add_best_levels(d = new_patient, ","trailing_whitespace_linter" +"vignettes/site_only/best_levels.Rmd",168,40,"style","Trailing whitespace is superfluous."," longsheet = new_meds, ","trailing_whitespace_linter" +"vignettes/site_only/best_levels.Rmd",186,84,"style","Trailing whitespace is superfluous.","models <- machine_learn(pima_diabetes_med_duration, patient_id, outcome = diabetes, ","trailing_whitespace_linter" +"vignettes/site_only/best_levels.Rmd",188,33,"style","Trailing whitespace is superfluous.","add_best_levels(d = new_patient, ","trailing_whitespace_linter" +"vignettes/site_only/best_levels.Rmd",189,38,"style","Trailing whitespace is superfluous."," longsheet = new_meds, ","trailing_whitespace_linter" +"vignettes/site_only/best_levels.Rmd",196,38,"style","Trailing whitespace is superfluous."," missing_fill = 0) %>% ","trailing_whitespace_linter" +"vignettes/site_only/best_levels.Rmd",241,17,"style","Trailing whitespace is superfluous.","meds <- tribble( ","trailing_whitespace_linter" +"vignettes/site_only/best_levels.Rmd",255,13,"style","Trailing whitespace is superfluous.","pima_meds <- ","trailing_whitespace_linter" +"vignettes/site_only/best_levels.Rmd",259,79,"style","Trailing whitespace is superfluous."," medication = sample(x = meds$name, size = sample(0:4, 1), replace = FALSE, ","trailing_whitespace_linter" +"vignettes/site_only/db_connections.Rmd",12,70,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set(echo = TRUE, results = ""hold"", collapse = TRUE, ","trailing_whitespace_linter" +"vignettes/site_only/db_connections.Rmd",131,44,"style","Commas should always have a space after.","predictions <- data.frame(patient_id = c(1,2,3),","commas_linter" +"vignettes/site_only/db_connections.Rmd",131,46,"style","Commas should always have a space after.","predictions <- data.frame(patient_id = c(1,2,3),","commas_linter" +"vignettes/site_only/db_connections.Rmd",134,34,"style","Trailing whitespace is superfluous.","table_id <- Id(schema = ""Sepsis"", ","trailing_whitespace_linter" +"vignettes/site_only/db_connections.Rmd",155,44,"style","Commas should always have a space after.","predictions <- data.frame(patient_id = c(1,2,3),","commas_linter" +"vignettes/site_only/db_connections.Rmd",155,46,"style","Commas should always have a space after.","predictions <- data.frame(patient_id = c(1,2,3),","commas_linter" +"vignettes/site_only/db_connections.Rmd",159,13,"style","Trailing whitespace is superfluous.","sqlSave(con, ","trailing_whitespace_linter" +"vignettes/site_only/db_connections.Rmd",160,21,"style","Trailing whitespace is superfluous."," predictions, ","trailing_whitespace_linter" +"vignettes/site_only/db_connections.Rmd",161,30,"style","Trailing whitespace is superfluous."," ""Sepsis.Predictions"", ","trailing_whitespace_linter" +"vignettes/site_only/db_connections.Rmd",162,23,"style","Trailing whitespace is superfluous."," append = TRUE, ","trailing_whitespace_linter" +"vignettes/site_only/db_connections.Rmd",192,44,"style","Commas should always have a space after.","predictions <- data.frame(patient_id = c(1,2,3),","commas_linter" +"vignettes/site_only/db_connections.Rmd",192,46,"style","Commas should always have a space after.","predictions <- data.frame(patient_id = c(1,2,3),","commas_linter" +"vignettes/site_only/db_connections.Rmd",197,24,"style","Trailing whitespace is superfluous.","RODBC::sqlSave(con_out, ","trailing_whitespace_linter" +"vignettes/site_only/db_connections.Rmd",198,28,"style","Trailing whitespace is superfluous."," predictions, ","trailing_whitespace_linter" +"vignettes/site_only/db_connections.Rmd",199,37,"style","Trailing whitespace is superfluous."," ""Sepsis.Predictions"", ","trailing_whitespace_linter" +"vignettes/site_only/db_connections.Rmd",200,30,"style","Trailing whitespace is superfluous."," append = TRUE, ","trailing_whitespace_linter" +"vignettes/site_only/deploy_model.Rmd",52,31,"style","Trailing whitespace is superfluous.","models <- machine_learn(d = d, ","trailing_whitespace_linter" +"vignettes/site_only/deploy_model.Rmd",100,31,"style","Trailing whitespace is superfluous.","predictions <- predictions %>% ","trailing_whitespace_linter" +"vignettes/site_only/deploy_model.Rmd",124,12,"style","Trailing whitespace is superfluous."," SELECT ","trailing_whitespace_linter" +"vignettes/site_only/deploy_model.Rmd",125,7,"style","Only use double-quotes."," '' AS FacilityAccountID","single_quotes_linter" +"vignettes/site_only/deploy_model.Rmd",125,10,"error","unexpected symbol"," '' AS FacilityAccountID",NA +"vignettes/site_only/deploy_model.Rmd",141,13,"style","Trailing whitespace is superfluous.","sqlSave(con, ","trailing_whitespace_linter" +"vignettes/site_only/deploy_model.Rmd",142,21,"style","Trailing whitespace is superfluous."," predictions, ","trailing_whitespace_linter" +"vignettes/site_only/deploy_model.Rmd",143,39,"style","Trailing whitespace is superfluous."," ""Schema.ReadmitMLOutputTable"", ","trailing_whitespace_linter" +"vignettes/site_only/deploy_model.Rmd",144,23,"style","Trailing whitespace is superfluous."," append = TRUE, ","trailing_whitespace_linter" +"vignettes/site_only/deploy_model.Rmd",175,22,"style","Trailing whitespace is superfluous.","prod_query <- ""SELECT ","trailing_whitespace_linter" +"vignettes/site_only/deploy_model.Rmd",193,13,"style","Trailing whitespace is superfluous.","sqlSave(con, ","trailing_whitespace_linter" +"vignettes/site_only/deploy_model.Rmd",194,21,"style","Trailing whitespace is superfluous."," predictions, ","trailing_whitespace_linter" +"vignettes/site_only/deploy_model.Rmd",195,43,"style","Trailing whitespace is superfluous."," ""Schema.ReadmitMLOutputTableBASE"", ","trailing_whitespace_linter" +"vignettes/site_only/deploy_model.Rmd",196,23,"style","Trailing whitespace is superfluous."," append = TRUE, ","trailing_whitespace_linter" +"vignettes/site_only/healthcareai.Rmd",12,70,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set(echo = TRUE, results = ""hold"", collapse = TRUE, ","trailing_whitespace_linter" +"vignettes/site_only/healthcareai.Rmd",65,17,"style","Trailing whitespace is superfluous.","quick_models %>% ","trailing_whitespace_linter" +"vignettes/site_only/healthcareai.Rmd",66,34,"style","Trailing whitespace is superfluous."," predict(outcome_groups = 2) %>% ","trailing_whitespace_linter" +"vignettes/site_only/healthcareai.Rmd",76,31,"style","Trailing whitespace is superfluous.","missingness(pima_diabetes) %>% ","trailing_whitespace_linter" +"vignettes/site_only/healthcareai.Rmd",132,28,"style","Trailing whitespace is superfluous.","models[""Random Forest""] %>% ","trailing_whitespace_linter" +"vignettes/site_only/healthcareai.Rmd",158,22,"style","Trailing whitespace is superfluous.","interpret(models) %>% ","trailing_whitespace_linter" +"vignettes/site_only/healthcareai.Rmd",176,20,"style","Trailing whitespace is superfluous.","explore(models) %>% ","trailing_whitespace_linter" +"vignettes/site_only/healthcareai.Rmd",194,20,"style","Trailing whitespace is superfluous.","test_predictions <- ","trailing_whitespace_linter" +"vignettes/site_only/healthcareai.Rmd",195,18,"style","Trailing whitespace is superfluous."," predict(models, ","trailing_whitespace_linter" +"vignettes/site_only/healthcareai.Rmd",196,27,"style","Trailing whitespace is superfluous."," split_data$test, ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",12,70,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set(echo = TRUE, results = ""hold"", collapse = TRUE, ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",83,44,"style","Put spaces around all infix operators.","print(paste(""Data is"", round(as.numeric(os)/1000000, 1), ""mb.""))","infix_spaces_linter" +"vignettes/site_only/performance.Rmd",113,22,"warning","1:nrow(...) is likely to be wrong in the empty edge case. Use seq_len() instead."," flight_id = 1:nrow(d)) %>%","seq_linter" +"vignettes/site_only/performance.Rmd",115,17,"style","Trailing whitespace is superfluous.","d_clean <- d %>% ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",118,43,"style","Trailing whitespace is superfluous."," collapse_rare_factors = FALSE, ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",122,52,"style","Put spaces around all infix operators.","print(paste(""Prepped data is"", round(as.numeric(os)/1000000, 1), ""mb.""))","infix_spaces_linter" +"vignettes/site_only/performance.Rmd",158,50,"style","Commas should never have a space before."," summarize_if(~ is.character(.x) | is.factor(.x) , n_distinct)","commas_linter" +"vignettes/site_only/performance.Rmd",166,83,"style","Trailing whitespace is superfluous."," ggplot(aes(x = reorder(dest, arr_delay, function(x) -sum(x == ""Y"") / length(x)), ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",219,33,"style","Trailing whitespace is superfluous."," prep_data(outcome = arr_delay, ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",231,33,"style","Trailing whitespace is superfluous."," prep_data(outcome = arr_delay, ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",286,6,"style","Trailing whitespace is superfluous.","d %>% ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",290,24,"style","Trailing whitespace is superfluous.","stratified_sample_d %>% ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",300,18,"style","Trailing whitespace is superfluous.","d_recent <- d %>% ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",314,18,"style","Trailing whitespace is superfluous.","downsampled_d %>% ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",361,33,"style","Trailing whitespace is superfluous."," prep_data(outcome = arr_delay, ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",365,32,"style","Trailing whitespace is superfluous.","m_rf_1 <- flash_models(d_clean, ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",366,44,"style","Trailing whitespace is superfluous."," outcome = arr_delay, ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",378,22,"style","Trailing whitespace is superfluous.","m <- machine_learn(d, ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",398,33,"style","Trailing whitespace is superfluous."," prep_data(outcome = arr_delay, ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",402,33,"style","Trailing whitespace is superfluous.","m_glm_1 <- flash_models(d_clean, ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",403,45,"style","Trailing whitespace is superfluous."," outcome = arr_delay, ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",419,33,"style","Trailing whitespace is superfluous."," prep_data(outcome = arr_delay, ","trailing_whitespace_linter" +"vignettes/site_only/transitioning.Rmd",12,70,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set(echo = TRUE, results = ""hold"", collapse = TRUE, ","trailing_whitespace_linter" +"vignettes/site_only/transitioning.Rmd",34,36,"style","Trailing whitespace is superfluous.","# csvfile <- system.file(""extdata"", ","trailing_whitespace_linter" +"vignettes/site_only/transitioning.Rmd",35,52,"style","Trailing whitespace is superfluous.","# ""HCRDiabetesClinical.csv"", ","trailing_whitespace_linter" +"vignettes/site_only/transitioning.Rmd",37,33,"style","Trailing whitespace is superfluous.","# df <- read.csv(file = csvfile, ","trailing_whitespace_linter" +"vignettes/site_only/transitioning.Rmd",38,32,"style","Trailing whitespace is superfluous.","# header = TRUE, ","trailing_whitespace_linter" +"vignettes/site_only/transitioning.Rmd",40,2,"style","Trailing whitespace is superfluous.","# ","trailing_whitespace_linter" +"vignettes/site_only/transitioning.Rmd",41,3,"style","Commented code should be removed.","# df$PatientID <- NULL # Only one ID column (ie, PatientEncounterID) is needed remove this column","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",62,3,"style","Commented code should be removed.","# dfDeploy <- df[951:1000,]","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",71,3,"style","Commented code should be removed.","# p <- SupervisedModelDevelopmentParams$new()","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",72,3,"style","Commented code should be removed.","# p$df <- df","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",73,3,"style","Commented code should be removed.","# p$type <- ""classification""","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",74,3,"style","Commented code should be removed.","# p$impute <- TRUE","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",75,3,"style","Commented code should be removed.","# p$grainCol <- ""PatientEncounterID""","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",76,3,"style","Commented code should be removed.","# p$predictedCol <- ""ThirtyDayReadmitFLG""","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",77,3,"style","Commented code should be removed.","# p$debug <- FALSE","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",78,3,"style","Commented code should be removed.","# p$cores <- 1","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",79,2,"style","Trailing whitespace is superfluous.","# ","trailing_whitespace_linter" +"vignettes/site_only/transitioning.Rmd",81,3,"style","Commented code should be removed.","# RandomForest <- RandomForestDevelopment$new(p)","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",82,3,"style","Commented code should be removed.","# RandomForest$run()","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",84,33,"style","Trailing whitespace is superfluous.","models <- machine_learn(d$train, ","trailing_whitespace_linter" +"vignettes/site_only/transitioning.Rmd",86,55,"style","Trailing whitespace is superfluous."," outcome = ThirtyDayReadmitFLG, ","trailing_whitespace_linter" +"vignettes/site_only/transitioning.Rmd",113,3,"style","Commented code should be removed.","# p2 <- SupervisedModelDeploymentParams$new()","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",114,3,"style","Commented code should be removed.","# p2$type <- ""classification""","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",115,3,"style","Commented code should be removed.","# p2$df <- dfDeploy","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",116,3,"style","Commented code should be removed.","# p2$grainCol <- ""PatientEncounterID""","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",117,3,"style","Commented code should be removed.","# p2$predictedCol <- ""ThirtyDayReadmitFLG""","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",118,3,"style","Commented code should be removed.","# p2$impute <- TRUE","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",119,3,"style","Commented code should be removed.","# p2$debug <- FALSE","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",120,3,"style","Commented code should be removed.","# p2$cores <- 1","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",121,2,"style","Trailing whitespace is superfluous.","# ","trailing_whitespace_linter" +"vignettes/site_only/transitioning.Rmd",122,3,"style","Commented code should be removed.","# dL <- RandomForestDeployment$new(p2)","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",123,3,"style","Commented code should be removed.","# dL$deploy()","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",124,2,"style","Trailing whitespace is superfluous.","# ","trailing_whitespace_linter" +"vignettes/site_only/transitioning.Rmd",125,3,"style","Commented code should be removed.","# dfOut <- dL$getOutDf()","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",126,3,"style","Commented code should be removed.","# head(dfOut)","commented_code_linter" diff --git a/.dev/revdep_emails/healthcareai/email-body b/.dev/revdep_emails/healthcareai/email-body new file mode 100644 index 000000000..77c958708 --- /dev/null +++ b/.dev/revdep_emails/healthcareai/email-body @@ -0,0 +1,27 @@ +Hello Mike Mastanduno! Thank you for using {lintr} in your package {healthcareai}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/HealthCatalyst/healthcareai-r using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 82s on CRAN vs. 33s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/i18n/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/i18n/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..72fed09e9 --- /dev/null +++ b/.dev/revdep_emails/i18n/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,345 @@ +"filename","line_number","column_number","type","message","line","linter" +"data-raw/01-locales.R",7,15,"style","Trailing whitespace is superfluous.","all_locales <- ","trailing_whitespace_linter" +"data-raw/01-locales.R",10,40,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-core"", ","trailing_whitespace_linter" +"data-raw/02-default_locales.R",7,19,"style","Trailing whitespace is superfluous.","default_content <- ","trailing_whitespace_linter" +"data-raw/02-default_locales.R",10,40,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-core"", ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",15,15,"style","Trailing whitespace is superfluous."," languages <- ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",30,13,"style","Trailing whitespace is superfluous."," scripts <- ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",37,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",44,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",45,17,"style","Trailing whitespace is superfluous."," territories <- ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",52,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",59,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",60,14,"style","Trailing whitespace is superfluous."," variants <- ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",67,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",74,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",77,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",80,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",82,81,"style","Lines should not be more than 80 characters."," territories_values <- territories_data$main[[1]]$localeDisplayNames$territories","line_length_linter" +"data-raw/03-locale_names.R",83,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",86,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",95,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",98,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",15,3,"style","Variable and function names should not be longer than 30 characters."," dates_gregorian_json_url_locale <- ","object_length_linter" +"data-raw/04-dates.R",15,37,"style","Trailing whitespace is superfluous."," dates_gregorian_json_url_locale <- ","trailing_whitespace_linter" +"data-raw/04-dates.R",18,53,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-dates-full/main"", ","trailing_whitespace_linter" +"data-raw/04-dates.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" +"data-raw/04-dates.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",33,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",36,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$months$format$abbreviated","line_length_linter" +"data-raw/04-dates.R",37,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",40,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$months$format$narrow","line_length_linter" +"data-raw/04-dates.R",41,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",45,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",48,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$months$`stand-alone`$abbreviated","line_length_linter" +"data-raw/04-dates.R",49,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",52,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$months$`stand-alone`$narrow","line_length_linter" +"data-raw/04-dates.R",53,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",56,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$months$`stand-alone`$wide","line_length_linter" +"data-raw/04-dates.R",57,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",61,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",64,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$days$format$abbreviated","line_length_linter" +"data-raw/04-dates.R",65,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",69,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",73,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",77,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",80,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$days$`stand-alone`$abbreviated","line_length_linter" +"data-raw/04-dates.R",81,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",84,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$days$`stand-alone`$narrow","line_length_linter" +"data-raw/04-dates.R",85,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",88,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$days$`stand-alone`$short","line_length_linter" +"data-raw/04-dates.R",89,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",92,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$days$`stand-alone`$wide","line_length_linter" +"data-raw/04-dates.R",93,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",97,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",100,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$quarters$format$abbreviated","line_length_linter" +"data-raw/04-dates.R",101,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",104,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$quarters$format$narrow","line_length_linter" +"data-raw/04-dates.R",105,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",108,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$quarters$format$wide","line_length_linter" +"data-raw/04-dates.R",109,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",112,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$quarters$`stand-alone`$abbreviated","line_length_linter" +"data-raw/04-dates.R",113,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",116,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$quarters$`stand-alone`$narrow","line_length_linter" +"data-raw/04-dates.R",117,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",120,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$quarters$`stand-alone`$wide","line_length_linter" +"data-raw/04-dates.R",121,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",125,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",128,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dayPeriods$format$abbreviated","line_length_linter" +"data-raw/04-dates.R",129,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",132,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dayPeriods$format$narrow","line_length_linter" +"data-raw/04-dates.R",133,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",136,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dayPeriods$format$wide","line_length_linter" +"data-raw/04-dates.R",137,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",140,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dayPeriods$`stand-alone`$abbreviated","line_length_linter" +"data-raw/04-dates.R",141,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",144,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dayPeriods$`stand-alone`$narrow","line_length_linter" +"data-raw/04-dates.R",145,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",148,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dayPeriods$`stand-alone`$wide","line_length_linter" +"data-raw/04-dates.R",149,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",153,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",157,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",161,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",165,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",169,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",173,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",177,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",181,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",183,20,"style","Trailing whitespace is superfluous."," time_skeletons <- ","trailing_whitespace_linter" +"data-raw/04-dates.R",185,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",188,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dateTimeFormats[1:4]","line_length_linter" +"data-raw/04-dates.R",189,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",192,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dateTimeFormats[[5]]","line_length_linter" +"data-raw/04-dates.R",193,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",196,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dateTimeFormats$appendItems","line_length_linter" +"data-raw/04-dates.R",197,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",200,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dateTimeFormats$intervalFormats","line_length_linter" +"data-raw/04-dates.R",201,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",244,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",247,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",259,66,"style","Trailing whitespace is superfluous."," months_format_abbrev, months_format_narrow, months_format_wide, ","trailing_whitespace_linter" +"data-raw/04-dates.R",264,72,"style","Trailing whitespace is superfluous."," quarters_format_abbrev, quarters_format_narrow, quarters_format_wide, ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",15,35,"style","Trailing whitespace is superfluous."," dates_generic_json_url_locale <- ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",18,53,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-dates-full/main"", ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",33,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",36,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$months$format$abbreviated","line_length_linter" +"data-raw/05-dates_generic.R",37,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",41,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",45,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",48,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$months$`stand-alone`$abbreviated","line_length_linter" +"data-raw/05-dates_generic.R",49,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",52,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$months$`stand-alone`$narrow","line_length_linter" +"data-raw/05-dates_generic.R",53,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",56,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$months$`stand-alone`$wide","line_length_linter" +"data-raw/05-dates_generic.R",57,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",61,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",65,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",69,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",73,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",77,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",80,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$days$`stand-alone`$abbreviated","line_length_linter" +"data-raw/05-dates_generic.R",81,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",84,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$days$`stand-alone`$narrow","line_length_linter" +"data-raw/05-dates_generic.R",85,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",88,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$days$`stand-alone`$short","line_length_linter" +"data-raw/05-dates_generic.R",89,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",93,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",97,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",100,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$quarters$format$abbreviated","line_length_linter" +"data-raw/05-dates_generic.R",101,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",105,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",109,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",112,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$quarters$`stand-alone`$abbreviated","line_length_linter" +"data-raw/05-dates_generic.R",113,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",116,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$quarters$`stand-alone`$narrow","line_length_linter" +"data-raw/05-dates_generic.R",117,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",120,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$quarters$`stand-alone`$wide","line_length_linter" +"data-raw/05-dates_generic.R",121,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",125,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",128,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$dayPeriods$format$abbreviated","line_length_linter" +"data-raw/05-dates_generic.R",129,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",132,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$dayPeriods$format$narrow","line_length_linter" +"data-raw/05-dates_generic.R",133,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",137,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",140,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$dayPeriods$`stand-alone`$abbreviated","line_length_linter" +"data-raw/05-dates_generic.R",141,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",144,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$dayPeriods$`stand-alone`$narrow","line_length_linter" +"data-raw/05-dates_generic.R",145,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",148,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$dayPeriods$`stand-alone`$wide","line_length_linter" +"data-raw/05-dates_generic.R",149,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",153,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",157,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",161,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",165,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",169,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",173,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",177,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",181,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",183,20,"style","Trailing whitespace is superfluous."," time_skeletons <- ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",185,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",189,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",193,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",196,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$dateTimeFormats$appendItems","line_length_linter" +"data-raw/05-dates_generic.R",197,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",200,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$dateTimeFormats$intervalFormats","line_length_linter" +"data-raw/05-dates_generic.R",201,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",244,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",247,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",15,29,"style","Trailing whitespace is superfluous."," numbers_json_url_locale <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",18,55,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-numbers-full/main"", ","trailing_whitespace_linter" +"data-raw/06-numbers.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" +"data-raw/06-numbers.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",33,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",37,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",41,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",43,13,"style","Trailing whitespace is superfluous."," decimal <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",45,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",47,11,"style","Trailing whitespace is superfluous."," group <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",49,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",51,10,"style","Trailing whitespace is superfluous."," list <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",53,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",55,18,"style","Trailing whitespace is superfluous."," percent_sign <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",57,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",59,15,"style","Trailing whitespace is superfluous."," plus_sign <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",61,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",63,16,"style","Trailing whitespace is superfluous."," minus_sign <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",65,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",67,17,"style","Trailing whitespace is superfluous."," approx_sign <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",69,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",71,14,"style","Trailing whitespace is superfluous."," exp_sign <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",73,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",75,13,"style","Trailing whitespace is superfluous."," sup_exp <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",76,81,"style","Lines should not be more than 80 characters."," numbers_data$main[[1]]$numbers$`symbols-numberSystem-latn`$superscriptingExponent","line_length_linter" +"data-raw/06-numbers.R",77,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",79,15,"style","Trailing whitespace is superfluous."," per_mille <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",81,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",83,14,"style","Trailing whitespace is superfluous."," infinity <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",85,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",87,9,"style","Trailing whitespace is superfluous."," nan <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",89,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",91,14,"style","Trailing whitespace is superfluous."," time_sep <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",93,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",95,20,"style","Trailing whitespace is superfluous."," approx_pattern <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",96,81,"style","Lines should not be more than 80 characters."," numbers_data$main[[1]]$numbers$`miscPatterns-numberSystem-latn`$approximately","line_length_linter" +"data-raw/06-numbers.R",97,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",99,22,"style","Trailing whitespace is superfluous."," at_least_pattern <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",101,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",103,21,"style","Trailing whitespace is superfluous."," at_most_pattern <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",105,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",107,19,"style","Trailing whitespace is superfluous."," range_pattern <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",109,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",113,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",116,81,"style","Lines should not be more than 80 characters."," numbers_data$main[[1]]$numbers$`scientificFormats-numberSystem-latn`$standard","line_length_linter" +"data-raw/06-numbers.R",117,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",121,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",125,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",128,81,"style","Lines should not be more than 80 characters."," numbers_data$main[[1]]$numbers$`currencyFormats-numberSystem-latn`$accounting","line_length_linter" +"data-raw/06-numbers.R",129,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",141,17,"style","Put spaces around all infix operators."," plus_sign =plus_sign,","infix_spaces_linter" +"data-raw/06-numbers.R",160,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",163,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/07-currencies.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/07-currencies.R",15,32,"style","Trailing whitespace is superfluous."," currencies_json_url_locale <- ","trailing_whitespace_linter" +"data-raw/07-currencies.R",18,55,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-numbers-full/main"", ","trailing_whitespace_linter" +"data-raw/07-currencies.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" +"data-raw/07-currencies.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/07-currencies.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/07-currencies.R",31,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/07-currencies.R",41,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/07-currencies.R",49,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/07-currencies.R",63,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/07-currencies.R",77,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/07-currencies.R",78,3,"style","Variable and function names should not be longer than 30 characters."," currency_display_name_count_other <-","object_length_linter" +"data-raw/07-currencies.R",91,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/07-currencies.R",103,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/07-currencies.R",106,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/08-characters.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/08-characters.R",15,16,"style","Trailing whitespace is superfluous."," characters <- ","trailing_whitespace_linter" +"data-raw/08-characters.R",18,52,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-misc-full/main"", ","trailing_whitespace_linter" +"data-raw/08-characters.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" +"data-raw/08-characters.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/08-characters.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/08-characters.R",36,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/08-characters.R",38,81,"style","Lines should not be more than 80 characters."," leninent_scope_general <- characters_data$main[[1]]$characters$`lenient-scope-general`","line_length_linter" +"data-raw/08-characters.R",39,81,"style","Lines should not be more than 80 characters."," leninent_scope_date <- characters_data$main[[1]]$characters$`lenient-scope-date`","line_length_linter" +"data-raw/08-characters.R",40,81,"style","Lines should not be more than 80 characters."," leninent_scope_number <- characters_data$main[[1]]$characters$`lenient-scope-number`","line_length_linter" +"data-raw/08-characters.R",41,81,"style","Lines should not be more than 80 characters."," stricter_scope_number <- characters_data$main[[1]]$characters$`stricter-scope-number`","line_length_linter" +"data-raw/08-characters.R",42,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/08-characters.R",59,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/08-characters.R",62,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/09-character_labels.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/09-character_labels.R",15,17,"style","Trailing whitespace is superfluous."," char_labels <- ","trailing_whitespace_linter" +"data-raw/09-character_labels.R",18,52,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-misc-full/main"", ","trailing_whitespace_linter" +"data-raw/09-character_labels.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" +"data-raw/09-character_labels.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/09-character_labels.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/09-character_labels.R",31,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/09-character_labels.R",33,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/09-character_labels.R",41,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/09-character_labels.R",44,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/10-delimiters.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/10-delimiters.R",15,16,"style","Trailing whitespace is superfluous."," delimiters <- ","trailing_whitespace_linter" +"data-raw/10-delimiters.R",18,52,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-misc-full/main"", ","trailing_whitespace_linter" +"data-raw/10-delimiters.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" +"data-raw/10-delimiters.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/10-delimiters.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/10-delimiters.R",32,81,"style","Lines should not be more than 80 characters."," alt_quotation_start <- delimiters_data$main[[1]]$delimiters$alternateQuotationStart","line_length_linter" +"data-raw/10-delimiters.R",33,81,"style","Lines should not be more than 80 characters."," alt_quotation_end <- delimiters_data$main[[1]]$delimiters$alternateQuotationEnd","line_length_linter" +"data-raw/10-delimiters.R",44,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/10-delimiters.R",47,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/10-delimiters.R",59,74,"style","Trailing whitespace is superfluous."," quotation_start, quotation_end, alt_quotation_start, alt_quotation_end, ","trailing_whitespace_linter" +"data-raw/11-layout.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/11-layout.R",15,12,"style","Trailing whitespace is superfluous."," layout <- ","trailing_whitespace_linter" +"data-raw/11-layout.R",18,52,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-misc-full/main"", ","trailing_whitespace_linter" +"data-raw/11-layout.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" +"data-raw/11-layout.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/11-layout.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/11-layout.R",40,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/11-layout.R",43,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/12-script_metadata.R",8,15,"style","Trailing whitespace is superfluous.","script_meta <- ","trailing_whitespace_linter" +"data-raw/12-script_metadata.R",10,81,"style","Lines should not be more than 80 characters."," ""https://raw.githubusercontent.com/unicode-org/cldr-json/main/cldr-json/cldr-core"", ","line_length_linter" +"data-raw/12-script_metadata.R",10,88,"style","Trailing whitespace is superfluous."," ""https://raw.githubusercontent.com/unicode-org/cldr-json/main/cldr-json/cldr-core"", ","trailing_whitespace_linter" +"data-raw/12-script_metadata.R",30,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/12-script_metadata.R",41,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/12-script_metadata.R",49,31,"style","Trailing whitespace is superfluous."," lb_letters = lb_letters, ","trailing_whitespace_linter" +"data-raw/12-script_metadata.R",57,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/12-script_metadata.R",59,81,"style","Lines should not be more than 80 characters."," script_metadata_tbl <- dplyr::bind_rows(script_metadata_tbl, script_metadata_row_i)","line_length_linter" +"data-raw/12-script_metadata.R",60,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/12-script_metadata.R",63,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/13-units.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/13-units.R",15,11,"style","Trailing whitespace is superfluous."," units <- ","trailing_whitespace_linter" +"data-raw/13-units.R",18,53,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-units-full/main"", ","trailing_whitespace_linter" +"data-raw/13-units.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" +"data-raw/13-units.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/13-units.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/13-units.R",33,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/13-units.R",41,42,"style","Trailing whitespace is superfluous."," dplyr::mutate(unit = names(long)) %>% ","trailing_whitespace_linter" +"data-raw/13-units.R",45,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/13-units.R",53,43,"style","Trailing whitespace is superfluous."," dplyr::mutate(unit = names(short)) %>% ","trailing_whitespace_linter" +"data-raw/13-units.R",57,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/13-units.R",65,44,"style","Trailing whitespace is superfluous."," dplyr::mutate(unit = names(narrow)) %>% ","trailing_whitespace_linter" +"data-raw/13-units.R",81,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/13-units.R",84,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/13-units.R",91,19,"style","Trailing whitespace is superfluous.","colnames_sorted <- ","trailing_whitespace_linter" +"data-raw/13-units.R",118,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/14-tz_exemplar.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/14-tz_exemplar.R",15,17,"style","Trailing whitespace is superfluous."," tz_exemplar <- ","trailing_whitespace_linter" +"data-raw/14-tz_exemplar.R",18,53,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-dates-full/main"", ","trailing_whitespace_linter" +"data-raw/14-tz_exemplar.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" +"data-raw/14-tz_exemplar.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/14-tz_exemplar.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/14-tz_exemplar.R",31,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/14-tz_exemplar.R",33,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/14-tz_exemplar.R",35,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/14-tz_exemplar.R",39,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/14-tz_exemplar.R",40,28,"style","Trailing whitespace is superfluous."," names(exemplar_cities) <- ","trailing_whitespace_linter" +"data-raw/14-tz_exemplar.R",42,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/14-tz_exemplar.R",43,27,"style","Trailing whitespace is superfluous."," tz_exemplar_tbl_row_i <- ","trailing_whitespace_linter" +"data-raw/14-tz_exemplar.R",48,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/14-tz_exemplar.R",51,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/15-tz_map.R",8,10,"style","Trailing whitespace is superfluous.","tz_map <- ","trailing_whitespace_linter" +"data-raw/15-tz_map.R",11,54,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-core/supplemental/"", ","trailing_whitespace_linter" +"data-raw/15-tz_map.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/15-tz_map.R",21,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/15-tz_map.R",24,26,"style","Trailing whitespace is superfluous.","colnames(map_data_all) <- ","trailing_whitespace_linter" +"data-raw/16-tz_formats.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/16-tz_formats.R",15,16,"style","Trailing whitespace is superfluous."," tz_formats <- ","trailing_whitespace_linter" +"data-raw/16-tz_formats.R",18,53,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-dates-full/main"", ","trailing_whitespace_linter" +"data-raw/16-tz_formats.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" +"data-raw/16-tz_formats.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/16-tz_formats.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/16-tz_formats.R",31,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/16-tz_formats.R",39,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/16-tz_formats.R",51,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/16-tz_formats.R",54,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/i18n/email-body b/.dev/revdep_emails/i18n/email-body new file mode 100644 index 000000000..2cf9f9a4c --- /dev/null +++ b/.dev/revdep_emails/i18n/email-body @@ -0,0 +1,27 @@ +Hello Richard Iannone! Thank you for using {lintr} in your package {i18n}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/rich-iannone/i18n using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 1s on CRAN vs. 5s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/jpmesh/attachments/jpmesh.warnings b/.dev/revdep_emails/jpmesh/attachments/jpmesh.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/jpmesh/attachments/jpmesh.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/jpmesh/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/jpmesh/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..25badc69e --- /dev/null +++ b/.dev/revdep_emails/jpmesh/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,3 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/administration_mesh.R",54,44,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (to_mesh_size <= mesh_units[5] & to_mesh_size >= mesh_units[7]) {","vector_logic_linter" +"R/coords_to_mesh.R",48,39,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!rlang::is_missing(longitude) | !rlang::is_missing(latitude))","vector_logic_linter" diff --git a/.dev/revdep_emails/jpmesh/email-body b/.dev/revdep_emails/jpmesh/email-body new file mode 100644 index 000000000..df021afd6 --- /dev/null +++ b/.dev/revdep_emails/jpmesh/email-body @@ -0,0 +1,27 @@ +Hello Shinya Uryu! Thank you for using {lintr} in your package {jpmesh}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/uribo/jpmesh using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 14s on CRAN vs. 9s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/languageserver/attachments/languageserver.warnings b/.dev/revdep_emails/languageserver/attachments/languageserver.warnings new file mode 100644 index 000000000..182961f94 --- /dev/null +++ b/.dev/revdep_emails/languageserver/attachments/languageserver.warnings @@ -0,0 +1,2 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Trying to remove β€˜camel_case_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/languageserver/email-body b/.dev/revdep_emails/languageserver/email-body new file mode 100644 index 000000000..e385e3d24 --- /dev/null +++ b/.dev/revdep_emails/languageserver/email-body @@ -0,0 +1,27 @@ +Hello Randy Lai! Thank you for using {lintr} in your package {languageserver}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/REditorSupport/languageserver using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 33s on CRAN vs. 10s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/latrend/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/latrend/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..6cf6f9344 --- /dev/null +++ b/.dev/revdep_emails/latrend/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,35 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/test-cases/data-na.R",50,13,"style","Variable and function name style should be snake_case.","testData2[, Value := replace(Value, .GRP %% M + 1L, NA), by = Id]","object_name_linter" +"R/data.R",168,13,"style","Variable and function name style should be snake_case."," alldata[, Mu.class := rowSums(Xc * t(clusterCoefs)[Class, ])]","object_name_linter" +"R/data.R",191,15,"style","Variable and function name style should be snake_case."," alldata[, Mu.random := rowSums(Xr * idCoefs[Id, ])]","object_name_linter" +"R/data.R",193,15,"style","Variable and function name style should be snake_case."," alldata[, Mu := Mu.fixed + Mu.class + Mu.random]","object_name_linter" +"R/data.R",195,15,"style","Variable and function name style should be snake_case."," alldata[, Mu := Mu.fixed + Mu.class]","object_name_linter" +"R/data.R",205,13,"style","Variable and function name style should be snake_case."," alldata[, Value := Mu + rnoise(.N, 0, noiseScales[Class])]","object_name_linter" +"R/data.R",215,13,"style","Variable and function name style should be snake_case."," alldata[, Class := factor(clusterNames[Class], levels = clusterNames)]","object_name_linter" +"R/matrix.R",161,10,"style","Variable and function name style should be snake_case."," dt[, .Fill := FALSE]","object_name_linter" +"R/matrix.R",166,10,"style","Variable and function name style should be snake_case."," dt[, .Fill := NULL]","object_name_linter" +"R/methodStratify.R",216,11,"style","Variable and function name style should be snake_case."," out[, Cluster := as.integer(Cluster) + 1L]","object_name_linter" +"R/model.R",948,15,"style","Variable and function name style should be snake_case."," newdata[, Cluster := factor(Cluster, levels = clusterNames(object))]","object_name_linter" +"R/model.R",961,38,"style","Variable and function name style should be snake_case."," lapply(function(cdata) cdata[, Cluster := NULL])","object_name_linter" +"R/model.R",1289,15,"style","Variable and function name style should be snake_case."," rawdata[, Cluster := trajAssignments[make.idRowIndices(object)]]","object_name_linter" +"R/modelCustom.R",197,19,"style","Place a space before left parenthesis, except in a function call."," object@predict(object, newdata, what, ...)","spaces_left_parentheses_linter" +"R/modelCustom.R",228,11,"style","Variable and function name style should be snake_case."," .[, Cluster := factor(Cluster,","object_name_linter" +"R/modelLcmmGMM.R",22,37,"style","Variable and function name style should be snake_case."," dataIndex[object@model$na.action, Include := FALSE]","object_name_linter" +"R/modelMixtoolsRM.R",57,11,"style","Variable and function name style should be snake_case."," .[, Time := times[.Block]] %>%","object_name_linter" +"R/modelMixtoolsRM.R",59,11,"style","Variable and function name style should be snake_case."," .[, .Component := NULL] %>%","object_name_linter" +"R/modelMixtoolsRM.R",60,11,"style","Variable and function name style should be snake_case."," .[, .Block := NULL] %>%","object_name_linter" +"R/models.R",515,9,"style","Variable and function name style should be snake_case."," .[, .ROW_INDEX := .I] %>%","object_name_linter" +"R/test.R",74,10,"style","Variable and function name style should be snake_case."," data[, Id := as.character(Id)]","object_name_linter" +"R/test.R",75,10,"style","Variable and function name style should be snake_case."," data[, Cluster := as.character(Cluster)]","object_name_linter" +"tests/testthat/setup-data.R",22,7,"style","Variable and function name style should be snake_case."," .[, Constant := 1] %>%","object_name_linter" +"tests/testthat/setup-data.R",23,7,"style","Variable and function name style should be snake_case."," .[, Cluster := Class]","object_name_linter" +"tests/testthat/test-akmedoids.R",24,12,"style","Variable and function name style should be snake_case.","trajData[, Cluster := LETTERS[as.integer(Id) %% 3 + 1]]","object_name_linter" +"tests/testthat/test-assert.R",197,32,"style","Variable and function name style should be snake_case."," .[Traj == unique(Traj)[2], Value := NA]","object_name_linter" +"tests/testthat/test-cluslong.R",111,23,"style","Variable and function name style should be snake_case."," .[sample(.N, 10), Traj := NA]","object_name_linter" +"tests/testthat/test-cluslong.R",118,9,"style","Variable and function name style should be snake_case."," .[, Traj := factor(Traj)]","object_name_linter" +"tests/testthat/test-cluslong.R",128,9,"style","Variable and function name style should be snake_case."," .[, Traj := factor(Traj, levels = rev(unique(Traj)))]","object_name_linter" +"tests/testthat/test-cluslong.R",138,9,"style","Variable and function name style should be snake_case."," .[, Traj := factor(Traj, levels = seq(0, uniqueN(Traj) + 1))]","object_name_linter" +"tests/testthat/test-cluslong.R",147,18,"style","Variable and function name style should be snake_case."," .[Traj == 1, Traj := NA]","object_name_linter" +"tests/testthat/test-cluslong.R",165,23,"style","Variable and function name style should be snake_case."," .[sample(.N, 10), Value := NA]","object_name_linter" +"tests/testthat/test-cluslong.R",175,23,"style","Variable and function name style should be snake_case."," .[sample(.N, 10), Value := Inf]","object_name_linter" +"tests/testthat/test-crimcv.R",32,7,"style","Variable and function name style should be snake_case."," .[, Cluster := rep(LETTERS[1:3], each = 33 * ncol(subTO1adj))]","object_name_linter" diff --git a/.dev/revdep_emails/latrend/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/latrend/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..c3fd426a9 --- /dev/null +++ b/.dev/revdep_emails/latrend/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,331 @@ +"filename","line_number","column_number","type","message","line","linter" +"data-raw/latrendData.R",6,1,"style","Variable and function name style should be snake_case or symbols.","latrendData = generateLongData(","object_name_linter" +"data-raw/latrendData.R",6,13,"style","Use <-, not =, for assignment.","latrendData = generateLongData(","assignment_linter" +"data-raw/latrendData.R",11,8,"style","Only use double-quotes."," id = 'Id',","single_quotes_linter" +"data-raw/latrendData.R",17,24,"style","Only use double-quotes."," clusterNames = paste('Class', 1:3),","single_quotes_linter" +"data-raw/latrendData.R",22,42,"style","Only use double-quotes.","plotTrajectories(latrendData, response = 'Y')","single_quotes_linter" +"data-raw/latrendData.R",23,42,"style","Only use double-quotes.","plotTrajectories(latrendData, response = 'Y', cluster = 'Class', facet = FALSE)","single_quotes_linter" +"data-raw/latrendData.R",23,57,"style","Only use double-quotes.","plotTrajectories(latrendData, response = 'Y', cluster = 'Class', facet = FALSE)","single_quotes_linter" +"data-raw/latrendData.R",24,42,"style","Only use double-quotes.","plotTrajectories(latrendData, response = 'Y', cluster = 'Class', facet = TRUE)","single_quotes_linter" +"data-raw/latrendData.R",24,57,"style","Only use double-quotes.","plotTrajectories(latrendData, response = 'Y', cluster = 'Class', facet = TRUE)","single_quotes_linter" +"data-raw/osa-adherence-data.R",6,81,"style","Lines should not be more than 80 characters.","#' @description Generates data from the group definitions provided by M. Aloia et al. (2008).","line_length_linter" +"data-raw/osa-adherence-data.R",16,81,"style","Lines should not be more than 80 characters.","#' @param missing Whether to simulate measurements being missing (including drop-out)","line_length_linter" +"data-raw/osa-adherence-data.R",19,81,"style","Lines should not be more than 80 characters.","#' Mark S. Aloia, Matthew S. Goodwin, Wayne F. Velicer, J. Todd Arnedt, Molly Zimmerman, Jaime Skrekas, Sarah Harris, Richard P. Millman,","line_length_linter" +"data-raw/osa-adherence-data.R",20,81,"style","Lines should not be more than 80 characters.","#' Time Series Analysis of Treatment Adherence Patterns in Individuals with Obstructive Sleep Apnea, Annals of Behavioral Medicine,","line_length_linter" +"data-raw/osa-adherence-data.R",21,81,"style","Lines should not be more than 80 characters.","#' Volume 36, Issue 1, August 2008, Pages 44–53, https://doi.org/10.1007/s12160-008-9052-9","line_length_linter" +"data-raw/osa-adherence-data.R",22,19,"style","Use <-, not =, for assignment.","generate_osa_data = function(","assignment_linter" +"data-raw/osa-adherence-data.R",25,3,"style","Variable and function name style should be snake_case or symbols."," nAggr = 14,","object_name_linter" +"data-raw/osa-adherence-data.R",37,3,"style","Variable and function name style should be snake_case or symbols."," dropoutTimes = c(Inf, Inf, Inf, Inf, Inf, 90, 30),","object_name_linter" +"data-raw/osa-adherence-data.R",38,3,"style","Variable and function name style should be snake_case or symbols."," sd.dropoutTimes = c(0, 0, 0, 0, 0, 30, 10),","object_name_linter" +"data-raw/osa-adherence-data.R",39,3,"style","Variable and function name style should be snake_case or symbols."," attemptProbs = c(354, 344, 280, 299, 106, 55, 14) / pmin(dropoutTimes, 365),","object_name_linter" +"data-raw/osa-adherence-data.R",50,3,"style","Variable and function name style should be snake_case or symbols."," sd.intercepts = c(","object_name_linter" +"data-raw/osa-adherence-data.R",68,3,"style","Variable and function name style should be snake_case or symbols."," sd.slopes = c(","object_name_linter" +"data-raw/osa-adherence-data.R",86,3,"style","Variable and function name style should be snake_case or symbols."," sd.quads = c(","object_name_linter" +"data-raw/osa-adherence-data.R",104,3,"style","Variable and function name style should be snake_case or symbols."," sd.vars = c(","object_name_linter" +"data-raw/osa-adherence-data.R",122,3,"style","Variable and function name style should be snake_case or symbols."," groupNames = c(","object_name_linter" +"data-raw/osa-adherence-data.R",123,5,"style","Only use double-quotes."," 'Good users',","single_quotes_linter" +"data-raw/osa-adherence-data.R",124,5,"style","Only use double-quotes."," 'Slow improvers',","single_quotes_linter" +"data-raw/osa-adherence-data.R",125,5,"style","Only use double-quotes."," 'Slow decliners',","single_quotes_linter" +"data-raw/osa-adherence-data.R",126,5,"style","Only use double-quotes."," 'Variable users',","single_quotes_linter" +"data-raw/osa-adherence-data.R",127,5,"style","Only use double-quotes."," 'Occasional attempters',","single_quotes_linter" +"data-raw/osa-adherence-data.R",128,5,"style","Only use double-quotes."," 'Early drop-outs',","single_quotes_linter" +"data-raw/osa-adherence-data.R",129,5,"style","Only use double-quotes."," 'Non-users'","single_quotes_linter" +"data-raw/osa-adherence-data.R",134,3,"style","Variable and function name style should be snake_case or symbols."," groupCounts = floor(patients * props)","object_name_linter" +"data-raw/osa-adherence-data.R",134,15,"style","Use <-, not =, for assignment."," groupCounts = floor(patients * props)","assignment_linter" +"data-raw/osa-adherence-data.R",135,3,"style","Variable and function name style should be snake_case or symbols."," incrIdx = order((patients * props) %% 1) %>%","object_name_linter" +"data-raw/osa-adherence-data.R",135,11,"style","Use <-, not =, for assignment."," incrIdx = order((patients * props) %% 1) %>%","assignment_linter" +"data-raw/osa-adherence-data.R",137,3,"style","Variable and function name style should be snake_case or symbols."," groupCounts[incrIdx] = groupCounts[incrIdx] + 1 # increment the groups that were closest to receiving another patient","object_name_linter" +"data-raw/osa-adherence-data.R",137,24,"style","Use <-, not =, for assignment."," groupCounts[incrIdx] = groupCounts[incrIdx] + 1 # increment the groups that were closest to receiving another patient","assignment_linter" +"data-raw/osa-adherence-data.R",137,81,"style","Lines should not be more than 80 characters."," groupCounts[incrIdx] = groupCounts[incrIdx] + 1 # increment the groups that were closest to receiving another patient","line_length_linter" +"data-raw/osa-adherence-data.R",139,3,"style","Variable and function name style should be snake_case or symbols."," groupNames = factor(groupNames, levels = groupNames)","object_name_linter" +"data-raw/osa-adherence-data.R",139,14,"style","Use <-, not =, for assignment."," groupNames = factor(groupNames, levels = groupNames)","assignment_linter" +"data-raw/osa-adherence-data.R",142,3,"style","Variable and function name style should be snake_case or symbols."," groupCoefs = data.table(","object_name_linter" +"data-raw/osa-adherence-data.R",142,14,"style","Use <-, not =, for assignment."," groupCoefs = data.table(","assignment_linter" +"data-raw/osa-adherence-data.R",159,3,"style","Variable and function name style should be snake_case or symbols."," patCoefs = groupCoefs[, .(","object_name_linter" +"data-raw/osa-adherence-data.R",159,12,"style","Use <-, not =, for assignment."," patCoefs = groupCoefs[, .(","assignment_linter" +"data-raw/osa-adherence-data.R",160,19,"warning","no visible binding for global variable β€˜Patients’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" +"data-raw/osa-adherence-data.R",160,19,"warning","no visible binding for global variable β€˜Patients’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" +"data-raw/osa-adherence-data.R",160,19,"warning","no visible binding for global variable β€˜Patients’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" +"data-raw/osa-adherence-data.R",160,19,"warning","no visible binding for global variable β€˜Patients’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" +"data-raw/osa-adherence-data.R",160,19,"warning","no visible binding for global variable β€˜Patients’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" +"data-raw/osa-adherence-data.R",160,19,"warning","no visible binding for global variable β€˜Patients’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" +"data-raw/osa-adherence-data.R",160,29,"warning","no visible binding for global variable β€˜TDrop’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" +"data-raw/osa-adherence-data.R",160,36,"warning","no visible binding for global variable β€˜Sd.TDrop’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" +"data-raw/osa-adherence-data.R",161,13,"warning","no visible binding for global variable β€˜AProb’"," AProb = AProb,","object_usage_linter" +"data-raw/osa-adherence-data.R",162,33,"warning","no visible binding for global variable β€˜Int’"," Intercept = rnorm(Patients, Int, Sd.Int) %>% pmax(0),","object_usage_linter" +"data-raw/osa-adherence-data.R",162,38,"warning","no visible binding for global variable β€˜Sd.Int’"," Intercept = rnorm(Patients, Int, Sd.Int) %>% pmax(0),","object_usage_linter" +"data-raw/osa-adherence-data.R",163,29,"warning","no visible binding for global variable β€˜Slope’"," Slope = rnorm(Patients, Slope, Sd.Slope),","object_usage_linter" +"data-raw/osa-adherence-data.R",163,36,"warning","no visible binding for global variable β€˜Sd.Slope’"," Slope = rnorm(Patients, Slope, Sd.Slope),","object_usage_linter" +"data-raw/osa-adherence-data.R",164,28,"warning","no visible binding for global variable β€˜Quad’"," Quad = rnorm(Patients, Quad, Sd.Quad),","object_usage_linter" +"data-raw/osa-adherence-data.R",164,34,"warning","no visible binding for global variable β€˜Sd.Quad’"," Quad = rnorm(Patients, Quad, Sd.Quad),","object_usage_linter" +"data-raw/osa-adherence-data.R",165,32,"warning","no visible binding for global variable β€˜Var’"," Variance = rnorm(Patients, Var, Sd.Var) %>% pmax(.75),","object_usage_linter" +"data-raw/osa-adherence-data.R",165,37,"warning","no visible binding for global variable β€˜Sd.Var’"," Variance = rnorm(Patients, Var, Sd.Var) %>% pmax(.75),","object_usage_linter" +"data-raw/osa-adherence-data.R",166,13,"warning","no visible binding for global variable β€˜R’"," R = rep(R, Patients)","object_usage_linter" +"data-raw/osa-adherence-data.R",167,11,"warning","no visible binding for global variable β€˜Group’"," ), by = Group]","object_usage_linter" +"data-raw/osa-adherence-data.R",170,3,"style","Variable and function name style should be snake_case or symbols."," genTs = function(N,","object_name_linter" +"data-raw/osa-adherence-data.R",170,9,"style","Use <-, not =, for assignment."," genTs = function(N,","assignment_linter" +"data-raw/osa-adherence-data.R",170,20,"style","Variable and function name style should be snake_case or symbols."," genTs = function(N,","object_name_linter" +"data-raw/osa-adherence-data.R",171,5,"style","Variable and function name style should be snake_case or symbols."," Intercept,","object_name_linter" +"data-raw/osa-adherence-data.R",172,5,"style","Variable and function name style should be snake_case or symbols."," Slope,","object_name_linter" +"data-raw/osa-adherence-data.R",173,5,"style","Variable and function name style should be snake_case or symbols."," Quad,","object_name_linter" +"data-raw/osa-adherence-data.R",174,5,"style","Variable and function name style should be snake_case or symbols."," Variance,","object_name_linter" +"data-raw/osa-adherence-data.R",175,5,"style","Variable and function name style should be snake_case or symbols."," R,","object_name_linter" +"data-raw/osa-adherence-data.R",176,5,"style","Variable and function name style should be snake_case or symbols."," AProb,","object_name_linter" +"data-raw/osa-adherence-data.R",177,5,"style","Variable and function name style should be snake_case or symbols."," TDrop,","object_name_linter" +"data-raw/osa-adherence-data.R",179,7,"style","Use <-, not =, for assignment."," y = as.numeric(Intercept + times * Slope + times ^ 2 * Quad + arima.sim(list(ar = R),","assignment_linter" +"data-raw/osa-adherence-data.R",179,81,"style","Lines should not be more than 80 characters."," y = as.numeric(Intercept + times * Slope + times ^ 2 * Quad + arima.sim(list(ar = R),","line_length_linter" +"data-raw/osa-adherence-data.R",183,5,"style","Variable and function name style should be snake_case or symbols."," skipMask = !rbinom(length(times), size = 1, prob = AProb)","object_name_linter" +"data-raw/osa-adherence-data.R",183,14,"style","Use <-, not =, for assignment."," skipMask = !rbinom(length(times), size = 1, prob = AProb)","assignment_linter" +"data-raw/osa-adherence-data.R",184,17,"style","Use <-, not =, for assignment."," y[skipMask] = 0","assignment_linter" +"data-raw/osa-adherence-data.R",187,7,"style","Variable and function name style should be snake_case or symbols."," obsMask = times <= TDrop","object_name_linter" +"data-raw/osa-adherence-data.R",187,15,"style","Use <-, not =, for assignment."," obsMask = times <= TDrop","assignment_linter" +"data-raw/osa-adherence-data.R",190,24,"style","Use <-, not =, for assignment."," y[times > TDrop] = 0","assignment_linter" +"data-raw/osa-adherence-data.R",195,3,"style","Variable and function name style should be snake_case or symbols."," patNames = paste0('P', 1:patients)","object_name_linter" +"data-raw/osa-adherence-data.R",195,12,"style","Use <-, not =, for assignment."," patNames = paste0('P', 1:patients)","assignment_linter" +"data-raw/osa-adherence-data.R",195,21,"style","Only use double-quotes."," patNames = paste0('P', 1:patients)","single_quotes_linter" +"data-raw/osa-adherence-data.R",196,11,"style","Use <-, not =, for assignment."," alldata = patCoefs[, do.call(genTs, .SD), by = .(Group, Id = factor(patNames, levels = patNames))] %>%","assignment_linter" +"data-raw/osa-adherence-data.R",196,52,"warning","no visible binding for global variable β€˜Group’"," alldata = patCoefs[, do.call(genTs, .SD), by = .(Group, Id = factor(patNames, levels = patNames))] %>%","object_usage_linter" +"data-raw/osa-adherence-data.R",196,81,"style","Lines should not be more than 80 characters."," alldata = patCoefs[, do.call(genTs, .SD), by = .(Group, Id = factor(patNames, levels = patNames))] %>%","line_length_linter" +"data-raw/osa-adherence-data.R",200,3,"style","Variable and function name style should be snake_case or symbols."," groupTrajs = groupCoefs[, .(","object_name_linter" +"data-raw/osa-adherence-data.R",200,14,"style","Use <-, not =, for assignment."," groupTrajs = groupCoefs[, .(","assignment_linter" +"data-raw/osa-adherence-data.R",202,19,"warning","no visible binding for global variable β€˜Int’"," Usage = (pmax(Int + times * Slope + times ^ 2 * Quad, 0) * AProb) %>% ifelse(times > TDrop, 0, .)","object_usage_linter" +"data-raw/osa-adherence-data.R",202,33,"warning","no visible binding for global variable β€˜Slope’"," Usage = (pmax(Int + times * Slope + times ^ 2 * Quad, 0) * AProb) %>% ifelse(times > TDrop, 0, .)","object_usage_linter" +"data-raw/osa-adherence-data.R",202,53,"warning","no visible binding for global variable β€˜Quad’"," Usage = (pmax(Int + times * Slope + times ^ 2 * Quad, 0) * AProb) %>% ifelse(times > TDrop, 0, .)","object_usage_linter" +"data-raw/osa-adherence-data.R",202,64,"warning","no visible binding for global variable β€˜AProb’"," Usage = (pmax(Int + times * Slope + times ^ 2 * Quad, 0) * AProb) %>% ifelse(times > TDrop, 0, .)","object_usage_linter" +"data-raw/osa-adherence-data.R",202,81,"style","Lines should not be more than 80 characters."," Usage = (pmax(Int + times * Slope + times ^ 2 * Quad, 0) * AProb) %>% ifelse(times > TDrop, 0, .)","line_length_linter" +"data-raw/osa-adherence-data.R",202,90,"warning","no visible binding for global variable β€˜TDrop’"," Usage = (pmax(Int + times * Slope + times ^ 2 * Quad, 0) * AProb) %>% ifelse(times > TDrop, 0, .)","object_usage_linter" +"data-raw/osa-adherence-data.R",203,13,"warning","no visible binding for global variable β€˜Group’"," ), by = Group]","object_usage_linter" +"data-raw/osa-adherence-data.R",205,20,"style","Only use double-quotes."," setattr(alldata, 'patCoefs', patCoefs)","single_quotes_linter" +"data-raw/osa-adherence-data.R",206,20,"style","Only use double-quotes."," setattr(alldata, 'groupCoefs', groupCoefs)","single_quotes_linter" +"data-raw/osa-adherence-data.R",207,20,"style","Only use double-quotes."," setattr(alldata, 'groupTrajs', groupTrajs)","single_quotes_linter" +"data-raw/osa-adherence-data.R",211,13,"style","Use <-, not =, for assignment."," alldata = transformToAverage(alldata, binSize = nAggr)","assignment_linter" +"data-raw/osa-adherence-data.R",211,15,"warning","no visible global function definition for β€˜transformToAverage’"," alldata = transformToAverage(alldata, binSize = nAggr)","object_usage_linter" +"data-raw/osa-adherence-data.R",217,1,"style","Variable and function name style should be snake_case or symbols.","transformToAverage = function(data, binSize = 14) {","object_name_linter" +"data-raw/osa-adherence-data.R",217,20,"style","Use <-, not =, for assignment.","transformToAverage = function(data, binSize = 14) {","assignment_linter" +"data-raw/osa-adherence-data.R",217,37,"style","Variable and function name style should be snake_case or symbols.","transformToAverage = function(data, binSize = 14) {","object_name_linter" +"data-raw/osa-adherence-data.R",218,8,"style","Use <-, not =, for assignment."," bins = seq(min(data$Time), max(data$Time), by = binSize)","assignment_linter" +"data-raw/osa-adherence-data.R",219,11,"style","Use <-, not =, for assignment."," bindata = data[, .(Usage = mean(Usage), Time = max(Time)),","assignment_linter" +"data-raw/osa-adherence-data.R",219,35,"warning","no visible binding for global variable β€˜Usage’"," bindata = data[, .(Usage = mean(Usage), Time = max(Time)),","object_usage_linter" +"data-raw/osa-adherence-data.R",221,7,"warning","no visible binding for global variable β€˜Group’"," Group,","object_usage_linter" +"data-raw/osa-adherence-data.R",226,3,"style","Variable and function name style should be snake_case or symbols."," groupTrajs = attr(data, 'groupTrajs')","object_name_linter" +"data-raw/osa-adherence-data.R",226,14,"style","Use <-, not =, for assignment."," groupTrajs = attr(data, 'groupTrajs')","assignment_linter" +"data-raw/osa-adherence-data.R",226,27,"style","Only use double-quotes."," groupTrajs = attr(data, 'groupTrajs')","single_quotes_linter" +"data-raw/osa-adherence-data.R",227,3,"style","Variable and function name style should be snake_case or symbols."," bingroupTrajs = groupTrajs[, .(Usage = mean(Usage)),","object_name_linter" +"data-raw/osa-adherence-data.R",227,17,"style","Use <-, not =, for assignment."," bingroupTrajs = groupTrajs[, .(Usage = mean(Usage)),","assignment_linter" +"data-raw/osa-adherence-data.R",227,47,"warning","no visible binding for global variable β€˜Usage’"," bingroupTrajs = groupTrajs[, .(Usage = mean(Usage)),","object_usage_linter" +"data-raw/osa-adherence-data.R",229,7,"warning","no visible binding for global variable β€˜Group’"," Group,","object_usage_linter" +"data-raw/osa-adherence-data.R",232,22,"warning","no visible binding for global variable β€˜Bin’"," .[, Time := bins[Bin]]","object_usage_linter" +"data-raw/osa-adherence-data.R",234,20,"style","Only use double-quotes."," setattr(bindata, 'groupTrajs', bingroupTrajs)","single_quotes_linter" +"data-raw/osa-adherence-data.R",239,9,"style","Use <-, not =, for assignment.","dataset = generate_osa_data(patients = 500, seed = 1)","assignment_linter" +"data-raw/osa-adherence-data.R",240,21,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" +"data-raw/osa-adherence-data.R",240,27,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" +"data-raw/osa-adherence-data.R",240,35,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" +"data-raw/osa-adherence-data.R",240,42,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" +"data-raw/osa-adherence-data.R",240,54,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" +"data-raw/osa-adherence-data.R",240,65,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" +"data-raw/osa-adherence-data.R",240,75,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" +"data-raw/osa-adherence-data.R",240,81,"style","Lines should not be more than 80 characters.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","line_length_linter" +"data-raw/osa-adherence-data.R",240,85,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" +"data-raw/osa-adherence-data.R",241,24,"style","Only use double-quotes.","setcolorder(dataset, c('Patient', 'Biweek', 'MaxDay', 'UsageHours', 'Group'))","single_quotes_linter" +"data-raw/osa-adherence-data.R",241,35,"style","Only use double-quotes.","setcolorder(dataset, c('Patient', 'Biweek', 'MaxDay', 'UsageHours', 'Group'))","single_quotes_linter" +"data-raw/osa-adherence-data.R",241,45,"style","Only use double-quotes.","setcolorder(dataset, c('Patient', 'Biweek', 'MaxDay', 'UsageHours', 'Group'))","single_quotes_linter" +"data-raw/osa-adherence-data.R",241,55,"style","Only use double-quotes.","setcolorder(dataset, c('Patient', 'Biweek', 'MaxDay', 'UsageHours', 'Group'))","single_quotes_linter" +"data-raw/osa-adherence-data.R",241,69,"style","Only use double-quotes.","setcolorder(dataset, c('Patient', 'Biweek', 'MaxDay', 'UsageHours', 'Group'))","single_quotes_linter" +"data-raw/osa-adherence-data.R",244,32,"style","Only use double-quotes.","plotTrajectories(dataset, id = 'Patient', time = 'Biweek', response = 'UsageHours', cluster = 'Group', facet = TRUE)","single_quotes_linter" +"data-raw/osa-adherence-data.R",244,50,"style","Only use double-quotes.","plotTrajectories(dataset, id = 'Patient', time = 'Biweek', response = 'UsageHours', cluster = 'Group', facet = TRUE)","single_quotes_linter" +"data-raw/osa-adherence-data.R",244,71,"style","Only use double-quotes.","plotTrajectories(dataset, id = 'Patient', time = 'Biweek', response = 'UsageHours', cluster = 'Group', facet = TRUE)","single_quotes_linter" +"data-raw/osa-adherence-data.R",244,81,"style","Lines should not be more than 80 characters.","plotTrajectories(dataset, id = 'Patient', time = 'Biweek', response = 'UsageHours', cluster = 'Group', facet = TRUE)","line_length_linter" +"data-raw/osa-adherence-data.R",244,95,"style","Only use double-quotes.","plotTrajectories(dataset, id = 'Patient', time = 'Biweek', response = 'UsageHours', cluster = 'Group', facet = TRUE)","single_quotes_linter" +"data-raw/osa-adherence-data.R",248,1,"style","Variable and function name style should be snake_case or symbols.","OSA.adherence = as.data.frame(dataset)","object_name_linter" +"data-raw/osa-adherence-data.R",248,15,"style","Use <-, not =, for assignment.","OSA.adherence = as.data.frame(dataset)","assignment_linter" +"R/assert.R",109,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/assert.R",341,7,"warning","no visible binding for global variable β€˜Dupe’"," .[Dupe == TRUE]","object_usage_linter" +"R/assert.R",371,7,"warning","no visible binding for global variable β€˜Moments’"," .[Moments < min]","object_usage_linter" +"R/assert.R",402,7,"warning","no visible binding for global variable β€˜HasMult’"," .[HasMult == TRUE]","object_usage_linter" +"R/assert.R",407,7,"warning","no visible global function definition for β€˜nroW’"," nroW(dtMult),","object_usage_linter" +"R/assert.R",413,9,"warning","no visible binding for global variable β€˜IsEqualLen’"," .[IsEqualLen == FALSE]","object_usage_linter" +"R/assert.R",438,7,"warning","no visible binding for global variable β€˜NaCount’"," .[NaCount > 0]","object_usage_linter" +"R/formula.R",31,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/generics.R",467,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/matrix.R",85,3,"style","`else` should come on the same line as the previous `}`."," else if (is.factor(times)) {","brace_linter" +"R/matrix.R",90,3,"style","`else` should come on the same line as the previous `}`."," else if (is.character(times)) {","brace_linter" +"R/method.R",364,3,"style","`else` should come on the same line as the previous `}`."," else if (is.list(args)) {","brace_linter" +"R/method.R",671,12,"warning","no visible binding for global variable β€˜label’"," object$label","object_usage_linter" +"R/method.R",1088,12,"warning","no visible binding for global variable β€˜response’"," object$response","object_usage_linter" +"R/method.R",1154,3,"style","`else` should come on the same line as the previous `}`."," else if (inherits(object, what = classes)) {","brace_linter" +"R/methods.R",123,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/model-transform.R",367,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/model-transform.R",388,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/model-transform.R",405,7,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/model.R",438,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/model.R",938,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/model.R",963,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/model.R",991,3,"style","`else` should come on the same line as the previous `}`."," else if (is.numeric(predList[[1]])) {","brace_linter" +"R/model.R",1004,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/model.R",1106,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/model.R",1381,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/modelKML.R",48,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/modelLMKM.R",59,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/models.R",53,3,"style","`else` should come on the same line as the previous `}`."," else if (is.lcModels(x)) {","brace_linter" +"R/models.R",56,3,"style","`else` should come on the same line as the previous `}`."," else if (is.lcModel(x)) {","brace_linter" +"R/models.R",59,3,"style","`else` should come on the same line as the previous `}`."," else if (is.list(x)) {","brace_linter" +"R/models.R",63,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/models.R",156,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/models.R",247,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/modelWeightedPartition.R",42,3,"style","`else` should come on the same line as the previous `}`."," else if (is.function(clusterNames)) {","brace_linter" +"R/random.R",12,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/test.R",410,3,"style","`else` should come on the same line as the previous `}`."," else if (!isFALSE(error)) {","brace_linter" +"tests/testthat/setup-init.R",160,17,"warning","no visible global function definition for β€˜is.ggplot’"," expect_true(is.ggplot(plot(object)))","object_usage_linter" +"tests/testthat/test-formula.R",9,28,"style","Put spaces around all infix operators."," expect_true(hasResponse(A~0))","infix_spaces_linter" +"tests/testthat/test-formula.R",10,36,"style","Put spaces around all infix operators."," expect_true(hasResponse(I(log(A))~B))","infix_spaces_linter" +"tests/testthat/test-formula.R",17,29,"style","Put spaces around all infix operators."," expect_true(hasIntercept(A~1))","infix_spaces_linter" +"tests/testthat/test-formula.R",18,30,"style","Put spaces around all infix operators."," expect_false(hasIntercept(A~-1))","infix_spaces_linter" +"tests/testthat/test-formula.R",25,34,"style","Put spaces around all infix operators."," expect_true(hasSingleResponse(A~0))","infix_spaces_linter" +"tests/testthat/test-formula.R",26,34,"style","Put spaces around all infix operators."," expect_true(hasSingleResponse(A~B))","infix_spaces_linter" +"tests/testthat/test-formula.R",43,27,"style","Put spaces around all infix operators."," expect_null(getREterms(A~B))","infix_spaces_linter" +"tests/testthat/test-formula.R",44,29,"style","Put spaces around all infix operators."," expect_length(getREterms(A~B + (1 | C)), 1)","infix_spaces_linter" +"tests/testthat/test-formula.R",45,29,"style","Put spaces around all infix operators."," expect_length(getREterms(A~B + (1 | C) + (1 | D)), 2)","infix_spaces_linter" +"tests/testthat/test-formula.R",62,28,"style","Put spaces around all infix operators."," expect_equal(getREterms(A~B + (1 | C))[[1]] %>% REtermAsFormula, ~1)","infix_spaces_linter" +"tests/testthat/test-formula.R",63,28,"style","Put spaces around all infix operators."," expect_equal(getREterms(A~B + (D | C))[[1]] %>% REtermAsFormula, ~D)","infix_spaces_linter" +"tests/testthat/test-formula.R",64,28,"style","Put spaces around all infix operators."," expect_equal(getREterms(A~B + (-1 + D | C))[[1]] %>% REtermAsFormula, ~-1 + D)","infix_spaces_linter" +"tests/testthat/test-formula.R",74,30,"style","Put spaces around all infix operators."," expect_true(hasCovariates(A~B))","infix_spaces_linter" +"tests/testthat/test-formula.R",76,30,"style","Put spaces around all infix operators."," expect_true(hasCovariates(A~poly(A, 2)))","infix_spaces_linter" +"tests/testthat/test-formula.R",77,31,"style","Put spaces around all infix operators."," expect_false(hasCovariates(A~0))","infix_spaces_linter" +"tests/testthat/test-formula.R",78,31,"style","Put spaces around all infix operators."," expect_false(hasCovariates(A~1))","infix_spaces_linter" +"tests/testthat/test-formula.R",84,32,"style","Put spaces around all infix operators."," expect_length(getCovariates(A~0), 0)","infix_spaces_linter" +"tests/testthat/test-formula.R",85,32,"style","Put spaces around all infix operators."," expect_length(getCovariates(A~1), 0)","infix_spaces_linter" +"tests/testthat/test-formula.R",101,31,"style","Put spaces around all infix operators."," expect_equal(merge.formula(Z~A, ~B), Z~A + B)","infix_spaces_linter" +"tests/testthat/test-formula.R",101,41,"style","Put spaces around all infix operators."," expect_equal(merge.formula(Z~A, ~B), Z~A + B)","infix_spaces_linter" +"tests/testthat/test-formula.R",102,31,"style","Put spaces around all infix operators."," expect_equal(merge.formula(Z~A + B, ~B), Z~A + B)","infix_spaces_linter" +"tests/testthat/test-formula.R",102,45,"style","Put spaces around all infix operators."," expect_equal(merge.formula(Z~A + B, ~B), Z~A + B)","infix_spaces_linter" +"tests/testthat/test-formula.R",103,31,"style","Put spaces around all infix operators."," expect_equal(merge.formula(Z~A + C, ~B), Z~A + C + B)","infix_spaces_linter" +"tests/testthat/test-formula.R",103,45,"style","Put spaces around all infix operators."," expect_equal(merge.formula(Z~A + C, ~B), Z~A + C + B)","infix_spaces_linter" +"tests/testthat/test-formula.R",104,35,"style","Put spaces around all infix operators."," expect_error(merge.formula(~A, Z~B))","infix_spaces_linter" +"tests/testthat/test-formula.R",111,42,"style","Put spaces around all infix operators."," expect_false(hasResponse(dropResponse(A~0)))","infix_spaces_linter" +"tests/testthat/test-formula.R",112,43,"style","Put spaces around all infix operators."," expect_false(hasIntercept(dropResponse(A~0)))","infix_spaces_linter" +"tests/testthat/test-formula.R",113,30,"style","Put spaces around all infix operators."," expect_equal(dropResponse(A~1), ~1)","infix_spaces_linter" +"tests/testthat/test-formula.R",114,30,"style","Put spaces around all infix operators."," expect_equal(dropResponse(A~B), ~B)","infix_spaces_linter" +"tests/testthat/test-formula.R",115,35,"style","Put spaces around all infix operators."," expect_equal(dropResponse(A + B ~C), ~C)","infix_spaces_linter" +"tests/testthat/test-formula.R",120,44,"style","Put spaces around all infix operators."," expect_false(hasIntercept(dropIntercept(A~0)))","infix_spaces_linter" +"tests/testthat/test-formula.R",121,44,"style","Put spaces around all infix operators."," expect_false(hasIntercept(dropIntercept(A~B)))","infix_spaces_linter" +"tests/testthat/test-method.R",15,11,"style","Put spaces around all infix operators."," form = A~B,","infix_spaces_linter" +"vignettes/demo.Rmd",28,23,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" +"vignettes/demo.Rmd",28,34,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" +"vignettes/demo.Rmd",28,41,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" +"vignettes/demo.Rmd",28,49,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" +"vignettes/demo.Rmd",28,81,"style","Lines should not be more than 80 characters."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","line_length_linter" +"vignettes/demo.Rmd",64,1,"style","Variable and function name style should be snake_case or symbols.","kmlMethod <- lcMethodKML(response = ""Y"", nClusters = 2, nbRedrawing = 1)","object_name_linter" +"vignettes/demo.Rmd",74,1,"style","Variable and function name style should be snake_case or symbols.","kmlModel <- latrend(kmlMethod, data = latrendData)","object_name_linter" +"vignettes/demo.Rmd",86,1,"style","Variable and function name style should be snake_case or symbols.","kmlMethods <- lcMethods(kmlMethod, nClusters = 1:8)","object_name_linter" +"vignettes/demo.Rmd",94,1,"style","Variable and function name style should be snake_case or symbols.","kmlModels <- latrendBatch(kmlMethods, data = latrendData, verbose = FALSE)","object_name_linter" +"vignettes/demo.Rmd",107,1,"style","Variable and function name style should be snake_case or symbols.","kmlModel4 <- subset(kmlModels, nClusters == 4, drop = TRUE)","object_name_linter" +"vignettes/demo.Rmd",144,1,"style","Variable and function name style should be snake_case or symbols.","gbtmMethod <- lcMethodLcmmGBTM(fixed = Y ~ bs(Time), mixture = fixed)","object_name_linter" +"vignettes/demo.Rmd",151,1,"style","Variable and function name style should be snake_case or symbols.","gbtmMethods <- lcMethods(gbtmMethod, nClusters = 1:5)","object_name_linter" +"vignettes/demo.Rmd",153,1,"style","Variable and function name style should be snake_case or symbols.","gbtmModels <- latrendBatch(gbtmMethods, data = latrendData, verbose = FALSE)","object_name_linter" +"vignettes/demo.Rmd",162,1,"style","Variable and function name style should be snake_case or symbols.","bestGbtmModel <- subset(gbtmModels, nClusters == 3, drop=TRUE)","object_name_linter" +"vignettes/demo.Rmd",162,57,"style","Put spaces around all infix operators.","bestGbtmModel <- subset(gbtmModels, nClusters == 3, drop=TRUE)","infix_spaces_linter" +"vignettes/demo.Rmd",170,1,"style","Variable and function name style should be snake_case or symbols.","gmmMethod <- lcMethodLcmmGMM(fixed = Y ~ poly(Time, 2, raw = TRUE), mixture = fixed, idiag = TRUE)","object_name_linter" +"vignettes/demo.Rmd",170,81,"style","Lines should not be more than 80 characters.","gmmMethod <- lcMethodLcmmGMM(fixed = Y ~ poly(Time, 2, raw = TRUE), mixture = fixed, idiag = TRUE)","line_length_linter" +"vignettes/demo.Rmd",176,1,"style","Variable and function name style should be snake_case or symbols.","gmmMethods <- lcMethods(gmmMethod, nClusters = 1:5)","object_name_linter" +"vignettes/demo.Rmd",178,1,"style","Variable and function name style should be snake_case or symbols.","gmmModels <- latrendBatch(gmmMethods, latrendData, verbose = FALSE)","object_name_linter" +"vignettes/demo.Rmd",186,1,"style","Variable and function name style should be snake_case or symbols.","bestGmmModel <- subset(gmmModels, nClusters == 3, drop=TRUE)","object_name_linter" +"vignettes/demo.Rmd",186,55,"style","Put spaces around all infix operators.","bestGmmModel <- subset(gmmModels, nClusters == 3, drop=TRUE)","infix_spaces_linter" +"vignettes/demo.Rmd",207,43,"style","Only use double-quotes.","metric(list(bestGbtmModel, bestGmmModel), 'WMAE')","single_quotes_linter" +"vignettes/demo.Rmd",211,45,"style","Only use double-quotes.","externalMetric(bestGbtmModel, bestGmmModel, 'WMMAE')","single_quotes_linter" +"vignettes/demo.Rmd",216,45,"style","Only use double-quotes.","externalMetric(bestGbtmModel, bestGmmModel, 'adjustedRand')","single_quotes_linter" +"vignettes/demo.Rmd",230,1,"style","Variable and function name style should be snake_case or symbols.","refTrajAssigns <- aggregate(Class ~ Id, data = latrendData, FUN = data.table::first)","object_name_linter" +"vignettes/demo.Rmd",230,81,"style","Lines should not be more than 80 characters.","refTrajAssigns <- aggregate(Class ~ Id, data = latrendData, FUN = data.table::first)","line_length_linter" +"vignettes/demo.Rmd",231,1,"style","Variable and function name style should be snake_case or symbols.","refModel <- lcModelPartition(data = latrendData, response = ""Y"", trajectoryAssignments = refTrajAssigns$Class)","object_name_linter" +"vignettes/demo.Rmd",231,81,"style","Lines should not be more than 80 characters.","refModel <- lcModelPartition(data = latrendData, response = ""Y"", trajectoryAssignments = refTrajAssigns$Class)","line_length_linter" +"vignettes/implement.Rmd",22,23,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" +"vignettes/implement.Rmd",22,34,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" +"vignettes/implement.Rmd",22,41,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" +"vignettes/implement.Rmd",22,81,"style","Lines should not be more than 80 characters."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","line_length_linter" +"vignettes/implement.Rmd",47,23,"style","Trailing whitespace is superfluous."," latrend.id = ""Traj"", ","trailing_whitespace_linter" +"vignettes/implement.Rmd",57,21,"style","Trailing whitespace is superfluous."," sizes = c(40, 60), ","trailing_whitespace_linter" +"vignettes/implement.Rmd",61,20,"style","Trailing whitespace is superfluous."," cluster = ~ Time, ","trailing_whitespace_linter" +"vignettes/implement.Rmd",66,6,"style","Trailing whitespace is superfluous.",") %>% ","trailing_whitespace_linter" +"vignettes/implement.Rmd",107,20,"style","Trailing whitespace is superfluous."," factor(int > 1.7, ","trailing_whitespace_linter" +"vignettes/implement.Rmd",108,34,"style","Trailing whitespace is superfluous."," levels = c(FALSE, TRUE), ","trailing_whitespace_linter" +"vignettes/implement.Rmd",122,18,"style","Trailing whitespace is superfluous."," response = ""Y"", ","trailing_whitespace_linter" +"vignettes/implement.Rmd",123,33,"style","Trailing whitespace is superfluous."," stratify = Intercept[1] > 1.7, ","trailing_whitespace_linter" +"vignettes/implement.Rmd",135,1,"style","Variable and function name style should be snake_case or symbols.","repStep <- function(method, data, verbose) {","object_name_linter" +"vignettes/implement.Rmd",137,72,"warning","no visible binding for global variable β€˜Traj’"," coefdata <- dt[, lm(Y ~ Time, .SD) %>% coef() %>% as.list(), keyby = Traj]","object_usage_linter" +"vignettes/implement.Rmd",148,1,"style","Variable and function name style should be snake_case or symbols.","clusStep <- function(method, data, repMat, envir, verbose) {","object_name_linter" +"vignettes/implement.Rmd",148,36,"style","Variable and function name style should be snake_case or symbols.","clusStep <- function(method, data, repMat, envir, verbose) {","object_name_linter" +"vignettes/implement.Rmd",152,32,"style","Trailing whitespace is superfluous."," response = method$response, ","trailing_whitespace_linter" +"vignettes/implement.Rmd",154,17,"style","Trailing whitespace is superfluous."," data = data, ","trailing_whitespace_linter" +"vignettes/implement.Rmd",164,1,"style","Variable and function name style should be snake_case or symbols.","m.twostep <- lcMethodFeature(","object_name_linter" +"vignettes/implement.Rmd",165,18,"style","Trailing whitespace is superfluous."," response = ""Y"", ","trailing_whitespace_linter" +"vignettes/implement.Rmd",166,32,"style","Trailing whitespace is superfluous."," representationStep = repStep, ","trailing_whitespace_linter" +"vignettes/implement.Rmd",172,1,"style","Variable and function name style should be snake_case or symbols.","model.twostep <- latrend(m.twostep, data = casedata)","object_name_linter" +"vignettes/implement.Rmd",183,1,"style","Variable and function name style should be snake_case or symbols.","repStep.gen <- function(method, data, verbose) {","object_name_linter" +"vignettes/implement.Rmd",185,81,"style","Lines should not be more than 80 characters."," coefdata <- dt[, lm(method$formula, .SD) %>% coef() %>% as.list(), keyby = c(method$id)]","line_length_linter" +"vignettes/implement.Rmd",192,1,"style","Variable and function name style should be snake_case or symbols.","clusStep.gen <- function(method, data, repMat, envir, verbose) {","object_name_linter" +"vignettes/implement.Rmd",192,40,"style","Variable and function name style should be snake_case or symbols.","clusStep.gen <- function(method, data, repMat, envir, verbose) {","object_name_linter" +"vignettes/implement.Rmd",198,17,"style","Trailing whitespace is superfluous."," data = data, ","trailing_whitespace_linter" +"vignettes/implement.Rmd",208,1,"style","Variable and function name style should be snake_case or symbols.","m.twostepgen <- lcMethodFeature(","object_name_linter" +"vignettes/implement.Rmd",210,36,"style","Trailing whitespace is superfluous."," representationStep = repStep.gen, ","trailing_whitespace_linter" +"vignettes/implement.Rmd",217,1,"style","Variable and function name style should be snake_case or symbols.","model.twostepgen <- latrend(m.twostepgen, formula = Y ~ Time, nClusters = 2, casedata)","object_name_linter" +"vignettes/implement.Rmd",217,81,"style","Lines should not be more than 80 characters.","model.twostepgen <- latrend(m.twostepgen, formula = Y ~ Time, nClusters = 2, casedata)","line_length_linter" +"vignettes/implement.Rmd",235,1,"style","Variable and function name style should be snake_case or symbols.","lcMethodSimpleGBTM <- function(...) {","object_name_linter" +"vignettes/implement.Rmd",236,6,"style","Use <-, not =, for assignment."," mc = match.call()","assignment_linter" +"vignettes/implement.Rmd",237,12,"style","Use <-, not =, for assignment."," mc$Class = 'lcMethodSimpleGBTM'","assignment_linter" +"vignettes/implement.Rmd",237,14,"style","Only use double-quotes."," mc$Class = 'lcMethodSimpleGBTM'","single_quotes_linter" +"vignettes/implement.Rmd",254,43,"style","Trailing whitespace is superfluous.","setMethod(""getName"", ""lcMethodSimpleGBTM"", ","trailing_whitespace_linter" +"vignettes/implement.Rmd",264,81,"style","Lines should not be more than 80 characters.","setMethod(""prepareData"", ""lcMethodSimpleGBTM"", function(method, data, verbose, ...) {","line_length_linter" +"vignettes/implement.Rmd",274,81,"style","Lines should not be more than 80 characters.","setMethod(""fit"", ""lcMethodSimpleGBTM"", function(method, data, envir, verbose, ...) {","line_length_linter" +"vignettes/implement.Rmd",286,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/implement.Rmd",288,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/implement.Rmd",290,25,"style","Trailing whitespace is superfluous."," ""lcModelSimpleGBTM"", ","trailing_whitespace_linter" +"vignettes/implement.Rmd",315,81,"style","Lines should not be more than 80 characters.","fitted.lcModelSimpleGBTM <- function(object, clusters = trajectoryAssignments(object)) {","line_length_linter" +"vignettes/implement.Rmd",316,3,"style","Variable and function name style should be snake_case or symbols."," predNames <- paste0(""pred_m"", 1:nClusters(object))","object_name_linter" +"vignettes/implement.Rmd",317,3,"style","Variable and function name style should be snake_case or symbols."," predMat <- as.matrix(object@model$pred[predNames])","object_name_linter" +"vignettes/implement.Rmd",318,12,"style","Variable and function name style should be snake_case or symbols."," colnames(predMat) <- clusterNames(object)","object_name_linter" +"vignettes/implement.Rmd",326,38,"style","Only use double-quotes."," object, newdata, cluster, what = 'mu', ...)","single_quotes_linter" +"vignettes/implement.Rmd",327,1,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","{","brace_linter" +"vignettes/implement.Rmd",328,3,"style","Variable and function name style should be snake_case or symbols."," predMat = lcmm::predictY(object@model, newdata = newdata)$pred %>%","object_name_linter" +"vignettes/implement.Rmd",328,11,"style","Use <-, not =, for assignment."," predMat = lcmm::predictY(object@model, newdata = newdata)$pred %>%","assignment_linter" +"vignettes/implement.Rmd",331,3,"style","Variable and function name style should be snake_case or symbols."," clusIdx = match(cluster, clusterNames(object))","object_name_linter" +"vignettes/implement.Rmd",331,11,"style","Use <-, not =, for assignment."," clusIdx = match(cluster, clusterNames(object))","assignment_linter" +"vignettes/simulation.Rmd",23,23,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'simTool', 'dplyr', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" +"vignettes/simulation.Rmd",23,34,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'simTool', 'dplyr', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" +"vignettes/simulation.Rmd",23,45,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'simTool', 'dplyr', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" +"vignettes/simulation.Rmd",23,54,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'simTool', 'dplyr', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" +"vignettes/simulation.Rmd",23,81,"style","Lines should not be more than 80 characters."," eval = all(vapply(c('ggplot2', 'simTool', 'dplyr', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","line_length_linter" +"vignettes/simulation.Rmd",66,1,"style","Variable and function name style should be snake_case or symbols.","dataGen <- function(numTraj, ..., data.seed) {","object_name_linter" +"vignettes/simulation.Rmd",66,21,"style","Variable and function name style should be snake_case or symbols.","dataGen <- function(numTraj, ..., data.seed) {","object_name_linter" +"vignettes/simulation.Rmd",66,35,"style","Variable and function name style should be snake_case or symbols.","dataGen <- function(numTraj, ..., data.seed) {","object_name_linter" +"vignettes/simulation.Rmd",91,1,"style","Variable and function name style should be snake_case or symbols.","exampleData <- dataGen(numTraj = 200, randomScale = .1, data.seed = 1)","object_name_linter" +"vignettes/simulation.Rmd",101,1,"style","Variable and function name style should be snake_case or symbols.","dataGrid <- simTool::expand_tibble(","object_name_linter" +"vignettes/simulation.Rmd",118,1,"style","Variable and function name style should be snake_case or symbols.","kmlMethodGrid <- simTool::expand_tibble(","object_name_linter" +"vignettes/simulation.Rmd",134,1,"style","Variable and function name style should be snake_case or symbols.","fitGCKM <- function(type, ...) {","object_name_linter" +"vignettes/simulation.Rmd",139,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/simulation.Rmd",146,1,"style","Variable and function name style should be snake_case or symbols.","gckmMethodGrid <- simTool::expand_tibble(","object_name_linter" +"vignettes/simulation.Rmd",157,1,"style","Variable and function name style should be snake_case or symbols.","methodGrid <- dplyr::bind_rows(kmlMethodGrid, gckmMethodGrid)","object_name_linter" +"vignettes/simulation.Rmd",166,1,"style","Variable and function name style should be snake_case or symbols.","analyzeModel <- function(model) {","object_name_linter" +"vignettes/simulation.Rmd",168,3,"style","Variable and function name style should be snake_case or symbols."," refModel <- lcModelPartition(data, response = ""Y"", trajectoryAssignments = ""Class"")","object_name_linter" +"vignettes/simulation.Rmd",168,81,"style","Lines should not be more than 80 characters."," refModel <- lcModelPartition(data, response = ""Y"", trajectoryAssignments = ""Class"")","line_length_linter" +"vignettes/simulation.Rmd",169,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/simulation.Rmd",182,24,"style","Trailing whitespace is superfluous."," data_grid = dataGrid, ","trailing_whitespace_linter" +"vignettes/simulation.Rmd",196,1,"style","Variable and function name style should be snake_case or symbols.","resultsTable <- as.data.table(result$simulation)","object_name_linter" +"vignettes/simulation.Rmd",204,81,"style","Lines should not be more than 80 characters.","resultsTable[, .(K = nClusters[which.min(BIC)]), keyby = .(numTraj, randomScales, data.seed, method)]","line_length_linter" +"vignettes/simulation.Rmd",213,81,"style","Lines should not be more than 80 characters.","resultsTable[nClusters > 1, .(ARI = mean(ARI)), keyby = .(nClusters, numTraj, randomScales, method)]","line_length_linter" +"vignettes/simulation.Rmd",217,81,"style","Lines should not be more than 80 characters.","resultsTable[nClusters > 1, .(ARI = mean(ARI)), keyby = .(randomScales, nClusters, method)]","line_length_linter" +"vignettes/simulation.Rmd",225,81,"style","Lines should not be more than 80 characters.","resultsTable[randomScales == .1, .(WMAE = mean(WMAE)), keyby = .(nClusters, method)]","line_length_linter" +"vignettes/validation.Rmd",29,23,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'mclustcomp', 'caret'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" +"vignettes/validation.Rmd",29,34,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'mclustcomp', 'caret'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" +"vignettes/validation.Rmd",29,41,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'mclustcomp', 'caret'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" +"vignettes/validation.Rmd",29,55,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'mclustcomp', 'caret'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" +"vignettes/validation.Rmd",29,81,"style","Lines should not be more than 80 characters."," eval = all(vapply(c('ggplot2', 'kml', 'mclustcomp', 'caret'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","line_length_linter" +"vignettes/validation.Rmd",64,1,"style","Variable and function name style should be snake_case or symbols.","repModels <- latrendRep(kml, data = latrendData, .rep=10)","object_name_linter" +"vignettes/validation.Rmd",64,54,"style","Put spaces around all infix operators.","repModels <- latrendRep(kml, data = latrendData, .rep=10)","infix_spaces_linter" +"vignettes/validation.Rmd",69,1,"style","Variable and function name style should be snake_case or symbols.","repSelfMetrics <- metric(repModels, name = c(""BIC"", ""WMAE"", ""APPA""))","object_name_linter" +"vignettes/validation.Rmd",81,1,"style","Variable and function name style should be snake_case or symbols.","bestRepModel <- min(repModels, ""BIC"")","object_name_linter" +"vignettes/validation.Rmd",88,1,"style","Variable and function name style should be snake_case or symbols.","simMat <- externalMetric(repModels, name = ""adjustedRand"")","object_name_linter" +"vignettes/validation.Rmd",98,1,"style","Variable and function name style should be snake_case or symbols.","bootModels <- latrendBoot(kml, data = latrendData, samples = 10)","object_name_linter" +"vignettes/validation.Rmd",103,1,"style","Variable and function name style should be snake_case or symbols.","bootMetrics <- metric(bootModels, name = c(""BIC"", ""WMAE"", ""APPA""))","object_name_linter" +"vignettes/validation.Rmd",119,1,"style","Variable and function name style should be snake_case or symbols.","trainModels <- latrendCV(kml, data = latrendData, folds = 10, seed = 1)","object_name_linter" +"vignettes/validation.Rmd",127,1,"style","Variable and function name style should be snake_case or symbols.","dataFolds <- createTrainDataFolds(latrendData, folds = 10)","object_name_linter" +"vignettes/validation.Rmd",128,1,"style","Variable and function name style should be snake_case or symbols.","foldModels <- latrendBatch(kml, data = dataFolds)","object_name_linter" +"vignettes/validation.Rmd",133,1,"style","Variable and function name style should be snake_case or symbols.","testDataFolds <- createTestDataFolds(latrendData, dataFolds)","object_name_linter" diff --git a/.dev/revdep_emails/latrend/email-body b/.dev/revdep_emails/latrend/email-body new file mode 100644 index 000000000..2823e1538 --- /dev/null +++ b/.dev/revdep_emails/latrend/email-body @@ -0,0 +1,27 @@ +Hello Niek Den Teuling! Thank you for using {lintr} in your package {latrend}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/philips-software/latrend using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 139s on CRAN vs. 89s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/lifecycle/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/lifecycle/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..7733b67eb --- /dev/null +++ b/.dev/revdep_emails/lifecycle/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,5 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/aaa.R",6,6,"style","Variable and function name style should be snake_case."," ns$.__rlang_hook__. <- c(ns$.__rlang_hook__., list(callback))","object_name_linter" +"R/aaa.R",21,6,"style","Variable and function name style should be snake_case."," ns$.__rlang_hook__. <- NULL","object_name_linter" +"R/lifecycle-package.R",11,1,"style","Variable and function name style should be snake_case.",".onLoad <- function(lib, pkg) {","object_name_linter" +"R/warning.R",48,1,"style","Variable and function names should not be longer than 30 characters.","conditionMessage.lifecycle_warning_deprecated <- function(c) {","object_length_linter" diff --git a/.dev/revdep_emails/lifecycle/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/lifecycle/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..080c856e1 --- /dev/null +++ b/.dev/revdep_emails/lifecycle/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,24 @@ +"filename","line_number","column_number","type","message","line","linter" +"vignettes/communicate.Rmd",70,3,"style","Trailing whitespace is superfluous.","#' ","trailing_whitespace_linter" +"vignettes/communicate.Rmd",73,3,"style","Trailing whitespace is superfluous.","#' ","trailing_whitespace_linter" +"vignettes/communicate.Rmd",81,13,"style","Trailing whitespace is superfluous.","#' @examples ","trailing_whitespace_linter" +"vignettes/communicate.Rmd",118,13,"style","Trailing whitespace is superfluous."," ""1.0.0"", ","trailing_whitespace_linter" +"vignettes/communicate.Rmd",119,17,"style","Trailing whitespace is superfluous."," ""add_two()"", ","trailing_whitespace_linter" +"vignettes/communicate.Rmd",186,3,"style","Trailing whitespace is superfluous.","#' ","trailing_whitespace_linter" +"vignettes/communicate.Rmd",187,16,"style","Trailing whitespace is superfluous.","#' @description ","trailing_whitespace_linter" +"vignettes/communicate.Rmd",189,3,"style","Trailing whitespace is superfluous.","#' ","trailing_whitespace_linter" +"vignettes/communicate.Rmd",227,3,"style","Trailing whitespace is superfluous.","#' ","trailing_whitespace_linter" +"vignettes/communicate.Rmd",274,27,"style","Variable and function name style should be snake_case or symbols.","add_two <- function(x, y, na.rm = TRUE) {","object_name_linter" +"vignettes/communicate.Rmd",290,27,"style","Variable and function name style should be snake_case or symbols.","add_two <- function(x, y, na.rm = TRUE) {","object_name_linter" +"vignettes/communicate.Rmd",293,22,"style","Trailing whitespace is superfluous."," when = ""1.0.0"", ","trailing_whitespace_linter" +"vignettes/communicate.Rmd",295,81,"style","Lines should not be more than 80 characters."," details = ""Ability to retain missing values will be dropped in next release.""","line_length_linter" +"vignettes/communicate.Rmd",298,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/communicate.Rmd",313,27,"style","Variable and function name style should be snake_case or symbols.","add_two <- function(x, y, na.rm = deprecated()) {","object_name_linter" +"vignettes/communicate.Rmd",316,22,"style","Trailing whitespace is superfluous."," when = ""1.0.0"", ","trailing_whitespace_linter" +"vignettes/communicate.Rmd",318,81,"style","Lines should not be more than 80 characters."," details = ""Ability to retain missing values will be dropped in next release.""","line_length_linter" +"vignettes/communicate.Rmd",321,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/communicate.Rmd",340,41,"style","Variable and function name style should be snake_case or symbols.","add_two <- function(x, y, na_rm = TRUE, na.rm = deprecated()) {","object_name_linter" +"vignettes/communicate.Rmd",345,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/manage.Rmd",36,81,"style","Lines should not be more than 80 characters.","#> Call `lifecycle::last_lifecycle_warnings()` to see where this warning was generated.","line_length_linter" +"vignettes/stages.Rmd",57,81,"style","Lines should not be more than 80 characters.","#> Call `lifecycle::last_lifecycle_warnings()` to see where this warning was generated. ","line_length_linter" +"vignettes/stages.Rmd",57,88,"style","Trailing whitespace is superfluous.","#> Call `lifecycle::last_lifecycle_warnings()` to see where this warning was generated. ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/lifecycle/email-body b/.dev/revdep_emails/lifecycle/email-body new file mode 100644 index 000000000..d7e11d4bd --- /dev/null +++ b/.dev/revdep_emails/lifecycle/email-body @@ -0,0 +1,27 @@ +Hello Lionel Henry! Thank you for using {lintr} in your package {lifecycle}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/r-lib/lifecycle using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 11s on CRAN vs. 8s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/lightgbm/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/lightgbm/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..9ad81cde0 --- /dev/null +++ b/.dev/revdep_emails/lightgbm/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,14 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/callback.R",27,1,"style","Variable and function name style should be snake_case.","format.eval.string <- function(eval_res, eval_err) {","object_name_linter" +"R/callback.R",43,1,"style","Variable and function name style should be snake_case.","merge.eval.string <- function(env) {","object_name_linter" +"R/lgb.Booster.R",805,1,"style","Variable and function name style should be snake_case.","predict.lgb.Booster <- function(object,","object_name_linter" +"R/lgb.Booster.R",853,1,"style","Variable and function name style should be snake_case.","print.lgb.Booster <- function(x, ...) {","object_name_linter" +"R/lgb.Booster.R",902,1,"style","Variable and function name style should be snake_case.","summary.lgb.Booster <- function(object, ...) {","object_name_linter" +"R/lgb.Dataset.R",956,1,"style","Variable and function name style should be snake_case.","dim.lgb.Dataset <- function(x) {","object_name_linter" +"R/lgb.Dataset.R",991,1,"style","Variable and function name style should be snake_case.","dimnames.lgb.Dataset <- function(x) {","object_name_linter" +"R/lgb.Dataset.R",1004,1,"style","Variable and function name style should be snake_case.","`dimnames<-.lgb.Dataset` <- function(x, value) {","object_name_linter" +"R/lgb.Dataset.R",1064,1,"style","Variable and function name style should be snake_case.","slice.lgb.Dataset <- function(dataset, idxset) {","object_name_linter" +"R/lgb.Dataset.R",1111,1,"style","Variable and function name style should be snake_case.","get_field.lgb.Dataset <- function(dataset, field_name) {","object_name_linter" +"R/lgb.Dataset.R",1160,1,"style","Variable and function name style should be snake_case.","set_field.lgb.Dataset <- function(dataset, field_name, data) {","object_name_linter" +"tests/testthat/test_lgb.interprete.R",71,10,"style","Variable and function name style should be snake_case."," iris$Species <- as.numeric(as.factor(iris$Species)) - 1L","object_name_linter" +"tests/testthat/test_lgb.plot.interpretation.R",69,10,"style","Variable and function name style should be snake_case."," iris$Species <- as.numeric(as.factor(iris$Species)) - 1L","object_name_linter" diff --git a/.dev/revdep_emails/lightgbm/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/lightgbm/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..1111460de --- /dev/null +++ b/.dev/revdep_emails/lightgbm/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,67 @@ +"filename","line_number","column_number","type","message","line","linter" +"demo/basic_walkthrough.R",11,81,"style","Lines should not be more than 80 characters.","# The loaded data is stored in sparseMatrix, and label is a numeric vector in {0,1}","line_length_linter" +"demo/basic_walkthrough.R",25,81,"style","Lines should not be more than 80 characters.","# Note: we are putting in sparse matrix here, lightgbm naturally handles sparse input","line_length_linter" +"demo/basic_walkthrough.R",26,81,"style","Lines should not be more than 80 characters.","# Use sparse matrix when your feature is sparse (e.g. when you are using one-hot encoding vector)","line_length_linter" +"demo/basic_walkthrough.R",44,81,"style","Lines should not be more than 80 characters.","# You can also put in lgb.Dataset object, which stores label, data and other meta datas needed for advanced features","line_length_linter" +"demo/basic_walkthrough.R",82,81,"style","Lines should not be more than 80 characters.","# Since we do not have this file with us, the following line is just for illustration","line_length_linter" +"demo/basic_walkthrough.R",84,7,"style","Commented code should be removed.","# data = ""agaricus.train.svm""","commented_code_linter" +"demo/basic_walkthrough.R",111,81,"style","Lines should not be more than 80 characters.","dtrain <- lgb.Dataset(data = train$data, label = train$label, free_raw_data = FALSE)","line_length_linter" +"demo/boost_from_prediction.R",8,81,"style","Lines should not be more than 80 characters.","dtest <- lgb.Dataset.create.valid(dtrain, data = agaricus.test$data, label = agaricus.test$label)","line_length_linter" +"demo/boost_from_prediction.R",24,81,"style","Lines should not be more than 80 characters.","# Note: we need the margin value instead of transformed prediction in set_init_score","line_length_linter" +"demo/categorical_features_rules.R",58,81,"style","Lines should not be more than 80 characters.","bank_test <- lgb.convert_with_rules(data = bank_test, rules = bank_rules$rules)$data","line_length_linter" +"demo/categorical_features_rules.R",70,81,"style","Lines should not be more than 80 characters.","# The categorical features can be passed to lgb.train to not copy and paste a lot","line_length_linter" +"demo/cross_validation.R",7,81,"style","Lines should not be more than 80 characters.","dtest <- lgb.Dataset.create.valid(dtrain, data = agaricus.test$data, label = agaricus.test$label)","line_length_linter" +"demo/cross_validation.R",52,81,"style","Lines should not be more than 80 characters.","# User-defined evaluation function returns a pair (metric_name, result, higher_better)","line_length_linter" +"demo/cross_validation.R",53,81,"style","Lines should not be more than 80 characters.","# NOTE: when you do customized loss function, the default prediction value is margin","line_length_linter" +"demo/cross_validation.R",55,81,"style","Lines should not be more than 80 characters.","# For example, we are doing logistic loss, the prediction is score before logistic transformation","line_length_linter" +"demo/cross_validation.R",56,81,"style","Lines should not be more than 80 characters.","# Keep this in mind when you use the customization, and maybe you need write customized evaluation function","line_length_linter" +"demo/early_stopping.R",9,81,"style","Lines should not be more than 80 characters.","dtest <- lgb.Dataset.create.valid(dtrain, data = agaricus.test$data, label = agaricus.test$label)","line_length_linter" +"demo/early_stopping.R",21,81,"style","Lines should not be more than 80 characters.","# User define objective function, given prediction, return gradient and second order gradient","line_length_linter" +"demo/early_stopping.R",31,81,"style","Lines should not be more than 80 characters.","# User-defined evaluation function returns a pair (metric_name, result, higher_better)","line_length_linter" +"demo/early_stopping.R",32,81,"style","Lines should not be more than 80 characters.","# NOTE: when you do customized loss function, the default prediction value is margin","line_length_linter" +"demo/early_stopping.R",34,81,"style","Lines should not be more than 80 characters.","# For example, we are doing logistic loss, the prediction is score before logistic transformation","line_length_linter" +"demo/early_stopping.R",36,81,"style","Lines should not be more than 80 characters.","# Keep this in mind when you use the customization, and maybe you need write customized evaluation function","line_length_linter" +"demo/efficient_many_training.R",2,81,"style","Lines should not be more than 80 characters.","# In the case of many trainings (like 100+ models), RAM will be eaten very quickly","line_length_linter" +"demo/efficient_many_training.R",5,81,"style","Lines should not be more than 80 characters.","# More results can be found here: https://github.com/microsoft/LightGBM/issues/879#issuecomment-326656580","line_length_linter" +"demo/efficient_many_training.R",7,81,"style","Lines should not be more than 80 characters.","# With reset=FALSE you get after 500 iterations (not 1000): OS reports 27GB usage, while R gc() reports 1.5GB.","line_length_linter" +"demo/efficient_many_training.R",9,81,"style","Lines should not be more than 80 characters.","# Doing reset=TRUE and calling gc() in the loop will have OS 1.3GB. Thanks for the latest tip.""","line_length_linter" +"demo/efficient_many_training.R",16,81,"style","Lines should not be more than 80 characters.","x_data <- matrix(rnorm(n = 100000000L, mean = 0.0, sd = 100.0), nrow = 1000000L, ncol = 100L)","line_length_linter" +"demo/efficient_many_training.R",23,81,"style","Lines should not be more than 80 characters.","# Loop through a training of 1000 models, please check your RAM on your task manager","line_length_linter" +"demo/leaf_stability.R",1,81,"style","Lines should not be more than 80 characters.","# We are going to look at how iterating too much might generate observation instability.","line_length_linter" +"demo/leaf_stability.R",9,81,"style","Lines should not be more than 80 characters.","# output of `RColorBrewer::brewer.pal(10, ""RdYlGn"")`, hardcooded here to avoid a dependency","line_length_linter" +"demo/leaf_stability.R",108,3,"style","Commented code should be removed.","# Z = logloss","commented_code_linter" +"demo/leaf_stability.R",124,81,"style","Lines should not be more than 80 characters.","new_data$Z <- -1.0 * (agaricus.test$label * log(new_data$Y) + (1L - agaricus.test$label) * log(1L - new_data$Y))","line_length_linter" +"demo/leaf_stability.R",140,81,"style","Lines should not be more than 80 characters.","# On the second plot, we clearly notice the lower the bin (the lower the leaf value), the higher the loss","line_length_linter" +"demo/leaf_stability.R",178,81,"style","Lines should not be more than 80 characters.","new_data2$Z <- -1.0 * (agaricus.test$label * log(new_data2$Y) + (1L - agaricus.test$label) * log(1L - new_data2$Y))","line_length_linter" +"demo/leaf_stability.R",194,81,"style","Lines should not be more than 80 characters.","# On the second plot, we clearly notice the lower the bin (the lower the leaf value), the higher the loss","line_length_linter" +"demo/leaf_stability.R",195,81,"style","Lines should not be more than 80 characters.","# On the third plot, it is clearly not smooth! We are severely overfitting the data, but the rules are","line_length_linter" +"demo/leaf_stability.R",234,81,"style","Lines should not be more than 80 characters.","new_data3$Z <- -1.0 * (agaricus.test$label * log(new_data3$Y) + (1L - agaricus.test$label) * log(1L - new_data3$Y))","line_length_linter" +"demo/leaf_stability.R",250,81,"style","Lines should not be more than 80 characters.","# On the third plot, it is clearly not smooth! We are severely overfitting the data, but the rules","line_length_linter" +"demo/leaf_stability.R",252,81,"style","Lines should not be more than 80 characters.","# However, if the rules were not true, the loss would explode. See the sudden spikes?","line_length_linter" +"demo/multiclass_custom_objective.R",17,81,"style","Lines should not be more than 80 characters.","dtest <- lgb.Dataset.create.valid(dtrain, data = test[, 1L:4L], label = test[, 5L])","line_length_linter" +"demo/multiclass_custom_objective.R",44,81,"style","Lines should not be more than 80 characters.","# User defined objective function, given prediction, return gradient and second order gradient","line_length_linter" +"demo/multiclass_custom_objective.R",48,81,"style","Lines should not be more than 80 characters."," # preds is a matrix with rows corresponding to samples and columns corresponding to choices","line_length_linter" +"demo/multiclass.R",17,81,"style","Lines should not be more than 80 characters.","dtest <- lgb.Dataset.create.valid(dtrain, data = test[, 1L:4L], label = test[, 5L])","line_length_linter" +"demo/multiclass.R",37,81,"style","Lines should not be more than 80 characters.","# Order: obs1 class1, obs1 class2, obs1 class3, obs2 class1, obs2 class2, obs2 class3...","line_length_linter" +"demo/weight_param.R",9,81,"style","Lines should not be more than 80 characters.","# - Run 1: sum of weights equal to 6513 (x 1e-5) without adjusted regularization (not learning)","line_length_linter" +"demo/weight_param.R",10,81,"style","Lines should not be more than 80 characters.","# - Run 2: sum of weights equal to 6513 (x 1e-5) adjusted regularization (learning)","line_length_linter" +"demo/weight_param.R",23,81,"style","Lines should not be more than 80 characters.","dtest <- lgb.Dataset.create.valid(dtrain, test$data, label = test$label, weight = weights2)","line_length_linter" +"demo/weight_param.R",26,81,"style","Lines should not be more than 80 characters.","# Run 1: sum of weights equal to 6513 (x 1e-5) without adjusted regularization (not learning)","line_length_linter" +"demo/weight_param.R",28,81,"style","Lines should not be more than 80 characters.","# min_sum_hessian alone is bigger than the sum of weights, thus you will never learn anything","line_length_linter" +"demo/weight_param.R",50,81,"style","Lines should not be more than 80 characters.","# Run 2: sum of weights equal to 6513 (x 1e-5) with adjusted regularization (learning)","line_length_linter" +"demo/weight_param.R",51,81,"style","Lines should not be more than 80 characters.","# Adjusted regularization just consisting in multiplicating results by 1e4 (x10000)","line_length_linter" +"demo/weight_param.R",52,81,"style","Lines should not be more than 80 characters.","# Notice how it learns, there is no issue as we adjusted regularization ourselves","line_length_linter" +"inst/make-r-def.R",49,22,"warning","no visible global function definition for β€˜shoQuote’"," , args = shoQuote(args)","object_usage_linter" +"R/aliases.R",50,13,"warning","no visible binding for global variable β€˜LGBM_DumpParamAliases_R’"," LGBM_DumpParamAliases_R","object_usage_linter" +"R/lgb.cv.R",288,14,"warning","no visible global function definition for β€˜cb_early_stop’"," , cb = cb_early_stop(","object_usage_linter" +"R/lgb.cv.R",583,7,"style","Variable and function name style should be snake_case or symbols."," foldVector[y == dimnames(numInClass)$y[i]] <- sample(seqVector)","object_name_linter" +"R/lgb.train.R",253,14,"warning","no visible global function definition for β€˜cb_early_stop’"," , cb = cb_early_stop(","object_usage_linter" +"tests/testthat/test_basic.R",1758,10,"style","Variable and function name style should be snake_case or symbols."," mode(X) <- data_mode","object_name_linter" +"tests/testthat/test_basic.R",2591,5,"style","Variable and function name style should be snake_case or symbols."," X[, 1L] <- rnorm(100L)","object_name_linter" +"tests/testthat/test_basic.R",2592,5,"style","Variable and function name style should be snake_case or symbols."," X[, 2L] <- sample(seq_len(4L), size = 100L, replace = TRUE)","object_name_linter" +"tests/testthat/test_Predictor.R",51,18,"style","Variable and function name style should be snake_case or symbols."," storage.mode(X_double) <- ""double""","object_name_linter" +"tests/testthat/test_Predictor.R",310,15,"style","Variable and function name style should be snake_case or symbols."," row.names(Xcopy) <- NULL","object_name_linter" +"tests/testthat/test_Predictor.R",327,15,"style","Variable and function name style should be snake_case or symbols."," row.names(Xcopy) <- NULL","object_name_linter" +"tests/testthat/test_Predictor.R",358,15,"style","Variable and function name style should be snake_case or symbols."," row.names(X) <- paste(""rname"", seq(1L, nrow(X)), sep = """")","object_name_linter" +"tests/testthat/test_Predictor.R",373,15,"style","Variable and function name style should be snake_case or symbols."," row.names(X) <- paste(""rname"", seq(1L, nrow(X)), sep = """")","object_name_linter" +"vignettes/basic_walkthrough.Rmd",59,1,"style","Variable and function name style should be snake_case or symbols.","X <- data.matrix(bank[, c(""age"", ""balance"")])","object_name_linter" diff --git a/.dev/revdep_emails/lightgbm/email-body b/.dev/revdep_emails/lightgbm/email-body new file mode 100644 index 000000000..f3b0cdb25 --- /dev/null +++ b/.dev/revdep_emails/lightgbm/email-body @@ -0,0 +1,27 @@ +Hello Yu Shi! Thank you for using {lintr} in your package {lightgbm}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/microsoft/LightGBM using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 72s on CRAN vs. 38s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/mlflow/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/mlflow/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..9386eedd9 --- /dev/null +++ b/.dev/revdep_emails/mlflow/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,3 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/tracking-rest.R",34,13,"style","Variable and function name style should be snake_case."," headers$Authorization <- auth_header","object_name_linter" +"R/tracking-rest.R",36,11,"style","Variable and function name style should be snake_case."," headers$`User-Agent` <- paste(""mlflow-r-client"", utils::packageVersion(""mlflow""), sep = ""/"")","object_name_linter" diff --git a/.dev/revdep_emails/mlflow/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/mlflow/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..6262bcd68 --- /dev/null +++ b/.dev/revdep_emails/mlflow/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,12 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/model.R",39,12,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," tryCatch({ mlflow_record_logged_model(model_spec) }, error = function(e) {","brace_linter" +"R/model.R",198,47,"style","Put spaces around all infix operators.","parse_json <- function(input_path, json_format=""split"") {","infix_spaces_linter" +"R/project-param.R",54,13,"style","Any function spanning multiple lines should use curly braces."," error = function(e) stop(""`default` value for `"", name, ""` cannot be casted to type "",","brace_linter" +"R/project-param.R",60,13,"style","Any function spanning multiple lines should use curly braces."," error = function(e) stop(""Provided value for `"", name,","brace_linter" +"R/project-param.R",76,9,"style","Compound semicolons are discouraged. Replace them by a newline."," i <- 0; n <- length(arguments)","semicolon_linter" +"R/tracking-observer.R",41,31,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," error = function(e) { }","brace_linter" +"R/tracking-observer.R",41,33,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," error = function(e) { }","brace_linter" +"R/tracking-rest.R",50,49,"style","Put spaces around all infix operators."," max_rate_limit_interval=60) {","infix_spaces_linter" +"tests/testthat/test-databricks-utils.R",35,66,"style","Any function spanning multiple lines should use curly braces."," with_mock(.env = ""mlflow"", get_databricks_config_for_profile = function(profile) list(","brace_linter" +"tests/testthat/test-databricks-utils.R",187,42,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," assign("".get_job_info"", function() { job_info }, envir = databricks_internal_env)","brace_linter" +"tests/testthat/test-ui.R",12,3,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","brace_linter" diff --git a/.dev/revdep_emails/mlflow/attachments/mlflow.warnings b/.dev/revdep_emails/mlflow/attachments/mlflow.warnings new file mode 100644 index 000000000..e85af501f --- /dev/null +++ b/.dev/revdep_emails/mlflow/attachments/mlflow.warnings @@ -0,0 +1,2 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Trying to remove β€˜closed_curly_linter’, β€˜open_curly_linter’ and β€˜absolute_paths_linter’, which are not in `defaults`. diff --git a/.dev/revdep_emails/mlflow/email-body b/.dev/revdep_emails/mlflow/email-body new file mode 100644 index 000000000..89ff5dde4 --- /dev/null +++ b/.dev/revdep_emails/mlflow/email-body @@ -0,0 +1,27 @@ +Hello Matei Zaharia! Thank you for using {lintr} in your package {mlflow}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/mlflow/mlflow using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 29s on CRAN vs. 19s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/mlr/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/mlr/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..52bb8b49d --- /dev/null +++ b/.dev/revdep_emails/mlr/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,152 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/analyzeFeatSelResult.R",49,6,"style","Variable and function name style should be snake_case or CamelCase."," df$n.feats = rowSums(df[, features, drop = FALSE])","object_name_linter" +"R/BaggingWrapper.R",50,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$bw.iters = bw.iters","object_name_linter" +"R/BaggingWrapper.R",54,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$bw.replace = bw.replace","object_name_linter" +"R/BaggingWrapper.R",58,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$bw.size = bw.size","object_name_linter" +"R/BaggingWrapper.R",62,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$bw.feats = bw.feats","object_name_linter" +"R/BaseEnsemble_operators.R",69,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$base.learners = lapply(lrn$base.learners, setPredictType, predict.type = predict.type)","object_name_linter" +"R/BaseEnsemble.R",66,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$base.learners = setNames(base.learners, ids)","object_name_linter" +"R/BaseEnsemble.R",67,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$par.set.bls = par.set.bls","object_name_linter" +"R/BaseEnsemble.R",68,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$par.set.ens = par.set","object_name_linter" +"R/BaseWrapper_operators.R",2,1,"style","Variable and function name style should be snake_case or CamelCase.","getParamSet.BaseWrapper = function(x) {","object_name_linter" +"R/BaseWrapper.R",41,11,"style","Variable and function name style should be snake_case or CamelCase."," learner$fix.factors.prediction = FALSE","object_name_linter" +"R/BaseWrapper.R",43,11,"style","Variable and function name style should be snake_case or CamelCase."," learner$model.subclass = model.subclass","object_name_linter" +"R/BenchmarkResultOrderLevels.R",11,8,"style","Variable and function name style should be snake_case or CamelCase."," df$task.id = factor(df$task.id, order.tsks)","object_name_linter" +"R/BenchmarkResultOrderLevels.R",26,8,"style","Variable and function name style should be snake_case or CamelCase."," df$learner.id = factor(df$learner.id, order.lrns)","object_name_linter" +"R/calculateConfusionMatrix.R",118,12,"style","Variable and function name style should be snake_case or CamelCase."," result$relative.row = result.rel.row","object_name_linter" +"R/calculateConfusionMatrix.R",119,12,"style","Variable and function name style should be snake_case or CamelCase."," result$relative.col = result.rel.col","object_name_linter" +"R/calculateConfusionMatrix.R",120,12,"style","Variable and function name style should be snake_case or CamelCase."," result$relative.error = result$result[k + 1, k + 1] / n.pred","object_name_linter" +"R/ClassifTask.R",36,8,"style","Variable and function name style should be snake_case or CamelCase."," task$task.desc = makeClassifTaskDesc(id, data, target, weights, blocking, positive, coordinates)","object_name_linter" +"R/ClusterTask.R",16,8,"style","Variable and function name style should be snake_case or CamelCase."," task$task.desc = makeClusterTaskDesc(id, data, weights, blocking, coordinates)","object_name_linter" +"R/CostSensTask.R",45,8,"style","Variable and function name style should be snake_case or CamelCase."," task$task.desc = makeCostSensTaskDesc(id, data, target, blocking, costs, coordinates)","object_name_linter" +"R/CostSensWeightedPairsWrapper.R",61,15,"style","Variable and function name style should be snake_case or CamelCase."," feats$..y.. = y","object_name_linter" +"R/createSpatialResamplingPlots.R",153,5,"style","Variable and function name style should be snake_case or CamelCase."," length.n.resamp = length(resample)","object_name_linter" +"R/createSpatialResamplingPlots.R",160,3,"style","Variable and function name style should be snake_case or CamelCase."," plot.list.out.all = lapply(resample, function(r) {","object_name_linter" +"R/createSpatialResamplingPlots.R",171,5,"style","Variable and function name style should be snake_case or CamelCase."," plot.list.out = imap(plot.list, function(.x, .y) {","object_name_linter" +"R/downsample.R",37,7,"style","Variable and function name style should be snake_case or CamelCase."," obj$train.inds = lapply(obj$train.inds, function(x) sample(x, size = length(x) * perc))","object_name_linter" +"R/DownsampleWrapper.R",26,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$dw.perc = dw.perc","object_name_linter" +"R/DownsampleWrapper.R",30,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$dw.stratify = dw.stratify","object_name_linter" +"R/DownsampleWrapper.R",55,5,"style","Variable and function name style should be snake_case or CamelCase."," m$train.task = .task","object_name_linter" +"R/extractFDAFeatures.R",89,8,"style","Variable and function name style should be snake_case or CamelCase."," desc$extractFDAFeat = Map(function(x) {","object_name_linter" +"R/extractFDAFeatures.R",102,8,"style","Variable and function name style should be snake_case or CamelCase."," desc$fd.cols = names(desc$extractFDAFeat)","object_name_linter" +"R/extractFDAFeatures.R",115,8,"style","Variable and function name style should be snake_case or CamelCase."," desc$extractFDAFeat = extracts","object_name_linter" +"R/FeatSelWrapper.R",71,5,"style","Variable and function name style should be snake_case or CamelCase."," x$opt.result = or","object_name_linter" +"R/FilterWrapper.R",168,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$more.args = ddd","object_name_linter" +"R/getHyperPars.R",43,26,"style","Variable and function name style should be snake_case or CamelCase."," learner$par.set$pars$fw.base.methods = NULL","object_name_linter" +"R/getHyperPars.R",44,26,"style","Variable and function name style should be snake_case or CamelCase."," learner$par.set$pars$fw.method = NULL","object_name_linter" +"R/getHyperPars.R",45,22,"style","Variable and function name style should be snake_case or CamelCase."," learner$par.vals$fw.method = NULL","object_name_linter" +"R/getHyperPars.R",46,22,"style","Variable and function name style should be snake_case or CamelCase."," learner$par.vals$fw.base.methods = NULL","object_name_linter" +"R/getHyperPars.R",49,39,"style","Variable and function name style should be snake_case or CamelCase."," learner$next.learner$par.set$pars$fw.base.methods = NULL","object_name_linter" +"R/getHyperPars.R",50,39,"style","Variable and function name style should be snake_case or CamelCase."," learner$next.learner$par.set$pars$fw.method = NULL","object_name_linter" +"R/getHyperPars.R",51,35,"style","Variable and function name style should be snake_case or CamelCase."," learner$next.learner$par.vals$fw.method = NULL","object_name_linter" +"R/getHyperPars.R",52,35,"style","Variable and function name style should be snake_case or CamelCase."," learner$next.learner$par.vals$fw.base.methods = NULL","object_name_linter" +"R/getMultilabelBinaryPerformances.R",39,20,"style","Variable and function name style should be snake_case or CamelCase."," predi$data$prob.TRUE = probs[, label]","object_name_linter" +"R/getParamSet.R",13,1,"style","Variable and function name style should be snake_case or CamelCase.","getParamSet.Learner = function(x) {","object_name_linter" +"R/getParamSet.R",18,1,"style","Variable and function name style should be snake_case or CamelCase.","getParamSet.character = function(x) {","object_name_linter" +"R/Impute.R",179,8,"style","Variable and function name style should be snake_case or CamelCase."," desc$recode.factor.levels = recode.factor.levels","object_name_linter" +"R/Impute.R",180,8,"style","Variable and function name style should be snake_case or CamelCase."," desc$impute.new.levels = impute.new.levels","object_name_linter" +"R/logFunOpt.R",9,5,"style","Variable and function name style should be snake_case or CamelCase."," start.time = Sys.time()","object_name_linter" +"R/logFunOpt.R",13,5,"style","Variable and function name style should be snake_case or CamelCase."," end.time = Sys.time()","object_name_linter" +"R/logFunOpt.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," start.time = Sys.time()","object_name_linter" +"R/logFunOpt.R",35,5,"style","Variable and function name style should be snake_case or CamelCase."," end.time = Sys.time()","object_name_linter" +"R/makeLearner.R",173,6,"style","Variable and function name style should be snake_case or CamelCase."," wl$fix.factors.prediction = fix.factors.prediction","object_name_linter" +"R/Measure_operators.R",22,11,"style","Variable and function name style should be snake_case or CamelCase."," measure$extra.args = insert(measure$extra.args, insert(par.vals, args))","object_name_linter" +"R/ModelMultiplexer.R",93,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$par.set = c(lrn$par.set, ps)","object_name_linter" +"R/ModelMultiplexer.R",94,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$par.set.ens = ps","object_name_linter" +"R/ModelMultiplexer.R",95,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$fix.factors.prediction = TRUE","object_name_linter" +"R/MultilabelNestedStackingWrapper.R",37,5,"style","Variable and function name style should be snake_case or CamelCase."," x$cv.folds = cv.folds","object_name_linter" +"R/MultilabelStackingWrapper.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," x$cv.folds = cv.folds","object_name_linter" +"R/MultilabelTask.R",34,8,"style","Variable and function name style should be snake_case or CamelCase."," task$task.desc = makeMultilabelTaskDesc(id, data, target, weights, blocking, coordinates)","object_name_linter" +"R/OptWrapper.R",8,5,"style","Variable and function name style should be snake_case or CamelCase."," x$opt.pars = par.set","object_name_linter" +"R/OptWrapper.R",9,5,"style","Variable and function name style should be snake_case or CamelCase."," x$bit.names = bit.names","object_name_linter" +"R/OptWrapper.R",10,5,"style","Variable and function name style should be snake_case or CamelCase."," x$bits.to.features = bits.to.features","object_name_linter" +"R/OptWrapper.R",11,5,"style","Variable and function name style should be snake_case or CamelCase."," x$opt.pars = par.set","object_name_linter" +"R/OptWrapper.R",13,5,"style","Variable and function name style should be snake_case or CamelCase."," x$show.info = show.info","object_name_linter" +"R/OverBaggingWrapper.R",48,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$obw.iters = obw.iters","object_name_linter" +"R/OverBaggingWrapper.R",52,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$obw.rate = obw.rate","object_name_linter" +"R/OverBaggingWrapper.R",56,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$obw.maxcl = obw.maxcl","object_name_linter" +"R/OverBaggingWrapper.R",60,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$obw.cl = obw.cl","object_name_linter" +"R/OverUndersampleWrapper.R",36,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$usw.rate = usw.rate","object_name_linter" +"R/OverUndersampleWrapper.R",40,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$usw.cl = usw.cl","object_name_linter" +"R/OverUndersampleWrapper.R",58,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$osw.rate = osw.rate","object_name_linter" +"R/OverUndersampleWrapper.R",62,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$osw.cl = osw.cl","object_name_linter" +"R/OverUndersampleWrapper.R",86,5,"style","Variable and function name style should be snake_case or CamelCase."," m$train.task = .task","object_name_linter" +"R/OverUndersampleWrapper.R",103,5,"style","Variable and function name style should be snake_case or CamelCase."," m$train.task = .task","object_name_linter" +"R/plotBMRRanksAsBarChart.R",39,6,"style","Variable and function name style should be snake_case or CamelCase."," df$learner.id = factor(rownames(df))","object_name_linter" +"R/plotCritDifferences.R",83,6,"style","Variable and function name style should be snake_case or CamelCase."," df$short.name = getBMRLearnerShortNames(bmr)","object_name_linter" +"R/plotLearnerPrediction.R",182,14,"style","Variable and function name style should be snake_case or CamelCase."," grid$.prob.pred.class = prob","object_name_linter" +"R/predict.R",101,5,"style","Variable and function name style should be snake_case or CamelCase."," time.predict = NA_real_","object_name_linter" +"R/predict.R",131,5,"style","Variable and function name style should be snake_case or CamelCase."," time.predict = measureTime(fun1({","object_name_linter" +"R/predict.R",142,7,"style","Variable and function name style should be snake_case or CamelCase."," time.predict = NA_real_","object_name_linter" +"R/Prediction.R",142,8,"style","Variable and function name style should be snake_case or CamelCase."," data$truth.time = truth[, 1L]","object_name_linter" +"R/Prediction.R",143,8,"style","Variable and function name style should be snake_case or CamelCase."," data$truth.event = truth[, 2L]","object_name_linter" +"R/RegrTask.R",27,8,"style","Variable and function name style should be snake_case or CamelCase."," task$task.desc = makeRegrTaskDesc(id, data, target, weights, blocking, coordinates)","object_name_linter" +"R/RemoveConstantFeaturesWrapper.R",18,10,"style","Variable and function name style should be snake_case or CamelCase."," args$dont.rm = union(args$dont.rm, target)","object_name_linter" +"R/ResampleDesc.R",123,5,"style","Variable and function name style should be snake_case or CamelCase."," d$stratify.cols = stratify.cols","object_name_linter" +"R/ResampleDesc.R",125,5,"style","Variable and function name style should be snake_case or CamelCase."," d$blocking.cv = blocking.cv","object_name_linter" +"R/ResampleInstance.R",92,10,"style","Variable and function name style should be snake_case or CamelCase."," inst$train.inds = lapply(inst$train.inds, function(i) sample(which(blocking %in% levs[i])))","object_name_linter" +"R/ResampleInstance.R",94,10,"style","Variable and function name style should be snake_case or CamelCase."," inst$test.inds = lapply(inst$train.inds, function(x) setdiff(ti, x))","object_name_linter" +"R/ResampleInstance.R",136,10,"style","Variable and function name style should be snake_case or CamelCase."," inst$train.inds = Reduce(function(i1, i2) Map(c, i1, i2), train.inds)","object_name_linter" +"R/ResampleInstance.R",137,10,"style","Variable and function name style should be snake_case or CamelCase."," inst$test.inds = Reduce(function(i1, i2) Map(c, i1, i2), test.inds)","object_name_linter" +"R/ResampleInstances.R",50,5,"style","Variable and function name style should be snake_case or CamelCase."," length.test.inds = unlist(lapply(test.inds, function(x) length(x)))","object_name_linter" +"R/ResampleResult_operators.R",149,11,"style","Variable and function name style should be snake_case or CamelCase."," res$measures.train = cbind(res$measures.train, perf$train[, missing.measures, drop = FALSE])","object_name_linter" +"R/ResampleResult_operators.R",154,11,"style","Variable and function name style should be snake_case or CamelCase."," res$measures.test = cbind(res$measures.test, perf$test[, missing.measures, drop = FALSE])","object_name_linter" +"R/RLearner_classif_h2odeeplearning.R",252,7,"style","Variable and function name style should be snake_case or CamelCase."," d$.mlr.weights = .weights","object_name_linter" +"R/RLearner_classif_h2oglm.R",47,7,"style","Variable and function name style should be snake_case or CamelCase."," d$.mlr.weights = .weights","object_name_linter" +"R/RLearner_regr_h2odeeplearning.R",253,7,"style","Variable and function name style should be snake_case or CamelCase."," d$.mlr.weights = .weights","object_name_linter" +"R/RLearner_regr_h2oglm.R",45,7,"style","Variable and function name style should be snake_case or CamelCase."," d$.mlr.weights = .weights","object_name_linter" +"R/RLearner_regr_km.R",54,10,"style","Variable and function name style should be snake_case or CamelCase."," args$nugget.stability = NULL","object_name_linter" +"R/RLearner.R",92,11,"style","Variable and function name style should be snake_case or CamelCase."," learner$short.name = short.name","object_name_linter" +"R/RLearner.R",95,11,"style","Variable and function name style should be snake_case or CamelCase."," learner$help.list = makeParamHelpList(callees, package, par.set)","object_name_linter" +"R/RLearner.R",113,11,"style","Variable and function name style should be snake_case or CamelCase."," lrn$class.weights.param = class.weights.param","object_name_linter" +"R/SMOTEWrapper.R",42,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$sw.rate = sw.rate","object_name_linter" +"R/SMOTEWrapper.R",46,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$sw.nn = sw.nn","object_name_linter" +"R/SMOTEWrapper.R",49,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$sw.standardize = sw.standardize","object_name_linter" +"R/SMOTEWrapper.R",52,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$sw.alt.logic = sw.alt.logic","object_name_linter" +"R/StackedLearner.R",153,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$fix.factors.prediction = TRUE","object_name_linter" +"R/StackedLearner.R",154,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$use.feat = use.feat","object_name_linter" +"R/StackedLearner.R",157,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$super.learner = super.learner","object_name_linter" +"R/SurvTask.R",48,8,"style","Variable and function name style should be snake_case or CamelCase."," task$task.desc = makeSurvTaskDesc(id, data, target, weights, blocking, coordinates)","object_name_linter" +"R/Task_operators.R",460,8,"style","Variable and function name style should be snake_case or CamelCase."," task$task.desc = switch(td$type,","object_name_linter" +"R/train.R",81,5,"style","Variable and function name style should be snake_case or CamelCase."," time.train = 0","object_name_linter" +"R/train.R",105,5,"style","Variable and function name style should be snake_case or CamelCase."," time.train = measureTime(fun1({","object_name_linter" +"R/TuneControlIrace.R",45,18,"style","Variable and function name style should be snake_case or CamelCase."," x$extra.args$maxExperiments = asCount(x$extra.args$maxExperiments)","object_name_linter" +"R/TuneControlIrace.R",55,18,"style","Variable and function name style should be snake_case or CamelCase."," x$extra.args$maxExperiments = x$budget","object_name_linter" +"R/TuneControlMBO.R",58,5,"style","Variable and function name style should be snake_case or CamelCase."," x$mbo.control = mbo.control","object_name_linter" +"R/TuneControlMBO.R",60,5,"style","Variable and function name style should be snake_case or CamelCase."," x$mbo.design = mbo.design","object_name_linter" +"R/tuneIrace.R",26,22,"style","Variable and function name style should be snake_case or CamelCase."," control$extra.args$n.instances = NULL","object_name_linter" +"R/tuneIrace.R",28,22,"style","Variable and function name style should be snake_case or CamelCase."," control$extra.args$show.irace.output = NULL","object_name_linter" +"R/TuneMultiCritControlMBO.R",37,5,"style","Variable and function name style should be snake_case or CamelCase."," x$mbo.control = mbo.control","object_name_linter" +"R/TuneMultiCritControlMBO.R",39,5,"style","Variable and function name style should be snake_case or CamelCase."," x$mbo.design = mbo.design","object_name_linter" +"R/TuneWrapper.R",72,5,"style","Variable and function name style should be snake_case or CamelCase."," x$opt.result = or","object_name_linter" +"R/utils_opt.R",11,13,"style","Variable and function name style should be snake_case or CamelCase."," control$impute.val = vnapply(measures, getDefVal)","object_name_linter" +"R/utils.R",35,1,"style","Variable and function name style should be snake_case or CamelCase.","print.mlr.dump = function(x, ...) {","object_name_linter" +"R/WeightedClassesWrapper.R",92,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$wcw.weight = wcw.weight","object_name_linter" +"R/WeightedClassesWrapper.R",100,5,"style","Variable and function name style should be snake_case or CamelCase."," x$wcw.param = wcw.param","object_name_linter" +"R/zzz.R",15,1,"style","Variable and function name style should be snake_case or CamelCase.",".onLoad = function(libname, pkgname) {","object_name_linter" +"R/zzz.R",20,1,"style","Variable and function name style should be snake_case or CamelCase.",".onAttach = function(libname, pkgname) {","object_name_linter" +"R/zzz.R",34,5,"style","Variable and function name style should be snake_case or CamelCase.","mlr$learner.properties = list(","object_name_linter" +"tests/testthat/helper_lint.R",279,13,"style","Variable and function name style should be snake_case or CamelCase."," linters$T.and.F.symbol = lintr::T_and_F_symbol_linter","object_name_linter" +"tests/testthat/helper_lint.R",282,13,"style","Variable and function name style should be snake_case or CamelCase."," linters$semicolon.terminator = lintr::semicolon_terminator_linter","object_name_linter" +"tests/testthat/helper_lint.R",288,13,"style","Variable and function name style should be snake_case or CamelCase."," linters$unneeded.concatenation = lintr::unneeded_concatenation_linter","object_name_linter" +"tests/testthat/test_base_BaseWrapper.R",34,41,"style","Place a space before left parenthesis, except in a function call."," makeDiscreteParam(""C"", values = 2^(-2:2)),","spaces_left_parentheses_linter" +"tests/testthat/test_base_BaseWrapper.R",35,45,"style","Place a space before left parenthesis, except in a function call."," makeDiscreteParam(""sigma"", values = 2^(-2:2))","spaces_left_parentheses_linter" +"tests/testthat/test_base_BaseWrapper.R",63,43,"style","Place a space before left parenthesis, except in a function call."," makeDiscreteParam(""C"", values = 2^(-2:2)),","spaces_left_parentheses_linter" +"tests/testthat/test_base_BaseWrapper.R",64,47,"style","Place a space before left parenthesis, except in a function call."," makeDiscreteParam(""sigma"", values = 2^(-2:2))","spaces_left_parentheses_linter" +"tests/testthat/test_base_generateHyperParsEffect.R",35,55,"style","Place a space before left parenthesis, except in a function call."," ps = makeParamSet(makeDiscreteParam(""C"", values = 2^(-2:2)))","spaces_left_parentheses_linter" +"tests/testthat/test_base_measures.R",202,3,"style","Variable and function name style should be snake_case or CamelCase."," time.surv = c(5, 10, 5, 10)","object_name_linter" +"tests/testthat/test_base_MulticlassWrapper.R",46,6,"style","Variable and function name style should be snake_case or CamelCase."," df$Sepal.Length = factor(df$Sepal.Length)","object_name_linter" +"tests/testthat/test_base_plotCritDifferences.R",33,5,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" +"tests/testthat/test_base_selectFeatures.R",17,8,"style","Variable and function name style should be snake_case or CamelCase."," ctrl$impute.val = 10","object_name_linter" +"tests/testthat/test_base_tuning.R",34,8,"style","Variable and function name style should be snake_case or CamelCase."," ctrl$impute.val = 10","object_name_linter" +"tests/testthat/test_base_tuning.R",192,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$par.set = c(lrn$par.set, long.learner.params)","object_name_linter" +"tests/testthat/test_classif_ksvm.R",26,10,"style","Variable and function name style should be snake_case or CamelCase."," pars$prob.model = TRUE","object_name_linter" +"tests/testthat/test_classif_pamr.R",20,14,"style","Variable and function name style should be snake_case or CamelCase."," parset$threshold.predict = NULL","object_name_linter" +"tests/testthat/test_regr_frbs.R",20,10,"style","Variable and function name style should be snake_case or CamelCase."," pars$data.train = regr.num.train","object_name_linter" +"tests/testthat/test_regr_mob.R",33,12,"style","Variable and function name style should be snake_case or CamelCase."," parset$term.feats = parset$part.feats = NULL","object_name_linter" +"tests/testthat/test_regr_mob.R",33,32,"style","Variable and function name style should be snake_case or CamelCase."," parset$term.feats = parset$part.feats = NULL","object_name_linter" +"tests/testthat/test_tune_tuneDesign.R",6,3,"style","Variable and function name style should be snake_case or CamelCase."," sigma.seq = 2^seq(-2, 2, length.out = reso)","object_name_linter" +"tests/testthat/test_tune_tuneGrid.R",6,3,"style","Variable and function name style should be snake_case or CamelCase."," sigma.seq = 2^seq(-2, 2, length.out = reso)","object_name_linter" +"tests/testthat/test_tune_tuneGrid.R",7,3,"style","Variable and function name style should be snake_case or CamelCase."," sigma.seq.2 = 2^seq(-2, 2, length.out = reso * 2)","object_name_linter" +"tests/testthat/test_tune_tuneGrid.R",41,7,"style","Variable and function name style should be snake_case or CamelCase."," op1$exec.time = op2$exec.time = NULL","object_name_linter" +"tests/testthat/test_tune_tuneGrid.R",41,23,"style","Variable and function name style should be snake_case or CamelCase."," op1$exec.time = op2$exec.time = NULL","object_name_linter" diff --git a/.dev/revdep_emails/mlr/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/mlr/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..819f871a1 --- /dev/null +++ b/.dev/revdep_emails/mlr/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,791 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/makeData.R",96,1,"style","Variable and function name style should be snake_case or CamelCase.","fuelSubset$UVVIS = scale(fuelSubset$UVVIS, scale = FALSE)","object_name_linter" +"inst/makeData.R",97,1,"style","Variable and function name style should be snake_case or CamelCase.","fuelSubset$NIR = scale(fuelSubset$NIR, scale = FALSE)","object_name_linter" +"R/analyzeFeatSelResult.R",95,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.na(ctrl$max.features) & (length(x) == ctrl$max.features)) {","vector_logic_linter" +"R/batchmark.R",59,5,"style","Variable and function name style should be snake_case or CamelCase."," apply.fun = getAlgoFun(learner, measures, models, keep.extract)","object_name_linter" +"R/benchmark.R",67,11,"style","Variable and function name style should be snake_case or CamelCase."," names(results.by.task[[taskname]]) = grid$learner[grid$task == taskname]","object_name_linter" +"R/BenchmarkResult_operators.R",125,7,"style","Variable and function name style should be snake_case or CamelCase."," drop.tasks = length(task.ids) == 1L","object_name_linter" +"R/BenchmarkResult_operators.R",126,7,"style","Variable and function name style should be snake_case or CamelCase."," drop.learners = length(learner.ids) == 1L","object_name_linter" +"R/BenchmarkResult_operators.R",127,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (drop.tasks | drop.learners) {","vector_logic_linter" +"R/BenchmarkResult_operators.R",129,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (drop.tasks & drop.learners) {","vector_logic_linter" +"R/BenchmarkResult_operators.R",132,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (drop.tasks & !drop.learners) {","vector_logic_linter" +"R/BenchmarkResult_operators.R",135,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!drop.tasks & drop.learners) {","vector_logic_linter" +"R/calculateConfusionMatrix.R",83,3,"style","Variable and function name style should be snake_case or CamelCase."," row.err = rowSums(mt)","object_name_linter" +"R/calculateConfusionMatrix.R",84,3,"style","Variable and function name style should be snake_case or CamelCase."," col.err = colSums(mt)","object_name_linter" +"R/calculateConfusionMatrix.R",158,5,"style","Variable and function name style should be snake_case or CamelCase."," col.err = x$relative.col[k + 1, ]","object_name_linter" +"R/calculateConfusionMatrix.R",159,5,"style","Variable and function name style should be snake_case or CamelCase."," row.err = x$relative.row[, k + 1]","object_name_linter" +"R/calculateConfusionMatrix.R",183,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/checkLearner.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," missing.props = setdiff(props, learner.props)","object_name_linter" +"R/configureMlr.R",74,3,"style","Variable and function name style should be snake_case or CamelCase."," any.change = FALSE","object_name_linter" +"R/configureMlr.R",78,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" +"R/configureMlr.R",83,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" +"R/configureMlr.R",88,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" +"R/configureMlr.R",93,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" +"R/configureMlr.R",98,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" +"R/configureMlr.R",103,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" +"R/configureMlr.R",108,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" +"R/configureMlr.R",113,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" +"R/evalOptimizationState.R",15,3,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = control$log.fun","object_name_linter" +"R/evalOptimizationState.R",50,7,"style","Variable and function name style should be snake_case or CamelCase."," th.args$pred = r$pred","object_name_linter" +"R/evalOptimizationState.R",51,7,"style","Variable and function name style should be snake_case or CamelCase."," th.args$measure = measures[[1L]]","object_name_linter" +"R/extractFDAFeatures.R",68,3,"style","Variable and function name style should be snake_case or CamelCase."," all.fds = which(names(feat.methods) == ""all"")","object_name_linter" +"R/extractFDAFeatures.R",71,5,"style","Variable and function name style should be snake_case or CamelCase."," feat.methods[all.fds] = NULL","object_name_linter" +"R/extractFDAFeaturesMethods.R",389,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(refs) | is.integer(refs)) {","vector_logic_linter" +"R/extractFDAFeaturesMethods.R",526,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(dim(df)) | vals$res.level == 1L) {","vector_logic_linter" +"R/FeatSelControl.R",106,3,"style","Variable and function name style should be snake_case or CamelCase."," max.features = asCount(max.features, na.ok = TRUE, positive = TRUE)","object_name_linter" +"R/FeatSelControl.R",108,5,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = logFunFeatSel","object_name_linter" +"R/FeatSelControl.R",110,5,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = logFunTuneMemory","object_name_linter" +"R/FeatSelControlExhaustive.R",5,3,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = ""default"") {","object_name_linter" +"R/FeatSelControlGA.R",4,24,"style","Variable and function name style should be snake_case or CamelCase."," maxit = NA_integer_, max.features = NA_integer_, comma = FALSE, mu = 10L, lambda,","object_name_linter" +"R/FeatSelControlGA.R",6,3,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = ""default"") {","object_name_linter" +"R/FeatSelControlSequential.R",4,53,"style","Variable and function name style should be snake_case or CamelCase."," alpha = 0.01, beta = -0.001, maxit = NA_integer_, max.features = NA_integer_,","object_name_linter" +"R/FilterEnsemble.R",56,3,"warning","local variable β€˜tag2df’ assigned but may not be used"," tag2df = function(tags, prefix = """") {","object_usage_linter" +"R/FilterEnsemble.R",113,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(fval.ens) = c(""name"", ""value"")","object_name_linter" +"R/FilterEnsemble.R",117,5,"style","Variable and function name style should be snake_case or CamelCase."," fval.ens$filter = ""E-min""","object_name_linter" +"R/FilterEnsemble.R",146,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(fval.ens) = c(""name"", ""value"")","object_name_linter" +"R/FilterEnsemble.R",150,5,"style","Variable and function name style should be snake_case or CamelCase."," fval.ens$filter = ""E-mean""","object_name_linter" +"R/FilterEnsemble.R",180,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(fval.ens) = c(""name"", ""value"")","object_name_linter" +"R/FilterEnsemble.R",184,5,"style","Variable and function name style should be snake_case or CamelCase."," fval.ens$filter = ""E-max""","object_name_linter" +"R/FilterEnsemble.R",213,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(fval.ens) = c(""name"", ""value"")","object_name_linter" +"R/FilterEnsemble.R",217,5,"style","Variable and function name style should be snake_case or CamelCase."," fval.ens$filter = ""E-median""","object_name_linter" +"R/FilterEnsemble.R",250,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(fval.ens) = c(""name"", ""value"")","object_name_linter" +"R/FilterEnsemble.R",254,5,"style","Variable and function name style should be snake_case or CamelCase."," fval.ens$filter = ""E-Borda""","object_name_linter" +"R/FilterEnsemble.R",290,3,"style","Variable and function name style should be snake_case or CamelCase."," all.filters = rbind(simple_filters, ensemble_filters)","object_name_linter" +"R/filterFeatures.R",170,22,"warning","no visible binding for global variable β€˜value’"," order(filter, -value)), ][[""value""]]), fun.args))","object_usage_linter" +"R/filterFeatures.R",191,47,"warning","no visible binding for global variable β€˜value’"," features = fval[with(fval, order(filter, -value)), ]","object_usage_linter" +"R/filterFeatures.R",206,3,"style","Variable and function name style should be snake_case or CamelCase."," sum.null = sum(!is.null(perc), !is.null(abs), !is.null(threshold), !is.null(fun))","object_name_linter" +"R/friedmanPostHocTestBMR.R",74,3,"style","Variable and function name style should be snake_case or CamelCase."," q.nemenyi = qtukey(1 - p.value, n.learners, 1e+06) / sqrt(2L)","object_name_linter" +"R/friedmanPostHocTestBMR.R",76,3,"style","Variable and function name style should be snake_case or CamelCase."," q.bd = qtukey(1L - (p.value / (n.learners - 1L)), 2L, 1e+06) / sqrt(2L)","object_name_linter" +"R/generateCalibration.R",101,7,"style","Variable and function name style should be snake_case or CamelCase."," break.points = hist(df$Probability, breaks = breaks, plot = FALSE)$breaks","object_name_linter" +"R/generateCalibration.R",121,3,"style","Variable and function name style should be snake_case or CamelCase."," max.bin = sapply(stri_split(levels(proportion$bin), regex = "",|]|\\)""),","object_name_linter" +"R/generateCalibration.R",201,5,"style","Variable and function name style should be snake_case or CamelCase."," top.data$x = jitter(as.numeric(top.data$bin))","object_name_linter" +"R/generateCalibration.R",204,5,"style","Variable and function name style should be snake_case or CamelCase."," bottom.data$x = jitter(as.numeric(bottom.data$bin))","object_name_linter" +"R/generateFilterValues.R",141,7,"style","Variable and function name style should be snake_case or CamelCase."," missing.score = setdiff(fn, names(x))","object_name_linter" +"R/generateFilterValues.R",165,44,"warning","no visible binding for global variable β€˜value’"," print(x$data[with(x$data, order(filter, -value)), ])","object_usage_linter" +"R/generateHyperParsEffect.R",304,7,"style","Variable and function name style should be snake_case or CamelCase."," col.name = stri_split_fixed(col, "".test.mean"", omit_empty = TRUE)[[1]]","object_name_linter" +"R/generateHyperParsEffect.R",353,9,"style","Variable and function name style should be snake_case or CamelCase."," col.name = stri_split_fixed(col, "".test.mean"", omit_empty = TRUE)[[1]]","object_name_linter" +"R/generateLearningCurve.R",135,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((color == ""learner"" & nlearn == 1L) | (color == ""measure"" & nmeas == 1L)) {","vector_logic_linter" +"R/generateLearningCurve.R",135,43,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((color == ""learner"" & nlearn == 1L) | (color == ""measure"" & nmeas == 1L)) {","vector_logic_linter" +"R/generateLearningCurve.R",135,65,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((color == ""learner"" & nlearn == 1L) | (color == ""measure"" & nmeas == 1L)) {","vector_logic_linter" +"R/generateLearningCurve.R",138,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((facet == ""learner"" & nlearn == 1L) | (facet == ""measure"" & nmeas == 1L)) {","vector_logic_linter" +"R/generateLearningCurve.R",138,43,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((facet == ""learner"" & nlearn == 1L) | (facet == ""measure"" & nmeas == 1L)) {","vector_logic_linter" +"R/generateLearningCurve.R",138,65,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((facet == ""learner"" & nlearn == 1L) | (facet == ""measure"" & nmeas == 1L)) {","vector_logic_linter" +"R/generatePartialDependence.R",113,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (obj$learner$predict.type == ""se"" & individual) {","vector_logic_linter" +"R/generatePartialDependence.R",116,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (obj$learner$predict.type == ""se"" & derivative) {","vector_logic_linter" +"R/generatePartialDependence.R",144,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (derivative & interaction) {","vector_logic_linter" +"R/generatePartialDependence.R",166,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(names(test.fun)) & !individual) {","vector_logic_linter" +"R/generatePartialDependence.R",406,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (obj$interaction & length(obj$features) > 2L & geom != ""tile"") {","vector_logic_linter" +"R/generatePartialDependence.R",406,51,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (obj$interaction & length(obj$features) > 2L & geom != ""tile"") {","vector_logic_linter" +"R/generatePartialDependence.R",444,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(features) > 1L & !(length(features) == 2L & geom == ""tile"")) {","vector_logic_linter" +"R/generatePartialDependence.R",444,58,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(features) > 1L & !(length(features) == 2L & geom == ""tile"")) {","vector_logic_linter" +"R/generatePartialDependence.R",497,53,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (obj$task.desc$type %in% c(""regr"", ""surv"") |","vector_logic_linter" +"R/generatePartialDependence.R",498,42,"warning","Conditional expressions require scalar logical operators (&& and ||)"," (obj$task.desc$type == ""classif"" & length(obj$task.desc$class.levels) <= 2L)) {","vector_logic_linter" +"R/generatePartialDependence.R",506,53,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (obj$task.desc$type %in% c(""regr"", ""surv"") |","vector_logic_linter" +"R/generatePartialDependence.R",507,42,"warning","Conditional expressions require scalar logical operators (&& and ||)"," (obj$task.desc$type == ""classif"" & length(obj$task.desc$class.levels) <= 2L)) {","vector_logic_linter" +"R/generateThreshVsPerf.R",203,3,"style","`else` should come on the same line as the previous `}`."," else if (length(obj$measures) == 1L) {","brace_linter" +"R/getCaretParamSet.R",95,5,"style","Variable and function name style should be snake_case or CamelCase."," par.vals[vlapply(par.vals, testIntegerish)] =","object_name_linter" +"R/getNestedTuneResults.R",53,5,"style","Variable and function name style should be snake_case or CamelCase."," op.dfs[[i]][, ""iter""] = i","object_name_linter" +"R/getResamplingIndices.R",42,5,"style","Variable and function name style should be snake_case or CamelCase."," outer.inds = object$pred$instance[c(""train.inds"", ""test.inds"")]","object_name_linter" +"R/helpers_FDGAMBoost.R",46,11,"style","Variable and function name style should be snake_case or CamelCase."," names(fd.grids) = fdns","object_name_linter" +"R/helpers_FDGAMBoost.R",55,7,"warning","local variable β€˜gn’ assigned but may not be used"," gn = stri_paste(fdn, "".grid"")","object_usage_linter" +"R/helpers_FDGAMBoost.R",57,7,"style","Variable and function name style should be snake_case or CamelCase."," mat.list[[fdn]] = mdata[, fdn]","object_name_linter" +"R/helpers_FDGAMBoost.R",81,3,"style","Variable and function name style should be snake_case or CamelCase."," mat.list[[targetname]] = mdata[, targetname]","object_name_linter" +"R/helpers_FDGAMBoost.R",112,11,"style","Variable and function name style should be snake_case or CamelCase."," names(fd.grids) = fdns","object_name_linter" +"R/helpers_FDGAMBoost.R",123,7,"style","Variable and function name style should be snake_case or CamelCase."," mat.list[[fdn]] = tdata[, fdn]","object_name_linter" +"R/helpers_FDGAMBoost.R",137,5,"style","Variable and function name style should be snake_case or CamelCase."," mat.list[[fsn]] = as.vector(as.matrix(tdata[, fsn, drop = FALSE]))","object_name_linter" +"R/helpers_FDGAMBoost.R",143,3,"style","Variable and function name style should be snake_case or CamelCase."," mat.list[[tn]] = tdata[, tn]","object_name_linter" +"R/helpers.R",59,11,"style","Variable and function name style should be snake_case or CamelCase."," attr(x, ""mlr.train.info"") = info","object_name_linter" +"R/helpers.R",113,3,"style","Variable and function name style should be snake_case or CamelCase."," meas.names[dupes] = new.names","object_name_linter" +"R/helpLearner.R",70,7,"style","Variable and function name style should be snake_case or CamelCase."," next.learner = current.learner$next.learner","object_name_linter" +"R/helpLearner.R",99,3,"style","Variable and function name style should be snake_case or CamelCase."," all.param = getParamIds(learner$par.set)","object_name_linter" +"R/helpLearner.R",217,11,"style","Variable and function name style should be snake_case or CamelCase."," help.list[[par.name]] = stri_join(""Argument of: "",","object_name_linter" +"R/Impute.R",257,9,"style","Variable and function name style should be snake_case or CamelCase."," names(dummy.cols) = sprintf(""%s.dummy"", desc$dummies)","object_name_linter" +"R/Learner_properties.R",86,3,"style","Variable and function name style should be snake_case or CamelCase."," all.props = c(listTaskTypes(), ""any"")","object_name_linter" +"R/Learner.R",7,11,"style","Variable and function name style should be snake_case or CamelCase."," names(par.vals) = character(0L)","object_name_linter" +"R/listLearners.R",6,3,"warning","local variable β€˜slots’ assigned but may not be used"," slots = c(""cl"", ""name"", ""short.name"", ""package"", ""properties"", ""note"")","object_usage_linter" +"R/Measure_colAUC.R",42,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (n1 > 0 & n2 > 0) {","vector_logic_linter" +"R/measures.R",808,3,"style","Variable and function name style should be snake_case or CamelCase."," class.values = seq_along(levels(truth)) - 1L","object_name_linter" +"R/measures.R",1450,5,"style","Variable and function name style should be snake_case or CamelCase."," max.time = assertNumber(extra.args$max.time, null.ok = TRUE) %??% max(getTaskTargets(task)[, 1L])","object_name_linter" +"R/measures.R",1471,5,"style","Variable and function name style should be snake_case or CamelCase."," max.time = assertNumber(extra.args$max.time, null.ok = TRUE) %??% max(getTaskTargets(task)[, 1L])","object_name_linter" +"R/measures.R",1499,5,"style","Variable and function name style should be snake_case or CamelCase."," max.time = extra.args$max.time %??% max(newdata[[tn[1L]]])","object_name_linter" +"R/mergeBenchmarkResults.R",40,3,"style","Variable and function name style should be snake_case or CamelCase."," all.combos = expand.grid(task.id = task.ids, learner.id = learner.ids)","object_name_linter" +"R/mergeBenchmarkResults.R",41,3,"style","Variable and function name style should be snake_case or CamelCase."," all.combos = stri_paste(all.combos$task.id, all.combos$learner.id, sep = "" - "")","object_name_linter" +"R/mergeBenchmarkResults.R",67,7,"style","Variable and function name style should be snake_case or CamelCase."," res.merged[[i]][[j]] = addRRMeasure(res.merged[[i]][[j]], measures.merged)","object_name_linter" +"R/ModelMultiplexerParamSet.R",69,7,"style","Variable and function name style should be snake_case or CamelCase."," for.learner = stri_replace(found, """", regex = long.pid.end)","object_name_linter" +"R/ModelMultiplexerParamSet.R",70,7,"style","Variable and function name style should be snake_case or CamelCase."," for.pars = pss[[for.learner]]$pars","object_name_linter" +"R/ModelMultiplexerParamSet.R",71,7,"style","Variable and function name style should be snake_case or CamelCase."," for.pars[[pid]] = p","object_name_linter" +"R/MulticlassWrapper.R",148,3,"style","Variable and function name style should be snake_case or CamelCase."," row.inds = lapply(binary.targets, function(v) which(v != 0))","object_name_linter" +"R/MulticlassWrapper.R",149,9,"style","Variable and function name style should be snake_case or CamelCase."," names(row.inds) = NULL","object_name_linter" +"R/MultilabelDBRWrapper.R",48,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(true.label.data) = setdiff(targets, tn)","object_name_linter" +"R/MultilabelDBRWrapper.R",51,5,"style","Variable and function name style should be snake_case or CamelCase."," models.meta[[tn]] = train(.learner$next.learner, ctask, weights = .weights)","object_name_linter" +"R/MultilabelNestedStackingWrapper.R",67,7,"style","Variable and function name style should be snake_case or CamelCase."," data.nst[[tnprevious]] = predlabel","object_name_linter" +"R/MultilabelStackingWrapper.R",77,12,"style","Variable and function name style should be snake_case or CamelCase."," colnames(pred.lvl1) = paste(.model$task.desc$target, "".1"", sep = """")","object_name_linter" +"R/options.R",11,9,"style","Variable and function name style should be snake_case or CamelCase."," names(mlr.options) = stri_sub(names(mlr.options), from = 5L)","object_name_linter" +"R/plotBMRBoxplots.R",41,13,"style","Variable and function name style should be snake_case or CamelCase."," names(learner.short.names) = learner.ids","object_name_linter" +"R/plotBMRRanksAsBarChart.R",33,18,"style","Variable and function name style should be snake_case or CamelCase."," pos = ""stack"", order.lrns = NULL, order.tsks = NULL, pretty.names = TRUE) {","object_name_linter" +"R/plotBMRRanksAsBarChart.R",33,37,"style","Variable and function name style should be snake_case or CamelCase."," pos = ""stack"", order.lrns = NULL, order.tsks = NULL, pretty.names = TRUE) {","object_name_linter" +"R/plotBMRRanksAsBarChart.R",50,11,"style","Variable and function name style should be snake_case or CamelCase."," names(learner.short.names) = learner.ids","object_name_linter" +"R/plotCritDifferences.R",117,5,"style","Variable and function name style should be snake_case or CamelCase."," nem.df$y = seq(from = 0.1, to = 0.35, length.out = dim(nem.df)[1])","object_name_linter" +"R/predict.R",111,5,"style","Variable and function name style should be snake_case or CamelCase."," debug.seed = getMlrOption(""debug.seed"", NULL)","object_name_linter" +"R/Prediction_operators.R",2,40,"style","Variable and function name style should be snake_case or CamelCase.","as.data.frame.Prediction = function(x, row.names = NULL, optional = FALSE, ...) {","object_name_linter" +"R/PreprocWrapperCaret.R",54,5,"style","Variable and function name style should be snake_case or CamelCase."," all.methods = c(","object_name_linter" +"R/PreprocWrapperCaret.R",102,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (par.vals$ppc.bagImpute | par.vals$ppc.knnImpute | par.vals$ppc.medianImpute) {","vector_logic_linter" +"R/PreprocWrapperCaret.R",102,55,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (par.vals$ppc.bagImpute | par.vals$ppc.knnImpute | par.vals$ppc.medianImpute) {","vector_logic_linter" +"R/relativeOverfitting.R",49,3,"warning","local variable β€˜mids’ assigned but may not be used"," mids = vcapply(measures, function(m) m$id)","object_usage_linter" +"R/relativeOverfitting.R",76,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.permuted$data = data.frame(truth = rep(c(predish$data$truth, pred.train$data$truth), each = nrows),","object_name_linter" +"R/resample.R",112,5,"style","Variable and function name style should be snake_case or CamelCase."," more.args$weights = weights","object_name_linter" +"R/resample.R",114,5,"style","Variable and function name style should be snake_case or CamelCase."," more.args$weights = getTaskWeights(task)","object_name_linter" +"R/resample.R",163,5,"style","Variable and function name style should be snake_case or CamelCase."," err.msgs[1L] = getFailureModelMsg(m)","object_name_linter" +"R/resample.R",164,5,"style","Variable and function name style should be snake_case or CamelCase."," err.dumps$train = getFailureModelDump(m)","object_name_linter" +"R/resample.R",182,35,"style","Variable and function name style should be snake_case or CamelCase."," if (!is.na(pred.train$error)) err.msgs[2L] = pred.train$error","object_name_linter" +"R/resample.R",184,11,"style","Variable and function name style should be snake_case or CamelCase."," names(ms.train) = vcapply(measures, measureAggrName)","object_name_linter" +"R/resample.R",185,5,"style","Variable and function name style should be snake_case or CamelCase."," err.dumps$predict.train = getPredictionDump(pred.train)","object_name_linter" +"R/resample.R",188,34,"style","Variable and function name style should be snake_case or CamelCase."," if (!is.na(pred.test$error)) err.msgs[2L] = pred.test$error","object_name_linter" +"R/resample.R",190,11,"style","Variable and function name style should be snake_case or CamelCase."," names(ms.test) = vcapply(measures, measureAggrName)","object_name_linter" +"R/resample.R",191,5,"style","Variable and function name style should be snake_case or CamelCase."," err.dumps$predict.test = getPredictionDump(pred.test)","object_name_linter" +"R/resample.R",200,35,"style","Variable and function name style should be snake_case or CamelCase."," if (!is.na(pred.train$error)) err.msgs[2L] = pred.train$error","object_name_linter" +"R/resample.R",202,11,"style","Variable and function name style should be snake_case or CamelCase."," names(ms.train) = vcapply(measures, measureAggrName)","object_name_linter" +"R/resample.R",203,5,"style","Variable and function name style should be snake_case or CamelCase."," err.dumps$predict.train = getPredictionDump(pred.train)","object_name_linter" +"R/resample.R",206,34,"style","Variable and function name style should be snake_case or CamelCase."," if (!is.na(pred.test$error)) err.msgs[2L] = paste(err.msgs[2L], pred.test$error)","object_name_linter" +"R/resample.R",208,11,"style","Variable and function name style should be snake_case or CamelCase."," names(ms.test) = vcapply(measures, measureAggrName)","object_name_linter" +"R/resample.R",209,5,"style","Variable and function name style should be snake_case or CamelCase."," err.dumps$predict.test = getPredictionDump(pred.test)","object_name_linter" +"R/resample.R",214,5,"style","Variable and function name style should be snake_case or CamelCase."," err.dumps$predict.train = NULL","object_name_linter" +"R/resample.R",215,5,"style","Variable and function name style should be snake_case or CamelCase."," err.dumps$predict.test = NULL","object_name_linter" +"R/resample.R",274,12,"style","Variable and function name style should be snake_case or CamelCase."," colnames(ms.test) = mids","object_name_linter" +"R/resample.R",275,12,"style","Variable and function name style should be snake_case or CamelCase."," rownames(ms.test) = NULL","object_name_linter" +"R/resample.R",277,12,"style","Variable and function name style should be snake_case or CamelCase."," colnames(ms.train) = mids","object_name_linter" +"R/resample.R",278,12,"style","Variable and function name style should be snake_case or CamelCase."," rownames(ms.train) = NULL","object_name_linter" +"R/resample.R",282,12,"style","Variable and function name style should be snake_case or CamelCase."," rownames(err.msgs) = NULL","object_name_linter" +"R/resample.R",283,12,"style","Variable and function name style should be snake_case or CamelCase."," colnames(err.msgs) = c(""train"", ""predict"")","object_name_linter" +"R/ResampleInstance.R",129,9,"style","Variable and function name style should be snake_case or CamelCase."," train.inds[[i]] = lapply(inst$train.inds, function(j) ci[j])","object_name_linter" +"R/ResampleInstance.R",130,9,"style","Variable and function name style should be snake_case or CamelCase."," test.inds[[i]] = lapply(inst$test.inds, function(j) ci[j])","object_name_linter" +"R/ResampleInstance.R",132,9,"style","Variable and function name style should be snake_case or CamelCase."," train.inds[[i]] = test.inds[[i]] = replicate(desc$iters, integer(0L), simplify = FALSE)","object_name_linter" +"R/ResampleInstance.R",132,27,"style","Variable and function name style should be snake_case or CamelCase."," train.inds[[i]] = test.inds[[i]] = replicate(desc$iters, integer(0L), simplify = FALSE)","object_name_linter" +"R/ResampleInstances.R",53,7,"style","Variable and function name style should be snake_case or CamelCase."," test.inds[[index]] = NULL","object_name_linter" +"R/ResampleResult_operators.R",102,7,"style","Variable and function name style should be snake_case or CamelCase."," p.split[[i]]$time = time[i]","object_name_linter" +"R/ResampleResult_operators.R",129,3,"style","Variable and function name style should be snake_case or CamelCase."," missing.measures = setdiff(measures.id, colnames(res$measures.test))","object_name_linter" +"R/RLearner_classif_dcSVM.R",44,5,"style","Variable and function name style should be snake_case or CamelCase."," max.levels = 1","object_name_linter" +"R/RLearner_classif_dcSVM.R",47,5,"style","Variable and function name style should be snake_case or CamelCase."," max.levels = pars$max.levels","object_name_linter" +"R/RLearner_classif_dcSVM.R",55,3,"style","Variable and function name style should be snake_case or CamelCase."," min.cluster = ceiling(5 * m / (k^max.levels))","object_name_linter" +"R/RLearner_classif_evtree.R",52,5,"warning","local variable β€˜p’ assigned but may not be used"," p = predict(.model$learner.model, newdata = .newdata, type = ""prob"", ...)","object_usage_linter" +"R/RLearner_classif_fdausc.kernel.R",43,3,"warning","local variable β€˜trainfun’ assigned but may not be used"," trainfun = getFromNamespace(""classif.kernel"", ""fda.usc"")","object_usage_linter" +"R/RLearner_classif_fdausc.kernel.R",44,3,"warning","local variable β€˜mod’ assigned but may not be used"," mod = do.call(""trainfun"",","object_usage_linter" +"R/RLearner_classif_fdausc.knn.R",37,3,"warning","local variable β€˜trainfun’ assigned but may not be used"," trainfun = getFromNamespace(""classif.knn"", ""fda.usc"")","object_usage_linter" +"R/RLearner_classif_fdausc.knn.R",39,3,"warning","local variable β€˜mod’ assigned but may not be used"," mod = suppressAll(do.call(""trainfun"",","object_usage_linter" +"R/RLearner_classif_fdausc.np.R",42,3,"warning","local variable β€˜trainfun’ assigned but may not be used"," trainfun = getFromNamespace(""classif.np"", ""fda.usc"")","object_usage_linter" +"R/RLearner_classif_featureless.R",22,3,"warning","local variable β€˜lvls’ assigned but may not be used"," lvls = getTaskClassLevels(.task)","object_usage_linter" +"R/RLearner_classif_fnn.R",32,11,"style","Variable and function name style should be snake_case or CamelCase."," attr(p, ""nn.index"") = NULL","object_name_linter" +"R/RLearner_classif_fnn.R",33,11,"style","Variable and function name style should be snake_case or CamelCase."," attr(p, ""nn.dist"") = NULL","object_name_linter" +"R/RLearner_classif_h2odeeplearning.R",271,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(p.df)[pcol] = stri_sub(colnames(p.df)[pcol], 2L)","object_name_linter" +"R/RLearner_classif_h2odeeplearning.R",277,5,"style","Variable and function name style should be snake_case or CamelCase."," p.df$predict = NULL","object_name_linter" +"R/RLearner_classif_h2ogbm.R",63,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(p.df)[pcol] = stri_sub(colnames(p.df)[pcol], 2L)","object_name_linter" +"R/RLearner_classif_h2ogbm.R",69,5,"style","Variable and function name style should be snake_case or CamelCase."," p.df$predict = NULL","object_name_linter" +"R/RLearner_classif_h2oglm.R",66,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(p.df)[pcol] = stri_sub(colnames(p.df)[pcol], 2L)","object_name_linter" +"R/RLearner_classif_h2oglm.R",72,5,"style","Variable and function name style should be snake_case or CamelCase."," p.df$predict = NULL","object_name_linter" +"R/RLearner_classif_h2orandomForest.R",55,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(p.df)[pcol] = stri_sub(colnames(p.df)[pcol], 2L)","object_name_linter" +"R/RLearner_classif_h2orandomForest.R",61,5,"style","Variable and function name style should be snake_case or CamelCase."," p.df$predict = NULL","object_name_linter" +"R/RLearner_classif_lvq1.R",20,3,"style","Variable and function name style should be snake_case or CamelCase."," cdbk.args$x = d$data","object_name_linter" +"R/RLearner_classif_lvq1.R",21,3,"style","Variable and function name style should be snake_case or CamelCase."," cdbk.args$cl = d$target","object_name_linter" +"R/RLearner_classif_lvq1.R",25,3,"style","Variable and function name style should be snake_case or CamelCase."," lvq.args$x = d$data","object_name_linter" +"R/RLearner_classif_lvq1.R",26,3,"style","Variable and function name style should be snake_case or CamelCase."," lvq.args$cl = d$target","object_name_linter" +"R/RLearner_classif_lvq1.R",27,3,"style","Variable and function name style should be snake_case or CamelCase."," lvq.args$codebk = codebk","object_name_linter" +"R/RLearner_regr_bcart.R",34,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(d$data, function(x) class(x))","object_name_linter" +"R/RLearner_regr_bcart.R",35,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" +"R/RLearner_regr_bcart.R",51,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(.newdata, function(x) class(x))","object_name_linter" +"R/RLearner_regr_bcart.R",52,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" +"R/RLearner_regr_btgp.R",42,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(d$data, function(x) class(x))","object_name_linter" +"R/RLearner_regr_btgp.R",43,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" +"R/RLearner_regr_btgp.R",59,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(.newdata, function(x) class(x))","object_name_linter" +"R/RLearner_regr_btgp.R",60,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" +"R/RLearner_regr_btgpllm.R",44,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(d$data, function(x) class(x))","object_name_linter" +"R/RLearner_regr_btgpllm.R",45,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" +"R/RLearner_regr_btgpllm.R",61,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(.newdata, function(x) class(x))","object_name_linter" +"R/RLearner_regr_btgpllm.R",62,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" +"R/RLearner_regr_btlm.R",36,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(d$data, function(x) class(x))","object_name_linter" +"R/RLearner_regr_btlm.R",37,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" +"R/RLearner_regr_btlm.R",53,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(.newdata, function(x) class(x))","object_name_linter" +"R/RLearner_regr_btlm.R",54,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" +"R/RLearner_regr_evtree.R",51,3,"warning","local variable β€˜p’ assigned but may not be used"," p = predict(.model$learner.model, newdata = .newdata, ...)","object_usage_linter" +"R/RLearner_regr_randomForest.R",88,3,"style","Variable and function name style should be snake_case or CamelCase."," single.model = getLearnerModel(.model)$single.model # get raw RF model","object_name_linter" +"R/RLearner_surv_gamboost.R",47,5,"warning","local variable β€˜model’ assigned but may not be used"," model = mboost::gamboost(f, data = data, control = ctrl, family = family, ...)","object_usage_linter" +"R/selectFeaturesGA.R",24,10,"style","Variable and function name style should be snake_case or CamelCase."," mode(pop.featmat) = ""integer""","object_name_linter" +"R/smote.R",79,9,"style","Variable and function name style should be snake_case or CamelCase."," x.min.matrix[, i] = as.numeric(as.integer(x.min.matrix[, i]))","object_name_linter" +"R/smote.R",85,16,"style","Variable and function name style should be snake_case or CamelCase."," storage.mode(x.min.matrix) = ""numeric""","object_name_linter" +"R/smote.R",100,13,"style","Variable and function name style should be snake_case or CamelCase."," x.scaled[, j] = (x.scaled[, j] != 0)","object_name_linter" +"R/smote.R",128,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/smote.R",131,10,"style","Variable and function name style should be snake_case or CamelCase."," diag(minclass.dist) = NA","object_name_linter" +"R/StackedLearner.R",106,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(resampling) & method != ""stack.cv"") {","vector_logic_linter" +"R/StackedLearner.R",124,55,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((method == ""average"" || method == ""hill.climb"") & (!is.null(super.learner) || is.null(predict.type))) {","vector_logic_linter" +"R/StackedLearner.R",127,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (method != ""average"" & method != ""hill.climb"" & is.null(super.learner)) {","vector_logic_linter" +"R/StackedLearner.R",127,52,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (method != ""average"" & method != ""hill.climb"" & is.null(super.learner)) {","vector_logic_linter" +"R/StackedLearner.R",132,55,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((method == ""average"" || method == ""hill.climb"") & use.feat) {","vector_logic_linter" +"R/StackedLearner.R",327,5,"style","Variable and function name style should be snake_case or CamelCase."," base.models[[i]] = model","object_name_linter" +"R/StackedLearner.R",349,5,"style","Variable and function name style should be snake_case or CamelCase."," base.models[[i]] = model","object_name_linter" +"R/StackedLearner.R",396,5,"style","Variable and function name style should be snake_case or CamelCase."," base.models[[i]] = train(bl, task)","object_name_linter" +"R/StackedLearner.R",475,5,"style","Variable and function name style should be snake_case or CamelCase."," base.models[[i]] = train(bl, task)","object_name_linter" +"R/StackedLearner.R",599,16,"style","Variable and function name style should be snake_case or CamelCase."," colnames(pred.return) = td$class.levels","object_name_linter" +"R/train.R",44,5,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," } # I believe this is a bug, see #2098","brace_linter" +"R/train.R",45,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/train.R",85,5,"style","Variable and function name style should be snake_case or CamelCase."," debug.seed = getMlrOption(""debug.seed"", NULL)","object_name_linter" +"R/train.R",113,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.levels = getTaskFactorLevels(task)","object_name_linter" +"R/tuneCMAES.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," ctrl.cmaes$lambda = 4 + floor(3 * log(N))","object_name_linter" +"R/tuneCMAES.R",42,3,"style","Variable and function name style should be snake_case or CamelCase."," ctrl.cmaes$maxit = maxit","object_name_linter" +"R/TuneControl.R",39,5,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = logFunTune","object_name_linter" +"R/TuneControl.R",41,5,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = logFunTuneMemory","object_name_linter" +"R/tuneIrace.R",37,3,"style","Variable and function name style should be snake_case or CamelCase."," log.file = tempfile()","object_name_linter" +"R/TuneMultiCritControl.R",47,5,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = logFunTune","object_name_linter" +"R/TuneMultiCritControl.R",49,5,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = logFunTuneMemory","object_name_linter" +"R/utils_imbalancy.R",7,3,"style","Variable and function name style should be snake_case or CamelCase."," min.name = ns[j.small]","object_name_linter" +"R/utils_imbalancy.R",8,3,"style","Variable and function name style should be snake_case or CamelCase."," max.name = ns[-j.small]","object_name_linter" +"R/WeightedClassesWrapper.R",113,11,"style","Variable and function name style should be snake_case or CamelCase."," names(wcw.weight) = c(td$positive, td$negative)","object_name_linter" +"R/WeightedClassesWrapper.R",116,11,"style","Variable and function name style should be snake_case or CamelCase."," names(wcw.weight) = levs","object_name_linter" +"tests/testthat/helper_helpers.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," cv.instance$train.inds[[i]] = inds[[i]]","object_name_linter" +"tests/testthat/helper_helpers.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," cv.instance$test.inds[[i]] = setdiff(1:size, inds[[i]])","object_name_linter" +"tests/testthat/helper_helpers.R",39,5,"style","Variable and function name style should be snake_case or CamelCase."," bs.instance$train.inds[[i]] = inds[[i]]","object_name_linter" +"tests/testthat/helper_helpers.R",40,5,"style","Variable and function name style should be snake_case or CamelCase."," bs.instance$test.inds[[i]] = setdiff(1:size, inds[[i]])","object_name_linter" +"tests/testthat/helper_helpers.R",96,3,"warning","local variable β€˜train’ assigned but may not be used"," train = df[inds, ]","object_usage_linter" +"tests/testthat/helper_helpers.R",97,3,"warning","local variable β€˜test’ assigned but may not be used"," test = df[-inds, ]","object_usage_linter" +"tests/testthat/helper_helpers.R",102,5,"warning","no visible global function definition for β€˜testSimple’"," testSimple(t.name, df, target, train.inds, old.predicts, parset)","object_usage_linter" +"tests/testthat/helper_helpers.R",123,21,"warning","no visible binding for global variable β€˜old.predicts’"," expect_s3_class(old.predicts, ""try-error"")","object_usage_linter" +"tests/testthat/helper_helpers.R",128,13,"style","Variable and function name style should be snake_case or CamelCase."," names(old.probs) = NULL","object_name_linter" +"tests/testthat/helper_helpers.R",138,28,"style","Variable and function name style should be snake_case or CamelCase."," colnames(p) = colnames(old.probs) = NULL","object_name_linter" +"tests/testthat/helper_helpers.R",139,28,"style","Variable and function name style should be snake_case or CamelCase."," rownames(p) = rownames(old.probs) = NULL","object_name_linter" +"tests/testthat/helper_helpers.R",140,11,"style","Variable and function name style should be snake_case or CamelCase."," class(old.probs) = NULL","object_name_linter" +"tests/testthat/helper_helpers.R",162,21,"warning","no visible binding for global variable β€˜old.predicts’"," expect_s3_class(old.predicts, ""try-error"")","object_usage_linter" +"tests/testthat/helper_helpers.R",167,13,"style","Variable and function name style should be snake_case or CamelCase."," names(old.probs) = NULL","object_name_linter" +"tests/testthat/helper_helpers.R",177,28,"style","Variable and function name style should be snake_case or CamelCase."," colnames(p) = colnames(old.probs) = NULL","object_name_linter" +"tests/testthat/helper_helpers.R",178,28,"style","Variable and function name style should be snake_case or CamelCase."," rownames(p) = rownames(old.probs) = NULL","object_name_linter" +"tests/testthat/helper_helpers.R",179,11,"style","Variable and function name style should be snake_case or CamelCase."," class(old.probs) = NULL","object_name_linter" +"tests/testthat/helper_helpers.R",180,44,"warning","no visible binding for global variable β€˜tol’"," expect_equal(p, old.probs, tolerance = tol)","object_usage_linter" +"tests/testthat/helper_helpers.R",187,3,"warning","local variable β€˜train’ assigned but may not be used"," train = df[inds, ]","object_usage_linter" +"tests/testthat/helper_helpers.R",188,3,"warning","local variable β€˜test’ assigned but may not be used"," test = df[-inds, ]","object_usage_linter" +"tests/testthat/helper_helpers.R",193,5,"warning","no visible global function definition for β€˜testProb’"," testProb(t.name, df, target, train.inds, old.probs, parset)","object_usage_linter" +"tests/testthat/helper_helpers.R",201,3,"warning","local variable β€˜train’ assigned but may not be used"," train = df[inds, ]","object_usage_linter" +"tests/testthat/helper_helpers.R",202,3,"warning","local variable β€˜test’ assigned but may not be used"," test = df[-inds, ]","object_usage_linter" +"tests/testthat/helper_helpers.R",207,5,"warning","no visible global function definition for β€˜testProbWithTol’"," testProbWithTol(t.name, df, target, train.inds, old.probs, parset, tolerance = tol)","object_usage_linter" +"tests/testthat/helper_helpers.R",207,84,"warning","no visible binding for global variable β€˜tol’"," testProbWithTol(t.name, df, target, train.inds, old.probs, parset, tolerance = tol)","object_usage_linter" +"tests/testthat/helper_helpers.R",261,5,"warning","no visible global function definition for β€˜testCV’"," testCV(t.name, df, target, folds, parset, tune.train, tune.predict)","object_usage_linter" +"tests/testthat/helper_helpers.R",313,44,"warning","no visible binding for global variable β€˜ns.svg’"," nodes = XML::getNodeSet(doc, text.paths, ns.svg)","object_usage_linter" +"tests/testthat/helper_learners_all.R",24,3,"warning","local variable β€˜rin’ assigned but may not be used"," rin = makeResampleInstance(""Holdout"", task = task)","object_usage_linter" +"tests/testthat/helper_learners_all.R",128,3,"warning","no visible global function definition for β€˜testBasicLearnerProperties’"," testBasicLearnerProperties(lrn = lrn, task = task, hyperpars = hyperpars)","object_usage_linter" +"tests/testthat/helper_learners_all.R",145,3,"warning","no visible global function definition for β€˜testBasicLearnerProperties’"," testBasicLearnerProperties(lrn = lrn, task = task, hyperpars = hyperpars)","object_usage_linter" +"tests/testthat/helper_learners_all.R",163,3,"warning","no visible global function definition for β€˜testBasicLearnerProperties’"," testBasicLearnerProperties(lrn = lrn, task = task, hyperpars = hyperpars)","object_usage_linter" +"tests/testthat/helper_learners_all.R",236,3,"warning","local variable β€˜ses’ assigned but may not be used"," ses = getPredictionSE(res$pred)","object_usage_linter" +"tests/testthat/helper_objects.R",50,1,"style","Variable and function name style should be snake_case or CamelCase.","multilabel.df[, ""y1""] = rep(c(TRUE, FALSE), 75L)","object_name_linter" +"tests/testthat/helper_objects.R",51,1,"style","Variable and function name style should be snake_case or CamelCase.","multilabel.df[, ""y2""] = rep(c(FALSE, TRUE), 75L)","object_name_linter" +"tests/testthat/helper_objects.R",101,1,"style","Variable and function name style should be snake_case or CamelCase.","regr.na.num.df[1, 1] = NA","object_name_linter" +"tests/testthat/helper_objects.R",125,3,"style","Variable and function name style should be snake_case or CamelCase."," obs.time[i] = q","object_name_linter" +"tests/testthat/helper_objects.R",126,3,"style","Variable and function name style should be snake_case or CamelCase."," cens.time[i] = FALSE","object_name_linter" +"tests/testthat/helper_objects.R",222,1,"style","Variable and function name style should be snake_case or CamelCase.","task.filters.rank$env$data = structure(list(trt = c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1,","object_name_linter" +"tests/testthat/test_base_benchmark.R",358,3,"style","Variable and function name style should be snake_case or CamelCase."," stop.learner = makeLearner(""classif.__mlrmocklearners__3"",","object_name_linter" +"tests/testthat/test_base_benchmark.R",360,3,"style","Variable and function name style should be snake_case or CamelCase."," stop.learner = makeFilterWrapper(stop.learner,","object_name_linter" +"tests/testthat/test_base_benchmark.R",363,3,"style","Variable and function name style should be snake_case or CamelCase."," stop.learner = makeTuneWrapper(stop.learner,","object_name_linter" +"tests/testthat/test_base_createDummyFeatures.R",22,3,"style","Variable and function name style should be snake_case or CamelCase."," dummy.task$env = NULL","object_name_linter" +"tests/testthat/test_base_createDummyFeatures.R",23,3,"style","Variable and function name style should be snake_case or CamelCase."," iris.task$env = NULL","object_name_linter" +"tests/testthat/test_base_getHyperPars.R",8,9,"style","Variable and function name style should be snake_case or CamelCase."," names(named.list) = character(0)","object_name_linter" +"tests/testthat/test_base_measures.R",167,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.regr$data$response = pred.art.regr","object_name_linter" +"tests/testthat/test_base_measures.R",177,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.classif$data$response = pred.art.classif","object_name_linter" +"tests/testthat/test_base_measures.R",187,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.bin$data$response = pred.art.bin","object_name_linter" +"tests/testthat/test_base_measures.R",199,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.multilabel$data[, 4:5] = pred.art.multilabel","object_name_linter" +"tests/testthat/test_base_measures.R",214,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.surv$data[, ""response""] = pred.art.surv","object_name_linter" +"tests/testthat/test_base_measures.R",228,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.costsens$data$response = pred.art.costsens","object_name_linter" +"tests/testthat/test_base_measures.R",237,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.cluster$data$response = pred.art.cluster","object_name_linter" +"tests/testthat/test_base_measures.R",267,3,"style","Variable and function name style should be snake_case or CamelCase."," abs.errs = abs(c(5 - 4, 10 - 11, 0 - 0, 5 - 4))","object_name_linter" +"tests/testthat/test_base_measures.R",347,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.regr.mape$data$truth = c(5, 10, 1, 5) # we change the 0 target because mape is undefined","object_name_linter" +"tests/testthat/test_base_measures.R",365,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.art.regr.neg[[1L]] = -3","object_name_linter" +"tests/testthat/test_base_measures.R",488,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.probs[pred.probs > 1 - 1e-15] = 1 - 1e-15","object_name_linter" +"tests/testthat/test_base_measures.R",489,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.probs[pred.probs < 1e-15] = 1e-15","object_name_linter" +"tests/testthat/test_base_measures.R",549,10,"style","Variable and function name style should be snake_case or CamelCase."," levels(tar.classif2) = as.numeric(levels(tar.classif))^2","object_name_linter" +"tests/testthat/test_base_measures.R",550,10,"style","Variable and function name style should be snake_case or CamelCase."," levels(pred.art.classif2) = as.numeric(levels(pred.art.classif))^2","object_name_linter" +"tests/testthat/test_base_measures.R",744,3,"style","Variable and function name style should be snake_case or CamelCase."," f1.test[is.na(f1.test)] = 1","object_name_linter" +"tests/testthat/test_base_measures.R",767,3,"style","Variable and function name style should be snake_case or CamelCase."," acc.test[is.na(acc.test)] = 1","object_name_linter" +"tests/testthat/test_base_multilabel.R",40,3,"style","Variable and function name style should be snake_case or CamelCase."," multilabel.df2[c(2, 10, 14), c(1, 5)] = NA","object_name_linter" +"tests/testthat/test_base_multilabel.R",71,23,"warning","no visible binding for global variable β€˜multilabel.task’"," mod = train(lrn2, multilabel.task)","object_usage_linter" +"tests/testthat/test_base_multilabel.R",72,25,"warning","no visible binding for global variable β€˜multilabel.task’"," pred = predict(mod, multilabel.task)","object_usage_linter" +"tests/testthat/test_base_multilabel.R",79,35,"warning","no visible binding for global variable β€˜multilabel.df’"," pred = predict(mod, newdata = multilabel.df)","object_usage_linter" +"tests/testthat/test_base_multilabel.R",85,55,"warning","no visible binding for global variable β€˜multilabel.task’"," expect_equal(rownames(pmulti), getTaskTargetNames(multilabel.task))","object_usage_linter" +"tests/testthat/test_base_multilabel.R",88,23,"warning","no visible binding for global variable β€˜multilabel.task’"," r = holdout(lrn2, multilabel.task)","object_usage_linter" +"tests/testthat/test_base_multilabel.R",93,55,"warning","no visible binding for global variable β€˜multilabel.task’"," expect_equal(rownames(pmulti), getTaskTargetNames(multilabel.task))","object_usage_linter" +"tests/testthat/test_base_multilabel.R",97,23,"warning","no visible binding for global variable β€˜multilabel.task’"," r = holdout(lrn2, multilabel.task)","object_usage_linter" +"tests/testthat/test_base_multilabel.R",101,63,"warning","no visible binding for global variable β€˜multilabel.task’"," p = getPredictionProbabilities(r$pred, getTaskClassLevels(multilabel.task))","object_usage_linter" +"tests/testthat/test_base_multilabel.R",107,23,"warning","no visible binding for global variable β€˜multilabel.task’"," r = holdout(lrn2, multilabel.task)","object_usage_linter" +"tests/testthat/test_base_multilabel.R",110,30,"warning","no visible binding for global variable β€˜multilabel.task’"," cls = getTaskClassLevels(multilabel.task)","object_usage_linter" +"tests/testthat/test_base_multilabel.R",122,59,"warning","no visible binding for global variable β€˜multilabel.task’"," expect_equal(length(tr$th), length(getTaskClassLevels(multilabel.task)))","object_usage_linter" +"tests/testthat/test_base_multilabel.R",128,5,"style","Variable and function name style should be snake_case or CamelCase."," multilabel.df2[c(2, 10, 14), c(1, 5)] = NA","object_name_linter" +"tests/testthat/test_base_multilabel.R",137,23,"warning","no visible binding for global variable β€˜multilabel.task’"," mod = train(lrn2, multilabel.task)","object_usage_linter" +"tests/testthat/test_base_multilabel.R",138,25,"warning","no visible binding for global variable β€˜multilabel.task’"," pred = predict(mod, multilabel.task)","object_usage_linter" +"tests/testthat/test_base_multilabel.R",143,5,"style","Variable and function name style should be snake_case or CamelCase."," three.target.df$y3 = three.target.df$y2","object_name_linter" +"tests/testthat/test_base_resample_operators.R",46,21,"style","Variable and function name style should be snake_case or CamelCase."," attr(ptrain$data, ""row.names"") = as.integer(row.names(ptrain$data))","object_name_linter" +"tests/testthat/test_base_resample_operators.R",49,20,"style","Variable and function name style should be snake_case or CamelCase."," attr(ptest$data, ""row.names"") = as.integer(row.names(ptest$data))","object_name_linter" +"tests/testthat/test_base_UnsupervisedTask.R",11,3,"style","Variable and function name style should be snake_case or CamelCase."," sub.task = subsetTask(noclass.task, features = 1:2)","object_name_linter" +"tests/testthat/test_classif_ada.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p[, 1]","object_name_linter" +"tests/testthat/test_classif_ada.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(binaryclass.class.levs[ifelse(p[, 2] > 0.5, 2, 1)])","object_name_linter" +"tests/testthat/test_classif_adaboostm1.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p[, 1]","object_name_linter" +"tests/testthat/test_classif_adaboostm1.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(binaryclass.class.levs[ifelse(p[, 2] > 0.5, 2, 1)])","object_name_linter" +"tests/testthat/test_classif_adaboostm1.R",44,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_adaboostm1.R",45,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_bartMachine.R",33,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_bartMachine.R",34,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_binomial.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p.class","object_name_linter" +"tests/testthat/test_classif_binomial.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_boost.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(p$class)","object_name_linter" +"tests/testthat/test_classif_boost.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = setColNames(p$prob, levels(multiclass.df[, multiclass.target]))","object_name_linter" +"tests/testthat/test_classif_bst.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = ifelse(p > 0, binaryclass.class.levs[2], binaryclass.class.levs[1])","object_name_linter" +"tests/testthat/test_classif_C50.R",31,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_C50.R",32,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_cforest.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, newdata = binaryclass.test)","object_name_linter" +"tests/testthat/test_classif_cforest.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = sapply(p, ""["", 1)","object_name_linter" +"tests/testthat/test_classif_clusterSVM.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, data.matrix(binaryclass.test[, -61]))$predictions","object_name_linter" +"tests/testthat/test_classif_ctree.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_ctree.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_cvglmnet.R",34,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_cvglmnet.R",35,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = 1 - p2","object_name_linter" +"tests/testthat/test_classif_dbnDNN.R",37,7,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(colnames(p)[max.col(p)])","object_name_linter" +"tests/testthat/test_classif_earth.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = 1 - p","object_name_linter" +"tests/testthat/test_classif_earth.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(binaryclass.class.levs[ifelse(p > 0.5, 2, 1)])","object_name_linter" +"tests/testthat/test_classif_earth.R",61,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_earth.R",62,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(predict(m,","object_name_linter" +"tests/testthat/test_classif_evtree.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, newdata = binaryclass.test)","object_name_linter" +"tests/testthat/test_classif_evtree.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p[, 1]","object_name_linter" +"tests/testthat/test_classif_extraTrees.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, x.test)","object_name_linter" +"tests/testthat/test_classif_extraTrees.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = predict(m, x.test, probability = TRUE)[, 1L]","object_name_linter" +"tests/testthat/test_classif_FDboost.R",17,9,"style","Variable and function name style should be snake_case or CamelCase."," names(fd.grids) = fdns","object_name_linter" +"tests/testthat/test_classif_fnn.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list1[[i]] = do.call(FNN::knn, pars)","object_name_linter" +"tests/testthat/test_classif_fnn.R",28,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list2[[i]] = do.call(FNN::knn, pars)","object_name_linter" +"tests/testthat/test_classif_gamboost.R",30,7,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] <- predict(m, newdata = binaryclass.test, type = ""class"")","object_name_linter" +"tests/testthat/test_classif_gamboost.R",33,7,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] <- 1 - predict(m, newdata = binaryclass.test, type = ""response"")[, 1]","object_name_linter" +"tests/testthat/test_classif_gausspr.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_gausspr.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_gbm.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_gbm.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_glmboost.R",28,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, newdata = binaryclass.test, type = ""class"")","object_name_linter" +"tests/testthat/test_classif_glmboost.R",29,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = 1 - predict(m, newdata = binaryclass.test, type = ""response"")[, 1]","object_name_linter" +"tests/testthat/test_classif_glmnet.R",39,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_glmnet.R",40,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = 1 - p2","object_name_linter" +"tests/testthat/test_classif_h2odeeplearning.R",15,3,"style","Variable and function name style should be snake_case or CamelCase."," debug.seed = getOption(""mlr.debug.seed"")","object_name_linter" +"tests/testthat/test_classif_h2odeeplearning.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = as.data.frame(p)[, 2L]","object_name_linter" +"tests/testthat/test_classif_h2ogbm.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = as.data.frame(p)[, 2L]","object_name_linter" +"tests/testthat/test_classif_h2oglm.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = as.data.frame(p)[, 2]","object_name_linter" +"tests/testthat/test_classif_h2oglm.R",55,9,"style","Variable and function name style should be snake_case or CamelCase."," names(feat.imp) = names(feat.imp.h2o)","object_name_linter" +"tests/testthat/test_classif_h2orandomForest.R",14,3,"style","Variable and function name style should be snake_case or CamelCase."," debug.seed = getOption(""mlr.debug.seed"")","object_name_linter" +"tests/testthat/test_classif_h2orandomForest.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = as.data.frame(p)[, 2L]","object_name_linter" +"tests/testthat/test_classif_h2orandomForest.R",56,9,"style","Variable and function name style should be snake_case or CamelCase."," names(feat.imp) = names(feat.imp.h2o)","object_name_linter" +"tests/testthat/test_classif_IBk.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_IBk.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_J48.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_J48.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_JRip.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_JRip.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_kknn.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_kknn.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = m$prob","object_name_linter" +"tests/testthat/test_classif_knn.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_ksvm.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = kernlab::predict(m, newdata = multiclass.test)","object_name_linter" +"tests/testthat/test_classif_ksvm.R",31,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = kernlab::predict(m, newdata = multiclass.test, type = ""prob"")","object_name_linter" +"tests/testthat/test_classif_ksvm.R",55,51,"style","Use TRUE instead of the symbol T."," B = factor(sample(c(""A"", ""B""), 10, replace = T))","T_and_F_symbol_linter" +"tests/testthat/test_classif_ksvm.R",59,56,"style","Use TRUE instead of the symbol T."," B = factor(sample(c(""A"", ""B"", ""C""), 10, replace = T))","T_and_F_symbol_linter" +"tests/testthat/test_classif_LiblineaRL1L2SVC.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(p$predictions)","object_name_linter" +"tests/testthat/test_classif_LiblineaRL1LogReg.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(p$predictions)","object_name_linter" +"tests/testthat/test_classif_LiblineaRL1LogReg.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p$probabilities[, 2L]","object_name_linter" +"tests/testthat/test_classif_LiblineaRL2L1SVC.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(p$predictions)","object_name_linter" +"tests/testthat/test_classif_LiblineaRL2LogReg.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(p$predictions)","object_name_linter" +"tests/testthat/test_classif_LiblineaRL2LogReg.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p$probabilities[, 2L]","object_name_linter" +"tests/testthat/test_classif_LiblineaRL2SVC.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(p$predictions)","object_name_linter" +"tests/testthat/test_classif_LibLineaRMultiClassSVC.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(p$predictions)","object_name_linter" +"tests/testthat/test_classif_lssvm.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = suppressMessages(kernlab::predict(m, newdata = multiclass.test))","object_name_linter" +"tests/testthat/test_classif_mda.R",28,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_mda.R",29,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_nodeHarvest.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = ifelse(p > 0.5, binaryclass.class.levs[1],","object_name_linter" +"tests/testthat/test_classif_nodeHarvest.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_OneR.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_OneR.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_pamr.R",28,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = pamr::pamr.predict(m, newdata,","object_name_linter" +"tests/testthat/test_classif_pamr.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = pamr::pamr.predict(m, newdata,","object_name_linter" +"tests/testthat/test_classif_PART.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_PART.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_penalized.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = 1 - penalized::predict(m, data = binaryclass.test)","object_name_linter" +"tests/testthat/test_classif_plr.R",34,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_plr.R",35,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_plsdaCaret.R",28,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_plsdaCaret.R",29,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_plsdaCaret.R",63,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_plsdaCaret.R",64,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_randomForest.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_randomForest.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_randomForestSRC.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p$class","object_name_linter" +"tests/testthat/test_classif_randomForestSRC.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p$predicted[, 1]","object_name_linter" +"tests/testthat/test_classif_ranger.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p$predictions[, 1]","object_name_linter" +"tests/testthat/test_classif_rda.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p$class","object_name_linter" +"tests/testthat/test_classif_rda.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p$posterior","object_name_linter" +"tests/testthat/test_classif_rFerns.R",18,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = factor(predict(m, binaryclass.test))","object_name_linter" +"tests/testthat/test_classif_rknn.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_rotationForest.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," binaryclass.test[, binaryclass.target] = NULL","object_name_linter" +"tests/testthat/test_classif_rotationForest.R",29,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_rotationForest.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_rpart.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_rpart.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_RRF.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_RRF.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_sparseLDA.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = sparseLDA:::predict.sda(m,","object_name_linter" +"tests/testthat/test_classif_sparseLDA.R",28,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = sparseLDA:::predict.sda(m,","object_name_linter" +"tests/testthat/test_classif_svm.R",32,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m1, newdata = multiclass.test)","object_name_linter" +"tests/testthat/test_classif_svm.R",33,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = predict(m2, newdata = multiclass.test,","object_name_linter" +"tests/testthat/test_classif_xgboost.R",29,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = factor(as.numeric(pred > 0.5),","object_name_linter" +"tests/testthat/test_classif_xgboost.R",49,7,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = y[, 1]","object_name_linter" +"tests/testthat/test_classif_xgboost.R",51,7,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = 1 - pred","object_name_linter" +"tests/testthat/test_cluster_cmeans.R",19,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_cluster_Cobweb.R",16,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_cluster_dbscan.R",15,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_cluster_EM.R",18,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_cluster_FarthestFirst.R",17,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_cluster_kkmeans.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_cluster_kmeans.R",19,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_cluster_MiniBatchKmeans.R",31,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_cluster_SimpleKMeans.R",17,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_cluster_XMeans.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_featsel_generateFilterValuesData.R",16,3,"style","Variable and function name style should be snake_case or CamelCase."," binaryclass.task.cp$env = NULL","object_name_linter" +"tests/testthat/test_learners_all_classif.R",90,3,"style","Variable and function name style should be snake_case or CamelCase."," min.task = makeClassifTask(""oneCol"", data.frame(","object_name_linter" +"tests/testthat/test_learners_all_regr.R",71,3,"style","Variable and function name style should be snake_case or CamelCase."," min.task = makeRegrTask(""oneCol"", data.frame(x = 1:10, y = 1:10),","object_name_linter" +"tests/testthat/test_learners_all_surv.R",12,3,"style","Variable and function name style should be snake_case or CamelCase."," sub.task = subsetTask(surv.task, subset = c(1:70),","object_name_linter" +"tests/testthat/test_multilabel_cforest.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = data.frame(p2)","object_name_linter" +"tests/testthat/test_multilabel_randomForestSRC.R",19,7,"style","Variable and function name style should be snake_case or CamelCase."," multilabel.train[j] = factor(multilabel.train[[j]],","object_name_linter" +"tests/testthat/test_multilabel_randomForestSRC.R",21,7,"style","Variable and function name style should be snake_case or CamelCase."," multilabel.test[j] = factor(multilabel.test[[j]],","object_name_linter" +"tests/testthat/test_multilabel_randomForestSRC.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.data.frame(lapply(p$classOutput,","object_name_linter" +"tests/testthat/test_multilabel_randomForestSRC.R",32,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = as.data.frame(lapply(p$classOutput,","object_name_linter" +"tests/testthat/test_regr_bartMachine.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, new_data = regr.test[, xind])","object_name_linter" +"tests/testthat/test_regr_bcart.R",15,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(df, function(x) class(x))","object_name_linter" +"tests/testthat/test_regr_bcart.R",16,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" +"tests/testthat/test_regr_bcart.R",33,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, XX = test, pred.n = FALSE)$ZZ.km","object_name_linter" +"tests/testthat/test_regr_bgp.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m,","object_name_linter" +"tests/testthat/test_regr_bgpllm.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m,","object_name_linter" +"tests/testthat/test_regr_blm.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m,","object_name_linter" +"tests/testthat/test_regr_brnn.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_bst.R",29,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, regr.num.test[, xind])","object_name_linter" +"tests/testthat/test_regr_btgp.R",13,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(df, function(x) class(x))","object_name_linter" +"tests/testthat/test_regr_btgp.R",14,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" +"tests/testthat/test_regr_btgp.R",31,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, XX = test, pred.n = FALSE)$ZZ.km","object_name_linter" +"tests/testthat/test_regr_btgpllm.R",12,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(df, function(x) class(x))","object_name_linter" +"tests/testthat/test_regr_btgpllm.R",13,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" +"tests/testthat/test_regr_btgpllm.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, XX = test, pred.n = FALSE)$ZZ.km","object_name_linter" +"tests/testthat/test_regr_btlm.R",16,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(df, function(x) class(x))","object_name_linter" +"tests/testthat/test_regr_btlm.R",17,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" +"tests/testthat/test_regr_btlm.R",34,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, XX = test, pred.n = FALSE)$ZZ.km","object_name_linter" +"tests/testthat/test_regr_cforest.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.vector(predict(m, newdata = regr.test))","object_name_linter" +"tests/testthat/test_regr_crs.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = pred","object_name_linter" +"tests/testthat/test_regr_ctree.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_cubist.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_cvglmnet.R",35,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_earth.R",18,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, newdata = regr.test)[, 1]","object_name_linter" +"tests/testthat/test_regr_evtree.R",18,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.vector(predict(m, newdata = regr.test))","object_name_linter" +"tests/testthat/test_regr_extraTrees.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, x.test)","object_name_linter" +"tests/testthat/test_regr_FDboost.R",17,9,"style","Variable and function name style should be snake_case or CamelCase."," names(fd.grids) = fdns","object_name_linter" +"tests/testthat/test_regr_fnn.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list1[[i]] = do.call(FNN::knn.reg, pars)$pred","object_name_linter" +"tests/testthat/test_regr_frbs.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_gamboost.R",35,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = suppressWarnings(as.vector(predict(m,","object_name_linter" +"tests/testthat/test_regr_gamboost.R",47,3,"style","Variable and function name style should be snake_case or CamelCase."," new.regr.df[, regr.target] = as.integer(floor(new.regr.df[, regr.target]))","object_name_linter" +"tests/testthat/test_regr_gamboost.R",48,3,"style","Variable and function name style should be snake_case or CamelCase."," new.regr.df[, ""chas""] = NULL","object_name_linter" +"tests/testthat/test_regr_gamboost.R",68,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = suppressWarnings(as.vector(predict(m,","object_name_linter" +"tests/testthat/test_regr_gausspr.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p[, 1]","object_name_linter" +"tests/testthat/test_regr_gbm.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_gbm.R",27,3,"style","Variable and function name style should be snake_case or CamelCase."," parset.list[[4]]$distribution = ""quantile""","object_name_linter" +"tests/testthat/test_regr_gbm.R",28,3,"style","Variable and function name style should be snake_case or CamelCase."," parset.list[[4]]$alpha = 0.2","object_name_linter" +"tests/testthat/test_regr_glm.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_glm.R",25,3,"style","Variable and function name style should be snake_case or CamelCase."," parset.list[[4]]$family = ""Gamma""","object_name_linter" +"tests/testthat/test_regr_glm.R",27,3,"style","Variable and function name style should be snake_case or CamelCase."," parset.list[[5]]$family = ""gaussian""","object_name_linter" +"tests/testthat/test_regr_glmboost.R",31,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.vector(predict(m, newdata = regr.test))","object_name_linter" +"tests/testthat/test_regr_glmboost.R",40,3,"style","Variable and function name style should be snake_case or CamelCase."," new.regr.df[, regr.target] = as.integer(floor(new.regr.df[, regr.target]))","object_name_linter" +"tests/testthat/test_regr_glmboost.R",59,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.vector(predict(m, newdata = new.regr.test))","object_name_linter" +"tests/testthat/test_regr_glmnet.R",35,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, as.matrix(newx), s = s)[, 1]","object_name_linter" +"tests/testthat/test_regr_glmnet.R",38,3,"style","Variable and function name style should be snake_case or CamelCase."," test.dat$chas = as.numeric(test.dat$chas)","object_name_linter" +"tests/testthat/test_regr_GPfit.R",11,12,"style","Variable and function name style should be snake_case or CamelCase."," colnames(gpfit.test.df) = c(""x1"", ""x2"", ""y"")","object_name_linter" +"tests/testthat/test_regr_h2odeeplearning.R",15,3,"style","Variable and function name style should be snake_case or CamelCase."," debug.seed = getOption(""mlr.debug.seed"")","object_name_linter" +"tests/testthat/test_regr_h2odeeplearning.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.data.frame(p)[, 1L]","object_name_linter" +"tests/testthat/test_regr_h2ogbm.R",46,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.data.frame(p)[, 1L]","object_name_linter" +"tests/testthat/test_regr_h2oglm.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.data.frame(p)[, 1L]","object_name_linter" +"tests/testthat/test_regr_h2orandomForest.R",13,3,"style","Variable and function name style should be snake_case or CamelCase."," debug.seed = getOption(""mlr.debug.seed"")","object_name_linter" +"tests/testthat/test_regr_h2orandomForest.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.data.frame(p)[, 1L]","object_name_linter" +"tests/testthat/test_regr_IBk.R",19,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_kknn.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_km.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = DiceKriging::predict(m, newdata = des2,","object_name_linter" +"tests/testthat/test_regr_ksvm.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p[, 1]","object_name_linter" +"tests/testthat/test_regr_laGP.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = do.call(laGP::aGP, pars)$mean","object_name_linter" +"tests/testthat/test_regr_LiblineaRL2L1SVR.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p$predictions","object_name_linter" +"tests/testthat/test_regr_LiblineaRL2L2SVR.R",33,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p$predictions","object_name_linter" +"tests/testthat/test_regr_mob.R",38,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_nodeHarvest.R",19,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, regr.df[-regr.train.inds, ])","object_name_linter" +"tests/testthat/test_regr_penalized.R",35,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p[, ""mu""]","object_name_linter" +"tests/testthat/test_regr_plsr.R",18,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = pls:::predict.mvr(m, newdata = regr.test,","object_name_linter" +"tests/testthat/test_regr_randomForest.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_randomForestSRC.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_ranger.R",19,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p$predictions","object_name_linter" +"tests/testthat/test_regr_ranger.R",42,5,"style","Variable and function name style should be snake_case or CamelCase."," parset.list[[i]] = c(parset, predict.type = ""se"")","object_name_linter" +"tests/testthat/test_regr_ranger.R",53,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = cbind(p$predictions, p$se)","object_name_linter" +"tests/testthat/test_regr_rknn.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_rknn.R",32,3,"style","Variable and function name style should be snake_case or CamelCase."," parset.list[[9]] = NULL","object_name_linter" +"tests/testthat/test_regr_rpart.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_RRF.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_svm.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_xgboost.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(model,","object_name_linter" +"tests/testthat/test_surv_cforest.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = -1 * predict(m, newdata = surv.test)","object_name_linter" +"tests/testthat/test_surv_coxph.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_surv_cvglmnet.R",31,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.numeric(p)","object_name_linter" +"tests/testthat/test_surv_gamboost.R",36,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = drop(p)","object_name_linter" +"tests/testthat/test_surv_gbm.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_surv_glmboost.R",33,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = drop(p)","object_name_linter" +"tests/testthat/test_surv_glmnet.R",32,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.numeric(p)","object_name_linter" +"tests/testthat/test_surv_randomForestSRC.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = drop(p)","object_name_linter" +"tests/testthat/test_surv_ranger.R",28,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = rowMeans(p$chf)","object_name_linter" +"tests/testthat/test_surv_rpart.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_tune_tuneGrid.R",30,3,"style","Variable and function name style should be snake_case or CamelCase."," op1.2$C = as.numeric(as.character(op1.2$C))","object_name_linter" +"tests/testthat/test_tune_tuneGrid.R",31,3,"style","Variable and function name style should be snake_case or CamelCase."," op1.2$sigma = as.numeric(as.character(op1.2$sigma))","object_name_linter" +"vignettes/tutorial/_mlr-tutorial_intro.Rmd",42,1,"style","Variable and function name style should be snake_case or CamelCase.","train.set = sample(n, size = 2 / 3 * n)","object_name_linter" +"vignettes/tutorial/_mlr-tutorial_intro.Rmd",43,1,"style","Variable and function name style should be snake_case or CamelCase.","test.set = setdiff(1:n, train.set)","object_name_linter" +"vignettes/tutorial/advanced_tune.Rmd",52,1,"style","Variable and function name style should be snake_case or CamelCase.","base.learners = list(","object_name_linter" +"vignettes/tutorial/bagging.Rmd",38,1,"style","Variable and function name style should be snake_case or CamelCase.","bag.lrn = makeBaggingWrapper(lrn, bw.iters = 50, bw.replace = TRUE,","object_name_linter" +"vignettes/tutorial/bagging.Rmd",69,1,"style","Variable and function name style should be snake_case or CamelCase.","bag.lrn = setPredictType(bag.lrn, predict.type = ""prob"")","object_name_linter" +"vignettes/tutorial/bagging.Rmd",80,1,"style","Variable and function name style should be snake_case or CamelCase.","train.inds = seq(1, n, 3)","object_name_linter" +"vignettes/tutorial/bagging.Rmd",81,1,"style","Variable and function name style should be snake_case or CamelCase.","test.inds = setdiff(1:n, train.inds)","object_name_linter" +"vignettes/tutorial/bagging.Rmd",83,1,"style","Variable and function name style should be snake_case or CamelCase.","bag.lrn = makeBaggingWrapper(lrn)","object_name_linter" +"vignettes/tutorial/bagging.Rmd",84,1,"style","Variable and function name style should be snake_case or CamelCase.","bag.lrn = setPredictType(bag.lrn, predict.type = ""se"")","object_name_linter" +"vignettes/tutorial/benchmark_experiments.Rmd",316,1,"style","Variable and function name style should be snake_case or CamelCase.","ring.task = convertMLBenchObjToTask(""mlbench.ringnorm"", n = 600)","object_name_linter" +"vignettes/tutorial/benchmark_experiments.Rmd",317,1,"style","Variable and function name style should be snake_case or CamelCase.","wave.task = convertMLBenchObjToTask(""mlbench.waveform"", n = 600)","object_name_linter" +"vignettes/tutorial/benchmark_experiments.Rmd",334,1,"style","Variable and function name style should be snake_case or CamelCase.","ring.task = convertMLBenchObjToTask(""mlbench.ringnorm"", n = 600)","object_name_linter" +"vignettes/tutorial/benchmark_experiments.Rmd",335,1,"style","Variable and function name style should be snake_case or CamelCase.","wave.task = convertMLBenchObjToTask(""mlbench.waveform"", n = 600)","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",92,1,"style","Variable and function name style should be snake_case or CamelCase.","credit.task = makeClassifTask(data = GermanCredit, target = ""Class"")","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",93,1,"style","Variable and function name style should be snake_case or CamelCase.","credit.task = removeConstantFeatures(credit.task)","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",157,1,"style","Variable and function name style should be snake_case or CamelCase.","pred.th = setThreshold(pred, th)","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",166,1,"style","Variable and function name style should be snake_case or CamelCase.","credit.costs = makeCostMeasure(id = ""credit.costs"", name = ""Credit costs"", costs = costs,","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",249,1,"style","Variable and function name style should be snake_case or CamelCase.","tune.res = tuneThreshold(pred = r$pred, measure = credit.costs)","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",267,1,"style","Variable and function name style should be snake_case or CamelCase.","tune.res = tuneThreshold(pred = r$pred, measure = credit.costs)","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",396,1,"style","Variable and function name style should be snake_case or CamelCase.","tune.res = tuneParams(lrn, credit.task, resampling = rin, par.set = ps,","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",411,1,"style","Variable and function name style should be snake_case or CamelCase.","credit.task.over = oversample(credit.task, rate = w, cl = ""Bad"")","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",467,1,"style","Variable and function name style should be snake_case or CamelCase.","tune.res = tuneParams(lrn, credit.task, rin, par.set = ps, measures = list(credit.costs, mmce),","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",488,1,"style","Variable and function name style should be snake_case or CamelCase.","wf.task = makeClassifTask(id = ""waveform"", data = as.data.frame(df), target = ""classes"")","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",495,1,"style","Variable and function name style should be snake_case or CamelCase.","wf.costs = makeCostMeasure(id = ""wf.costs"", name = ""Waveform costs"", costs = costs,","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",523,1,"style","Variable and function name style should be snake_case or CamelCase.","pred.th = setThreshold(r$pred, threshold = th)","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",547,1,"style","Variable and function name style should be snake_case or CamelCase.","pred.th = setThreshold(r$pred, threshold = th)","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",565,1,"style","Variable and function name style should be snake_case or CamelCase.","tune.res = tuneThreshold(pred = r$pred, measure = wf.costs)","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",589,1,"style","Variable and function name style should be snake_case or CamelCase.","tune.res = tuneParams(lrn, wf.task, resampling = rin, par.set = ps,","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",610,1,"style","Variable and function name style should be snake_case or CamelCase.","costsens.task = makeCostSensTask(id = ""iris"", data = df, cost = cost)","object_name_linter" +"vignettes/tutorial/create_filter.Rmd",125,1,"style","Variable and function name style should be snake_case or CamelCase.","iris.task.filtered = filterFeatures(iris.task, method = ""nonsense.filter"", abs = 2)","object_name_linter" +"vignettes/tutorial/create_imputation.Rmd",32,1,"style","Variable and function name style should be snake_case or CamelCase.","showFunctionDef = function(fun, name = sub(""^[^:]*:+"", """", deparse(substitute(fun)))) {","object_name_linter" +"vignettes/tutorial/create_imputation.Rmd",63,1,"style","Variable and function name style should be snake_case or CamelCase.","imputeLOCF = function() {","object_name_linter" +"vignettes/tutorial/create_imputation.Rmd",69,7,"style","Variable and function name style should be snake_case or CamelCase."," lastValue = which(dind == 1) # position of the last observed value previous to NA","object_name_linter" +"vignettes/tutorial/create_imputation.Rmd",70,7,"style","Variable and function name style should be snake_case or CamelCase."," lastNA = which(dind == -1) # position of the last of potentially several consecutive NA's","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",121,1,"style","Variable and function name style should be snake_case or CamelCase.","showFunctionDef = function(fun, name = gsub(""^[^:]*:+"", """", deparse(substitute(fun)))) {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",129,1,"style","Variable and function name style should be snake_case or CamelCase.","makeRLearner.classif.lda = function() {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",159,58,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","function(.learner, .task, .subset, .weights = NULL, ...) { }","brace_linter" +"vignettes/tutorial/create_learner.Rmd",159,60,"style","Closing curly-braces should always be on their own line, unless they are followed by an else.","function(.learner, .task, .subset, .weights = NULL, ...) { }","brace_linter" +"vignettes/tutorial/create_learner.Rmd",173,1,"style","Variable and function name style should be snake_case or CamelCase.","trainLearner.classif.lda = function(.learner, .task, .subset, .weights = NULL, ...) {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",186,43,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","function(.learner, .model, .newdata, ...) { }","brace_linter" +"vignettes/tutorial/create_learner.Rmd",186,45,"style","Closing curly-braces should always be on their own line, unless they are followed by an else.","function(.learner, .model, .newdata, ...) { }","brace_linter" +"vignettes/tutorial/create_learner.Rmd",199,1,"style","Variable and function name style should be snake_case or CamelCase.","predictLearner.classif.lda = function(.learner, .model, .newdata, predict.method = ""plug-in"", ...) {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",218,1,"style","Variable and function name style should be snake_case or CamelCase.","makeRLearner.regr.earth = function() {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",247,1,"style","Variable and function name style should be snake_case or CamelCase.","trainLearner.regr.earth = function(.learner, .task, .subset, .weights = NULL, ...) {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",254,1,"style","Variable and function name style should be snake_case or CamelCase.","predictLearner.regr.earth = function(.learner, .model, .newdata, ...) {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",273,1,"style","Variable and function name style should be snake_case or CamelCase.","makeRLearner.surv.coxph = function() {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",301,1,"style","Variable and function name style should be snake_case or CamelCase.","trainLearner.surv.coxph = function(.learner, .task, .subset, .weights = NULL, ...) {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",317,1,"style","Variable and function name style should be snake_case or CamelCase.","predictLearner.surv.coxph = function(.learner, .model, .newdata, ...) {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",321,5,"style","Variable and function name style should be snake_case or CamelCase."," surv.range = getTrainingInfo(.model$learner.model)$surv.range","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",342,1,"style","Variable and function names should not be longer than 30 characters.","makeRLearner.cluster.FarthestFirst = function() {","object_length_linter" +"vignettes/tutorial/create_learner.Rmd",342,1,"style","Variable and function name style should be snake_case or CamelCase.","makeRLearner.cluster.FarthestFirst = function() {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",360,1,"style","Variable and function names should not be longer than 30 characters.","trainLearner.cluster.FarthestFirst = function(.learner, .task, .subset, .weights = NULL, ...) {","object_length_linter" +"vignettes/tutorial/create_learner.Rmd",360,1,"style","Variable and function name style should be snake_case or CamelCase.","trainLearner.cluster.FarthestFirst = function(.learner, .task, .subset, .weights = NULL, ...) {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",367,1,"style","Variable and function names should not be longer than 30 characters.","predictLearner.cluster.FarthestFirst = function(.learner, .model, .newdata, ...) {","object_length_linter" +"vignettes/tutorial/create_learner.Rmd",367,1,"style","Variable and function name style should be snake_case or CamelCase.","predictLearner.cluster.FarthestFirst = function(.learner, .model, .newdata, ...) {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",390,1,"style","Variable and function name style should be snake_case or CamelCase.","makeRLearner.multilabel.rFerns = function() {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",407,1,"style","Variable and function name style should be snake_case or CamelCase.","trainLearner.multilabel.rFerns = function(.learner, .task, .subset, .weights = NULL, ...) {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",414,1,"style","Variable and function names should not be longer than 30 characters.","predictLearner.multilabel.rFerns = function(.learner, .model, .newdata, ...) {","object_length_linter" +"vignettes/tutorial/create_learner.Rmd",414,1,"style","Variable and function name style should be snake_case or CamelCase.","predictLearner.multilabel.rFerns = function(.learner, .model, .newdata, ...) {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",435,1,"style","Variable and function names should not be longer than 30 characters.","getFeatureImportanceLearner.classif.rpart = function(.learner, .model, ...) {","object_length_linter" +"vignettes/tutorial/create_learner.Rmd",435,1,"style","Variable and function name style should be snake_case or CamelCase.","getFeatureImportanceLearner.classif.rpart = function(.learner, .model, ...) {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",444,1,"style","Variable and function names should not be longer than 30 characters.","getFeatureImportanceLearner.classif.randomForestSRC = function(.learner, .model, ...) {","object_length_linter" +"vignettes/tutorial/create_learner.Rmd",444,1,"style","Variable and function name style should be snake_case or CamelCase.","getFeatureImportanceLearner.classif.randomForestSRC = function(.learner, .model, ...) {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",560,3,"style","Variable and function name style should be snake_case or CamelCase."," parset.list = list(","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",568,3,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list = list()","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",570,13,"warning","1:length(...) is likely to be wrong in the empty edge case. Use seq_along() instead."," for (i in 1:length(parset.list)) {","seq_linter" +"vignettes/tutorial/create_learner.Rmd",578,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"vignettes/tutorial/create_measure.Rmd",141,1,"style","Variable and function name style should be snake_case or CamelCase.","my.mmce.fun = function(task, model, pred, feats, extra.args) {","object_name_linter" +"vignettes/tutorial/create_measure.Rmd",141,50,"style","Variable and function name style should be snake_case or CamelCase.","my.mmce.fun = function(task, model, pred, feats, extra.args) {","object_name_linter" +"vignettes/tutorial/create_measure.Rmd",147,1,"style","Variable and function name style should be snake_case or CamelCase.","my.mmce = makeMeasure(","object_name_linter" +"vignettes/tutorial/create_measure.Rmd",182,1,"style","Variable and function name style should be snake_case or CamelCase.","my.costs = makeCostMeasure(","object_name_linter" +"vignettes/tutorial/create_measure.Rmd",214,1,"style","Variable and function name style should be snake_case or CamelCase.","my.range.aggr = makeAggregation(id = ""test.range"", name = ""Test Range"",","object_name_linter" +"vignettes/tutorial/create_measure.Rmd",216,24,"style","Variable and function name style should be snake_case or CamelCase."," fun = function(task, perf.test, perf.train, measure, group, pred) {","object_name_linter" +"vignettes/tutorial/create_measure.Rmd",216,35,"style","Variable and function name style should be snake_case or CamelCase."," fun = function(task, perf.test, perf.train, measure, group, pred) {","object_name_linter" +"vignettes/tutorial/create_measure.Rmd",244,1,"style","Variable and function name style should be snake_case or CamelCase.","perf.data = as.data.frame(res$opt.path)","object_name_linter" +"vignettes/tutorial/example_tasks.Rmd",14,1,"style","Variable and function name style should be snake_case or CamelCase.","urlMlrFunctions = ""https://mlr-org.github.io/mlr/reference/""","object_name_linter" +"vignettes/tutorial/example_tasks.Rmd",27,1,"style","Variable and function name style should be snake_case or CamelCase.","linkTask = function(x) {","object_name_linter" +"vignettes/tutorial/example_tasks.Rmd",28,47,"warning","no visible binding for global variable β€˜urlMlrFunctions’"," collapse(sprintf(""[%1$s](%2$s%1$s%3$s)"", x, urlMlrFunctions, ext), sep = ""
"")","object_usage_linter" +"vignettes/tutorial/example_tasks.Rmd",28,64,"warning","no visible binding for global variable β€˜ext’"," collapse(sprintf(""[%1$s](%2$s%1$s%3$s)"", x, urlMlrFunctions, ext), sep = ""
"")","object_usage_linter" +"vignettes/tutorial/feature_selection.Rmd",99,1,"style","Variable and function name style should be snake_case or CamelCase.","filtered.task = filterFeatures(iris.task, method = ""FSelectorRcpp_information.gain"", abs = 2)","object_name_linter" +"vignettes/tutorial/feature_selection.Rmd",102,1,"style","Variable and function name style should be snake_case or CamelCase.","filtered.task = filterFeatures(iris.task, fval = fv, perc = 0.25)","object_name_linter" +"vignettes/tutorial/feature_selection.Rmd",105,1,"style","Variable and function name style should be snake_case or CamelCase.","filtered.task = filterFeatures(iris.task, fval = fv, threshold = 0.5)","object_name_linter" +"vignettes/tutorial/feature_selection.Rmd",325,1,"style","Variable and function name style should be snake_case or CamelCase.","out.rdesc = makeResampleDesc(""CV"", iters = 5)","object_name_linter" +"vignettes/tutorial/filter_methods.Rmd",14,1,"style","Variable and function name style should be snake_case or CamelCase.","urlContribPackages = ""https://cran.r-project.org/package=""","object_name_linter" +"vignettes/tutorial/filter_methods.Rmd",29,1,"style","Variable and function name style should be snake_case or CamelCase.","linkPkg = function(x) {","object_name_linter" +"vignettes/tutorial/filter_methods.Rmd",30,63,"warning","no visible binding for global variable β€˜urlContribPackages’"," ifelse(x == """", """", collapse(sprintf(""[%1$s](%2$s%1$s)"", x, urlContribPackages), sep = ""
""))","object_usage_linter" +"vignettes/tutorial/filter_methods.Rmd",45,121,"style","Lines should not be more than 120 characters.","pandoc.table(dfnd, style = ""rmarkdown"", split.tables = Inf, split.cells = Inf, emphasize.rownames = FALSE, justify = just)","line_length_linter" +"vignettes/tutorial/functional_data.Rmd",118,1,"style","Variable and function name style should be snake_case or CamelCase.","fd.features = list(""UVVIS"" = 3:136, ""NIR"" = 137:367)","object_name_linter" +"vignettes/tutorial/functional_data.Rmd",157,1,"style","Variable and function name style should be snake_case or CamelCase.","knn.lrn = makeLearner(""classif.fdausc.knn"")","object_name_linter" +"vignettes/tutorial/functional_data.Rmd",203,1,"style","Variable and function name style should be snake_case or CamelCase.","rpart.lrn = makeLearner(""regr.rpart"")","object_name_linter" +"vignettes/tutorial/functional_data.Rmd",230,1,"style","Variable and function name style should be snake_case or CamelCase.","feat.methods = list(""UVVIS"" = extractFDAFourier(), ""NIR"" = extractFDAFPCA())","object_name_linter" +"vignettes/tutorial/functional_data.Rmd",250,1,"style","Variable and function name style should be snake_case or CamelCase.","feat.methods = list(""UVVIS"" = extractFDAWavelets(filter = ""haar""))","object_name_linter" +"vignettes/tutorial/functional_data.Rmd",251,1,"style","Variable and function name style should be snake_case or CamelCase.","task.w = extractFDAFeatures(tsk1, feat.methods = feat.methods)","object_name_linter" +"vignettes/tutorial/functional_data.Rmd",254,1,"style","Variable and function name style should be snake_case or CamelCase.","feat.methods = list(""NIR"" = extractFDAWavelets(filter = ""d4""))","object_name_linter" +"vignettes/tutorial/functional_data.Rmd",255,1,"style","Variable and function name style should be snake_case or CamelCase.","task.wd4 = extractFDAFeatures(tsk1, feat.methods = feat.methods)","object_name_linter" +"vignettes/tutorial/functional_data.Rmd",269,1,"style","Variable and function name style should be snake_case or CamelCase.","feat.methods = list(""NIR"" = extractFDAFourier(trafo.coeff = ""amplitude""),","object_name_linter" +"vignettes/tutorial/functional_data.Rmd",271,1,"style","Variable and function name style should be snake_case or CamelCase.","task.fourier = extractFDAFeatures(tsk1, feat.methods = feat.methods)","object_name_linter" +"vignettes/tutorial/functional_data.Rmd",283,1,"style","Variable and function name style should be snake_case or CamelCase.","feat.methods = list(""NIR"" = extractFDAFourier())","object_name_linter" +"vignettes/tutorial/functional_data.Rmd",284,1,"style","Variable and function name style should be snake_case or CamelCase.","wrapped.lrn = makeExtractFDAFeatsWrapper(""regr.rpart"", feat.methods = feat.methods)","object_name_linter" +"vignettes/tutorial/handling_of_spatial_data.Rmd",90,1,"style","Variable and function name style should be snake_case or CamelCase.","learner.rf = makeLearner(""classif.ranger"", predict.type = ""prob"")","object_name_linter" +"vignettes/tutorial/handling_of_spatial_data.Rmd",108,1,"style","Variable and function name style should be snake_case or CamelCase.","learner.rf = makeLearner(""classif.ranger"", predict.type = ""prob"")","object_name_linter" +"vignettes/tutorial/hyperpar_tuning_effects.Rmd",75,43,"style","Use TRUE instead of the symbol T.","generateHyperParsEffectData(res, trafo = T, include.diagnostics = FALSE)","T_and_F_symbol_linter" +"vignettes/tutorial/hyperpar_tuning_effects.Rmd",86,43,"style","Use TRUE instead of the symbol T.","generateHyperParsEffectData(res, trafo = T, include.diagnostics = FALSE)","T_and_F_symbol_linter" +"vignettes/tutorial/hyperpar_tuning_effects.Rmd",114,43,"style","Use TRUE instead of the symbol T.","generateHyperParsEffectData(res, trafo = T, include.diagnostics = FALSE)","T_and_F_symbol_linter" +"vignettes/tutorial/hyperpar_tuning_effects.Rmd",126,43,"style","Use TRUE instead of the symbol T.","generateHyperParsEffectData(res, trafo = T, include.diagnostics = FALSE)","T_and_F_symbol_linter" +"vignettes/tutorial/impute.Rmd",104,1,"style","Variable and function name style should be snake_case or CamelCase.","airq.train = airq[1:100, ]","object_name_linter" +"vignettes/tutorial/impute.Rmd",105,1,"style","Variable and function name style should be snake_case or CamelCase.","airq.test = airq[-c(1:100), ]","object_name_linter" +"vignettes/tutorial/impute.Rmd",134,1,"style","Variable and function name style should be snake_case or CamelCase.","airq.test.imp = reimpute(airq.test, imp$desc)","object_name_linter" +"vignettes/tutorial/integrated_learners.Rmd",14,1,"style","Variable and function name style should be snake_case or CamelCase.","urlContribPackages = urlBasePackages = ""http://www.rdocumentation.org/packages/""","object_name_linter" +"vignettes/tutorial/integrated_learners.Rmd",14,22,"style","Variable and function name style should be snake_case or CamelCase.","urlContribPackages = urlBasePackages = ""http://www.rdocumentation.org/packages/""","object_name_linter" +"vignettes/tutorial/integrated_learners.Rmd",31,1,"style","Variable and function name style should be snake_case or CamelCase.","linkPkg = function(x) {","object_name_linter" +"vignettes/tutorial/integrated_learners.Rmd",34,7,"warning","no visible binding for global variable β€˜urlBasePackages’"," if (urlBasePackages != urlContribPackages) {","object_usage_linter" +"vignettes/tutorial/integrated_learners.Rmd",34,26,"warning","no visible binding for global variable β€˜urlContribPackages’"," if (urlBasePackages != urlContribPackages) {","object_usage_linter" +"vignettes/tutorial/integrated_learners.Rmd",35,18,"warning","no visible binding for global variable β€˜baseR’"," ind = x %in% baseR","object_usage_linter" +"vignettes/tutorial/integrated_learners.Rmd",36,13,"warning","no visible binding for global variable β€˜urlContribPackages’"," url = c(urlContribPackages, urlBasePackages)[ind + 1]","object_usage_linter" +"vignettes/tutorial/integrated_learners.Rmd",36,33,"warning","no visible binding for global variable β€˜urlBasePackages’"," url = c(urlContribPackages, urlBasePackages)[ind + 1]","object_usage_linter" +"vignettes/tutorial/integrated_learners.Rmd",38,11,"warning","no visible binding for global variable β€˜urlContribPackages’"," url = urlContribPackages","object_usage_linter" +"vignettes/tutorial/integrated_learners.Rmd",43,1,"style","Variable and function name style should be snake_case or CamelCase.","getTab = function(type) {","object_name_linter" +"vignettes/tutorial/integrated_learners.Rmd",54,121,"style","Lines should not be more than 120 characters."," cols = c(""class"", ""type"", ""package"", ""short.name"", ""name"", ""numerics"", ""factors"", ""ordered"", ""missings"", ""weights"", ""note"", ""installed"")","line_length_linter" +"vignettes/tutorial/integrated_learners.Rmd",57,3,"style","Variable and function name style should be snake_case or CamelCase."," colNames = c(""Class / Short Name / Name"", ""Packages"", ""Num."", ""Fac."", ""Ord."", ""NAs"", ""Weights"", ""Props"", ""Note"")","object_name_linter" +"vignettes/tutorial/integrated_learners.Rmd",59,121,"style","Lines should not be more than 120 characters."," col.types = c(""character"", ""character"", ""logical"", ""logical"", ""logical"", ""logical"", ""logical"", ""character"", ""character""))","line_length_linter" +"vignettes/tutorial/integrated_learners.Rmd",65,38,"warning","no visible binding for global variable β€˜linkPkg’"," df$Packages = sapply(lrns$package, linkPkg)","object_usage_linter" +"vignettes/tutorial/integrated_learners.Rmd",74,1,"style","Variable and function name style should be snake_case or CamelCase.","makeTab = function(df) {","object_name_linter" +"vignettes/tutorial/learner.Rmd",39,1,"style","Variable and function name style should be snake_case or CamelCase.","classif.lrn = makeLearner(""classif.randomForest"", predict.type = ""prob"", fix.factors.prediction = TRUE)","object_name_linter" +"vignettes/tutorial/learner.Rmd",42,1,"style","Variable and function name style should be snake_case or CamelCase.","regr.lrn = makeLearner(""regr.gbm"", par.vals = list(n.trees = 500, interaction.depth = 3))","object_name_linter" +"vignettes/tutorial/learner.Rmd",45,1,"style","Variable and function name style should be snake_case or CamelCase.","surv.lrn = makeLearner(""surv.coxph"", id = ""cph"")","object_name_linter" +"vignettes/tutorial/learner.Rmd",48,1,"style","Variable and function name style should be snake_case or CamelCase.","cluster.lrn = makeLearner(""cluster.kmeans"", centers = 5)","object_name_linter" +"vignettes/tutorial/learner.Rmd",51,1,"style","Variable and function name style should be snake_case or CamelCase.","multilabel.lrn = makeLearner(""multilabel.rFerns"")","object_name_linter" +"vignettes/tutorial/learner.Rmd",142,1,"style","Variable and function name style should be snake_case or CamelCase.","surv.lrn = setLearnerId(surv.lrn, ""CoxModel"")","object_name_linter" +"vignettes/tutorial/learner.Rmd",146,1,"style","Variable and function name style should be snake_case or CamelCase.","classif.lrn = setPredictType(classif.lrn, ""response"")","object_name_linter" +"vignettes/tutorial/learner.Rmd",149,1,"style","Variable and function name style should be snake_case or CamelCase.","cluster.lrn = setHyperPars(cluster.lrn, centers = 4)","object_name_linter" +"vignettes/tutorial/learner.Rmd",152,1,"style","Variable and function name style should be snake_case or CamelCase.","regr.lrn = removeHyperPars(regr.lrn, c(""n.trees"", ""interaction.depth""))","object_name_linter" +"vignettes/tutorial/measures.Rmd",14,1,"style","Variable and function name style should be snake_case or CamelCase.","urlMlrFunctions = ""https://mlr-org.github.io/mlr/reference/""","object_name_linter" +"vignettes/tutorial/measures.Rmd",46,1,"style","Variable and function name style should be snake_case or CamelCase.","linkFct = function(x, y) {","object_name_linter" +"vignettes/tutorial/measures.Rmd",47,50,"warning","no visible binding for global variable β€˜urlMlrFunctions’"," collapse(sprintf(""[%1$s](%3$s%2$s%4$s)"", x, y, urlMlrFunctions, ext), sep = ""
"")","object_usage_linter" +"vignettes/tutorial/measures.Rmd",47,67,"warning","no visible binding for global variable β€˜ext’"," collapse(sprintf(""[%1$s](%3$s%2$s%4$s)"", x, y, urlMlrFunctions, ext), sep = ""
"")","object_usage_linter" +"vignettes/tutorial/measures.Rmd",54,1,"style","Variable and function name style should be snake_case or CamelCase.","getTab = function(type) {","object_name_linter" +"vignettes/tutorial/measures.Rmd",67,121,"style","Lines should not be more than 120 characters."," cols = c(""ID / Name"", ""Minim."", ""Best"", ""Worst"", ""Multi"", ""Pred."", ""Truth"", ""Probs"", ""Model"", ""Task"", ""Feats"", ""Aggr."", ""Note"")","line_length_linter" +"vignettes/tutorial/measures.Rmd",69,121,"style","Lines should not be more than 120 characters."," col.types = c(""character"", ""logical"", ""numeric"", ""numeric"", ""logical"", ""logical"", ""logical"", ""logical"", ""logical"", ""logical"", ""logical"", ""character"", ""character""))","line_length_linter" +"vignettes/tutorial/measures.Rmd",74,29,"warning","no visible global function definition for β€˜linkFct’"," df[i, 1] = paste0(""**"", linkFct(mea$id, ""measures""), ""**
"", mea$name)","object_usage_linter" +"vignettes/tutorial/measures.Rmd",85,17,"warning","no visible global function definition for β€˜linkFct’"," df[i, 12] = linkFct(mea$aggr$id, ""aggregations"")","object_usage_linter" +"vignettes/tutorial/measures.Rmd",86,17,"warning","no visible global function definition for β€˜urls’"," df[i, 13] = urls(cn(mea$note))","object_usage_linter" +"vignettes/tutorial/measures.Rmd",86,22,"warning","no visible global function definition for β€˜cn’"," df[i, 13] = urls(cn(mea$note))","object_usage_linter" +"vignettes/tutorial/measures.Rmd",89,121,"style","Lines should not be more than 120 characters."," just = c(""left"", ""center"", ""right"", ""right"", ""center"", ""center"", ""center"", ""center"", ""center"", ""center"", ""center"", ""left"", ""left"")","line_length_linter" +"vignettes/tutorial/multilabel.Rmd",37,1,"style","Variable and function name style should be snake_case or CamelCase.","yeast.task = makeMultilabelTask(id = ""multi"", data = yeast, target = labels)","object_name_linter" +"vignettes/tutorial/multilabel.Rmd",55,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.rfsrc = makeLearner(""multilabel.randomForestSRC"")","object_name_linter" +"vignettes/tutorial/multilabel.Rmd",56,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.rFerns = makeLearner(""multilabel.rFerns"")","object_name_linter" +"vignettes/tutorial/multilabel.Rmd",68,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.br = makeLearner(""classif.rpart"", predict.type = ""prob"")","object_name_linter" +"vignettes/tutorial/multilabel.Rmd",69,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.br = makeMultilabelBinaryRelevanceWrapper(lrn.br)","object_name_linter" +"vignettes/tutorial/multilabel.Rmd",72,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.br2 = makeMultilabelBinaryRelevanceWrapper(""classif.rpart"")","object_name_linter" +"vignettes/tutorial/nested_resampling.Rmd",145,1,"style","Variable and function name style should be snake_case or CamelCase.","opt.paths = getNestedTuneResultsOptPathDf(r)","object_name_linter" +"vignettes/tutorial/nested_resampling.Rmd",150,1,"style","Variable and function name style should be snake_case or CamelCase.","opt.paths = getNestedTuneResultsOptPathDf(r)","object_name_linter" +"vignettes/tutorial/nested_resampling.Rmd",265,1,"style","Variable and function name style should be snake_case or CamelCase.","opt.paths = lapply(r$extract, function(x) as.data.frame(x$opt.path))","object_name_linter" +"vignettes/tutorial/nested_resampling.Rmd",270,1,"style","Variable and function name style should be snake_case or CamelCase.","opt.paths = lapply(r$extract, function(x) as.data.frame(x$opt.path))","object_name_linter" +"vignettes/tutorial/nested_resampling.Rmd",363,1,"style","Variable and function name style should be snake_case or CamelCase.","opt.paths = lapply(res, function(x) as.data.frame(x$opt.path))","object_name_linter" +"vignettes/tutorial/nested_resampling.Rmd",458,1,"style","Variable and function name style should be snake_case or CamelCase.","tune.res = getBMRTuneResults(res,","object_name_linter" +"vignettes/tutorial/nested_resampling.Rmd",514,1,"style","Variable and function name style should be snake_case or CamelCase.","opt.paths = lapply(feats, function(x) as.data.frame(x$opt.path))","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",64,1,"style","Variable and function name style should be snake_case or CamelCase.","data.imbal.train = rbind(","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",69,1,"style","Variable and function name style should be snake_case or CamelCase.","task.over = oversample(task, rate = 8)","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",70,1,"style","Variable and function name style should be snake_case or CamelCase.","task.under = undersample(task, rate = 1 / 8)","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",87,1,"style","Variable and function name style should be snake_case or CamelCase.","mod.over = train(lrn, task.over)","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",88,1,"style","Variable and function name style should be snake_case or CamelCase.","mod.under = train(lrn, task.under)","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",89,1,"style","Variable and function name style should be snake_case or CamelCase.","data.imbal.test = rbind(","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",113,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.over = makeOversampleWrapper(lrn, osw.rate = 8)","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",114,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.under = makeUndersampleWrapper(lrn, usw.rate = 1 / 8)","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",116,1,"style","Variable and function name style should be snake_case or CamelCase.","mod.over = train(lrn.over, task)","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",117,1,"style","Variable and function name style should be snake_case or CamelCase.","mod.under = train(lrn.under, task)","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",140,1,"style","Variable and function name style should be snake_case or CamelCase.","task.smote = smote(task, rate = 8, nn = 5)","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",149,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.smote = makeSMOTEWrapper(lrn, sw.rate = 8, sw.nn = 5)","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",150,1,"style","Variable and function name style should be snake_case or CamelCase.","mod.smote = train(lrn.smote, task)","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",170,1,"style","Variable and function name style should be snake_case or CamelCase.","obw.lrn = makeOverBaggingWrapper(lrn, obw.rate = 8, obw.iters = 3)","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",186,1,"style","Variable and function name style should be snake_case or CamelCase.","obw.lrn = setPredictType(obw.lrn, ""prob"")","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",196,1,"style","Variable and function name style should be snake_case or CamelCase.","obw.lrn = makeOverBaggingWrapper(lrn, obw.rate = 8, obw.iters = 3)","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",203,1,"style","Variable and function name style should be snake_case or CamelCase.","obw.lrn = setPredictType(obw.lrn, ""prob"")","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",317,1,"style","Variable and function name style should be snake_case or CamelCase.","wcw.lrn = makeWeightedClassesWrapper(lrn, wcw.weight = 0.01)","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",328,1,"style","Variable and function name style should be snake_case or CamelCase.","wcw.lrn = makeWeightedClassesWrapper(lrn, wcw.weight = 0.01)","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",66,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.classif = makeLearner(""classif.ksvm"", predict.type = ""prob"")","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",67,1,"style","Variable and function name style should be snake_case or CamelCase.","fit.classif = train(lrn.classif, iris.task)","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",80,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.lst = generatePartialDependenceData(fit.classif, iris.task, c(""Petal.Width"", ""Petal.Length""), FALSE)","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",87,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.int = generatePartialDependenceData(fit.classif, iris.task, c(""Petal.Width"", ""Petal.Length""), TRUE)","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",104,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.regr = makeLearner(""regr.ksvm"")","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",105,1,"style","Variable and function name style should be snake_case or CamelCase.","fit.regr = train(lrn.regr, bh.task)","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",106,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.regr = generatePartialDependenceData(fit.regr, bh.task, ""lstat"", fun = median)","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",111,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.ci = generatePartialDependenceData(fit.regr, bh.task, ""lstat"",","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",117,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.classif = generatePartialDependenceData(fit.classif, iris.task, ""Petal.Length"", fun = median)","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",126,1,"style","Variable and function name style should be snake_case or CamelCase.","fit.se = train(makeLearner(""regr.randomForest"", predict.type = ""se""), bh.task)","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",127,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.se = generatePartialDependenceData(fit.se, bh.task, c(""lstat"", ""crim""))","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",137,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.ind.regr = generatePartialDependenceData(fit.regr, bh.task, ""lstat"", individual = TRUE)","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",146,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.ind.classif = generatePartialDependenceData(fit.classif, iris.task, ""Petal.Length"", individual = TRUE)","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",155,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.regr.der = generatePartialDependenceData(fit.regr, bh.task, ""lstat"", derivative = TRUE)","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",160,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.regr.der.ind = generatePartialDependenceData(fit.regr, bh.task, ""lstat"", derivative = TRUE,","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",166,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.classif.der = generatePartialDependenceData(fit.classif, iris.task, ""Petal.Width"", derivative = TRUE)","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",171,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.classif.der.ind = generatePartialDependenceData(fit.classif, iris.task, ""Petal.Width"", derivative = TRUE,","object_name_linter" +"vignettes/tutorial/predict.Rmd",36,1,"style","Variable and function name style should be snake_case or CamelCase.","train.set = seq(1, n, by = 2)","object_name_linter" +"vignettes/tutorial/predict.Rmd",37,1,"style","Variable and function name style should be snake_case or CamelCase.","test.set = seq(2, n, by = 2)","object_name_linter" +"vignettes/tutorial/predict.Rmd",41,1,"style","Variable and function name style should be snake_case or CamelCase.","task.pred = predict(mod, task = bh.task, subset = test.set)","object_name_linter" +"vignettes/tutorial/predict.Rmd",47,1,"style","Variable and function name style should be snake_case or CamelCase.","train.set = seq(1, n, by = 2)","object_name_linter" +"vignettes/tutorial/predict.Rmd",48,1,"style","Variable and function name style should be snake_case or CamelCase.","test.set = seq(2, n, by = 2)","object_name_linter" +"vignettes/tutorial/predict.Rmd",52,1,"style","Variable and function name style should be snake_case or CamelCase.","task.pred = predict(mod, task = bh.task, subset = test.set)","object_name_linter" +"vignettes/tutorial/predict.Rmd",77,1,"style","Variable and function name style should be snake_case or CamelCase.","iris.train = iris[seq(1, n, by = 2), -5]","object_name_linter" +"vignettes/tutorial/predict.Rmd",78,1,"style","Variable and function name style should be snake_case or CamelCase.","iris.test = iris[seq(2, n, by = 2), -5]","object_name_linter" +"vignettes/tutorial/predict.Rmd",82,1,"style","Variable and function name style should be snake_case or CamelCase.","newdata.pred = predict(mod, newdata = iris.test)","object_name_linter" +"vignettes/tutorial/predict.Rmd",88,1,"style","Variable and function name style should be snake_case or CamelCase.","iris.train = iris[seq(1, n, by = 2), -5]","object_name_linter" +"vignettes/tutorial/predict.Rmd",89,1,"style","Variable and function name style should be snake_case or CamelCase.","iris.test = iris[seq(2, n, by = 2), -5]","object_name_linter" +"vignettes/tutorial/predict.Rmd",93,1,"style","Variable and function name style should be snake_case or CamelCase.","newdata.pred = predict(mod, newdata = iris.test)","object_name_linter" +"vignettes/tutorial/predict.Rmd",156,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.lm = makeLearner(""regr.lm"", predict.type = ""se"")","object_name_linter" +"vignettes/tutorial/predict.Rmd",157,1,"style","Variable and function name style should be snake_case or CamelCase.","mod.lm = train(lrn.lm, bh.task, subset = train.set)","object_name_linter" +"vignettes/tutorial/predict.Rmd",158,1,"style","Variable and function name style should be snake_case or CamelCase.","task.pred.lm = predict(mod.lm, task = bh.task, subset = test.set)","object_name_linter" +"vignettes/tutorial/predict.Rmd",163,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.lm = makeLearner(""regr.lm"", predict.type = ""se"")","object_name_linter" +"vignettes/tutorial/predict.Rmd",164,1,"style","Variable and function name style should be snake_case or CamelCase.","mod.lm = train(lrn.lm, bh.task, subset = train.set)","object_name_linter" +"vignettes/tutorial/predict.Rmd",165,1,"style","Variable and function name style should be snake_case or CamelCase.","task.pred.lm = predict(mod.lm, task = bh.task, subset = test.set)","object_name_linter" +"vignettes/tutorial/predict.Rmd",246,1,"style","Variable and function name style should be snake_case or CamelCase.","conf.matrix = calculateConfusionMatrix(pred, relative = TRUE)","object_name_linter" +"vignettes/tutorial/preproc.Rmd",376,1,"style","Variable and function name style should be snake_case or CamelCase.","makePreprocWrapperScale = function(learner, center = TRUE, scale = TRUE) {","object_name_linter" +"vignettes/tutorial/resample.Rmd",182,121,"style","Lines should not be more than 120 characters.","## Aggregated Result: mmce.test.mean=0.2904762,fpr.test.mean=0.2932609,fnr.test.mean=0.2615067,timetrain.test.mean=0.0128000","line_length_linter" +"vignettes/tutorial/resample.Rmd",207,121,"style","Lines should not be more than 120 characters.","## Aggr perf: mmce.test.mean=0.2904762,fpr.test.mean=0.2932609,fnr.test.mean=0.2615067,timetrain.test.mean=0.0128000,ber.test.mean=0.2773838,timepredict.test.mean=0.0032000","line_length_linter" +"vignettes/tutorial/resample.Rmd",346,1,"style","Variable and function name style should be snake_case or CamelCase.","predList = getRRPredictionList(r)","object_name_linter" +"vignettes/tutorial/resample.Rmd",351,1,"style","Variable and function name style should be snake_case or CamelCase.","predList = getRRPredictionList(r)","object_name_linter" +"vignettes/tutorial/resample.Rmd",635,1,"style","Variable and function name style should be snake_case or CamelCase.","r.lda = resample(""classif.lda"", iris.task, rin, show.info = FALSE)","object_name_linter" +"vignettes/tutorial/resample.Rmd",636,1,"style","Variable and function name style should be snake_case or CamelCase.","r.rpart = resample(""classif.rpart"", iris.task, rin, show.info = FALSE)","object_name_linter" +"vignettes/tutorial/resample.Rmd",693,1,"style","Variable and function name style should be snake_case or CamelCase.","mseTestMedian = setAggregation(mse, test.median)","object_name_linter" +"vignettes/tutorial/resample.Rmd",694,1,"style","Variable and function name style should be snake_case or CamelCase.","mseTestMin = setAggregation(mse, test.min)","object_name_linter" +"vignettes/tutorial/resample.Rmd",695,1,"style","Variable and function name style should be snake_case or CamelCase.","mseTestMax = setAggregation(mse, test.max)","object_name_linter" +"vignettes/tutorial/resample.Rmd",704,1,"style","Variable and function name style should be snake_case or CamelCase.","mseTestMedian = setAggregation(mse, test.median)","object_name_linter" +"vignettes/tutorial/resample.Rmd",705,1,"style","Variable and function name style should be snake_case or CamelCase.","mseTestMin = setAggregation(mse, test.min)","object_name_linter" +"vignettes/tutorial/resample.Rmd",706,1,"style","Variable and function name style should be snake_case or CamelCase.","mseTestMax = setAggregation(mse, test.max)","object_name_linter" +"vignettes/tutorial/resample.Rmd",726,121,"style","Lines should not be more than 120 characters.","## Aggregated Result: mse.test.mean=24.0886607,mse.test.median=24.0782026,mse.test.min=18.6894718,mse.test.max=29.4983077","line_length_linter" +"vignettes/tutorial/resample.Rmd",748,1,"style","Variable and function name style should be snake_case or CamelCase.","mmceTrainMean = setAggregation(mmce, train.mean)","object_name_linter" +"vignettes/tutorial/resample.Rmd",777,1,"style","Variable and function name style should be snake_case or CamelCase.","mmceB632 = setAggregation(mmce, b632)","object_name_linter" +"vignettes/tutorial/resample.Rmd",778,1,"style","Variable and function name style should be snake_case or CamelCase.","mmceB632plus = setAggregation(mmce, b632plus)","object_name_linter" +"vignettes/tutorial/roc_analysis.Rmd",65,1,"style","Variable and function name style should be snake_case or CamelCase.","train.set = sample(n, size = round(2 / 3 * n))","object_name_linter" +"vignettes/tutorial/roc_analysis.Rmd",66,1,"style","Variable and function name style should be snake_case or CamelCase.","test.set = setdiff(seq_len(n), train.set)","object_name_linter" +"vignettes/tutorial/roc_analysis.Rmd",160,1,"style","Variable and function name style should be snake_case or CamelCase.","rdesc.inner = makeResampleDesc(""Holdout"")","object_name_linter" +"vignettes/tutorial/roc_analysis.Rmd",175,1,"style","Variable and function name style should be snake_case or CamelCase.","rdesc.outer = makeResampleDesc(""CV"", iters = 5)","object_name_linter" +"vignettes/tutorial/roc_analysis.Rmd",247,1,"style","Variable and function name style should be snake_case or CamelCase.","train.set = sample(n, size = round(2 / 3 * n))","object_name_linter" +"vignettes/tutorial/roc_analysis.Rmd",248,1,"style","Variable and function name style should be snake_case or CamelCase.","test.set = setdiff(seq_len(n), train.set)","object_name_linter" +"vignettes/tutorial/task.Rmd",46,1,"style","Variable and function name style should be snake_case or CamelCase.","regr.task = makeRegrTask(id = ""bh"", data = BostonHousing, target = ""medv"")","object_name_linter" +"vignettes/tutorial/task.Rmd",65,1,"style","Variable and function name style should be snake_case or CamelCase.","classif.task = makeClassifTask(id = ""BreastCancer"", data = df, target = ""Class"")","object_name_linter" +"vignettes/tutorial/task.Rmd",77,1,"style","Variable and function name style should be snake_case or CamelCase.","classif.task = makeClassifTask(id = ""BreastCancer"", data = df, target = ""Class"", positive = ""malignant"")","object_name_linter" +"vignettes/tutorial/task.Rmd",89,1,"style","Variable and function name style should be snake_case or CamelCase.","surv.task = makeSurvTask(data = lung, target = c(""time"", ""status""))","object_name_linter" +"vignettes/tutorial/task.Rmd",109,1,"style","Variable and function name style should be snake_case or CamelCase.","yeast.task = makeMultilabelTask(id = ""multi"", data = yeast, target = labels)","object_name_linter" +"vignettes/tutorial/task.Rmd",122,1,"style","Variable and function name style should be snake_case or CamelCase.","cluster.task = makeClusterTask(data = mtcars)","object_name_linter" +"vignettes/tutorial/task.Rmd",147,1,"style","Variable and function name style should be snake_case or CamelCase.","costsens.task = makeCostSensTask(data = df, cost = cost)","object_name_linter" +"vignettes/tutorial/task.Rmd",227,1,"style","Variable and function name style should be snake_case or CamelCase.","cluster.task = subsetTask(cluster.task, subset = 4:17)","object_name_linter" +"vignettes/tutorial/train.Rmd",74,1,"style","Variable and function name style should be snake_case or CamelCase.","ruspini.task = makeClusterTask(data = ruspini)","object_name_linter" +"vignettes/tutorial/train.Rmd",106,1,"style","Variable and function name style should be snake_case or CamelCase.","train.set = sample(n, size = n / 3)","object_name_linter" +"vignettes/tutorial/usecase_regression.Rmd",44,1,"style","Variable and function name style should be snake_case or CamelCase.","regr.task = makeRegrTask(data = BostonHousing, target = ""medv"")","object_name_linter" +"vignettes/tutorial/usecase_regression.Rmd",92,1,"style","Variable and function name style should be snake_case or CamelCase.","tuned.ksvm = makeTuneWrapper(learner = ""regr.ksvm"", resampling = rdesc, measures = meas,","object_name_linter" +"vignettes/tutorial/usecase_regression.Rmd",94,1,"style","Variable and function name style should be snake_case or CamelCase.","tuned.rf = makeTuneWrapper(learner = ""regr.ranger"", resampling = rdesc, measures = meas,","object_name_linter" +"vignettes/tutorial/wrapper.Rmd",56,1,"style","Variable and function name style should be snake_case or CamelCase.","base.lrn = makeLearner(""classif.rpart"")","object_name_linter" +"vignettes/tutorial/wrapper.Rmd",57,1,"style","Variable and function name style should be snake_case or CamelCase.","wrapped.lrn = makeBaggingWrapper(base.lrn, bw.iters = 100, bw.feats = 0.5)","object_name_linter" +"vignettes/tutorial/wrapper.Rmd",81,1,"style","Variable and function name style should be snake_case or CamelCase.","par.set = makeParamSet(","object_name_linter" +"vignettes/tutorial/wrapper.Rmd",85,1,"style","Variable and function name style should be snake_case or CamelCase.","tuned.lrn = makeTuneWrapper(wrapped.lrn, rdesc, mmce, par.set, ctrl)","object_name_linter" diff --git a/.dev/revdep_emails/mlr/attachments/mlr.warnings b/.dev/revdep_emails/mlr/attachments/mlr.warnings new file mode 100644 index 000000000..be09e01a7 --- /dev/null +++ b/.dev/revdep_emails/mlr/attachments/mlr.warnings @@ -0,0 +1,2 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Trying to remove β€˜todo_comment_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/mlr/email-body b/.dev/revdep_emails/mlr/email-body new file mode 100644 index 000000000..a51707efa --- /dev/null +++ b/.dev/revdep_emails/mlr/email-body @@ -0,0 +1,27 @@ +Hello Patrick Schratz! Thank you for using {lintr} in your package {mlr}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/mlr-org/mlr using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 319s on CRAN vs. 205s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/mlrCPO/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/mlrCPO/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..914c55203 --- /dev/null +++ b/.dev/revdep_emails/mlrCPO/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,4 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/makeCPO.R",110,28,"style","Variable and function name style should be snake_case."," predict.type.map = c(response = ""response""),","object_name_linter" +"R/makeCPO.R",140,28,"style","Variable and function name style should be snake_case."," predict.type.map = c(response = ""response""),","object_name_linter" +"tests/testthat/test_core_datasplit.R",400,11,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" diff --git a/.dev/revdep_emails/mlrCPO/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/mlrCPO/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..62b9ad28a --- /dev/null +++ b/.dev/revdep_emails/mlrCPO/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,441 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/doc/toc/vignettetoc.Rmd",16,3,"style","Commented code should be removed.","# path = names(knitr::opts_knit$get(""encoding""))[1]","commented_code_linter" +"inst/doc/toc/vignettetoc.Rmd",16,3,"style","Commented code should be removed.","# path = names(knitr::opts_knit$get(""encoding""))[1]","commented_code_linter" +"inst/doc/toc/vignettetoc.Rmd",17,6,"style","Use <-, not =, for assignment.","base = knitr::opts_knit$get(""output.dir"")","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",17,6,"style","Use <-, not =, for assignment.","base = knitr::opts_knit$get(""output.dir"")","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",18,6,"style","Use <-, not =, for assignment.","file = sys.frame(min(grep(""^knitr::knit$|^knit$"", sapply(sys.calls(), function(x) as.character(x)[1]))))$input","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",18,6,"style","Use <-, not =, for assignment.","file = sys.frame(min(grep(""^knitr::knit$|^knit$"", sapply(sys.calls(), function(x) as.character(x)[1]))))$input","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",18,81,"style","Lines should not be more than 80 characters.","file = sys.frame(min(grep(""^knitr::knit$|^knit$"", sapply(sys.calls(), function(x) as.character(x)[1]))))$input","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",18,81,"style","Lines should not be more than 80 characters.","file = sys.frame(min(grep(""^knitr::knit$|^knit$"", sapply(sys.calls(), function(x) as.character(x)[1]))))$input","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",19,6,"style","Use <-, not =, for assignment.","file = basename(file)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",19,6,"style","Use <-, not =, for assignment.","file = basename(file)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",20,6,"style","Use <-, not =, for assignment.","path = file.path(base, file)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",20,6,"style","Use <-, not =, for assignment.","path = file.path(base, file)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",21,7,"style","Use <-, not =, for assignment.","rpath = gsub(""\\.[^.]*$"", "".R"", path)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",21,7,"style","Use <-, not =, for assignment.","rpath = gsub(""\\.[^.]*$"", "".R"", path)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",26,11,"style","Use <-, not =, for assignment."," lines = readLines(rpath)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",26,11,"style","Use <-, not =, for assignment."," lines = readLines(rpath)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",27,11,"style","Use <-, not =, for assignment."," lines = gsub("" *(\n|$)"", ""\\1"", lines)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",27,11,"style","Use <-, not =, for assignment."," lines = gsub("" *(\n|$)"", ""\\1"", lines)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",36,10,"style","Use <-, not =, for assignment.","fullfile = file","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",36,10,"style","Use <-, not =, for assignment.","fullfile = file","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",38,10,"style","Use <-, not =, for assignment.","allfiles = list.files(path = base, pattern = "".*\\.Rmd$"")","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",38,10,"style","Use <-, not =, for assignment.","allfiles = list.files(path = base, pattern = "".*\\.Rmd$"")","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",42,14,"style","Use <-, not =, for assignment.","fileinfolist = list()","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",42,14,"style","Use <-, not =, for assignment.","fileinfolist = list()","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",44,10,"style","Use <-, not =, for assignment."," ismain = TRUE","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",44,10,"style","Use <-, not =, for assignment."," ismain = TRUE","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",46,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""^z_"", """", cf)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",46,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""^z_"", """", cf)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",47,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""_terse\\.Rmd$"", """", infoslot)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",47,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""_terse\\.Rmd$"", """", infoslot)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",48,13,"style","Use <-, not =, for assignment."," subslot = ""compact""","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",48,13,"style","Use <-, not =, for assignment."," subslot = ""compact""","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",50,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""^a_"", """", cf)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",50,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""^a_"", """", cf)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",51,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""\\.Rmd$"", """", infoslot)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",51,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""\\.Rmd$"", """", infoslot)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",52,13,"style","Use <-, not =, for assignment."," subslot = ""main""","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",52,13,"style","Use <-, not =, for assignment."," subslot = ""main""","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",55,11,"style","Use <-, not =, for assignment."," content = scan(paste(base, cf, sep = ""/""), what = ""character"", quiet = TRUE)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",55,11,"style","Use <-, not =, for assignment."," content = scan(paste(base, cf, sep = ""/""), what = ""character"", quiet = TRUE)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",56,7,"style","Use <-, not =, for assignment."," pos = min(c(which(content == ""title:""), Inf))","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",56,7,"style","Use <-, not =, for assignment."," pos = min(c(which(content == ""title:""), Inf))","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",60,12,"style","Use <-, not =, for assignment."," infolist = list(title = content[pos + 1], url = cf, iscurrent = cf == file)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",60,12,"style","Use <-, not =, for assignment."," infolist = list(title = content[pos + 1], url = cf, iscurrent = cf == file)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",62,11,"style","Use <-, not =, for assignment."," applist = list(infolist)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",62,11,"style","Use <-, not =, for assignment."," applist = list(infolist)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",63,18,"style","Use <-, not =, for assignment."," names(applist) = subslot","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",63,18,"style","Use <-, not =, for assignment."," names(applist) = subslot","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",64,28,"style","Use <-, not =, for assignment."," fileinfolist[[infoslot]] = c(fileinfolist[[infoslot]], applist)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",64,28,"style","Use <-, not =, for assignment."," fileinfolist[[infoslot]] = c(fileinfolist[[infoslot]], applist)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",68,9,"style","Use <-, not =, for assignment.","linkify = function(info, title) {","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",68,9,"style","Use <-, not =, for assignment.","linkify = function(info, title) {","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",78,11,"style","Use <-, not =, for assignment."," content = fileinfolist[[sort(names(fileinfolist))[idx]]]","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",78,11,"style","Use <-, not =, for assignment."," content = fileinfolist[[sort(names(fileinfolist))[idx]]]","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",80,81,"style","Lines should not be more than 80 characters."," if (paste(sub(""[0-9]\\. "", """", content$main$title), ""(No Output)"") != sub(""^z "", """", content$compact$title)) {","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",80,81,"style","Lines should not be more than 80 characters."," if (paste(sub(""[0-9]\\. "", """", content$main$title), ""(No Output)"") != sub(""^z "", """", content$compact$title)) {","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",81,81,"style","Lines should not be more than 80 characters."," stop(sprintf(""File %s and its compact version %s have incompatible titles\nThe compact version must be paste(main_title, \""(No Output)\""). Is: '%s', expected: '%s'"",","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",81,81,"style","Lines should not be more than 80 characters."," stop(sprintf(""File %s and its compact version %s have incompatible titles\nThe compact version must be paste(main_title, \""(No Output)\""). Is: '%s', expected: '%s'"",","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",82,81,"style","Lines should not be more than 80 characters."," content$main$url, content$compact$url, content$compact$title, paste(content$main$title, ""(No Output)"")))","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",82,81,"style","Lines should not be more than 80 characters."," content$main$url, content$compact$url, content$compact$title, paste(content$main$title, ""(No Output)"")))","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",84,10,"style","Use <-, not =, for assignment."," line = sprintf(""%s (%s)"", linkify(content$main, content$main$title), linkify(content$compact, ""compact version""))","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",84,10,"style","Use <-, not =, for assignment."," line = sprintf(""%s (%s)"", linkify(content$main, content$main$title), linkify(content$compact, ""compact version""))","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",84,81,"style","Lines should not be more than 80 characters."," line = sprintf(""%s (%s)"", linkify(content$main, content$main$title), linkify(content$compact, ""compact version""))","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",84,81,"style","Lines should not be more than 80 characters."," line = sprintf(""%s (%s)"", linkify(content$main, content$main$title), linkify(content$compact, ""compact version""))","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",86,10,"style","Use <-, not =, for assignment."," line = linkify(content$main, content$main$title)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",86,10,"style","Use <-, not =, for assignment."," line = linkify(content$main, content$main$title)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",90,14,"style","Use <-, not =, for assignment."," fullfile = content$main$url","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",90,14,"style","Use <-, not =, for assignment."," fullfile = content$main$url","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",94,10,"style","Use <-, not =, for assignment.","fullpath = file.path(base, fullfile)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",94,10,"style","Use <-, not =, for assignment.","fullpath = file.path(base, fullfile)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",102,1,"style","Variable and function name style should be snake_case or symbols.","printToc = function(print.level = 3) {","object_name_linter" +"inst/doc/toc/vignettetoc.Rmd",102,1,"style","Variable and function name style should be snake_case or symbols.","printToc = function(print.level = 3) {","object_name_linter" +"inst/doc/toc/vignettetoc.Rmd",102,10,"style","Use <-, not =, for assignment.","printToc = function(print.level = 3) {","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",102,10,"style","Use <-, not =, for assignment.","printToc = function(print.level = 3) {","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",103,14,"style","Use <-, not =, for assignment."," owncontent = readLines(fullpath)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",103,14,"style","Use <-, not =, for assignment."," owncontent = readLines(fullpath)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",103,26,"warning","no visible binding for global variable β€˜fullpath’"," owncontent = readLines(fullpath)","object_usage_linter" +"inst/doc/toc/vignettetoc.Rmd",103,26,"warning","no visible binding for global variable β€˜fullpath’"," owncontent = readLines(fullpath)","object_usage_linter" +"inst/doc/toc/vignettetoc.Rmd",104,13,"style","Use <-, not =, for assignment."," tripletic = grepl(""^```"", owncontent)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",104,13,"style","Use <-, not =, for assignment."," tripletic = grepl(""^```"", owncontent)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",105,14,"style","Use <-, not =, for assignment."," owncontent = owncontent[cumsum(tripletic) %% 2 == 0] # exclude ```-delimited code","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",105,14,"style","Use <-, not =, for assignment."," owncontent = owncontent[cumsum(tripletic) %% 2 == 0] # exclude ```-delimited code","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",105,81,"style","Lines should not be more than 80 characters."," owncontent = owncontent[cumsum(tripletic) %% 2 == 0] # exclude ```-delimited code","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",105,81,"style","Lines should not be more than 80 characters."," owncontent = owncontent[cumsum(tripletic) %% 2 == 0] # exclude ```-delimited code","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",106,13,"style","Use <-, not =, for assignment."," headlines = grep(""^#+ +"", owncontent, value = TRUE)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",106,13,"style","Use <-, not =, for assignment."," headlines = grep(""^#+ +"", owncontent, value = TRUE)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",107,14,"style","Use <-, not =, for assignment."," headlevels = nchar(gsub("" .*"", """", headlines))","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",107,14,"style","Use <-, not =, for assignment."," headlevels = nchar(gsub("" .*"", """", headlines))","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",108,13,"style","Use <-, not =, for assignment."," headlines = gsub(""^[#]+ +"", """", headlines)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",108,13,"style","Use <-, not =, for assignment."," headlines = gsub(""^[#]+ +"", """", headlines)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",109,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"inst/doc/toc/vignettetoc.Rmd",109,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"inst/doc/toc/vignettetoc.Rmd",110,9,"style","Use <-, not =, for assignment."," links = gsub(""[^-a-z. ]"", """", tolower(headlines))","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",110,9,"style","Use <-, not =, for assignment."," links = gsub(""[^-a-z. ]"", """", tolower(headlines))","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",111,9,"style","Use <-, not =, for assignment."," links = gsub("" +"", ""-"", links)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",111,9,"style","Use <-, not =, for assignment."," links = gsub("" +"", ""-"", links)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",112,9,"style","Use <-, not =, for assignment."," links = gsub(""-$"", """", links)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",112,9,"style","Use <-, not =, for assignment."," links = gsub(""-$"", """", links)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",117,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"inst/doc/toc/vignettetoc.Rmd",117,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"inst/doc/toc/vignettetoc.Rmd",118,81,"style","Lines should not be more than 80 characters."," cat(""Table of Contents\n
\n"", sep = """")","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",118,81,"style","Lines should not be more than 80 characters."," cat(""Table of Contents\n
\n"", sep = """")","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",120,13,"style","Use <-, not =, for assignment."," lastlevel = headlevels[1] - 1","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",120,13,"style","Use <-, not =, for assignment."," lastlevel = headlevels[1] - 1","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",122,10,"style","Use <-, not =, for assignment."," line = headlines[idx]","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",122,10,"style","Use <-, not =, for assignment."," line = headlines[idx]","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",123,11,"style","Use <-, not =, for assignment."," level = headlevels[idx]","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",123,11,"style","Use <-, not =, for assignment."," level = headlevels[idx]","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",124,10,"style","Use <-, not =, for assignment."," link = links[idx]","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",124,10,"style","Use <-, not =, for assignment."," link = links[idx]","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",129,81,"style","Lines should not be more than 80 characters."," stop(""First headline level must be the lowest one used, but '"", line, ""' is lower."")","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",129,81,"style","Lines should not be more than 80 characters."," stop(""First headline level must be the lowest one used, but '"", line, ""' is lower."")","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",131,13,"style","Use <-, not =, for assignment."," lvldiff = level - lastlevel","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",131,13,"style","Use <-, not =, for assignment."," lvldiff = level - lastlevel","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",148,15,"style","Use <-, not =, for assignment."," lastlevel = level","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",148,15,"style","Use <-, not =, for assignment."," lastlevel = level","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",151,11,"style","Use <-, not =, for assignment."," lvldiff = lastlevel - headlevels[1]","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",151,11,"style","Use <-, not =, for assignment."," lvldiff = lastlevel - headlevels[1]","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",165,14,"style","Use <-, not =, for assignment.","replaceprint = function(ofunc) {","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",165,14,"style","Use <-, not =, for assignment.","replaceprint = function(ofunc) {","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",168,8,"style","Use <-, not =, for assignment."," cu = capture.output({ret = ofunc(x, ...)})","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",168,8,"style","Use <-, not =, for assignment."," cu = capture.output({ret = ofunc(x, ...)})","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",168,25,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," cu = capture.output({ret = ofunc(x, ...)})","brace_linter" +"inst/doc/toc/vignettetoc.Rmd",168,25,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," cu = capture.output({ret = ofunc(x, ...)})","brace_linter" +"inst/doc/toc/vignettetoc.Rmd",168,30,"style","Use <-, not =, for assignment."," cu = capture.output({ret = ofunc(x, ...)})","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",168,30,"style","Use <-, not =, for assignment."," cu = capture.output({ret = ofunc(x, ...)})","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",169,8,"style","Use <-, not =, for assignment."," cu = grep(""time: [-+e0-9.]{1,6}"", cu, value = TRUE, invert = TRUE)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",169,8,"style","Use <-, not =, for assignment."," cu = grep(""time: [-+e0-9.]{1,6}"", cu, value = TRUE, invert = TRUE)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",179,9,"style","Use <-, not =, for assignment."," ofunc = get(pfunc, asNamespace(""mlr""))","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",179,9,"style","Use <-, not =, for assignment."," ofunc = get(pfunc, asNamespace(""mlr""))","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",182,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" +"inst/doc/toc/vignettetoc.Rmd",182,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" +"inst/doc/toc/vignettetoc.Rmd",183,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" +"inst/doc/toc/vignettetoc.Rmd",183,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" +"R/CPO_encode.R",25,18,"style","Any function spanning multiple lines should use curly braces."," lapply(data, function(col)","brace_linter" +"R/CPO_encode.R",26,35,"style","Any function spanning multiple lines should use curly braces."," sapply(levels(target[[1]]), function(tl)","brace_linter" +"R/CPO_encode.R",27,37,"style","Any function spanning multiple lines should use curly braces."," vnapply(c(levels(col), NA), function(cl)","brace_linter" +"R/CPO_encode.R",79,18,"style","Any function spanning multiple lines should use curly braces."," lapply(data, function(col)","brace_linter" +"R/CPO_encode.R",137,18,"style","Any function spanning multiple lines should use curly braces."," lapply(data, function(col)","brace_linter" +"R/CPO_quantileBinNumerics.R",17,18,"style","Any function spanning multiple lines should use curly braces."," lapply(data, function(d)","brace_linter" +"tests/testthat/helper_cpo.R",408,5,"warning","no visible global function definition for β€˜pss’"," pss(numrows: integer[0, ],","object_usage_linter" +"tests/testthat/helper_cpo.R",408,9,"warning","no visible binding for global variable β€˜numrows’"," pss(numrows: integer[0, ],","object_usage_linter" +"tests/testthat/helper_cpo.R",409,7,"warning","no visible binding for global variable β€˜numtarget’"," numtarget: integer[0, ],","object_usage_linter" +"tests/testthat/helper_cpo.R",410,7,"warning","no visible binding for global variable β€˜numnumeric’"," numnumeric: integer[0, ] [[requires = quote(!isdf && !istask)]],","object_usage_linter" +"tests/testthat/helper_cpo.R",411,7,"warning","no visible binding for global variable β€˜numfactor’"," numfactor: integer[0, ] [[requires = quote(!isdf && !istask)]],","object_usage_linter" +"tests/testthat/helper_cpo.R",412,7,"warning","no visible binding for global variable β€˜numother’"," numother: integer[0, ] [[requires = quote(!isdf && !istask)]],","object_usage_linter" +"tests/testthat/helper_makecpo.R",333,57,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, target = target, param = param,","object_usage_linter" +"tests/testthat/helper_makecpo.R",333,57,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, target = target, param = param,","object_usage_linter" +"tests/testthat/helper_makecpo.R",342,44,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, param = param,","object_usage_linter" +"tests/testthat/helper_makecpo.R",342,44,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, param = param,","object_usage_linter" +"tests/testthat/helper_makecpo.R",350,46,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, param = param, control = control)","object_usage_linter" +"tests/testthat/helper_makecpo.R",356,59,"warning","no visible binding for global variable β€˜param’"," train(data = data, target = target, param = param)","object_usage_linter" +"tests/testthat/helper_makecpo.R",359,44,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, param = param, control = control)","object_usage_linter" +"tests/testthat/helper_makecpo.R",369,46,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, param = param, control = control)","object_usage_linter" +"tests/testthat/helper_makecpo.R",381,44,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, param = param, control = control)","object_usage_linter" +"tests/testthat/helper_makecpo.R",410,61,"warning","no visible binding for global variable β€˜param’"," train(data = data, target = target, param = param)","object_usage_linter" +"tests/testthat/helper_makecpo.R",449,73,"warning","no visible binding for global variable β€˜param’"," traininvert(data = data, control = control, param = param)","object_usage_linter" +"tests/testthat/helper_makecpo.R",492,63,"warning","no visible binding for global variable β€˜param’"," train(data = data, target = target, param = param)","object_usage_linter" +"tests/testthat/helper_makecpo.R",495,71,"warning","no visible binding for global variable β€˜param’"," traininvert(data = data, control = control, param = param)","object_usage_linter" +"tests/testthat/helper_makecpo.R",642,33,"warning","no visible binding for global variable β€˜allowedGMC’"," for (lineno in seq_len(nrow(allowedGMC))) {","object_usage_linter" +"tests/testthat/test_core_properties.R",34,33,"style","Any function spanning multiple lines should use curly braces."," lapply(getCPOProperties(x), function(y)","brace_linter" +"tests/testthat/test_meta_multiplex.R",158,38,"style","Variable and function name style should be snake_case or symbols."," cpo.build = function(data, target, logical.param, a, b) {","object_name_linter" +"vignettes/a_1_getting_started.Rmd",55,81,"style","Lines should not be more than 80 characters.","cpoScale(center = FALSE) # create a CPO object that scales, but does not center, data","line_length_linter" +"vignettes/a_1_getting_started.Rmd",66,1,"style","Variable and function name style should be snake_case or symbols.","iris.demo = iris[c(1, 2, 3, 51, 52, 102, 103), ]","object_name_linter" +"vignettes/a_1_getting_started.Rmd",66,11,"style","Use <-, not =, for assignment.","iris.demo = iris[c(1, 2, 3, 51, 52, 102, 103), ]","assignment_linter" +"vignettes/a_1_getting_started.Rmd",67,81,"style","Lines should not be more than 80 characters.","tail(iris.demo %>>% cpoQuantileBinNumerics()) # bin the data in below & above median","line_length_linter" +"vignettes/a_1_getting_started.Rmd",78,13,"style","Use <-, not =, for assignment.","quantilenum = cpoQuantileBinNumerics(numsplits = 3) %>>% cpoAsNumeric()","assignment_linter" +"vignettes/a_1_getting_started.Rmd",88,1,"style","Variable and function name style should be snake_case or symbols.","quantilenum.restricted = cpoQuantileBinNumerics(numsplits = 3) %>>%","object_name_linter" +"vignettes/a_1_getting_started.Rmd",88,24,"style","Use <-, not =, for assignment.","quantilenum.restricted = cpoQuantileBinNumerics(numsplits = 3) %>>%","assignment_linter" +"vignettes/a_1_getting_started.Rmd",97,1,"style","Variable and function name style should be snake_case or symbols.","demo.task = makeClassifTask(data = iris.demo, target = ""Species"")","object_name_linter" +"vignettes/a_1_getting_started.Rmd",97,11,"style","Use <-, not =, for assignment.","demo.task = makeClassifTask(data = iris.demo, target = ""Species"")","assignment_linter" +"vignettes/a_1_getting_started.Rmd",98,8,"style","Use <-, not =, for assignment.","result = demo.task %>>% quantilenum","assignment_linter" +"vignettes/a_1_getting_started.Rmd",114,5,"style","Use <-, not =, for assignment.","cpo = cpoScale()","assignment_linter" +"vignettes/a_1_getting_started.Rmd",129,6,"style","Use <-, not =, for assignment.","cpo2 = setHyperPars(cpo, scale.scale = FALSE)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",147,5,"style","Use <-, not =, for assignment.","cpo = cpoScale(id = ""a"") %>>% cpoScale(id = ""b"") # not very useful example","assignment_linter" +"vignettes/a_1_getting_started.Rmd",160,5,"style","Use <-, not =, for assignment.","cpo = cpoPca(export = c(""center"", ""rank""))","assignment_linter" +"vignettes/a_1_getting_started.Rmd",176,13,"style","Use <-, not =, for assignment.","transformed = iris.demo %>>% cpoPca(rank = 3)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",180,5,"style","Use <-, not =, for assignment.","ret = retrafo(transformed)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",198,4,"style","Use <-, not =, for assignment.","t2 = transformed %>>% cpoScale()","assignment_linter" +"vignettes/a_1_getting_started.Rmd",202,4,"style","Use <-, not =, for assignment.","t3 = clearRI(transformed) %>>% cpoScale()","assignment_linter" +"vignettes/a_1_getting_started.Rmd",222,1,"style","Variable and function name style should be snake_case or symbols.","iris.regr = makeRegrTask(data = iris.demo, target = ""Petal.Width"")","object_name_linter" +"vignettes/a_1_getting_started.Rmd",222,11,"style","Use <-, not =, for assignment.","iris.regr = makeRegrTask(data = iris.demo, target = ""Petal.Width"")","assignment_linter" +"vignettes/a_1_getting_started.Rmd",223,1,"style","Variable and function name style should be snake_case or symbols.","iris.logd = iris.regr %>>% cpoLogTrafoRegr()","object_name_linter" +"vignettes/a_1_getting_started.Rmd",223,11,"style","Use <-, not =, for assignment.","iris.logd = iris.regr %>>% cpoLogTrafoRegr()","assignment_linter" +"vignettes/a_1_getting_started.Rmd",229,5,"style","Use <-, not =, for assignment.","inv = inverter(iris.logd) # inverter object","assignment_linter" +"vignettes/a_1_getting_started.Rmd",235,10,"style","Use <-, not =, for assignment.","logmodel = train(""regr.lm"", iris.logd)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",236,6,"style","Use <-, not =, for assignment.","pred = predict(logmodel, iris.logd) # prediction on the task itself","assignment_linter" +"vignettes/a_1_getting_started.Rmd",246,9,"style","Use <-, not =, for assignment.","newdata = makeRegrTask(""newiris"", iris[7:9, ], target = ""Petal.Width"",","assignment_linter" +"vignettes/a_1_getting_started.Rmd",253,1,"style","Variable and function name style should be snake_case or symbols.","newdata.transformed = newdata %>>% retrafo(iris.logd)","object_name_linter" +"vignettes/a_1_getting_started.Rmd",253,21,"style","Use <-, not =, for assignment.","newdata.transformed = newdata %>>% retrafo(iris.logd)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",257,6,"style","Use <-, not =, for assignment.","pred = predict(logmodel, newdata.transformed)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",264,1,"style","Variable and function name style should be snake_case or symbols.","inv.newdata = inverter(newdata.transformed)","object_name_linter" +"vignettes/a_1_getting_started.Rmd",264,13,"style","Use <-, not =, for assignment.","inv.newdata = inverter(newdata.transformed)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",290,1,"style","Variable and function name style should be snake_case or symbols.","iris.resid = iris.regr %>>% cpoRegrResiduals(""regr.lm"")","object_name_linter" +"vignettes/a_1_getting_started.Rmd",290,12,"style","Use <-, not =, for assignment.","iris.resid = iris.regr %>>% cpoRegrResiduals(""regr.lm"")","assignment_linter" +"vignettes/a_1_getting_started.Rmd",295,1,"style","Variable and function name style should be snake_case or symbols.","model.resid = train(""regr.randomForest"", iris.resid)","object_name_linter" +"vignettes/a_1_getting_started.Rmd",295,13,"style","Use <-, not =, for assignment.","model.resid = train(""regr.randomForest"", iris.resid)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",297,1,"style","Variable and function name style should be snake_case or symbols.","newdata.resid = newdata %>>% retrafo(iris.resid)","object_name_linter" +"vignettes/a_1_getting_started.Rmd",297,15,"style","Use <-, not =, for assignment.","newdata.resid = newdata %>>% retrafo(iris.resid)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",298,81,"style","Lines should not be more than 80 characters.","getTaskData(newdata.resid) # Petal.Width are now the residuals of lm model predictions","line_length_linter" +"vignettes/a_1_getting_started.Rmd",302,6,"style","Use <-, not =, for assignment.","pred = predict(model.resid, newdata.resid)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",308,1,"style","Variable and function name style should be snake_case or symbols.","inv.newdata = inverter(newdata.resid)","object_name_linter" +"vignettes/a_1_getting_started.Rmd",308,13,"style","Use <-, not =, for assignment.","inv.newdata = inverter(newdata.resid)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",317,9,"style","Use <-, not =, for assignment.","sampled = iris %>>% cpoSample(size = 3)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",334,5,"style","Use <-, not =, for assignment.","lrn = cpoRegrResiduals(""regr.lm"") %>>% makeLearner(""regr.randomForest"")","assignment_linter" +"vignettes/a_1_getting_started.Rmd",338,7,"style","Use <-, not =, for assignment.","model = train(lrn, iris.regr)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",340,6,"style","Use <-, not =, for assignment.","pred = predict(model, newdata)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",353,8,"style","Use <-, not =, for assignment.","icalrn = cpoIca() %>>% makeLearner(""classif.logreg"")","assignment_linter" +"vignettes/a_1_getting_started.Rmd",358,4,"style","Use <-, not =, for assignment.","ps = makeParamSet(","assignment_linter" +"vignettes/a_1_getting_started.Rmd",362,3,"style","Commented code should be removed.","# ps = pSS(ica.n.comp: integer[1, 8], ica.alg.typ: discrete[parallel, deflation])","commented_code_linter" +"vignettes/a_1_getting_started.Rmd",362,81,"style","Lines should not be more than 80 characters.","# ps = pSS(ica.n.comp: integer[1, 8], ica.alg.typ: discrete[parallel, deflation])","line_length_linter" +"vignettes/a_1_getting_started.Rmd",405,7,"style","Use <-, not =, for assignment.","repca = retrafo(iris.demo %>>% cpoPca())","assignment_linter" +"vignettes/a_1_getting_started.Rmd",406,7,"style","Use <-, not =, for assignment.","state = getCPOTrainedState(repca)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",412,22,"style","Use <-, not =, for assignment.","state$control$center = FALSE","assignment_linter" +"vignettes/a_1_getting_started.Rmd",413,21,"style","Use <-, not =, for assignment.","state$control$scale = FALSE","assignment_linter" +"vignettes/a_1_getting_started.Rmd",414,1,"style","Variable and function name style should be snake_case or symbols.","nosc.repca = makeCPOTrainedFromState(cpoPca, state)","object_name_linter" +"vignettes/a_1_getting_started.Rmd",414,12,"style","Use <-, not =, for assignment.","nosc.repca = makeCPOTrainedFromState(cpoPca, state)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",442,5,"style","Use <-, not =, for assignment.","cpm = cpoMultiplex(list(cpoIca, cpoPca(export = ""export.all"")))","assignment_linter" +"vignettes/a_1_getting_started.Rmd",456,5,"style","Use <-, not =, for assignment.","cpa = cpoWrap()","assignment_linter" +"vignettes/a_1_getting_started.Rmd",474,7,"style","Use <-, not =, for assignment.","scale = cpoSelect(pattern = ""Sepal"", id = ""first"") %>>% cpoScale(id = ""scale"")","assignment_linter" +"vignettes/a_1_getting_started.Rmd",475,11,"style","Use <-, not =, for assignment.","scale.pca = scale %>>% cpoPca()","assignment_linter" +"vignettes/a_1_getting_started.Rmd",476,9,"style","Use <-, not =, for assignment.","cbinder = cpoCbind(scale, scale.pca, cpoSelect(pattern = ""Petal"", id = ""second""))","assignment_linter" +"vignettes/a_1_getting_started.Rmd",476,81,"style","Lines should not be more than 80 characters.","cbinder = cpoCbind(scale, scale.pca, cpoSelect(pattern = ""Petal"", id = ""second""))","line_length_linter" +"vignettes/a_2_mlrCPO_core.Rmd",41,40,"style","Commented code should be removed.","print(cpoAsNumeric, verbose = TRUE) # alternative: !cpoAsNumeric","commented_code_linter" +"vignettes/a_2_mlrCPO_core.Rmd",61,6,"style","Use <-, not =, for assignment.","(cpo = cpoScale()) # construct CPO with default Hyperparameter values","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",107,6,"style","Use <-, not =, for assignment.","task = applyCPO(cpoPca(), iris.task)","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",118,7,"style","Use <-, not =, for assignment.","scale = cpoScale()","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",119,5,"style","Use <-, not =, for assignment.","pca = cpoPca()","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",122,10,"style","Use <-, not =, for assignment.","compound = scale %>>% pca","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",157,5,"style","Use <-, not =, for assignment.","lrn = makeLearner(""classif.logreg"")","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",158,9,"style","Use <-, not =, for assignment.","(cpolrn = cpo %>>% lrn) # the new learner has the CPO hyperparameters","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",168,5,"style","Use <-, not =, for assignment.","lrn = cpoLogTrafoRegr() %>>% makeLearner(""regr.lm"")","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",169,7,"style","Use <-, not =, for assignment.","model = train(lrn, subsetTask(bh.task, 1:300))","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",174,7,"style","Use <-, not =, for assignment.","trafo = subsetTask(bh.task, 1:300) %>>% cpoLogTrafoRegr()","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",175,7,"style","Use <-, not =, for assignment.","model = train(""regr.lm"", trafo)","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",177,9,"style","Use <-, not =, for assignment.","newdata = subsetTask(bh.task, 301:500) %>>% retrafo(trafo)","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",178,6,"style","Use <-, not =, for assignment.","pred = predict(model, newdata)","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",198,13,"style","Use <-, not =, for assignment.","transformed = iris %>>% cpoScale()","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",200,6,"style","Use <-, not =, for assignment.","(ret = retrafo(transformed))","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",205,13,"style","Use <-, not =, for assignment.","transformed = bh.task %>>% cpoLogTrafoRegr()","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",207,6,"style","Use <-, not =, for assignment.","(inv = inverter(transformed))","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",219,5,"style","Use <-, not =, for assignment.","bh2 = bh.task","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",220,14,"style","Use <-, not =, for assignment.","retrafo(bh2) = ret","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",224,14,"style","Use <-, not =, for assignment.","retrafo(bh2) = NULLCPO","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",226,3,"style","Commented code should be removed.","# retrafo(bh2) = NULL","commented_code_linter" +"vignettes/a_2_mlrCPO_core.Rmd",232,5,"style","Use <-, not =, for assignment.","bh3 = clearRI(transformed)","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",275,8,"style","Use <-, not =, for assignment.","(state = getCPOTrainedState(retrafo(iris %>>% cpoScale())))","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",276,25,"style","Use <-, not =, for assignment.","state$control$center[1] = 1000 # will now subtract 1000 from the first column","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",277,1,"style","Variable and function name style should be snake_case or symbols.","new.retrafo = makeCPOTrainedFromState(cpoScale, state)","object_name_linter" +"vignettes/a_2_mlrCPO_core.Rmd",277,13,"style","Use <-, not =, for assignment.","new.retrafo = makeCPOTrainedFromState(cpoScale, state)","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",286,6,"style","Use <-, not =, for assignment.","data = head(iris) %>>% cpoPca()","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",288,7,"style","Use <-, not =, for assignment.","data2 = data %>>% cpoScale()","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",296,6,"style","Use <-, not =, for assignment.","data = clearRI(data)","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",297,7,"style","Use <-, not =, for assignment.","data2 = data %>>% cpoScale()","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",302,15,"style","Use <-, not =, for assignment.","retrafo(data) = NULL","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",303,16,"style","Use <-, not =, for assignment.","inverter(data) = NULL","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",304,7,"style","Use <-, not =, for assignment.","data3 = data %>>% cpoScale()","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",312,1,"style","Variable and function name style should be snake_case or symbols.","compound.retrafo = retrafo(head(iris) %>>% compound)","object_name_linter" +"vignettes/a_2_mlrCPO_core.Rmd",312,18,"style","Use <-, not =, for assignment.","compound.retrafo = retrafo(head(iris) %>>% compound)","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",316,14,"style","Use <-, not =, for assignment.","(retrafolist = as.list(compound.retrafo))","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",328,13,"style","Use <-, not =, for assignment.","transformed = iris %>>% cpoScale()","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",346,13,"style","Use <-, not =, for assignment.","transformed = bh.task %>>% cpoLogTrafoRegr()","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",347,12,"style","Use <-, not =, for assignment.","prediction = predict(train(""regr.lm"", transformed), transformed)","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",348,5,"style","Use <-, not =, for assignment.","inv = inverter(transformed)","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",352,5,"style","Use <-, not =, for assignment.","ret = retrafo(transformed)","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",381,81,"style","Lines should not be more than 80 characters.","# applying NULLCPO leads to a retrafo() of NULLCPO, so it is its own CPOTrainedCPO","line_length_linter" +"vignettes/a_2_mlrCPO_core.Rmd",401,5,"style","Use <-, not =, for assignment.","cpo = cpoPca()","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",436,81,"style","Lines should not be more than 80 characters.","train(cpoDummyEncode(reference.cat = TRUE) %>>% makeLearner(""classif.geoDA""), bc.task)","line_length_linter" +"vignettes/a_2_mlrCPO_core.Rmd",469,5,"style","Use <-, not =, for assignment.","cpo = cpoPca(affect.pattern = "".Length"")","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",473,8,"style","Use <-, not =, for assignment.","triris = iris %>>% cpo","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",27,5,"style","Use <-, not =, for assignment.","tab = listCPO()[, c(""name"", ""category"", ""subcategory"")]","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",28,12,"style","Use <-, not =, for assignment.","owncontent = readLines(path)","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",29,11,"style","Use <-, not =, for assignment.","headlines = grep(""^#+ +"", owncontent, value = TRUE)","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",30,11,"style","Use <-, not =, for assignment.","headlines = gsub(""^#+ +"", """", headlines)","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",31,10,"style","Use <-, not =, for assignment.","tab[[1]] = sapply(tab[[1]], function(x)","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",31,29,"style","Any function spanning multiple lines should use curly braces.","tab[[1]] = sapply(tab[[1]], function(x)","brace_linter" +"vignettes/a_3_all_CPOs.Rmd",54,5,"style","Use <-, not =, for assignment.","cpa = cpoWrap()","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",58,81,"style","Lines should not be more than 80 characters.","# attaching the cpo applicator to a learner gives this learner a ""cpo"" hyperparameter","line_length_linter" +"vignettes/a_3_all_CPOs.Rmd",67,5,"style","Use <-, not =, for assignment.","cpm = cpoMultiplex(list(cpoScale, cpoPca))","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",79,1,"style","Variable and function name style should be snake_case or symbols.","s.and.p = cpoCase(pSS(logical.param: logical),","object_name_linter" +"vignettes/a_3_all_CPOs.Rmd",79,9,"style","Use <-, not =, for assignment.","s.and.p = cpoCase(pSS(logical.param: logical),","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",80,33,"style","Trailing whitespace is superfluous."," export.cpos = list(cpoScale(), ","trailing_whitespace_linter" +"vignettes/a_3_all_CPOs.Rmd",82,38,"style","Variable and function name style should be snake_case or symbols."," cpo.build = function(data, target, logical.param, scale, pca) {","object_name_linter" +"vignettes/a_3_all_CPOs.Rmd",99,7,"style","Use <-, not =, for assignment.","scale = cpoScale(id = ""scale"")","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",100,11,"style","Use <-, not =, for assignment.","scale.pca = scale %>>% cpoPca()","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",101,9,"style","Use <-, not =, for assignment.","cbinder = cpoCbind(scaled = scale, pcad = scale.pca, original = NULLCPO)","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",104,81,"style","Lines should not be more than 80 characters.","# cpoCbind recognises that ""scale.scale"" happens before ""pca.pca"" but is also fed to the","line_length_linter" +"vignettes/a_3_all_CPOs.Rmd",110,81,"style","Lines should not be more than 80 characters.","# the unnecessary copies of ""Species"" are unfortunate. Remove them with cpoSelect:","line_length_linter" +"vignettes/a_3_all_CPOs.Rmd",111,10,"style","Use <-, not =, for assignment.","selector = cpoSelect(type = ""numeric"")","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",112,1,"style","Variable and function name style should be snake_case or symbols.","cbinder.select = cpoCbind(scaled = selector %>>% scale, pcad = selector %>>% scale.pca, original = NULLCPO)","object_name_linter" +"vignettes/a_3_all_CPOs.Rmd",112,16,"style","Use <-, not =, for assignment.","cbinder.select = cpoCbind(scaled = selector %>>% scale, pcad = selector %>>% scale.pca, original = NULLCPO)","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",112,81,"style","Lines should not be more than 80 characters.","cbinder.select = cpoCbind(scaled = selector %>>% scale, pcad = selector %>>% scale.pca, original = NULLCPO)","line_length_linter" +"vignettes/a_3_all_CPOs.Rmd",126,5,"style","Use <-, not =, for assignment.","cpo = cpoTransformParams(cpoPca(), alist(pca.scale = pca.center))","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",127,6,"style","Use <-, not =, for assignment.","retr = pid.task %>|% setHyperPars(cpo, pca.center = FALSE)","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",132,6,"style","Use <-, not =, for assignment.","mplx = cpoMultiplex(list(cpoIca(export = ""n.comp""), cpoPca(export = ""rank"")))","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",134,5,"style","Use <-, not =, for assignment.","mtx = cpoTransformParams(mplx, alist(ica.n.comp = comp, pca.rank = comp),","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",146,4,"style","Use <-, not =, for assignment.","df = data.frame(a = 1:3, b = -(1:3) * 10)","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",148,36,"style","Commented code should be removed.","df %>>% cpoScale(scale = FALSE) # center = TRUE","commented_code_linter" +"vignettes/a_3_all_CPOs.Rmd",190,9,"style","Use <-, not =, for assignment.","irisfix = head(iris) %>>% cpoFixFactors() # Species only has level 'setosa' in train","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",190,81,"style","Lines should not be more than 80 characters.","irisfix = head(iris) %>>% cpoFixFactors() # Species only has level 'setosa' in train","line_length_linter" +"vignettes/a_3_all_CPOs.Rmd",194,4,"style","Use <-, not =, for assignment.","rf = retrafo(irisfix)","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",203,9,"style","Use <-, not =, for assignment.","impdata = df","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",204,17,"style","Use <-, not =, for assignment.","impdata[[1]][1] = NA","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",233,7,"style","Use <-, not =, for assignment.","iris2 = iris","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",234,15,"style","Use <-, not =, for assignment.","iris2$Species = factor(c(""a"", ""b"", ""c"", ""b"", ""b"", ""c"", ""b"", ""c"",","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",281,81,"style","Lines should not be more than 80 characters.","impdata %>>% cpoImputeAll(cols = list(b = imputeMedian())) # error, since NAs remain","line_length_linter" +"vignettes/a_3_all_CPOs.Rmd",285,1,"style","Variable and function name style should be snake_case or symbols.","missing.task = makeRegrTask(""missing.task"", impdata, target = ""b"")","object_name_linter" +"vignettes/a_3_all_CPOs.Rmd",285,14,"style","Use <-, not =, for assignment.","missing.task = makeRegrTask(""missing.task"", impdata, target = ""b"")","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",286,81,"style","Lines should not be more than 80 characters.","# the following gives an error, since 'cpoImpute' does not make sure all missings are removed","line_length_linter" +"vignettes/a_3_all_CPOs.Rmd",288,81,"style","Lines should not be more than 80 characters.","train(cpoImpute(cols = list(a = imputeMedian())) %>>% makeLearner(""regr.lm""), missing.task)","line_length_linter" +"vignettes/a_3_all_CPOs.Rmd",292,81,"style","Lines should not be more than 80 characters.","train(cpoImputeAll(cols = list(a = imputeMedian())) %>>% makeLearner(""regr.lm""), missing.task)","line_length_linter" +"vignettes/a_3_all_CPOs.Rmd",302,81,"style","Lines should not be more than 80 characters.","listCPO()[listCPO()$category == ""imputation"" & listCPO()$subcategory == ""specialised"",","line_length_linter" +"vignettes/a_3_all_CPOs.Rmd",315,81,"style","Lines should not be more than 80 characters.","head(getTaskData(iris.task %>>% cpoFilterFeatures(method = ""variance"", perc = 0.5)))","line_length_linter" +"vignettes/a_3_all_CPOs.Rmd",318,81,"style","Lines should not be more than 80 characters.","listCPO()[listCPO()$category == ""featurefilter"" & listCPO()$subcategory == ""specialised"",","line_length_linter" +"vignettes/a_4_custom_CPOs.Rmd",109,13,"style","Use <-, not =, for assignment."," newsize = round(nrow(data) * fraction)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",110,5,"style","Variable and function name style should be snake_case or symbols."," row.indices = sample(nrow(data), newsize)","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",110,17,"style","Use <-, not =, for assignment."," row.indices = sample(nrow(data), newsize)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",114,5,"style","Use <-, not =, for assignment.","cpo = xmpSample(0.01)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",126,13,"style","Use <-, not =, for assignment."," newsize = round(nrow(data) * fraction)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",127,5,"style","Variable and function name style should be snake_case or symbols."," row.indices = sample(nrow(data), newsize)","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",127,17,"style","Use <-, not =, for assignment."," row.indices = sample(nrow(data), newsize)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",153,38,"style","Variable and function name style should be snake_case or symbols."," cpo.train = function(data, target, n.col) {","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",157,41,"style","Variable and function name style should be snake_case or symbols."," cpo.retrafo = function(data, control, n.col) {","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",162,14,"style","Use <-, not =, for assignment."," greatest = order(-control) # columns, ordered greatest to smallest var","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",166,5,"style","Use <-, not =, for assignment.","cpo = xmpFilterVar(2)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",172,8,"style","Use <-, not =, for assignment.","(trafd = head(iris) %>>% cpo)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",201,38,"style","Variable and function name style should be snake_case or symbols."," cpo.train = function(data, target, n.col) {","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",203,10,"style","Use <-, not =, for assignment."," ctrl = sapply(data, var, na.rm = TRUE)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",212,16,"style","Use <-, not =, for assignment."," greatest = order(-ctrl) # columns, ordered greatest to smallest var","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",217,5,"style","Use <-, not =, for assignment.","cpo = xmpFilterVarFunc(2)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",222,8,"style","Use <-, not =, for assignment.","(trafd = head(iris) %>>% cpo)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",241,5,"style","Use <-, not =, for assignment.","cpo = xmpAsNum()","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",246,8,"style","Use <-, not =, for assignment.","(trafd = head(iris) %>>% cpo)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",264,38,"style","Variable and function name style should be snake_case or symbols."," cpo.trafo = function(data, target, n.col) {","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",266,9,"style","Use <-, not =, for assignment."," pcr = prcomp(as.matrix(data), center = FALSE, scale. = FALSE, rank = n.col)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",268,13,"style","Use <-, not =, for assignment."," control = pcr$rotation","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",271,41,"style","Variable and function name style should be snake_case or symbols."," cpo.retrafo = function(data, control, n.col) {","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",277,5,"style","Use <-, not =, for assignment.","cpo = xmpPca(2)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",282,8,"style","Use <-, not =, for assignment.","(trafd = head(iris) %>>% cpo)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",302,38,"style","Variable and function name style should be snake_case or symbols."," cpo.trafo = function(data, target, n.col) {","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",304,9,"style","Use <-, not =, for assignment."," pcr = prcomp(as.matrix(data), center = FALSE, scale. = FALSE, rank = n.col)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",306,5,"style","Variable and function name style should be snake_case or symbols."," cpo.retrafo = function(data) {","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",306,17,"style","Use <-, not =, for assignment."," cpo.retrafo = function(data) {","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",314,5,"style","Use <-, not =, for assignment.","cpo = xmpPcaFunc(2)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",318,8,"style","Use <-, not =, for assignment.","(trafd = head(iris) %>>% cpo)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",368,9,"style","Use <-, not =, for assignment."," lrn = setPredictType(lrn, ""prob"")","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",373,16,"style","Use <-, not =, for assignment."," prediction = predict(control, target)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",374,11,"style","Use <-, not =, for assignment."," tname = getTaskTargetNames(target)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",375,11,"style","Use <-, not =, for assignment."," tdata = getTaskData(target)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",376,20,"style","Use <-, not =, for assignment."," tdata[[tname]] = factor(prediction$data$response == prediction$data$truth)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",384,33,"style","Variable and function name style should be snake_case or symbols."," cpo.invert = function(target, control.invert, predict.type, lrn) {","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",387,14,"style","Use <-, not =, for assignment."," outmat = as.matrix(control.invert[grep(""^prob\\."", names(control.invert))])","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",387,81,"style","Lines should not be more than 80 characters."," outmat = as.matrix(control.invert[grep(""^prob\\."", names(control.invert))])","line_length_linter" +"vignettes/a_4_custom_CPOs.Rmd",388,14,"style","Use <-, not =, for assignment."," revmat = outmat[, c(2, 1)]","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",393,7,"style","Variable and function name style should be snake_case or symbols."," numeric.prediction = as.numeric(control.invert$response)","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",393,26,"style","Use <-, not =, for assignment."," numeric.prediction = as.numeric(control.invert$response)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",394,7,"style","Variable and function name style should be snake_case or symbols."," numeric.res = ifelse(target == ""TRUE"",","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",394,19,"style","Use <-, not =, for assignment."," numeric.res = ifelse(target == ""TRUE"",","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",402,5,"style","Use <-, not =, for assignment.","cpo = xmpMetaLearn(makeLearner(""classif.logreg""))","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",409,7,"style","Use <-, not =, for assignment.","split = makeResampleInstance(hout, pid.task)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",410,1,"style","Variable and function name style should be snake_case or symbols.","train.task = subsetTask(pid.task, split$train.inds[[1]])","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",410,12,"style","Use <-, not =, for assignment.","train.task = subsetTask(pid.task, split$train.inds[[1]])","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",411,1,"style","Variable and function name style should be snake_case or symbols.","test.task = subsetTask(pid.task, split$predict.inds[[1]])","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",411,11,"style","Use <-, not =, for assignment.","test.task = subsetTask(pid.task, split$predict.inds[[1]])","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",417,7,"style","Use <-, not =, for assignment.","trafd = train.task %>>% cpo","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",426,7,"style","Use <-, not =, for assignment.","model = train(makeLearner(""classif.logreg"", predict.type = ""prob""), train.task)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",433,6,"style","Use <-, not =, for assignment.","retr = test.task %>>% retrafo(trafd)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",439,1,"style","Variable and function name style should be snake_case or symbols.","retr.df = getTaskData(test.task, target.extra = TRUE)$data %>>% retrafo(trafd)","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",439,9,"style","Use <-, not =, for assignment.","retr.df = getTaskData(test.task, target.extra = TRUE)$data %>>% retrafo(trafd)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",446,1,"style","Variable and function name style should be snake_case or symbols.","ext.model = train(""classif.svm"", trafd)","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",446,11,"style","Use <-, not =, for assignment.","ext.model = train(""classif.svm"", trafd)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",447,1,"style","Variable and function name style should be snake_case or symbols.","ext.pred = predict(ext.model, retr)","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",447,10,"style","Use <-, not =, for assignment.","ext.pred = predict(ext.model, retr)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",448,9,"style","Use <-, not =, for assignment.","newpred = invert(inverter(retr), ext.pred)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",455,1,"style","Variable and function name style should be snake_case or symbols.","cpo.learner = cpo %>>% makeLearner(""classif.svm"")","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",455,13,"style","Use <-, not =, for assignment.","cpo.learner = cpo %>>% makeLearner(""classif.svm"")","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",456,1,"style","Variable and function name style should be snake_case or symbols.","cpo.model = train(cpo.learner, train.task)","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",456,11,"style","Use <-, not =, for assignment.","cpo.model = train(cpo.learner, train.task)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",459,9,"style","Use <-, not =, for assignment.","lrnpred = predict(cpo.model, test.task)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",488,9,"style","Use <-, not =, for assignment."," lrn = setPredictType(lrn, ""prob"")","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",489,11,"style","Use <-, not =, for assignment."," model = train(lrn, data)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",490,5,"style","Variable and function name style should be snake_case or symbols."," cpo.retrafo = function(data, target) {","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",490,17,"style","Use <-, not =, for assignment."," cpo.retrafo = function(data, target) {","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",492,18,"style","Use <-, not =, for assignment."," prediction = predict(model, target)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",493,13,"style","Use <-, not =, for assignment."," tname = getTaskTargetNames(target)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",494,13,"style","Use <-, not =, for assignment."," tdata = getTaskData(target)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",495,22,"style","Use <-, not =, for assignment."," tdata[[tname]] = factor(prediction$data$response == prediction$data$truth)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",499,5,"style","Variable and function name style should be snake_case or symbols."," cpo.train.invert = function(data) {","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",499,22,"style","Use <-, not =, for assignment."," cpo.train.invert = function(data) {","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",501,18,"style","Use <-, not =, for assignment."," prediction = predict(model, newdata = data)$data","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",505,18,"style","Use <-, not =, for assignment."," outmat = as.matrix(prediction[grep(""^prob\\."", names(prediction))])","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",506,18,"style","Use <-, not =, for assignment."," revmat = outmat[, c(2, 1)]","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",511,11,"style","Variable and function name style should be snake_case or symbols."," numeric.prediction = as.numeric(prediction$response)","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",511,30,"style","Use <-, not =, for assignment."," numeric.prediction = as.numeric(prediction$response)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",512,11,"style","Variable and function name style should be snake_case or symbols."," numeric.res = ifelse(target == ""TRUE"",","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",512,23,"style","Use <-, not =, for assignment."," numeric.res = ifelse(target == ""TRUE"",","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",517,10,"style","Trailing whitespace is superfluous."," } ","trailing_whitespace_linter" +"vignettes/a_4_custom_CPOs.Rmd",543,17,"style","Use <-, not =, for assignment."," target[[1]] = target[[1]] - control","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",546,47,"style","Variable and function name style should be snake_case or symbols."," cpo.invert = function(target, predict.type, control.invert) {","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",550,5,"style","Use <-, not =, for assignment.","cpo = xmpRegCenter()","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",555,1,"style","Variable and function name style should be snake_case or symbols.","train.task = subsetTask(bh.task, 150:155)","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",555,12,"style","Use <-, not =, for assignment.","train.task = subsetTask(bh.task, 150:155)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",559,14,"style","Use <-, not =, for assignment.","predict.task = subsetTask(bh.task, 156:160)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",565,7,"style","Use <-, not =, for assignment.","trafd = train.task %>>% cpo","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",574,6,"style","Use <-, not =, for assignment.","retr = retrafo(trafd)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",575,14,"style","Use <-, not =, for assignment.","predict.traf = predict.task %>>% retr","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",581,7,"style","Use <-, not =, for assignment.","model = train(""regr.lm"", trafd)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",582,6,"style","Use <-, not =, for assignment.","pred = predict(model, predict.traf)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",591,7,"style","Use <-, not =, for assignment.","model = train(""regr.lm"", train.task)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",618,17,"style","Use <-, not =, for assignment."," target[[1]] = log(target[[1]])","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",625,5,"style","Use <-, not =, for assignment.","cpo = xmpLogRegr()","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",630,7,"style","Use <-, not =, for assignment.","trafd = train.task %>>% cpo","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",635,6,"style","Use <-, not =, for assignment.","retr = retrafo(trafd)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",636,14,"style","Use <-, not =, for assignment.","predict.traf = predict.task %>>% retr","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",641,7,"style","Use <-, not =, for assignment.","model = train(""regr.lm"", trafd)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",642,6,"style","Use <-, not =, for assignment.","pred = predict(model, predict.traf)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",670,17,"style","Use <-, not =, for assignment."," target[[1]] = target[[1]] + 1","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",671,13,"style","Use <-, not =, for assignment."," control = ""control created in cpo.trafo""","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",672,5,"style","Variable and function name style should be snake_case or symbols."," control.invert = ""control.invert created in cpo.trafo""","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",672,20,"style","Use <-, not =, for assignment."," control.invert = ""control.invert created in cpo.trafo""","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",677,5,"style","Variable and function name style should be snake_case or symbols."," control.invert = ""control.invert created in cpo.retrafo""","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",677,20,"style","Use <-, not =, for assignment."," control.invert = ""control.invert created in cpo.retrafo""","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",680,19,"style","Use <-, not =, for assignment."," target[[1]] = target[[1]] - 1","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",683,81,"style","Lines should not be more than 80 characters."," cat(""target is NULL, no transformation (but control.invert was created)\n"")","line_length_linter" +"vignettes/a_4_custom_CPOs.Rmd",687,33,"style","Variable and function name style should be snake_case or symbols."," cpo.invert = function(target, control.invert, predict.type) {","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",693,5,"style","Use <-, not =, for assignment.","cpo = xmpSynCPO()","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",698,7,"style","Use <-, not =, for assignment.","trafd = train.task %>>% cpo","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",703,9,"style","Use <-, not =, for assignment.","retrafd = train.task %>>% retrafo(trafd)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",711,9,"style","Use <-, not =, for assignment.","retrafd = getTaskData(train.task, target.extra = TRUE)$data %>>% retrafo(trafd)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",717,5,"style","Use <-, not =, for assignment.","inv = invert(inverter(trafd), 1:6)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",720,5,"style","Use <-, not =, for assignment.","inv = invert(inverter(retrafd), 1:6)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",727,9,"style","Use <-, not =, for assignment.","oscipen = options(""scipen"")","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",731,10,"style","Use <-, not =, for assignment.","learners = list(","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",741,7,"style","Use <-, not =, for assignment.","perfs = sapply(learners, function(lrn) {","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",753,7,"style","Use <-, not =, for assignment.","pvals = c(","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",754,75,"style","Trailing whitespace is superfluous."," logreg = t.test(perfs[, ""logreg""], perfs[, ""cpo""], ""greater"")$p.value, ","trailing_whitespace_linter" +"vignettes/z_1_getting_started_terse.Rmd",13,81,"style","Lines should not be more than 80 characters.","cat(knitr::knit_child(""a_1_getting_started.Rmd"", options = list(eval = FALSE)), sep = ""\n"")","line_length_linter" +"vignettes/z_2_mlrCPO_core_terse.Rmd",13,81,"style","Lines should not be more than 80 characters.","cat(knitr::knit_child(""a_2_mlrCPO_core.Rmd"", options = list(eval = FALSE)), sep = ""\n"")","line_length_linter" +"vignettes/z_3_all_CPOs_terse.Rmd",13,81,"style","Lines should not be more than 80 characters.","cat(knitr::knit_child(""a_3_all_CPOs.Rmd"", options = list(eval = FALSE)), sep = ""\n"")","line_length_linter" +"vignettes/z_4_custom_CPOs_terse.Rmd",13,81,"style","Lines should not be more than 80 characters.","cat(knitr::knit_child(""a_4_custom_CPOs.Rmd"", options = list(eval = FALSE)), sep = ""\n"")","line_length_linter" diff --git a/.dev/revdep_emails/mlrCPO/email-body b/.dev/revdep_emails/mlrCPO/email-body new file mode 100644 index 000000000..2d56f12c3 --- /dev/null +++ b/.dev/revdep_emails/mlrCPO/email-body @@ -0,0 +1,27 @@ +Hello Martin Binder! Thank you for using {lintr} in your package {mlrCPO}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/mlr-org/mlrCPO using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 178s on CRAN vs. 108s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/modules/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/modules/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..f1e08b6de --- /dev/null +++ b/.dev/revdep_emails/modules/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,12 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/module-helper.R",49,5,"style","Either both or neither branch in `if`/`else` should use curly braces."," else {","brace_linter" +"vignettes/modulesAsObjects.Rmd",63,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/modulesAsObjects.Rmd",83,5,"warning","local variable β€˜fun’ assigned but may not be used"," fun <- function() param","object_usage_linter" +"vignettes/modulesAsObjects.Rmd",95,5,"warning","local variable β€˜fun’ assigned but may not be used"," fun <- function() param","object_usage_linter" +"vignettes/modulesAsObjects.Rmd",122,1,"style","Variable and function name style should be camelCase.","B <- function(a) {","object_name_linter" +"vignettes/modulesAsObjects.Rmd",124,5,"warning","local variable β€˜foo’ assigned but may not be used"," foo <- function() a$foo()","object_usage_linter" +"vignettes/modulesAsObjects.Rmd",194,1,"style","Variable and function name style should be camelCase.","A <- function() {","object_name_linter" +"vignettes/modulesAsObjects.Rmd",196,5,"warning","local variable β€˜foo’ assigned but may not be used"," foo <- function() ""foo""","object_usage_linter" +"vignettes/modulesAsObjects.Rmd",200,1,"style","Variable and function name style should be camelCase.","B <- function(a) {","object_name_linter" +"vignettes/modulesAsObjects.Rmd",203,5,"warning","local variable β€˜bar’ assigned but may not be used"," bar <- function() ""bar""","object_usage_linter" +"vignettes/modulesInR.Rmd",12,91,"style","Lines should not be more than 90 characters.","cat(gsub(""\\n "", """", packageDescription(""modules"", fields = ""Description"", encoding = NA)))","line_length_linter" diff --git a/.dev/revdep_emails/modules/attachments/modules.warnings b/.dev/revdep_emails/modules/attachments/modules.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/modules/attachments/modules.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/modules/email-body b/.dev/revdep_emails/modules/email-body new file mode 100644 index 000000000..3f277a4cb --- /dev/null +++ b/.dev/revdep_emails/modules/email-body @@ -0,0 +1,27 @@ +Hello Sebastian Warnholz! Thank you for using {lintr} in your package {modules}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/wahani/modules using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 16s on CRAN vs. 10s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/nLTT/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/nLTT/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..cb4447ed8 --- /dev/null +++ b/.dev/revdep_emails/nLTT/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,2 @@ +"filename","line_number","column_number","type","message","line","linter" +"vignettes/nltt_diff.Rmd",84,45,"style","Compound semicolons are discouraged. Replace them by a newline.","nLTT::nltt_plot(phylogeny_1, ylim = c(0, 1)); nLTT::nltt_lines(phylogeny_2)","semicolon_linter" diff --git a/.dev/revdep_emails/nLTT/email-body b/.dev/revdep_emails/nLTT/email-body new file mode 100644 index 000000000..5a6436b20 --- /dev/null +++ b/.dev/revdep_emails/nLTT/email-body @@ -0,0 +1,27 @@ +Hello Thijs Janzen! Thank you for using {lintr} in your package {nLTT}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/thijsjanzen/nLTT using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 21s on CRAN vs. 14s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/newsmd/email-body b/.dev/revdep_emails/newsmd/email-body new file mode 100644 index 000000000..a1655f951 --- /dev/null +++ b/.dev/revdep_emails/newsmd/email-body @@ -0,0 +1,27 @@ +Hello Jakob Gepp! Thank you for using {lintr} in your package {newsmd}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/Dschaykib/newsmd using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 3s on CRAN vs. 1s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/openbankeR/attachments/openbankeR.warnings b/.dev/revdep_emails/openbankeR/attachments/openbankeR.warnings new file mode 100644 index 000000000..5602e2ffd --- /dev/null +++ b/.dev/revdep_emails/openbankeR/attachments/openbankeR.warnings @@ -0,0 +1,68 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Linter closed_curly_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. +Trying to remove β€˜open_curly_linter’, β€˜undesirable_function_linter’, β€˜undesirable_operator_linter’ and β€˜todo_comment_linter’, which are not in `defaults`. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. diff --git a/.dev/revdep_emails/openbankeR/email-body b/.dev/revdep_emails/openbankeR/email-body new file mode 100644 index 000000000..5b420857e --- /dev/null +++ b/.dev/revdep_emails/openbankeR/email-body @@ -0,0 +1,27 @@ +Hello Nik Lilovski! Thank you for using {lintr} in your package {openbankeR}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/nik01010/openbankeR using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 2s on CRAN vs. 1s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/osfr/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/osfr/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..56b534d6a --- /dev/null +++ b/.dev/revdep_emails/osfr/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,8 @@ +"filename","line_number","column_number","type","message","line","linter" +"data-raw/create-test-project.R",40,1,"style","Variable and function name style should be snake_case or symbols.","dev.null <- mapply(","object_name_linter" +"R/osf_tbl-compat.R",9,32,"style","Variable and function name style should be snake_case or symbols.","rbind.osf_tbl <- function(..., deparse.level = 1) {","object_name_linter" +"R/osf_tbl.R",77,23,"style","Any function spanning multiple lines should use curly braces.","as_osf_tbl.default <- function(x, subclass = NULL)","brace_linter" +"R/osf_tbl.R",92,3,"warning","local variable β€˜name_field’ assigned but may not be used"," name_field <- switch(subclass,","object_usage_linter" +"R/utils-file-operations.R",34,15,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (verbose & action == ""move"") message(sprintf(""Moved '%s' to '%s'."", x$name, to$name))","vector_logic_linter" +"R/utils-file-operations.R",35,15,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (verbose & action == ""copy"") message(sprintf(""Copied '%s' to '%s'."", x$name, to$name))","vector_logic_linter" +"R/utils-uploads.R",21,3,"warning","local variable β€˜msg’ assigned but may not be used"," msg <- bullet_msg(","object_usage_linter" diff --git a/.dev/revdep_emails/osfr/attachments/osfr.warnings b/.dev/revdep_emails/osfr/attachments/osfr.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/osfr/attachments/osfr.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/osfr/email-body b/.dev/revdep_emails/osfr/email-body new file mode 100644 index 000000000..4bd17d723 --- /dev/null +++ b/.dev/revdep_emails/osfr/email-body @@ -0,0 +1,27 @@ +Hello Aaron Wolen! Thank you for using {lintr} in your package {osfr}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/ropensci/osfr using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 35s on CRAN vs. 21s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/packager/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/packager/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..cda5a9cc8 --- /dev/null +++ b/.dev/revdep_emails/packager/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,5 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/templates/zzz.R",1,1,"style","Variable and function name style should be snake_case.",".onLoad <- function(libname, pkgname) {","object_name_linter" +"R/devtools.R",395,7,"style","Variable and function name style should be snake_case."," pkg$Rmd <- TRUE","object_name_linter" +"R/remotes_modified.R",2,1,"style","Variable and function name style should be snake_case.","`%::%` <- function(p, f) get(f, envir = asNamespace(p))","object_name_linter" +"R/zzz.R",1,1,"style","Variable and function name style should be snake_case.",".onLoad <- function(libname, pkgname) {","object_name_linter" diff --git a/.dev/revdep_emails/packager/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/packager/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..5c0411512 --- /dev/null +++ b/.dev/revdep_emails/packager/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,29 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/files/An_Introduction_to_packager.Rmd",69,72,"style","Trailing whitespace is superfluous.","if (""myFirstPackage"" %in% .packages()) detach(""package:myFirstPackage"", ","trailing_whitespace_linter" +"inst/files/An_Introduction_to_packager.Rmd",80,76,"style","Trailing whitespace is superfluous.","a <- utils::person(given = ""Your"", family = ""Name"", email = ""some@whe.re"", ","trailing_whitespace_linter" +"inst/files/An_Introduction_to_packager.Rmd",99,71,"style","Trailing whitespace is superfluous.","help_file <- system.file(""man"", paste0(package_title, ""-package.Rd""), ","trailing_whitespace_linter" +"inst/files/An_Introduction_to_packager.Rmd",101,18,"style","Only use double-quotes.","captured <- gsub('_\b', '', capture.output(tools:::Rd2txt(help_file) ))","single_quotes_linter" +"inst/files/An_Introduction_to_packager.Rmd",101,25,"style","Only use double-quotes.","captured <- gsub('_\b', '', capture.output(tools:::Rd2txt(help_file) ))","single_quotes_linter" +"inst/files/An_Introduction_to_packager.Rmd",101,70,"style","Do not place spaces before parentheses.","captured <- gsub('_\b', '', capture.output(tools:::Rd2txt(help_file) ))","spaces_inside_linter" +"inst/files/An_Introduction_to_packager.Rmd",143,39,"style","Trailing whitespace is superfluous.","suppressMessages(withr::with_dir(path, ","trailing_whitespace_linter" +"inst/files/An_Introduction_to_packager.Rmd",144,68,"style","Trailing whitespace is superfluous."," print(fakemake::make(""build"", ml, ","trailing_whitespace_linter" +"inst/files/An_Introduction_to_packager.Rmd",171,39,"style","Trailing whitespace is superfluous.","suppressMessages(withr::with_dir(path, ","trailing_whitespace_linter" +"inst/files/An_Introduction_to_packager.Rmd",172,67,"style","Trailing whitespace is superfluous."," print(fakemake::make(""check"", ml, ","trailing_whitespace_linter" +"inst/files/An_Introduction_to_packager.Rmd",199,81,"style","Lines should not be more than 80 characters.","system.time(withr::with_dir(path, print(fakemake::make(""check"", ml, verbose = FALSE))))","line_length_linter" +"inst/files/An_Introduction_to_packager.Rmd",210,81,"style","Lines should not be more than 80 characters.","withr::with_dir(path, print(fakemake::make(""cran_comments"", ml, verbose = FALSE)))","line_length_linter" +"inst/files/An_Introduction_to_packager.Rmd",223,56,"style","Trailing whitespace is superfluous.","packager::git_add_commit(path = path, untracked = TRUE, ","trailing_whitespace_linter" +"inst/files/An_Introduction_to_packager.Rmd",246,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" +"inst/runit_tests/test_internal.R",51,23,"style","Any function spanning multiple lines should use curly braces.","test_warn_and_stop <- function()","brace_linter" +"inst/templates/README.Rmd",37,20,"style","Only use double-quotes."," captured <- gsub('_\b', '', capture.output(tools:::Rd2txt(help_file) ))","single_quotes_linter" +"inst/templates/README.Rmd",37,27,"style","Only use double-quotes."," captured <- gsub('_\b', '', capture.output(tools:::Rd2txt(help_file) ))","single_quotes_linter" +"inst/templates/README.Rmd",37,72,"style","Do not place spaces before parentheses."," captured <- gsub('_\b', '', capture.output(tools:::Rd2txt(help_file) ))","spaces_inside_linter" +"R/convert_vignette.R",76,24,"style","Any function spanning multiple lines should use curly braces.","convert_code_blocks <- function(lines)","brace_linter" +"R/devtools.R",478,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/devtools.R",532,7,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/devtools.R",536,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/git.R",55,20,"style","Any function spanning multiple lines should use curly braces."," function(x)","brace_linter" +"R/internal.R",110,16,"style","Variable and function name style should be snake_case or symbols."," substr(Rdep, start, stop) <- paste(numeric_version, collapse = ""."")","object_name_linter" +"R/remotes_modified.R",8,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/upload_cran.R",24,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/usethis.R",92,5,"style","`else` should come on the same line as the previous `}`."," else if (delta == 0 && !is.null(min_version)) {","brace_linter" +"R/usethis.R",101,5,"style","`else` should come on the same line as the previous `}`."," else if (delta > 0) {","brace_linter" diff --git a/.dev/revdep_emails/packager/attachments/packager.warnings b/.dev/revdep_emails/packager/attachments/packager.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/packager/attachments/packager.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/packager/email-body b/.dev/revdep_emails/packager/email-body new file mode 100644 index 000000000..85ffad84e --- /dev/null +++ b/.dev/revdep_emails/packager/email-body @@ -0,0 +1,27 @@ +Hello Andreas Dominik Cullmann! Thank you for using {lintr} in your package {packager}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://gitlab.com/fvafrCU/packager using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 40s on CRAN vs. 23s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/physiology/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/physiology/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..e58e63851 --- /dev/null +++ b/.dev/revdep_emails/physiology/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,58 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/JOSS/paper.Rmd",14,33,"style","Trailing whitespace is superfluous.","egfr(creatinine_mgdl_to_uM(1.4), ","trailing_whitespace_linter" +"inst/JOSS/paper.Rmd",17,19,"style","Trailing whitespace is superfluous."," male = FALSE, ","trailing_whitespace_linter" +"inst/JOSS/paper.Rmd",25,54,"style","Trailing whitespace is superfluous."," #Height = c(seq.default(1.2, 1.8, by = 0.2)), ","trailing_whitespace_linter" +"inst/JOSS/paper.Rmd",33,57,"style","Trailing whitespace is superfluous."," height_m = as.integer(x[""Height""]), ","trailing_whitespace_linter" +"inst/JOSS/paper.Rmd",35,49,"style","Trailing whitespace is superfluous."," male = x[""Male""] == ""Male"", ","trailing_whitespace_linter" +"inst/JOSS/paper.Rmd",36,52,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," black = x[""Black""] == ""Black"")}","brace_linter" +"inst/JOSS/paper.Rmd",40,38,"style","Trailing whitespace is superfluous.","ggplot(plt, aes(x = Age, y = eGFR)) + ","trailing_whitespace_linter" +"inst/JOSS/paper.Rmd",41,21,"style","Trailing whitespace is superfluous."," geom_col() + ","trailing_whitespace_linter" +"R/bmi.R",30,23,"style","Any function spanning multiple lines should use curly braces.","ideal_weight_adult <- function(height_m, male, ...)","brace_linter" +"R/bmi.R",35,23,"style","Any function spanning multiple lines should use curly braces.","ideal_weight_child <- function(height_m, age_y = NULL, ...)","brace_linter" +"R/bmi.R",79,24,"style","Any function spanning multiple lines should use curly braces.","ideal_weight_Devine <- function(height_m, male, ...)","brace_linter" +"R/bmi.R",89,26,"style","Any function spanning multiple lines should use curly braces.","ideal_weight_Robinson <- function(height_m, male, ...)","brace_linter" +"R/bmi.R",99,24,"style","Any function spanning multiple lines should use curly braces.","ideal_weight_Miller <- function(height_m, male, ...)","brace_linter" +"R/bmi.R",108,23,"style","Any function spanning multiple lines should use curly braces.","ideal_weight_Broca <- function(height_m, male, ...)","brace_linter" +"R/deadspace.R",87,31,"style","Any function spanning multiple lines should use curly braces.","deadspace_intrathoracic_ml <- function(ideal_weight_kg)","brace_linter" +"R/eGFR.R",208,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (any(ret > 60) & warn_ckdepi_preferred)","vector_logic_linter" +"R/eGFR.R",248,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (any(ret < 60) & warn_mdrd_preferred) {","vector_logic_linter" +"R/physics.R",5,16,"style","Any function spanning multiple lines should use curly braces.","temp_c_to_k <- function(temp_c)","brace_linter" +"R/physics.R",12,18,"style","Any function spanning multiple lines should use curly braces.","svp_sea_level <- function(temp_k)","brace_linter" +"R/valid.R",86,20,"style","Any function spanning multiple lines should use curly braces.","valid_age_adult <- function(age_y, age_min = 18, age_max = 150,","brace_linter" +"R/valid.R",106,42,"style","Put spaces around all infix operators."," scr_min_hard=0, scr_max_hard = 4000,","infix_spaces_linter" +"tests/testthat/test-bmi.R",25,54,"style","Use FALSE instead of the symbol F."," expect_equal(ideal_weight_adult(60 / inch, male = F), 45.5)","T_and_F_symbol_linter" +"tests/testthat/test-bmi.R",207,42,"style","Use TRUE instead of the symbol T."," expect_error(do.call(f, list(male = T)), info = f)","T_and_F_symbol_linter" +"tests/testthat/test-bmi.R",213,64,"style","Use TRUE instead of the symbol T."," expect_error(do.call(f, list(height_m = c(1.5, 2), male = T)), info = f)","T_and_F_symbol_linter" +"tests/testthat/test-bmi.R",214,58,"style","Use TRUE instead of the symbol T."," expect_error(do.call(f, list(height_m = 2, male = c(T, F))), info = f)","T_and_F_symbol_linter" +"tests/testthat/test-bmi.R",214,61,"style","Use FALSE instead of the symbol F."," expect_error(do.call(f, list(height_m = 2, male = c(T, F))), info = f)","T_and_F_symbol_linter" +"tests/testthat/test-bmi.R",216,61,"style","Use TRUE instead of the symbol T."," expect_error(do.call(f, list(height_m = NULL, male = c(T, F))), info = f)","T_and_F_symbol_linter" +"tests/testthat/test-bmi.R",216,64,"style","Use FALSE instead of the symbol F."," expect_error(do.call(f, list(height_m = NULL, male = c(T, F))), info = f)","T_and_F_symbol_linter" +"tests/testthat/test-bmi.R",217,65,"style","Use TRUE instead of the symbol T."," expect_error(do.call(f, list(height_m = c(1.5, NA), male = T)), info = f)","T_and_F_symbol_linter" +"tests/testthat/test-bmi.R",218,62,"style","Use TRUE instead of the symbol T."," expect_error(do.call(f, list(height_m = 2, male = c(NA, T))), info = f)","T_and_F_symbol_linter" +"tests/testthat/test-bmi.R",219,59,"style","Use FALSE instead of the symbol F."," expect_error(do.call(f, list(height_m = NULL, male = F)), info = f)","T_and_F_symbol_linter" +"tests/testthat/test-bmi.R",226,46,"style","Use TRUE instead of the symbol T."," do.call(f, list(height_m = -1, male = T, do.stop = TRUE)), info = f)","T_and_F_symbol_linter" +"tests/testthat/test-bmi.R",228,46,"style","Use TRUE instead of the symbol T."," do.call(f, list(height_m = 0, male = T, do.stop = TRUE)), info = f)","T_and_F_symbol_linter" +"tests/testthat/test-bmi.R",236,45,"style","Use TRUE instead of the symbol T."," do.call(f, list(height_m = 8, male = T, do.stop = TRUE)), info = f)","T_and_F_symbol_linter" +"vignettes/Everest.Rmd",37,8,"style","Use <-, not =, for assignment.","temp_k = temp_c_to_k(37)","assignment_linter" +"vignettes/Everest.Rmd",45,18,"style","Use <-, not =, for assignment.","pres_atm_everest = 760 * pres_atm_frac(8850)","assignment_linter" +"vignettes/Everest.Rmd",51,19,"style","Trailing whitespace is superfluous."," PACO2_mmHg = 40, ","trailing_whitespace_linter" +"vignettes/Everest.Rmd",63,35,"style","Trailing whitespace is superfluous."," PACO2_mmHg = PACO2_mmHg_Grocott, ","trailing_whitespace_linter" +"vignettes/Everest.Rmd",76,35,"style","Trailing whitespace is superfluous."," PACO2_mmHg = PACO2_mmHg_Grocott, ","trailing_whitespace_linter" +"vignettes/Everest.Rmd",81,35,"style","Trailing whitespace is superfluous."," PACO2_mmHg = PACO2_mmHg_Grocott, ","trailing_whitespace_linter" +"vignettes/Everest.Rmd",92,43,"style","Trailing whitespace is superfluous.","results <- c(""sea\nlevel"" = PAO2_sealevel, ","trailing_whitespace_linter" +"vignettes/Everest.Rmd",93,54,"style","Trailing whitespace is superfluous."," ""summit\nresting"" = PAO2_summit_resting, ","trailing_whitespace_linter" +"vignettes/Everest.Rmd",94,55,"style","Trailing whitespace is superfluous."," ""summit\nexertion"" = PAO2_summit_exerted, ","trailing_whitespace_linter" +"vignettes/Everest.Rmd",95,56,"style","Trailing whitespace is superfluous."," ""summit\nfatty diet"" = PAO2_summit_lipids, ","trailing_whitespace_linter" +"vignettes/Everest.Rmd",98,17,"style","Trailing whitespace is superfluous.","barplot(results, ","trailing_whitespace_linter" +"vignettes/IdealWeightComparison.Rmd",19,14,"style","Use TRUE instead of the symbol T.","male <- rep(T, times = length(hts))","T_and_F_symbol_linter" +"vignettes/NeonatalVentilation.Rmd",36,23,"style","Trailing whitespace is superfluous."," childsds::who.ref, ","trailing_whitespace_linter" +"vignettes/NeonatalVentilation.Rmd",39,18,"style","Trailing whitespace is superfluous."," stack = TRUE, ","trailing_whitespace_linter" +"vignettes/NeonatalVentilation.Rmd",42,36,"style","Trailing whitespace is superfluous."," dplyr::rename(weight = value) %>% ","trailing_whitespace_linter" +"vignettes/NeonatalVentilation.Rmd",50,40,"style","Trailing whitespace is superfluous."," mutate(tidal_volume = 7 * weight) %>% ","trailing_whitespace_linter" +"vignettes/NeonatalVentilation.Rmd",53,41,"style","Trailing whitespace is superfluous.","plot(dat[c(""weight"", ""error_fraction"")], ","trailing_whitespace_linter" +"vignettes/NeonatalVentilation.Rmd",64,26,"style","Trailing whitespace is superfluous.","cleft_repair_deadspace <- ","trailing_whitespace_linter" +"vignettes/NeonatalVentilation.Rmd",66,40,"style","Trailing whitespace is superfluous."," elbow = FALSE, ","trailing_whitespace_linter" +"vignettes/NeonatalVentilation.Rmd",68,27,"style","Trailing whitespace is superfluous.","cleft_repair_deadspace2 <- ","trailing_whitespace_linter" +"vignettes/NeonatalVentilation.Rmd",70,40,"style","Trailing whitespace is superfluous."," elbow = FALSE, ","trailing_whitespace_linter" +"vignettes/NeonatalVentilation.Rmd",80,37,"style","Trailing whitespace is superfluous.","plot(dat$months, dat$equip_err_frac, ","trailing_whitespace_linter" +"vignettes/NeonatalVentilation.Rmd",93,27,"style","Put spaces around all infix operators.","axis(1, at = seq(0, 12, 12/6), labels = wts, line = 2)","infix_spaces_linter" diff --git a/.dev/revdep_emails/physiology/attachments/physiology.warnings b/.dev/revdep_emails/physiology/attachments/physiology.warnings new file mode 100644 index 000000000..182961f94 --- /dev/null +++ b/.dev/revdep_emails/physiology/attachments/physiology.warnings @@ -0,0 +1,2 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Trying to remove β€˜camel_case_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/physiology/email-body b/.dev/revdep_emails/physiology/email-body new file mode 100644 index 000000000..3b5c043f3 --- /dev/null +++ b/.dev/revdep_emails/physiology/email-body @@ -0,0 +1,27 @@ +Hello Jack O. Wasey! Thank you for using {lintr} in your package {physiology}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/jackwasey/physiology using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 19s on CRAN vs. 12s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/precommit/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/precommit/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..858073cfe --- /dev/null +++ b/.dev/revdep_emails/precommit/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,8 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/hooks/exported/style-files.R",77,3,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" +"R/exec.R",207,5,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" +"R/release.R",46,3,"warning","local variable β€˜last_release’ assigned but may not be used"," last_release <- call_and_capture(""git"", ""tag -l --sort=-taggerdate"")$stdout[1]","object_usage_linter" +"R/release.R",49,3,"warning","local variable β€˜msg1’ assigned but may not be used"," msg1 <- glue::glue(""Release {new_version}, see NEWS.md for details."")","object_usage_linter" +"R/setup.R",193,7,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" +"R/zzz.R",1,1,"style","Variable and function name style should be snake_case.",".onLoad <- function(libname, pkgname) {","object_name_linter" +"tests/testthat/test-conda.R",157,7,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" diff --git a/.dev/revdep_emails/precommit/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/precommit/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..f79a2fb4a --- /dev/null +++ b/.dev/revdep_emails/precommit/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,17 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/hooks/exported/deps-in-desc.R",9,3,"style","Use <-, not ->, for assignment.",""" -> doc","assignment_linter" +"inst/hooks/exported/lintr.R",11,3,"style","Use <-, not ->, for assignment.",""" -> doc","assignment_linter" +"inst/hooks/exported/readme-rmd-rendered.R",2,31,"warning","Conditional expressions require scalar logical operators (&& and ||)","if (file.exists(""README.Rmd"") & file.exists(""README.md"")) {","vector_logic_linter" +"inst/hooks/exported/roxygenize.R",22,3,"style","Use <-, not ->, for assignment.",""" -> doc","assignment_linter" +"inst/hooks/exported/spell-check.R",10,3,"style","Use <-, not ->, for assignment.",""" -> doc","assignment_linter" +"inst/hooks/exported/style-files.R",13,3,"style","Use <-, not ->, for assignment.","' -> doc","assignment_linter" +"inst/hooks/local/consistent-release-tag.R",8,3,"style","Use <-, not ->, for assignment.",""" -> doc","assignment_linter" +"R/call.R",13,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(command) != 1 | !inherits(command, ""character"")) {","vector_logic_linter" +"R/config.R",43,49,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!file_exists(fs::path(root, name_target)) | force) {","vector_logic_linter" +"R/install.R",3,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is_installed() | force) {","vector_logic_linter" +"tests/testthat/in/parsable-R-fail.Rmd",7,3,"error","unexpected numeric constant","1 1j1j ΓΆj1 ",NA +"tests/testthat/in/parsable-R-fail.Rmd",7,11,"style","Trailing whitespace is superfluous.","1 1j1j ΓΆj1 ","trailing_whitespace_linter" +"tests/testthat/in/parsable-R-success.Rmd",16,11,"error","unexpected numeric constant"," fas / fk 12 -",NA +"tests/testthat/in/parsable-R-success.Rmd",21,8,"style","Trailing whitespace is superfluous.","this is ","trailing_whitespace_linter" +"tests/testthat/in/parsable-R-success.Rmd",25,8,"style","Trailing whitespace is superfluous.","this is ","trailing_whitespace_linter" +"tests/testthat/in/parsable-R-success.Rmd",29,8,"style","Trailing whitespace is superfluous.","this is ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/precommit/email-body b/.dev/revdep_emails/precommit/email-body new file mode 100644 index 000000000..2adbbf09d --- /dev/null +++ b/.dev/revdep_emails/precommit/email-body @@ -0,0 +1,27 @@ +Hello Lorenz Walthert! Thank you for using {lintr} in your package {precommit}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/lorenzwalthert/precommit using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 30s on CRAN vs. 17s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/prettyB/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/prettyB/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..7bb0db986 --- /dev/null +++ b/.dev/revdep_emails/prettyB/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,23 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/barplot.R",33,23,"style","Compound semicolons are discouraged. Replace them by a newline."," args$height = height; args$width = width; args$space = space","semicolon_linter" +"R/barplot.R",33,43,"style","Compound semicolons are discouraged. Replace them by a newline."," args$height = height; args$width = width; args$space = space","semicolon_linter" +"R/barplot.R",34,29,"style","Compound semicolons are discouraged. Replace them by a newline."," args$names.arg = names.arg; args$legend.text = legend.text","semicolon_linter" +"R/barplot.R",35,23,"style","Compound semicolons are discouraged. Replace them by a newline."," args$beside = beside; args$horiz = horiz","semicolon_linter" +"R/barplot.R",36,25,"style","Compound semicolons are discouraged. Replace them by a newline."," args$density = density; args$angle = angle","semicolon_linter" +"R/barplot.R",41,17,"style","Compound semicolons are discouraged. Replace them by a newline."," args$xpd = xpd; args$log = log","semicolon_linter" +"R/barplot.R",42,29,"style","Compound semicolons are discouraged. Replace them by a newline."," args$axisnames = axisnames; args$cex.axis = cex.axis","semicolon_linter" +"R/boxplot.R",44,13,"style","Compound semicolons are discouraged. Replace them by a newline."," args$x = x; args$range = range; args$width = width","semicolon_linter" +"R/boxplot.R",44,33,"style","Compound semicolons are discouraged. Replace them by a newline."," args$x = x; args$range = range; args$width = width","semicolon_linter" +"R/boxplot.R",45,27,"style","Compound semicolons are discouraged. Replace them by a newline."," args$varwidth = varwidth; args$notch = notch; args$outline = outline","semicolon_linter" +"R/boxplot.R",45,47,"style","Compound semicolons are discouraged. Replace them by a newline."," args$varwidth = varwidth; args$notch = notch; args$outline = outline","semicolon_linter" +"R/boxplot.R",47,19,"style","Compound semicolons are discouraged. Replace them by a newline."," args$plot = plot; args$border = border; args$log = log","semicolon_linter" +"R/boxplot.R",47,41,"style","Compound semicolons are discouraged. Replace them by a newline."," args$plot = plot; args$border = border; args$log = log","semicolon_linter" +"R/boxplot.R",48,19,"style","Compound semicolons are discouraged. Replace them by a newline."," args$pars = pars; args$horizontal = horizontal; args$add = add","semicolon_linter" +"R/boxplot.R",48,49,"style","Compound semicolons are discouraged. Replace them by a newline."," args$pars = pars; args$horizontal = horizontal; args$add = add","semicolon_linter" +"R/boxplot.R",52,19,"style","Compound semicolons are discouraged. Replace them by a newline."," main = args$main; sub = args$sub","semicolon_linter" +"R/boxplot.R",97,29,"style","Compound semicolons are discouraged. Replace them by a newline."," args$xlim = name_axis$lim; args$ylim = number_axis$lim","semicolon_linter" +"R/boxplot.R",98,32,"style","Compound semicolons are discouraged. Replace them by a newline."," ticks_names = name_axis$ticks; ticks_numbers = number_axis$ticks","semicolon_linter" +"R/boxplot.R",114,19,"style","Compound semicolons are discouraged. Replace them by a newline."," args$yaxt = NULL; args$add = TRUE","semicolon_linter" +"vignettes/introduction.Rmd",10,52,"style","Do not place spaces before parentheses.","knitr::opts_chunk$set(results = ""hide"", echo = TRUE )","spaces_inside_linter" +"vignettes/introduction.Rmd",51,53,"style","Trailing whitespace is superfluous.","hist(y, main = ""Base Graphics"", sub = ""Sub heading"", ","trailing_whitespace_linter" +"vignettes/introduction.Rmd",121,41,"style","Trailing whitespace is superfluous.","boxplot_p(rnorm(100), horizontal = TRUE, ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/prettyB/attachments/prettyB.warnings b/.dev/revdep_emails/prettyB/attachments/prettyB.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/prettyB/attachments/prettyB.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/prettyB/email-body b/.dev/revdep_emails/prettyB/email-body new file mode 100644 index 000000000..3ba65ab71 --- /dev/null +++ b/.dev/revdep_emails/prettyB/email-body @@ -0,0 +1,27 @@ +Hello Colin Gillespie! Thank you for using {lintr} in your package {prettyB}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/jumpingrivers/prettyB using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 5s on CRAN vs. 2s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/rBiasCorrection/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/rBiasCorrection/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..165042a71 --- /dev/null +++ b/.dev/revdep_emails/rBiasCorrection/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,110 @@ +"filename","line_number","column_number","type","message","line","linter" +"data-raw/devstuffs.R",11,79,"style","Only use double-quotes."," person(""Lorenz A."", ""Kapsner"", email = ""lorenz.kapsner@gmail.com"", role = c('cre', 'aut', 'cph'),","single_quotes_linter" +"data-raw/devstuffs.R",11,81,"style","Lines should not be more than 80 characters."," person(""Lorenz A."", ""Kapsner"", email = ""lorenz.kapsner@gmail.com"", role = c('cre', 'aut', 'cph'),","line_length_linter" +"data-raw/devstuffs.R",11,86,"style","Only use double-quotes."," person(""Lorenz A."", ""Kapsner"", email = ""lorenz.kapsner@gmail.com"", role = c('cre', 'aut', 'cph'),","single_quotes_linter" +"data-raw/devstuffs.R",11,93,"style","Only use double-quotes."," person(""Lorenz A."", ""Kapsner"", email = ""lorenz.kapsner@gmail.com"", role = c('cre', 'aut', 'cph'),","single_quotes_linter" +"data-raw/devstuffs.R",43,2,"style","Commented code should be removed.","#usethis::use_gpl3_license(name=""Lorenz Kapsner"")","commented_code_linter" +"data-raw/devstuffs.R",46,53,"style","Put spaces around all infix operators.","usethis::use_package(""R"", min_version = ""2.10"", type=""Depends"")","infix_spaces_linter" +"data-raw/devstuffs.R",49,81,"style","Lines should not be more than 80 characters.","# https://cran.r-project.org/web/packages/data.table/vignettes/datatable-importing.html","line_length_linter" +"data-raw/devstuffs.R",50,40,"style","Put spaces around all infix operators.","usethis::use_package(""data.table"", type=""Imports"")","infix_spaces_linter" +"data-raw/devstuffs.R",51,37,"style","Put spaces around all infix operators.","usethis::use_package(""ggplot2"", type=""Imports"")","infix_spaces_linter" +"data-raw/devstuffs.R",52,38,"style","Put spaces around all infix operators.","usethis::use_package(""magrittr"", type=""Imports"")","infix_spaces_linter" +"data-raw/devstuffs.R",53,37,"style","Put spaces around all infix operators.","usethis::use_package(""polynom"", type=""Imports"")","infix_spaces_linter" +"data-raw/devstuffs.R",54,34,"style","Put spaces around all infix operators.","usethis::use_package(""nls2"", type=""Imports"")","infix_spaces_linter" +"data-raw/devstuffs.R",55,35,"style","Put spaces around all infix operators.","usethis::use_package(""stats"", type=""Imports"")","infix_spaces_linter" +"data-raw/devstuffs.R",56,42,"style","Put spaces around all infix operators.","usethis::use_package(""future.apply"", type=""Imports"")","infix_spaces_linter" +"data-raw/devstuffs.R",66,36,"style","Put spaces around all infix operators.","usethis::use_package(""ggpubr"", type=""Suggests"")","infix_spaces_linter" +"data-raw/devstuffs.R",70,3,"style","Commented code should be removed.","# tag <- ""master""","commented_code_linter" +"data-raw/devstuffs.R",71,3,"style","Commented code should be removed.","# devtools::install_github(repo = ""r-lib/testthat"", ref = tag, upgrade = ""always"")","commented_code_linter" +"data-raw/devstuffs.R",71,81,"style","Lines should not be more than 80 characters.","# devtools::install_github(repo = ""r-lib/testthat"", ref = tag, upgrade = ""always"")","line_length_linter" +"data-raw/devstuffs.R",72,3,"style","Commented code should be removed.","# # https://cran.r-project.org/web/packages/devtools/vignettes/dependencies.html","commented_code_linter" +"data-raw/devstuffs.R",73,3,"style","Commented code should be removed.","# desc::desc_set_remotes(paste0(""github::r-lib/testthat@"", tag), file = usethis::proj_get())","commented_code_linter" +"data-raw/devstuffs.R",73,81,"style","Lines should not be more than 80 characters.","# desc::desc_set_remotes(paste0(""github::r-lib/testthat@"", tag), file = usethis::proj_get())","line_length_linter" +"data-raw/devstuffs.R",133,3,"style","Commented code should be removed.","# experimental = ""../19_PCR-bias/data/example_data/type1/example_data_type1_experimentaldata.csv""","commented_code_linter" +"data-raw/devstuffs.R",133,81,"style","Lines should not be more than 80 characters.","# experimental = ""../19_PCR-bias/data/example_data/type1/example_data_type1_experimentaldata.csv""","line_length_linter" +"data-raw/devstuffs.R",134,3,"style","Commented code should be removed.","# calibration = ""../19_PCR-bias/data/example_data/type1/example_data_type1_calibrationdata.csv""","commented_code_linter" +"data-raw/devstuffs.R",134,81,"style","Lines should not be more than 80 characters.","# calibration = ""../19_PCR-bias/data/example_data/type1/example_data_type1_calibrationdata.csv""","line_length_linter" +"data-raw/devstuffs.R",136,1,"style","Variable and function name style should be snake_case or symbols.","example.data_experimental <- data.table::fread(""./tests/testthat/testdata/exp_type_1.csv"")","object_name_linter" +"data-raw/devstuffs.R",136,81,"style","Lines should not be more than 80 characters.","example.data_experimental <- data.table::fread(""./tests/testthat/testdata/exp_type_1.csv"")","line_length_linter" +"data-raw/devstuffs.R",137,1,"style","Variable and function name style should be snake_case or symbols.","example.data_calibration <- data.table::fread(""./tests/testthat/testdata/cal_type_1.csv"")","object_name_linter" +"data-raw/devstuffs.R",137,81,"style","Lines should not be more than 80 characters.","example.data_calibration <- data.table::fread(""./tests/testthat/testdata/cal_type_1.csv"")","line_length_linter" +"data-raw/devstuffs.R",139,3,"style","Commented code should be removed.","# vec <- colnames(example.data_experimental)","commented_code_linter" +"data-raw/devstuffs.R",140,3,"style","Commented code should be removed.","# vec <- vec[2:length(vec)]","commented_code_linter" +"data-raw/devstuffs.R",142,5,"style","Commented code should be removed.","# as.numeric(gsub(""\\,"", ""."", x))","commented_code_linter" +"data-raw/devstuffs.R",145,3,"style","Commented code should be removed.","# data.table::fwrite(example.data_experimental, ""./tests/testthat/testdata/exp_type_1.csv"")","commented_code_linter" +"data-raw/devstuffs.R",145,81,"style","Lines should not be more than 80 characters.","# data.table::fwrite(example.data_experimental, ""./tests/testthat/testdata/exp_type_1.csv"")","line_length_linter" +"data-raw/devstuffs.R",147,3,"style","Commented code should be removed.","# vec <- colnames(example.data_calibration)","commented_code_linter" +"data-raw/devstuffs.R",149,5,"style","Commented code should be removed.","# as.numeric(gsub(""\\,"", ""."", x))","commented_code_linter" +"data-raw/devstuffs.R",152,3,"style","Commented code should be removed.","# data.table::fwrite(example.data_calibration, ""./tests/testthat/testdata/cal_type_1.csv"")","commented_code_linter" +"data-raw/devstuffs.R",152,81,"style","Lines should not be more than 80 characters.","# data.table::fwrite(example.data_calibration, ""./tests/testthat/testdata/cal_type_1.csv"")","line_length_linter" +"data-raw/devstuffs.R",154,1,"style","Variable and function name style should be snake_case or symbols.","example.data_experimental <- rBiasCorrection::clean_dt(example.data_experimental,","object_name_linter" +"data-raw/devstuffs.R",154,81,"style","Lines should not be more than 80 characters.","example.data_experimental <- rBiasCorrection::clean_dt(example.data_experimental,","line_length_linter" +"data-raw/devstuffs.R",158,1,"style","Variable and function name style should be snake_case or symbols.","example.data_calibration <- rBiasCorrection::clean_dt(example.data_calibration,","object_name_linter" +"data-raw/devstuffs.R",164,1,"style","Variable and function name style should be snake_case or symbols.","example._plot.df_agg <- rBiasCorrection:::create_agg_df(","object_name_linter" +"data-raw/devstuffs.R",171,31,"style","Use FALSE instead of the symbol F."," internal = F,","T_and_F_symbol_linter" +"data-raw/devstuffs.R",172,32,"style","Use FALSE instead of the symbol F."," overwrite = F)","T_and_F_symbol_linter" +"data-raw/devstuffs.R",175,3,"style","Commented code should be removed.","# BiasCorrection(experimental = ""../19_PCR-bias/data/example_data/type1/example_data_type1_experimentaldata.csv"", calibration = ""../19_PCR-bias/data/example_data/type1/example_data_type1_calibrationdata.csv"", samplelocusname = ""Test"")","commented_code_linter" +"data-raw/devstuffs.R",175,81,"style","Lines should not be more than 80 characters.","# BiasCorrection(experimental = ""../19_PCR-bias/data/example_data/type1/example_data_type1_experimentaldata.csv"", calibration = ""../19_PCR-bias/data/example_data/type1/example_data_type1_calibrationdata.csv"", samplelocusname = ""Test"")","line_length_linter" +"data-raw/devstuffs.R",176,2,"style","Commented code should be removed.","#covr::package_coverage()","commented_code_linter" +"data-raw/devstuffs.R",177,2,"style","Commented code should be removed.","#lintr::lint_package()","commented_code_linter" +"data-raw/devstuffs.R",178,2,"style","Commented code should be removed.","#styler::style_pkg()","commented_code_linter" +"R/better_model.R",106,55,"style","Use FALSE instead of the symbol F."," ""SSE_cubic""), with = F]","T_and_F_symbol_linter" +"R/better_model.R",113,80,"style","Use FALSE instead of the symbol F."," x_dat <- statstable_post_hyperbolic[, c(""Name"", ""relative_error""), with = F]","T_and_F_symbol_linter" +"R/better_model.R",115,75,"style","Use FALSE instead of the symbol F."," y_dat <- statstable_post_cubic[, c(""Name"", ""relative_error""), with = F]","T_and_F_symbol_linter" +"R/better_model.R",119,28,"style","Use TRUE instead of the symbol T."," all = T,","T_and_F_symbol_linter" +"R/biascorrection.R",178,49,"style","Use TRUE instead of the symbol T."," data.table::fread(experimental, header = T),","T_and_F_symbol_linter" +"R/biascorrection.R",188,69,"style","Use TRUE instead of the symbol T."," cal_type_1 <- clean_dt(data.table::fread(calibration, header = T),","T_and_F_symbol_linter" +"R/biascorrection.R",278,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" +"R/biascorrection.R",376,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" +"R/biascorrection.R",485,60,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" +"R/biascorrection.R",490,60,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" +"R/clean_dt.R",125,36,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (description == ""calibration"" & type == ""1"") {","vector_logic_linter" +"R/clean_dt.R",153,60,"style","Use TRUE instead of the symbol T."," datatable <- datatable[rowSums(datatable[, -1], na.rm = T) != 0, ]","T_and_F_symbol_linter" +"R/clean_dt.R",161,34,"style","Use FALSE instead of the symbol F."," datatable[, vec_cal, with = F], na.rm = T","T_and_F_symbol_linter" +"R/clean_dt.R",161,46,"style","Use TRUE instead of the symbol T."," datatable[, vec_cal, with = F], na.rm = T","T_and_F_symbol_linter" +"R/clean_dt.R",173,43,"style","Use FALSE instead of the symbol F."," !is.na(datatable[, vec[-1], with = F])","T_and_F_symbol_linter" +"R/clean_dt.R",193,68,"style","Use TRUE instead of the symbol T."," datatable <- datatable[order(get(""CpG_count""), decreasing = T)]","T_and_F_symbol_linter" +"R/create_agg_df.R",20,59,"style","Use FALSE instead of the symbol F."," df <- datatable[, c(""true_methylation"", index), with = F]","T_and_F_symbol_linter" +"R/create_agg_df.R",32,41,"style","Use TRUE instead of the symbol T."," ""CpG"" = mean(get(""CpG""), na.rm = T),","T_and_F_symbol_linter" +"R/create_agg_df.R",33,45,"style","Use TRUE instead of the symbol T."," ""sd"" = stats::sd(get(""CpG""), na.rm = T)","T_and_F_symbol_linter" +"R/create_agg_df.R",50,54,"style","Use FALSE instead of the symbol F."," df <- datatable[, c(""sample_id"", index), with = F]","T_and_F_symbol_linter" +"R/create_agg_df.R",56,43,"style","Use TRUE instead of the symbol T."," ""CpG"" = mean(get(""CpG""), na.rm = T),","T_and_F_symbol_linter" +"R/create_agg_df.R",57,47,"style","Use TRUE instead of the symbol T."," ""sd"" = stats::sd(get(""CpG""), na.rm = T)","T_and_F_symbol_linter" +"R/create_agg_df.R",62,53,"style","Use FALSE instead of the symbol F."," df <- datatable[, c(""locus_id"", index), with = F]","T_and_F_symbol_linter" +"R/create_agg_df.R",67,43,"style","Use TRUE instead of the symbol T."," ""CpG"" = mean(get(""CpG""), na.rm = T),","T_and_F_symbol_linter" +"R/create_agg_df.R",68,47,"style","Use TRUE instead of the symbol T."," ""sd"" = stats::sd(get(""CpG""), na.rm = T)","T_and_F_symbol_linter" +"R/create_exampleplot.R",90,16,"style","Use FALSE instead of the symbol F."," parse = F","T_and_F_symbol_linter" +"R/createbarerrorplots.R",155,70,"style","Use FALSE instead of the symbol F."," stats_pre <- statstable_pre[, c(""Name"", ""relative_error""), with = F]","T_and_F_symbol_linter" +"R/createbarerrorplots.R",156,72,"style","Use FALSE instead of the symbol F."," stats_post <- statstable_post[, c(""Name"", ""relative_error""), with = F]","T_and_F_symbol_linter" +"R/createbarerrorplots.R",170,13,"style","Use FALSE instead of the symbol F."," sort = F,","T_and_F_symbol_linter" +"R/cubic.R",129,7,"warning","local variable β€˜ret’ assigned but may not be used"," ret <- nls2::nls2(CpG ~ cubic_eq_minmax(","object_usage_linter" +"R/cubic.R",171,62,"style","Use TRUE instead of the symbol T."," sse <- as.numeric(dat[, sum(get(""squared_error""), na.rm = T)])","T_and_F_symbol_linter" +"R/cubic.R",177,66,"style","Use TRUE instead of the symbol T."," tss <- as.numeric(dat[, sum(get(""squared_dist_mean""), na.rm = T)])","T_and_F_symbol_linter" +"R/hyperbolic.R",118,7,"warning","local variable β€˜ret’ assigned but may not be used"," ret <- nls2::nls2(CpG ~ hyperbolic_eq(","object_usage_linter" +"R/hyperbolic.R",231,7,"warning","local variable β€˜ret’ assigned but may not be used"," ret <- nls2::nls2(CpG ~ hyperbolic_eq_minmax(","object_usage_linter" +"R/hyperbolic.R",271,62,"style","Use TRUE instead of the symbol T."," sse <- as.numeric(dat[, sum(get(""squared_error""), na.rm = T)])","T_and_F_symbol_linter" +"R/hyperbolic.R",277,66,"style","Use TRUE instead of the symbol T."," tss <- as.numeric(dat[, sum(get(""squared_dist_mean""), na.rm = T)])","T_and_F_symbol_linter" +"R/hyperbolic.R",282,60,"style","Use TRUE instead of the symbol T."," , mean(get(""relative_error""), na.rm = T)],","T_and_F_symbol_linter" +"R/solving_equations.R",208,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (find_x[[k]] >= 0 & find_x[[k]] <= 100) {","vector_logic_linter" +"R/solving_equations.R",377,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (h_solv >= 0 & h_solv <= 100) {","vector_logic_linter" +"R/solving_equations.R",392,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (h_solv < 0 & h_solv > -10) {","vector_logic_linter" +"R/solving_equations.R",402,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (h_solv > 100 & h_solv < 110) {","vector_logic_linter" +"R/utils.R",118,32,"style","Use TRUE instead of the symbol T."," unlink(plotdir, recursive = T)","T_and_F_symbol_linter" +"R/utils.R",120,31,"style","Use TRUE instead of the symbol T."," unlink(csvdir, recursive = T)","T_and_F_symbol_linter" +"R/utils.R",149,52,"style","Use TRUE instead of the symbol T."," write(message_out, file = logfilename, append = T)","T_and_F_symbol_linter" +"R/utils.R",178,42,"style","Use FALSE instead of the symbol F."," row.names = F,","T_and_F_symbol_linter" +"tests/testthat/test-algorithm_minmax_FALSE_re.R",71,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" +"tests/testthat/test-algorithm_minmax_FALSE_re.R",106,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" +"tests/testthat/test-algorithm_minmax_FALSE.R",194,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" +"tests/testthat/test-algorithm_minmax_FALSE.R",276,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" +"tests/testthat/test-algorithm_minmax_TRUE_re.R",71,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" +"tests/testthat/test-algorithm_minmax_TRUE_re.R",106,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" +"tests/testthat/test-algorithm_minmax_TRUE.R",188,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" +"tests/testthat/test-algorithm_minmax_TRUE.R",265,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" +"tests/testthat/test-clean_dt.R",27,74,"style","Use TRUE instead of the symbol T."," exp_type_1 <- fread(""./testdata/exp_type_1_empty_col.csv"", header = T)","T_and_F_symbol_linter" +"tests/testthat/test-clean_dt.R",75,74,"style","Use TRUE instead of the symbol T."," exp_type_2 <- fread(""./testdata/exp_type_2_empty_col.csv"", header = T)","T_and_F_symbol_linter" +"vignettes/rBiasCorrection_howto.Rmd",55,77,"style","Use FALSE instead of the symbol F.","temp_file <- rBiasCorrection::example.data_experimental$dat[, cols, with = F]","T_and_F_symbol_linter" +"vignettes/rBiasCorrection_howto.Rmd",58,76,"style","Use FALSE instead of the symbol F.","temp_file <- rBiasCorrection::example.data_calibration$dat[, cols, with = F]","T_and_F_symbol_linter" +"vignettes/rBiasCorrection_howto.Rmd",165,81,"style","Lines should not be more than 80 characters.","filename <- list.files(csvdir)[grepl(""regression_stats_[[:digit:]]"", list.files(csvdir))]","line_length_linter" +"vignettes/rBiasCorrection_howto.Rmd",167,25,"style","Commas should always have a space after.","knitr::kable(reg_stats[,1:9])","commas_linter" +"vignettes/rBiasCorrection_howto.Rmd",168,25,"style","Commas should always have a space after.","knitr::kable(reg_stats[,11:16])","commas_linter" diff --git a/.dev/revdep_emails/rBiasCorrection/attachments/rBiasCorrection.warnings b/.dev/revdep_emails/rBiasCorrection/attachments/rBiasCorrection.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/rBiasCorrection/attachments/rBiasCorrection.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/rBiasCorrection/email-body b/.dev/revdep_emails/rBiasCorrection/email-body new file mode 100644 index 000000000..c79925732 --- /dev/null +++ b/.dev/revdep_emails/rBiasCorrection/email-body @@ -0,0 +1,27 @@ +Hello Lorenz A. Kapsner! Thank you for using {lintr} in your package {rBiasCorrection}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/kapsner/rBiasCorrection using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 28s on CRAN vs. 11s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/rasterpdf/email-body b/.dev/revdep_emails/rasterpdf/email-body new file mode 100644 index 000000000..707404889 --- /dev/null +++ b/.dev/revdep_emails/rasterpdf/email-body @@ -0,0 +1,27 @@ +Hello Ilari Scheinin! Thank you for using {lintr} in your package {rasterpdf}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/ilarischeinin/rasterpdf using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 4s on CRAN vs. 2s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/rbokeh/email-body b/.dev/revdep_emails/rbokeh/email-body new file mode 100644 index 000000000..39d92d48c --- /dev/null +++ b/.dev/revdep_emails/rbokeh/email-body @@ -0,0 +1,27 @@ +Hello Ryan Hafen! Thank you for using {lintr} in your package {rbokeh}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/bokeh/rbokeh using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 0s on CRAN vs. 0s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/rde/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/rde/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..04fab8175 --- /dev/null +++ b/.dev/revdep_emails/rde/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,12 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/load.R",65,26,"style","Variable and function name style should be snake_case or symbols."," load.fcn,","object_name_linter" +"R/save.R",100,5,"style","`else` should come on the same line as the previous `}`."," else if (length(r1) == 0 && length(r2) == 0) {","brace_linter" +"R/save.R",106,5,"style","`else` should come on the same line as the previous `}`."," else if (length(r2) == 0) {","brace_linter" +"vignettes/rde_tutorial.Rmd",48,1,"style","Variable and function name style should be snake_case or symbols.","pop.data <- read.csv(fname, stringsAsFactors = FALSE)","object_name_linter" +"vignettes/rde_tutorial.Rmd",74,1,"style","Variable and function name style should be snake_case or symbols.","pop.data <- load_rde_var(","object_name_linter" +"vignettes/rde_tutorial.Rmd",109,1,"style","Variable and function name style should be snake_case or symbols.","pop.data <- load_rde_var(","object_name_linter" +"vignettes/rde_tutorial.Rmd",116,81,"style","Lines should not be more than 80 characters."," rde1QlpoOTFBWSZTWQy+/kYAAIB3/v//6EJABRg/WlQv797wYkAAAMQiABBAACAAAZGwANk0RTKejU9T","line_length_linter" +"vignettes/rde_tutorial.Rmd",117,81,"style","Lines should not be more than 80 characters."," RoBoGgGjTRoBoGgaGymE0Kp+qemmkDNQ0YmJk0AA0xNADQNPUaA0JRhDTJoANAAAAAAAAEJx2Eja7QBK","line_length_linter" +"vignettes/rde_tutorial.Rmd",118,81,"style","Lines should not be more than 80 characters."," MKPPkRAx63wSAWt31AABs1zauhwHifs5WlltyIyQKAAAZEAZGQYMIZEA6ZAPHVMEB71jSCqdlsiR/eSY","line_length_linter" +"vignettes/rde_tutorial.Rmd",119,81,"style","Lines should not be more than 80 characters."," kzQkRq5RoXgvNNZnB5RSOvKaTGFtc/SXc74AhzqhMEJvdisEGVfo7UYngc0AwGqTvTHx8CBZTzE9OQZZ","line_length_linter" +"vignettes/rde_tutorial.Rmd",120,81,"style","Lines should not be more than 80 characters."," VY8KAhHAhrG4RCeilM0rXKkdpjGqyNgJwAkmnPQOMYrLlQ4YTIv0WyxfYdkd9WSWUsvggC/i7kinChIB","line_length_linter" diff --git a/.dev/revdep_emails/rde/email-body b/.dev/revdep_emails/rde/email-body new file mode 100644 index 000000000..80a09e749 --- /dev/null +++ b/.dev/revdep_emails/rde/email-body @@ -0,0 +1,27 @@ +Hello Stefan Kloppenborg! Thank you for using {lintr} in your package {rde}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/kloppen/rde using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 5s on CRAN vs. 3s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/rnrfa/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/rnrfa/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..24aa9c6d7 --- /dev/null +++ b/.dev/revdep_emails/rnrfa/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,65 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/catalogue.R",84,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(column_name) & !is.null(column_value)) {","vector_logic_linter" +"R/catalogue.R",87,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(column_name) & is.null(column_value)) {","vector_logic_linter" +"R/catalogue.R",90,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(column_name) & !is.null(column_value)) {","vector_logic_linter" +"R/catalogue.R",99,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (condition_2 | condition_3 | condition_4) {","vector_logic_linter" +"R/catalogue.R",99,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (condition_2 | condition_3 | condition_4) {","vector_logic_linter" +"R/catalogue.R",101,11,"warning","local variable β€˜threshold’ assigned but may not be used"," threshold <- as.numeric(as.character(substr(column_value, 3,","object_usage_linter" +"R/catalogue.R",108,14,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/catalogue.R",118,12,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/catalogue.R",123,10,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/get_ts.R",71,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/get_ts.R",78,12,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/get_ts.R",79,77,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (type %in% c(""pot-stage"", ""pot-flow"", ""amax-stage"", ""amax-flow"") &","vector_logic_linter" +"R/get_ts.R",83,14,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/get_ts.R",89,10,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/get_ts.R",94,42,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (""SOCKcluster"" %in% class(cl) | ""cluster"" %in% class(cl)) {","vector_logic_linter" +"R/get_ts.R",103,14,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/get_ts.R",107,12,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/internals.R",90,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/internals.R",100,73,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (type %in% c(""pot-stage"", ""pot-flow"", ""amax-stage"", ""amax-flow"") &","vector_logic_linter" +"R/internals.R",143,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/osg_parse.R",67,26,"style","Put spaces around all infix operators."," padz <- function(x, n=max(nchar(x))) gsub("" "", ""0"", formatC(x, width = -n))","infix_spaces_linter" +"R/plot_rain_flow.R",44,55,"style","Use TRUE instead of the symbol T."," proportion <- ceiling((max(converted_flow, na.rm = T) -","T_and_F_symbol_linter" +"R/plot_rain_flow.R",45,57,"style","Use TRUE instead of the symbol T."," min(converted_flow, na.rm = T)) / 3)","T_and_F_symbol_linter" +"R/plot_rain_flow.R",54,35,"style","Use TRUE instead of the symbol T."," graphics::par(bty = ""n"", new = T)","T_and_F_symbol_linter" +"R/plot_rain_flow.R",57,49,"style","Use FALSE instead of the symbol F."," yaxt = ""n"", xaxt = ""n"", ann = F, # do not plot x and y axis","T_and_F_symbol_linter" +"R/plot_rain_flow.R",69,35,"style","Use FALSE instead of the symbol F."," graphics::par(bty = ""o"", new = F)","T_and_F_symbol_linter" +"R/seasonal_averages.R",28,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"tests/testthat.R",7,6,"style","There should be a space before an opening curly brace.","}else{","brace_linter" +"vignettes/rnrfa-vignette.Rmd",32,81,"style","Lines should not be more than 80 characters.","install.packages(c(""cowplot"", ""httr"", ""xts"", ""ggmap"", ""ggplot2"", ""sp"", ""rgdal"", ""parallel"", ""tibble""))","line_length_linter" +"vignettes/rnrfa-vignette.Rmd",70,1,"style","Variable and function name style should be snake_case or symbols.","allIDs <- station_ids()","object_name_linter" +"vignettes/rnrfa-vignette.Rmd",79,1,"style","Variable and function name style should be snake_case or symbols.","allStations <- catalogue()","object_name_linter" +"vignettes/rnrfa-vignette.Rmd",142,22,"style","Put spaces around all infix operators.","catalogue(column_name=""river"", column_value=""Wye"")","infix_spaces_linter" +"vignettes/rnrfa-vignette.Rmd",142,44,"style","Put spaces around all infix operators.","catalogue(column_name=""river"", column_value=""Wye"")","infix_spaces_linter" +"vignettes/rnrfa-vignette.Rmd",145,28,"style","Put spaces around all infix operators.","catalogue(bbox, column_name=""river"", column_value=""Wye"")","infix_spaces_linter" +"vignettes/rnrfa-vignette.Rmd",145,50,"style","Put spaces around all infix operators.","catalogue(bbox, column_name=""river"", column_value=""Wye"")","infix_spaces_linter" +"vignettes/rnrfa-vignette.Rmd",148,28,"style","Put spaces around all infix operators.","catalogue(bbox, column_name=""catchment-area"", column_value="">1"")","infix_spaces_linter" +"vignettes/rnrfa-vignette.Rmd",148,59,"style","Put spaces around all infix operators.","catalogue(bbox, column_name=""catchment-area"", column_value="">1"")","infix_spaces_linter" +"vignettes/rnrfa-vignette.Rmd",154,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/rnrfa-vignette.Rmd",156,22,"style","Put spaces around all infix operators.","catalogue(column_name=""id"", column_value=c(3001,3002,3003))","infix_spaces_linter" +"vignettes/rnrfa-vignette.Rmd",156,41,"style","Put spaces around all infix operators.","catalogue(column_name=""id"", column_value=c(3001,3002,3003))","infix_spaces_linter" +"vignettes/rnrfa-vignette.Rmd",156,49,"style","Commas should always have a space after.","catalogue(column_name=""id"", column_value=c(3001,3002,3003))","commas_linter" +"vignettes/rnrfa-vignette.Rmd",156,54,"style","Commas should always have a space after.","catalogue(column_name=""id"", column_value=c(3001,3002,3003))","commas_linter" +"vignettes/rnrfa-vignette.Rmd",161,1,"style","Variable and function name style should be snake_case or symbols.","someStations <- catalogue(bbox,","object_name_linter" +"vignettes/rnrfa-vignette.Rmd",163,50,"style","Commas should always have a space after."," column_value = c(54022,54090,54091,54092,54097),","commas_linter" +"vignettes/rnrfa-vignette.Rmd",163,56,"style","Commas should always have a space after."," column_value = c(54022,54090,54091,54092,54097),","commas_linter" +"vignettes/rnrfa-vignette.Rmd",163,62,"style","Commas should always have a space after."," column_value = c(54022,54090,54091,54092,54097),","commas_linter" +"vignettes/rnrfa-vignette.Rmd",163,68,"style","Commas should always have a space after."," column_value = c(54022,54090,54091,54092,54097),","commas_linter" +"vignettes/rnrfa-vignette.Rmd",214,21,"style","Put spaces around all infix operators.","plot(info$data, main=paste(""Monthly rainfall data for the"",","infix_spaces_linter" +"vignettes/rnrfa-vignette.Rmd",215,50,"style","Commas should always have a space after."," info$meta$stationName,""catchment""), ","commas_linter" +"vignettes/rnrfa-vignette.Rmd",215,63,"style","Trailing whitespace is superfluous."," info$meta$stationName,""catchment""), ","trailing_whitespace_linter" +"vignettes/rnrfa-vignette.Rmd",216,10,"style","Put spaces around all infix operators."," xlab="""", ylab=info$meta$units)","infix_spaces_linter" +"vignettes/rnrfa-vignette.Rmd",216,19,"style","Put spaces around all infix operators."," xlab="""", ylab=info$meta$units)","infix_spaces_linter" +"vignettes/rnrfa-vignette.Rmd",228,21,"style","Put spaces around all infix operators.","plot(info$data, main=paste0(""Daily flow data for the "",","infix_spaces_linter" +"vignettes/rnrfa-vignette.Rmd",239,17,"style","Commas should always have a space after.","s <- cmr(c(3002,3003), metadata = TRUE)","commas_linter" +"vignettes/rnrfa-vignette.Rmd",242,18,"style","Trailing whitespace is superfluous.","plot(s[[1]]$data, ","trailing_whitespace_linter" +"vignettes/rnrfa-vignette.Rmd",244,23,"style","Put spaces around all infix operators.","lines(s[[2]]$data, col=""green"")","infix_spaces_linter" +"vignettes/rnrfa-vignette.Rmd",261,45,"style","`%>%` should always have a space before it and a new line after it, unless the full pipeline fits on one line.","leaflet(data = someStations) %>% addTiles() %>%","pipe_continuation_linter" +"vignettes/rnrfa-vignette.Rmd",262,68,"style","Commas should always have a space after."," addMarkers(~longitude, ~latitude, popup = ~as.character(paste(id,name)))","commas_linter" +"vignettes/rnrfa-vignette.Rmd",279,1,"style","Variable and function name style should be snake_case or symbols.","someStations <- catalogue(bbox)","object_name_linter" +"vignettes/rnrfa-vignette.Rmd",294,1,"style","Variable and function name style should be snake_case or symbols.","someStations$meangdf <- unlist(lapply(s2, mean))","object_name_linter" +"vignettes/rnrfa-vignette.Rmd",301,49,"style","Commas should always have a space after."," xlab(expression(paste(""Catchment area [Km^2]"",sep=""""))) +","commas_linter" +"vignettes/rnrfa-vignette.Rmd",301,52,"style","Put spaces around all infix operators."," xlab(expression(paste(""Catchment area [Km^2]"",sep=""""))) +","infix_spaces_linter" +"vignettes/rnrfa-vignette.Rmd",302,45,"style","Commas should always have a space after."," ylab(expression(paste(""Mean flow [m^3/s]"",sep="""")))","commas_linter" +"vignettes/rnrfa-vignette.Rmd",302,48,"style","Put spaces around all infix operators."," ylab(expression(paste(""Mean flow [m^3/s]"",sep="""")))","infix_spaces_linter" diff --git a/.dev/revdep_emails/rnrfa/email-body b/.dev/revdep_emails/rnrfa/email-body new file mode 100644 index 000000000..52b521078 --- /dev/null +++ b/.dev/revdep_emails/rnrfa/email-body @@ -0,0 +1,27 @@ +Hello Claudia Vitolo! Thank you for using {lintr} in your package {rnrfa}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cvitolo/rnrfa using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 11s on CRAN vs. 8s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/roadoi/email-body b/.dev/revdep_emails/roadoi/email-body new file mode 100644 index 000000000..6f8f47956 --- /dev/null +++ b/.dev/revdep_emails/roadoi/email-body @@ -0,0 +1,27 @@ +Hello Najko Jahn! Thank you for using {lintr} in your package {roadoi}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/ropensci/roadoi using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 3s on CRAN vs. 2s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/scriptexec/attachments/scriptexec.warnings b/.dev/revdep_emails/scriptexec/attachments/scriptexec.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/scriptexec/attachments/scriptexec.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/scriptexec/email-body b/.dev/revdep_emails/scriptexec/email-body new file mode 100644 index 000000000..b12228021 --- /dev/null +++ b/.dev/revdep_emails/scriptexec/email-body @@ -0,0 +1,27 @@ +Hello Sagie Gur-Ari! Thank you for using {lintr} in your package {scriptexec}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/sagiegurari/scriptexec using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 7s on CRAN vs. 4s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/secuTrialR/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/secuTrialR/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..632ca0212 --- /dev/null +++ b/.dev/revdep_emails/secuTrialR/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,17 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/completeness.R",28,1,"style","Variable and function names should not be longer than 30 characters.","form_status_counts.secuTrialdata <- function(object, ...) {","object_length_linter" +"R/completeness.R",105,25,"style","Variable and function name style should be snake_case."," spread_summary0$""partly filled"" <- NA","object_name_linter" +"R/completeness.R",108,25,"style","Variable and function name style should be snake_case."," spread_summary0$""completely filled"" <- NA","object_name_linter" +"R/completeness.R",114,25,"style","Variable and function name style should be snake_case."," spread_summary1$""with errors"" <- NA","object_name_linter" +"R/completeness.R",120,25,"style","Variable and function name style should be snake_case."," spread_summary2$""with warnings"" <- NA","object_name_linter" +"R/completeness.R",170,1,"style","Variable and function names should not be longer than 30 characters.","form_status_summary.secuTrialdata <- function(object, ...) {","object_length_linter" +"R/factorize.R",28,1,"style","Variable and function names should not be longer than 30 characters.","factorize_secuTrial.secuTrialdata <- function(object, ...) {","object_length_linter" +"R/factorize.R",68,1,"style","Variable and function name style should be snake_case.","factorize_secuTrial.data.frame <- function(data, cl, form, items, short_names) {","object_name_linter" +"R/labels_secuTrial.R",151,1,"style","Variable and function name style should be snake_case.","label_secuTrial.data.frame <- function(data, it) {","object_name_linter" +"R/labels_secuTrial.R",181,1,"style","Variable and function name style should be snake_case.","""label<-"" <- function(x, value) {","object_name_linter" +"R/labels_secuTrial.R",190,1,"style","Variable and function name style should be snake_case.","""units<-"" <- function(x, value) {","object_name_linter" +"R/read_export_options.R",33,11,"style","Variable and function name style should be snake_case."," files$Name <- as.character(files$Name)","object_name_linter" +"R/visit_structure.R",64,39,"style","Place a space before left parenthesis, except in a function call."," z_input <- !is.na(as.matrix(ro[, -(1:2)]))","spaces_left_parentheses_linter" +"R/visit_structure.R",82,30,"style","Place a space before left parenthesis, except in a function call."," z <- !is.na(as.matrix(x[, -(1:2)]))","spaces_left_parentheses_linter" +"tests/testthat/test-visit_structure.R",73,23,"style","Place a space before left parenthesis, except in a function call."," cs <- colSums(vs[, -(1:2)], na.rm = TRUE)","spaces_left_parentheses_linter" +"tests/testthat/test-visit_structure.R",75,23,"style","Place a space before left parenthesis, except in a function call."," rs <- rowSums(vs[, -(1:2)], na.rm = TRUE)","spaces_left_parentheses_linter" diff --git a/.dev/revdep_emails/secuTrialR/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/secuTrialR/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..335a9f069 --- /dev/null +++ b/.dev/revdep_emails/secuTrialR/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,41 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/asdataframe.R",56,13,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!meta & is.null(data.frames)) {","vector_logic_linter" +"R/assess_form_variable_completeness.R",74,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (occ_in_vp > 1 & completeness == ""savedforms"") {","vector_logic_linter" +"R/assess_form_variable_completeness.R",84,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (any(""position"" %in% names(form)) & completeness == ""allforms"") {","vector_logic_linter" +"R/build_secuTrial_url.R",74,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (!is.na(projid) & (is.na(customer) | is.na(instance))) {","vector_logic_linter" +"R/build_secuTrial_url.R",74,48,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (!is.na(projid) & (is.na(customer) | is.na(instance))) {","vector_logic_linter" +"R/build_secuTrial_url.R",76,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (!is.na(customer) & is.na(instance)) {","vector_logic_linter" +"R/diff_secuTrial.R",34,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (class(x) == ""secuTrialdata"" & class(y) == ""secuTrialdata"") {","vector_logic_linter" +"R/diff_secuTrial.R",37,39,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (! x$export_options$proj_setup & y$export_options$proj_setup) {","vector_logic_linter" +"R/factorize.R",92,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (""mnpsubdocid"" %in% names(data) & short_names) {","vector_logic_linter" +"R/factorize.R",140,44,"warning","Conditional expressions require scalar logical operators (&& and ||)"," length(which(is.na(data[, name]))) &","vector_logic_linter" +"R/factorize.R",145,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," ! (grepl(""^mnpfs"", name) | grepl(""^at"", form))) {","vector_logic_linter" +"R/internals.R",15,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(language) & any(grep(""lang"", names(dict)))) {","vector_logic_linter" +"R/internals.R",77,3,"style","`else` should come on the same line as the previous `}`."," else if (new_col_idx == ncol(df)) {","brace_linter" +"R/internals.R",95,43,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (! (col_name_after %in% names(df)) & col_name_after != ""first"") {","vector_logic_linter" +"R/internals.R",246,12,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (warn & length(datevars) == 0) {","vector_logic_linter" +"R/internals.R",249,12,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (warn & length(meta_datevars) == 0) {","vector_logic_linter" +"R/internals.R",252,12,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (warn & length(timevars) == 0) {","vector_logic_linter" +"R/internals.R",255,12,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (warn & length(meta_timevars) == 0) {","vector_logic_linter" +"R/plot_recruitment.R",48,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (return_data & (! show_centres)) {","vector_logic_linter" +"R/read_export_options.R",147,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (rectangular_table & short_names) {","vector_logic_linter" +"R/read_export_table.R",82,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (curr_encoding == ""ISO-8859-1"" | curr_encoding == ""ISO-8859-15"") {","vector_logic_linter" +"R/read_export_table.R",119,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (add_pat_id & (""mnppid"" %in% names(loaded_table))) {","vector_logic_linter" +"R/return_random_participants.R",63,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (percent <= 0 | percent >= 1) {","vector_logic_linter" +"R/subset.R",53,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(participant) & !dat$export_options$add_id) {","vector_logic_linter" +"R/subset.R",56,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(centre) & !dat$export_options$centre_info) {","vector_logic_linter" +"R/subset.R",59,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(centre) & is.null(participant)) {","vector_logic_linter" +"R/subset.R",101,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(centre) & ""centre"" %in% names(new_dat[[tab]])) {","vector_logic_linter" +"tests/testthat/test-subset.R",40,46,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (any(names(dat[[tab]]) %in% ""pat_id"") & nrow(dat[[tab]]) > 0) {","vector_logic_linter" +"tests/testthat/test-subset.R",42,53,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (any(names(dat[[tab]]) %in% ""mnpaid"") & nrow(dat[[tab]]) > 0) {","vector_logic_linter" +"tests/testthat/test-subset.R",44,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"vignettes/secuTrialR-package-vignette.Rmd",44,2,"style","Commented code should be removed.","#rm(list = ls()) # removed this at the request of the CRAN submission","commented_code_linter" +"vignettes/secuTrialR-package-vignette.Rmd",419,81,"style","Lines should not be more than 80 characters.","# randomly retrieve at least 25 percent of participants recorded after March 18th 2019","line_length_linter" +"vignettes/secuTrialR-package-vignette.Rmd",485,81,"style","Lines should not be more than 80 characters.","ctu06_v1 <- read_secuTrial(system.file(""extdata"", ""sT_exports"", ""change_tracking"",","line_length_linter" +"vignettes/secuTrialR-package-vignette.Rmd",489,81,"style","Lines should not be more than 80 characters.","ctu06_v2 <- read_secuTrial(system.file(""extdata"", ""sT_exports"", ""change_tracking"",","line_length_linter" +"vignettes/secuTrialR-package-vignette.Rmd",538,81,"style","Lines should not be more than 80 characters.","ctu05_data_berlin <- subset_secuTrial(ctu05_data, centre = centres, exclude = TRUE)","line_length_linter" +"vignettes/secuTrialR-package-vignette.Rmd",570,81,"style","Lines should not be more than 80 characters.","ctu05_data_bern <- subset_secuTrial(ctu05_data, centre = ""Inselspital Bern (RPACK)"")","line_length_linter" +"vignettes/secuTrialR-package-vignette.Rmd",581,81,"style","Lines should not be more than 80 characters."," centre = c(""Inselspital Bern (RPACK)"",","line_length_linter" +"vignettes/secuTrialR-package-vignette.Rmd",724,81,"style","Lines should not be more than 80 characters.","Likely the label was changed from its original state in the secuTrial project setup.","line_length_linter" +"vignettes/secuTrialR-package-vignette.Rmd",761,81,"style","Lines should not be more than 80 characters.","bl_surg <- merge(x = ctu05_data$baseline, y = ctu05_data$esurgeries, by = ""mnpdocid"")","line_length_linter" +"vignettes/secuTrialR-package-vignette.Rmd",816,81,"style","Lines should not be more than 80 characters.","surg_wide <- pivot_wider(surg, names_from = surgery_organ.factor, values_from = count)","line_length_linter" diff --git a/.dev/revdep_emails/secuTrialR/email-body b/.dev/revdep_emails/secuTrialR/email-body new file mode 100644 index 000000000..617fda2c5 --- /dev/null +++ b/.dev/revdep_emails/secuTrialR/email-body @@ -0,0 +1,27 @@ +Hello Alan G. Haynes! Thank you for using {lintr} in your package {secuTrialR}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/SwissClinicalTrialOrganisation/secuTrialR using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 55s on CRAN vs. 34s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/semantic.dashboard/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/semantic.dashboard/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..c987dd1b3 --- /dev/null +++ b/.dev/revdep_emails/semantic.dashboard/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,5 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/box.R",44,3,"warning","local variable β€˜icon_selector’ assigned but may not be used"," icon_selector <- glue::glue(""'#{title_id} > .label > .icon'"")","object_usage_linter" +"R/semantic_dashboard.R",135,20,"style","There should be a space between right parenthesis and an opening curly brace.","#' if(interactive()){","paren_brace_linter" +"R/semantic_dashboard.R",202,20,"style","There should be a space between right parenthesis and an opening curly brace.","#' if(interactive()){","paren_brace_linter" +"R/semantic_dashboard.R",249,20,"style","There should be a space between right parenthesis and an opening curly brace.","#' if(interactive()){","paren_brace_linter" diff --git a/.dev/revdep_emails/semantic.dashboard/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/semantic.dashboard/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..2a77caad3 --- /dev/null +++ b/.dev/revdep_emails/semantic.dashboard/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,8 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/menu_item.R",51,3,"style","`else` should come on the same line as the previous `}`."," else if (is.null(href)) {","brace_linter" +"R/menu_item.R",54,3,"style","`else` should come on the same line as the previous `}`."," else if (newtab) {","brace_linter" +"vignettes/intro.Rmd",52,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/intro.Rmd",73,81,"style","Lines should not be more than 80 characters."," taskItem(""Project progress..."", 50.777, color = ""red"")))","line_length_linter" +"vignettes/intro.Rmd",128,81,"style","Lines should not be more than 80 characters."," taskItem(""Project progress..."", 50.777, color = ""red""))),","line_length_linter" +"vignettes/intro.Rmd",151,44,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","server <- function(input, output, session) {}","brace_linter" +"vignettes/intro.Rmd",151,45,"style","Closing curly-braces should always be on their own line, unless they are followed by an else.","server <- function(input, output, session) {}","brace_linter" diff --git a/.dev/revdep_emails/semantic.dashboard/email-body b/.dev/revdep_emails/semantic.dashboard/email-body new file mode 100644 index 000000000..57455e896 --- /dev/null +++ b/.dev/revdep_emails/semantic.dashboard/email-body @@ -0,0 +1,27 @@ +Hello Developers Appsilon! Thank you for using {lintr} in your package {semantic.dashboard}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/Appsilon/semantic.dashboard using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 14s on CRAN vs. 9s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/shiny.info/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/shiny.info/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..75d413ea2 --- /dev/null +++ b/.dev/revdep_emails/shiny.info/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,3 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/display.R",14,3,"warning","local variable β€˜fixed_layout’ assigned but may not be used"," fixed_layout <- ""fixed""","object_usage_linter" +"R/hide.R",73,3,"warning","local variable β€˜shortcut_condition’ assigned but may not be used"," shortcut_condition <- .shortcut_condition(shortcut)","object_usage_linter" diff --git a/.dev/revdep_emails/shiny.info/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/shiny.info/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..e3bd822ee --- /dev/null +++ b/.dev/revdep_emails/shiny.info/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,3 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/display.R",74,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(company_name) & is.null(logo)) {","vector_logic_linter" +"tests/testthat/test_powered_by.R",10,3,"style","Missing terminal newline.","})","trailing_blank_lines_linter" diff --git a/.dev/revdep_emails/shiny.info/email-body b/.dev/revdep_emails/shiny.info/email-body new file mode 100644 index 000000000..b2e09bc21 --- /dev/null +++ b/.dev/revdep_emails/shiny.info/email-body @@ -0,0 +1,27 @@ +Hello Jakub Nowicki! Thank you for using {lintr} in your package {shiny.info}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/Appsilon/shiny.info using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 6s on CRAN vs. 4s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/shiny.semantic/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/shiny.semantic/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..7a8116241 --- /dev/null +++ b/.dev/revdep_emails/shiny.semantic/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,30 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/button.R",11,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/button.R",42,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/button.R",82,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/button.R",155,3,"warning","local variable β€˜big_mark_regex’ assigned but may not be used"," big_mark_regex <- if (big_mark == "" "") ""\\s"" else big_mark","object_usage_linter" +"R/checkbox.R",17,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/dsl.R",12,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/dsl.R",80,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/dsl.R",153,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/dsl.R",206,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/dsl.R",248,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/dsl.R",280,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/dsl.R",323,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/dsl.R",356,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/dsl.R",391,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/dsl.R",443,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/dsl.R",480,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/dsl.R",528,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/dsl.R",673,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/dsl.R",794,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/grid.R",79,7,"warning","local variable β€˜mustache_id’ assigned but may not be used"," mustache_id <- ""{{ grid_id }}""","object_usage_linter" +"R/grid.R",80,7,"warning","local variable β€˜mustache_css’ assigned but may not be used"," mustache_css <- paste0(""{{ "", name, ""_custom_css }}"")","object_usage_linter" +"R/grid.R",81,7,"warning","local variable β€˜mustache_area’ assigned but may not be used"," mustache_area <- paste(""{{"", name, ""}}"")","object_usage_linter" +"R/grid.R",224,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/layouts.R",45,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/layouts.R",86,3,"warning","local variable β€˜sidebar_width’ assigned but may not be used"," sidebar_width <- sidebar_panel$width","object_usage_linter" +"R/layouts.R",87,3,"warning","local variable β€˜main_width’ assigned but may not be used"," main_width <- main_panel$width","object_usage_linter" +"R/menu.R",65,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/tables.R",9,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/toast.R",163,14,"style","Variable and function name style should be snake_case."," toast_tags$closeIcon <- closeButton","object_name_linter" diff --git a/.dev/revdep_emails/shiny.semantic/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/shiny.semantic/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..178637a22 --- /dev/null +++ b/.dev/revdep_emails/shiny.semantic/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,24 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/grid.R",290,5,"style","Any function spanning multiple lines should use curly braces."," function(color) glue::glue(","brace_linter" +"R/grid.R",310,23,"style","Use TRUE instead of the symbol T."," launch.browser = T","T_and_F_symbol_linter" +"R/menu.R",14,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/menu.R",80,3,"style","Either both or neither branch in `if`/`else` should use curly braces."," else {","brace_linter" +"R/semanticPage.R",154,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"tests/testthat/test_layouts.R",104,53,"style","Use FALSE instead of the symbol F."," v1 <- vertical_layout(p(""a""), adjusted_to_page = F)","T_and_F_symbol_linter" +"vignettes/basics.Rmd",79,12,"style","Put spaces around all infix operators."," a(class=""ui green ribbon label"", ""Link""),","infix_spaces_linter" +"vignettes/basics.Rmd",90,14,"style","Put spaces around all infix operators."," a(class=""ui green ribbon label"", ""Link""),","infix_spaces_linter" +"vignettes/intro.Rmd",31,81,"style","Lines should not be more than 80 characters."," list(header = ""Item 1"", description = ""My text for item 1"", icon = ""cat""),","line_length_linter" +"vignettes/intro.Rmd",32,81,"style","Lines should not be more than 80 characters."," list(header = ""Item 2"", description = ""My text for item 2"", icon = ""tree""),","line_length_linter" +"vignettes/intro.Rmd",33,81,"style","Lines should not be more than 80 characters."," list(header = ""Item 3"", description = ""My text for item 3"", icon = ""dog"")","line_length_linter" +"vignettes/intro.Rmd",51,44,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","server <- function(input, output, session) {}","brace_linter" +"vignettes/intro.Rmd",51,45,"style","Closing curly-braces should always be on their own line, unless they are followed by an else.","server <- function(input, output, session) {}","brace_linter" +"vignettes/intro.Rmd",73,44,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","server <- function(input, output, session) {}","brace_linter" +"vignettes/intro.Rmd",73,45,"style","Closing curly-braces should always be on their own line, unless they are followed by an else.","server <- function(input, output, session) {}","brace_linter" +"vignettes/intro.Rmd",112,44,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","server <- function(input, output, session) {}","brace_linter" +"vignettes/intro.Rmd",112,45,"style","Closing curly-braces should always be on their own line, unless they are followed by an else.","server <- function(input, output, session) {}","brace_linter" +"vignettes/intro.Rmd",127,81,"style","Lines should not be more than 80 characters."," dropdown_input(""mtcars_dropdown"", c(""mpg"", ""cyl"", ""disp"", ""hp""), value = ""mpg""),","line_length_linter" +"vignettes/intro.Rmd",172,81,"style","Lines should not be more than 80 characters."," dropdown_input(""mtcars_dropdown"", c(""mpg"", ""cyl"", ""disp"", ""hp""), value = ""mpg"")","line_length_linter" +"vignettes/intro.Rmd",237,81,"style","Lines should not be more than 80 characters."," dropdown_input(""mtcars_dropdown"", c(""mpg"", ""cyl"", ""disp"", ""hp""), value = ""mpg"")","line_length_linter" +"vignettes/semantic_integration.Rmd",37,12,"style","Put spaces around all infix operators."," a(class=""ui green ribbon label"", ""Plotly demo""),","infix_spaces_linter" +"vignettes/semantic_integration.Rmd",45,13,"warning","no visible binding for global variable β€˜economics’"," plot_ly(economics, x = ~date, color = I(""black"")) %>%","object_usage_linter" +"vignettes/semantic_integration.Rmd",67,12,"style","Put spaces around all infix operators."," a(class=""ui blue ribbon label"", ""Leaflet demo""),","infix_spaces_linter" diff --git a/.dev/revdep_emails/shiny.semantic/email-body b/.dev/revdep_emails/shiny.semantic/email-body new file mode 100644 index 000000000..7d754b3a4 --- /dev/null +++ b/.dev/revdep_emails/shiny.semantic/email-body @@ -0,0 +1,27 @@ +Hello Developers Appsilon! Thank you for using {lintr} in your package {shiny.semantic}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/Appsilon/shiny.semantic using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 65s on CRAN vs. 44s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/smerc/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/smerc/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..a55157e94 --- /dev/null +++ b/.dev/revdep_emails/smerc/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,93 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/arg_check_functions.R",6,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(is.matrix(coords) | is.data.frame(coords))) {","vector_logic_linter" +"R/arg_check_functions.R",195,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (min(pvalue) < 0 | max(pvalue) > 1) {","vector_logic_linter" +"R/arg_check_functions.R",204,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nrow(d) != N | ncol(d) != N) {","vector_logic_linter" +"R/arg_check_functions.R",280,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (min(angle_all) < 0 | max(angle_all) >= 360) {","vector_logic_linter" +"R/arg_check_functions.R",312,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.matrix(w) & !is.data.frame(w)) {","vector_logic_linter" +"R/arg_check_functions.R",315,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nrow(w) != N | ncol(w) != N) {","vector_logic_linter" +"R/arg_check_functions.R",530,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.matrix(w) & !is.data.frame(w)) {","vector_logic_linter" +"R/arg_check_functions.R",533,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nrow(w) != N | ncol(w) != N) {","vector_logic_linter" +"R/arg_check_functions.R",606,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(ein) | is.null(eout)) {","vector_logic_linter" +"R/arg_check_functions.R",630,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(popin) | is.null(popout) | is.null(tpop)) {","vector_logic_linter" +"R/arg_check_functions.R",630,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(popin) | is.null(popout) | is.null(tpop)) {","vector_logic_linter" +"R/arg_check_functions.R",669,16,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (ubd <= 0 | ubd > 1) {","vector_logic_linter" +"R/clusters-smerc_cluster.R",4,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (min(idx) < 1 | max(idx) > length(x$clusters)) {","vector_logic_linter" +"R/color.clusters.R",36,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (class(x) != ""scan"" & class(x) != ""smerc_cluster"") {","vector_logic_linter" +"R/color.clusters.R",39,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (min(idx) < 1 | max(idx) > length(x$clusters)) {","vector_logic_linter" +"R/combine.zones.R",18,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.list(z1) | !is.list(z2)) {","vector_logic_linter" +"R/dist.ellipse.R",61,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (angle < 00 | angle >= 360) {","vector_logic_linter" +"R/dmst.zones.R",102,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(progress) != 1 | !is.logical(progress)) {","vector_logic_linter" +"R/elliptic.nn.R",31,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(ubpop) != 1 | ubpop <= 0 | ubpop > 1) {","vector_logic_linter" +"R/elliptic.nn.R",31,39,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(ubpop) != 1 | ubpop <= 0 | ubpop > 1) {","vector_logic_linter" +"R/elliptic.sim.R",50,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(nsim) != 1 | !is.numeric(nsim) | nsim < 1) {","vector_logic_linter" +"R/elliptic.sim.R",50,45,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(nsim) != 1 | !is.numeric(nsim) | nsim < 1) {","vector_logic_linter" +"R/elliptic.test.R",57,22,"style","Variable and function name style should be snake_case or symbols."," min.cases = 2) {","object_name_linter" +"R/fast.zones.R",41,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(ubpop) != 1 | !is.numeric(ubpop)) {","vector_logic_linter" +"R/fast.zones.R",44,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (ubpop <= 0 | ubpop > 1) {","vector_logic_linter" +"R/fast.zones.R",47,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(simple) != 1 | !is.logical(simple)) {","vector_logic_linter" +"R/flex.sim.R",57,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(nsim) != 1 | !is.numeric(nsim) | nsim < 1) {","vector_logic_linter" +"R/flex.sim.R",57,45,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(nsim) != 1 | !is.numeric(nsim) | nsim < 1) {","vector_logic_linter" +"R/flex.sim.R",63,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(type) != 1 | !is.element(type, c(""poisson"", ""binomial""))) {","vector_logic_linter" +"R/flex.sim.R",67,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(ein) | is.null(eout)) {","vector_logic_linter" +"R/flex.sim.R",78,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(popin) | is.null(popout) | is.null(tpop)) {","vector_logic_linter" +"R/flex.sim.R",78,42,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(popin) | is.null(popout) | is.null(tpop)) {","vector_logic_linter" +"R/knn.R",33,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(longlat) != 1 | !is.logical(longlat)) {","vector_logic_linter" +"R/knn.R",37,13,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (k < 1 | k > n) {","vector_logic_linter" +"R/knn.R",41,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nrow(d) != n | ncol(d) != n) {","vector_logic_linter" +"R/morancr.stat.R",62,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.matrix(w) & !is.data.frame(w)) {","vector_logic_linter" +"R/morancr.stat.R",65,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nrow(w) != N | ncol(w) != N) {","vector_logic_linter" +"R/mst.seq.R",120,16,"warning","Conditional expressions require scalar logical operators (&& and ||)"," while (!stop & i < length(neighbors)) {","vector_logic_linter" +"R/mst.seq.R",133,16,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (i == 1 | nlinks == ""one"") {","vector_logic_linter" +"R/mst.seq.R",164,17,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (early & (stat_cand[max_idx] <= loglikrat[i])) {","vector_logic_linter" +"R/nndist.R",29,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(ubd) != 1 | !is.numeric(ubd) | ubd <= 0) {","vector_logic_linter" +"R/nndist.R",29,43,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(ubd) != 1 | !is.numeric(ubd) | ubd <= 0) {","vector_logic_linter" +"R/noz.R",40,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/optimal_ubpop.R",43,22,"style","Variable and function name style should be snake_case or symbols."," min.cases = 0,","object_name_linter" +"R/optimal_ubpop.R",195,36,"style","Variable and function name style should be snake_case or symbols."," min.cases) {","object_name_linter" +"R/rflex_zones.R",142,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(alpha1) != 1 | alpha1 <= 0) {","vector_logic_linter" +"R/rflex_zones.R",153,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(loop) != 1 | !is.logical(loop)) {","vector_logic_linter" +"R/rflex_zones.R",156,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(pfreq) != 1 | pfreq < 1) {","vector_logic_linter" +"R/rflex_zones.R",159,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(verbose) != 1 | !is.logical(verbose)) {","vector_logic_linter" +"R/rflex.midp.R",43,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.numeric(cases) | !is.numeric(ex)) {","vector_logic_linter" +"R/rflex.midp.R",46,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(type) != 1 |","vector_logic_linter" +"R/rflex.midp.R",50,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (type == ""binomial"" & is.null(pop)) {","vector_logic_linter" +"R/rflex.sim.R",32,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(nsim) != 1 | !is.numeric(nsim) | nsim < 1) {","vector_logic_linter" +"R/rflex.sim.R",32,45,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(nsim) != 1 | !is.numeric(nsim) | nsim < 1) {","vector_logic_linter" +"R/rflex.zones.R",149,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(alpha1) != 1 | alpha1 <= 0) {","vector_logic_linter" +"R/rflex.zones.R",160,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(loop) != 1 | !is.logical(loop)) {","vector_logic_linter" +"R/rflex.zones.R",163,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(pfreq) != 1 | pfreq < 1) {","vector_logic_linter" +"R/rflex.zones.R",166,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(verbose) != 1 | !is.logical(verbose)) {","vector_logic_linter" +"R/scan_stat.R",90,15,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (a > 0 & length(shape) == 1) {","vector_logic_linter" +"R/scan_stat.R",120,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(ein) & is.null(popin)) {","vector_logic_linter" +"R/scan_stat.R",133,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(type) != 1 | !is.element(type, c(""poisson"", ""binomial""))) {","vector_logic_linter" +"R/scan_stat.R",136,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(a) != 1 | a < 0 | a > 1) {","vector_logic_linter" +"R/scan_stat.R",136,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(a) != 1 | a < 0 | a > 1) {","vector_logic_linter" +"R/scan_stat.R",139,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(shape) != 1 & length(shape) != length(yin)) {","vector_logic_linter" +"R/scan_stat.R",142,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (type == ""binomial"" & is.null(tpop)) {","vector_logic_linter" +"R/scan.sim.R",121,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (simdist == ""binomial"" & is.null(pop)) {","vector_logic_linter" +"R/scan.stat.R",140,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(ein) & is.null(popin)) {","vector_logic_linter" +"R/scan.stat.R",153,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(type) != 1 | !is.element(type, c(""poisson"", ""binomial""))) {","vector_logic_linter" +"R/scan.stat.R",156,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(a) != 1 | a < 0 | a > 1) {","vector_logic_linter" +"R/scan.stat.R",156,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(a) != 1 | a < 0 | a > 1) {","vector_logic_linter" +"R/scan.stat.R",159,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(shape) != 1 & length(shape) != length(yin)) {","vector_logic_linter" +"R/scan.stat.R",162,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (type == ""binomial"" & is.null(tpop)) {","vector_logic_linter" +"R/scan.test.R",96,22,"style","Variable and function name style should be snake_case or symbols."," min.cases = 2,","object_name_linter" +"R/scan.test.R",215,28,"style","Variable and function name style should be snake_case or symbols."," simdist = NULL, min.cases = NULL) {","object_name_linter" +"R/seq_scan_sim.R",25,21,"style","Variable and function name style should be snake_case or symbols."," min.cases = 0,","object_name_linter" +"R/seq_scan_sim.R",132,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (simdist == ""binomial"" & is.null(pop)) {","vector_logic_linter" +"R/seq_scan_test.R",21,22,"style","Variable and function name style should be snake_case or symbols."," min.cases = 0,","object_name_linter" +"R/seq_scan_test.R",140,36,"style","Variable and function name style should be snake_case or symbols."," min.cases) {","object_name_linter" +"R/smerc_cluster-plot.R",53,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (min(idx) < 1 | max(idx) > length(x$clusters)) {","vector_logic_linter" +"R/smerc_cluster-print.R",19,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(extra) != 1 | !is.logical(extra)) {","vector_logic_linter" +"R/smerc_cluster-summary.R",37,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (min(idx) < 1 | max(idx) > length(object$clusters)) {","vector_logic_linter" +"R/tango.weights.R",83,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (type == ""rogerson"" & is.null(pop)) {","vector_logic_linter" +"vignettes/smerc_demo.Rmd",43,8,"style","Use <-, not =, for assignment.","coords = nydf[,c(""x"", ""y"")] # extract coordinates","assignment_linter" +"vignettes/smerc_demo.Rmd",43,16,"style","Commas should always have a space after.","coords = nydf[,c(""x"", ""y"")] # extract coordinates","commas_linter" +"vignettes/smerc_demo.Rmd",44,7,"style","Use <-, not =, for assignment.","cases = nydf$cases # extract cases","assignment_linter" +"vignettes/smerc_demo.Rmd",45,5,"style","Use <-, not =, for assignment.","pop = nydf$population # extract population","assignment_linter" +"vignettes/smerc_demo.Rmd",46,10,"style","Use <-, not =, for assignment.","scan_out = scan.test(coords, cases, pop, nsim = 99) # perform scan test","assignment_linter" +"vignettes/smerc_demo.Rmd",106,8,"style","Use <-, not =, for assignment.","bn_out = bn.test(coords = coords, cases = cases, pop = pop, cstar = 20,","assignment_linter" +"vignettes/smerc_demo.Rmd",117,10,"style","Use <-, not =, for assignment.","cepp_out = cepp.test(coords = coords, cases = cases, pop = pop,","assignment_linter" +"vignettes/smerc_demo.Rmd",129,3,"style","Use <-, not =, for assignment.","w = dweights(coords, kappa = 1) # construct weights matrix","assignment_linter" +"vignettes/smerc_demo.Rmd",130,11,"style","Use <-, not =, for assignment.","tango_out = tango.test(cases, pop, w, nsim = 49) # perform tango's test","assignment_linter" +"vignettes/smerc_demo.Rmd",143,8,"style","Use <-, not =, for assignment.","ezones = elliptic.zones(coords, pop, ubpop = 0.1)","assignment_linter" diff --git a/.dev/revdep_emails/smerc/email-body b/.dev/revdep_emails/smerc/email-body new file mode 100644 index 000000000..5c65ed869 --- /dev/null +++ b/.dev/revdep_emails/smerc/email-body @@ -0,0 +1,27 @@ +Hello Joshua French! Thank you for using {lintr} in your package {smerc}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/jfrench/smerc using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 105s on CRAN vs. 67s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/stencilaschema/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/stencilaschema/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..4fdc22035 --- /dev/null +++ b/.dev/revdep_emails/stencilaschema/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,3 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/typing.R",196,3,"style","`else` should come on the same line as the previous `}`."," else if (is_class(type, ""Array"")) {","brace_linter" +"R/typing.R",205,5,"style","`else` should come on the same line as the previous `}`."," else if (","brace_linter" diff --git a/.dev/revdep_emails/stencilaschema/attachments/stencilaschema.warnings b/.dev/revdep_emails/stencilaschema/attachments/stencilaschema.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/stencilaschema/attachments/stencilaschema.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/stencilaschema/email-body b/.dev/revdep_emails/stencilaschema/email-body new file mode 100644 index 000000000..1ccd1c303 --- /dev/null +++ b/.dev/revdep_emails/stencilaschema/email-body @@ -0,0 +1,27 @@ +Hello Nokome Bentley! Thank you for using {lintr} in your package {stencilaschema}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/stencila/schema using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 3s on CRAN vs. 2s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/supernova/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/supernova/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..0faf4ad8c --- /dev/null +++ b/.dev/revdep_emails/supernova/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,4 @@ +"filename","line_number","column_number","type","message","line","linter" +"data-raw/class_data.R",18,3,"warning","local variable β€˜number_of_teachers’ assigned but may not be used"," number_of_teachers <- 3","object_usage_linter" +"R/equation.R",9,3,"warning","local variable β€˜format_term’ assigned but may not be used"," format_term <- function(value, name, digits) {","object_usage_linter" +"R/supernova.R",436,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," bar_col <- if (!is_lmer_model & is_verbose) ""description"" else ""term""","vector_logic_linter" diff --git a/.dev/revdep_emails/supernova/attachments/supernova.warnings b/.dev/revdep_emails/supernova/attachments/supernova.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/supernova/attachments/supernova.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/supernova/email-body b/.dev/revdep_emails/supernova/email-body new file mode 100644 index 000000000..60621a90c --- /dev/null +++ b/.dev/revdep_emails/supernova/email-body @@ -0,0 +1,27 @@ +Hello Adam Blake! Thank you for using {lintr} in your package {supernova}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/UCLATALL/supernova using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 29s on CRAN vs. 16s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/tsviz/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/tsviz/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..7c641185a --- /dev/null +++ b/.dev/revdep_emails/tsviz/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,2 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/tsviz.R",12,20,"style","There should be a space between right parenthesis and an opening curly brace.","#' if(interactive()){","paren_brace_linter" diff --git a/.dev/revdep_emails/tsviz/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/tsviz/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..a4bc7c8e8 --- /dev/null +++ b/.dev/revdep_emails/tsviz/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,2 @@ +"filename","line_number","column_number","type","message","line","linter" +"data-raw/rhub_check.R",3,3,"style","Commented code should be removed.","# validate_email()","commented_code_linter" diff --git a/.dev/revdep_emails/tsviz/attachments/tsviz.warnings b/.dev/revdep_emails/tsviz/attachments/tsviz.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/tsviz/attachments/tsviz.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/tsviz/email-body b/.dev/revdep_emails/tsviz/email-body new file mode 100644 index 000000000..556167403 --- /dev/null +++ b/.dev/revdep_emails/tsviz/email-body @@ -0,0 +1,27 @@ +Hello Emanuele Fabbiani! Thank you for using {lintr} in your package {tsviz}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/donlelef/tsviz using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 3s on CRAN vs. 2s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/tuber/attachments/tuber.failure b/.dev/revdep_emails/tuber/attachments/tuber.failure new file mode 100644 index 000000000..08edf6748 --- /dev/null +++ b/.dev/revdep_emails/tuber/attachments/tuber.failure @@ -0,0 +1 @@ +`defaults` must be a named list. diff --git a/.dev/revdep_emails/tuber/attachments/tuber.warnings b/.dev/revdep_emails/tuber/attachments/tuber.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/tuber/attachments/tuber.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/tuber/email-body b/.dev/revdep_emails/tuber/email-body new file mode 100644 index 000000000..2bdcb9e90 --- /dev/null +++ b/.dev/revdep_emails/tuber/email-body @@ -0,0 +1,27 @@ +Hello Gaurav Sood! Thank you for using {lintr} in your package {tuber}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at http://github.com/soodoku/tuber using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 3s on CRAN vs. 0s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/unifir/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/unifir/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..c3a23e34e --- /dev/null +++ b/.dev/revdep_emails/unifir/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,5 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/associate_coordinates.R",52,33,"style","Place a space before left parenthesis, except in a function call."," stopifnot(side_length %in% (2^(5:12) + 1))","spaces_left_parentheses_linter" +"R/associate_coordinates.R",68,10,"style","Variable and function name style should be snake_case."," coords$X <- (side_length *","object_name_linter" +"R/associate_coordinates.R",71,10,"style","Variable and function name style should be snake_case."," coords$Y <- bounds[[4]] - coords$Y","object_name_linter" +"tests/testthat/test-find_unity.R",68,5,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" diff --git a/.dev/revdep_emails/unifir/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/unifir/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..69b35ea5c --- /dev/null +++ b/.dev/revdep_emails/unifir/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,8 @@ +"filename","line_number","column_number","type","message","line","linter" +"vignettes/unifir-asset-guide.Rmd",108,63,"style","Trailing whitespace is superfluous."," prefab_path = file.path(""Assets"", ","trailing_whitespace_linter" +"vignettes/unifir-dev-guide.Rmd",127,41,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," build = function(script, prop, debug) {},","brace_linter" +"vignettes/unifir-user-guide.Rmd",232,45,"style","Trailing whitespace is superfluous."," terrainr::transform_elevation(raster_file, ","trailing_whitespace_linter" +"vignettes/unifir-user-guide.Rmd",247,59,"style","Trailing whitespace is superfluous."," # Where should the ""top-left"" corner of the terrain sit? ","trailing_whitespace_linter" +"vignettes/unifir-user-guide.Rmd",248,62,"style","Trailing whitespace is superfluous."," # Note that Unity uses a left-handed Y-up coordinate system ","trailing_whitespace_linter" +"vignettes/unifir-user-guide.Rmd",256,81,"style","Lines should not be more than 80 characters."," height = as.numeric(terra::global(r, max)), # Max height of the terrain (Y axis)","line_length_linter" +"vignettes/unifir-user-guide.Rmd",258,38,"style","Trailing whitespace is superfluous."," heightmap_resolution = terrain_size ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/unifir/email-body b/.dev/revdep_emails/unifir/email-body new file mode 100644 index 000000000..5127a3e71 --- /dev/null +++ b/.dev/revdep_emails/unifir/email-body @@ -0,0 +1,27 @@ +Hello Michael Mahoney! Thank you for using {lintr} in your package {unifir}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/ropensci/unifir using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 23s on CRAN vs. 15s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/virustotal/email-body b/.dev/revdep_emails/virustotal/email-body new file mode 100644 index 000000000..9f3c4ed44 --- /dev/null +++ b/.dev/revdep_emails/virustotal/email-body @@ -0,0 +1,27 @@ +Hello Gaurav Sood! Thank you for using {lintr} in your package {virustotal}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/themains/virustotal using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 0s on CRAN vs. 0s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/wavefunction/email-body b/.dev/revdep_emails/wavefunction/email-body new file mode 100644 index 000000000..a4f90ad7d --- /dev/null +++ b/.dev/revdep_emails/wavefunction/email-body @@ -0,0 +1,27 @@ +Hello Madeleine B. Thompson! Thank you for using {lintr} in your package {wavefunction}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cran/wavefunction using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took NAs on CRAN vs. NAs in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/xgboost/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/xgboost/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..f4e629123 --- /dev/null +++ b/.dev/revdep_emails/xgboost/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,29 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/callbacks.R",753,1,"style","Variable and function name style should be snake_case.","format.eval.string <- function(iter, eval_res, eval_err = NULL) {","object_name_linter" +"R/xgb.Booster.R",471,1,"style","Variable and function name style should be snake_case.","predict.xgb.Booster.handle <- function(object, ...) {","object_name_linter" +"R/xgb.cv.R",278,1,"style","Variable and function name style should be snake_case.","print.xgb.cv.synchronous <- function(x, verbose = FALSE, ...) {","object_name_linter" +"R/xgb.DMatrix.R",117,1,"style","Variable and function name style should be snake_case.","dim.xgb.DMatrix <- function(x) {","object_name_linter" +"R/xgb.DMatrix.R",146,1,"style","Variable and function name style should be snake_case.","dimnames.xgb.DMatrix <- function(x) {","object_name_linter" +"R/xgb.DMatrix.R",152,1,"style","Variable and function name style should be snake_case.","`dimnames<-.xgb.DMatrix` <- function(x, value) {","object_name_linter" +"R/xgb.DMatrix.R",204,1,"style","Variable and function name style should be snake_case.","getinfo.xgb.DMatrix <- function(object, name, ...) {","object_name_linter" +"R/xgb.DMatrix.R",329,1,"style","Variable and function name style should be snake_case.","slice.xgb.DMatrix <- function(object, idxset, ...) {","object_name_linter" +"R/xgb.DMatrix.R",355,1,"style","Variable and function name style should be snake_case.","`[.xgb.DMatrix` <- function(object, idxset, colset = NULL) {","object_name_linter" +"R/xgb.DMatrix.R",378,1,"style","Variable and function name style should be snake_case.","print.xgb.DMatrix <- function(x, verbose = FALSE, ...) {","object_name_linter" +"R/xgb.ggplot.R",21,23,"style","Variable and function name style should be snake_case."," importance_matrix[, Cluster := as.character(clusters$cluster)]","object_name_linter" +"R/xgb.model.dt.tree.R",101,16,"style","Variable and function name style should be snake_case."," td[position, Tree := 1L]","object_name_linter" +"R/xgb.model.dt.tree.R",102,8,"style","Variable and function name style should be snake_case."," td[, Tree := cumsum(ifelse(is.na(Tree), 0L, Tree)) - 1L]","object_name_linter" +"R/xgb.model.dt.tree.R",111,8,"style","Variable and function name style should be snake_case."," td[, Node := as.integer(sub(""^([0-9]+):.*"", ""\\1"", t))]","object_name_linter" +"R/xgb.model.dt.tree.R",112,25,"style","Variable and function name style should be snake_case."," if (!use_int_id) td[, ID := add.tree.id(Node, Tree)]","object_name_linter" +"R/xgb.model.dt.tree.R",113,8,"style","Variable and function name style should be snake_case."," td[, isLeaf := grepl(""leaf"", t, fixed = TRUE)]","object_name_linter" +"R/xgb.model.dt.tree.R",143,25,"style","Variable and function name style should be snake_case."," td[isLeaf == FALSE, Feature := feature_names[as.numeric(Feature) + 1]]","object_name_linter" +"R/xgb.model.dt.tree.R",171,8,"style","Variable and function name style should be snake_case."," td[, isLeaf := NULL]","object_name_linter" +"R/xgb.plot.deepness.R",130,25,"style","Variable and function name style should be snake_case."," dt_edges[is.na(Leaf), Leaf := FALSE]","object_name_linter" +"R/xgb.plot.importance.R",95,25,"style","Variable and function name style should be snake_case."," importance_matrix[, Importance := Importance / max(abs(Importance))]","object_name_linter" +"R/xgb.plot.multi.trees.R",71,35,"style","Variable and function name style should be snake_case."," tree.matrix[ID %in% root.nodes, abs.node.position := root.nodes]","object_name_linter" +"R/xgb.plot.multi.trees.R",86,28,"style","Variable and function name style should be snake_case."," tree.matrix[!is.na(Yes), Yes := paste0(abs.node.position, ""_0"")]","object_name_linter" +"R/xgb.plot.multi.trees.R",87,27,"style","Variable and function name style should be snake_case."," tree.matrix[!is.na(No), No := paste0(abs.node.position, ""_1"")]","object_name_linter" +"R/xgb.plot.multi.trees.R",116,14,"style","Variable and function name style should be snake_case."," edges.dt[, N := NULL]","object_name_linter" +"tests/testthat/test_callbacks.R",262,11,"style","Variable and function name style should be snake_case."," titanic$Pclass <- as.factor(titanic$Pclass)","object_name_linter" +"tests/testthat/test_helpers.R",17,6,"style","Variable and function name style should be snake_case.","df[, AgeDiscret := as.factor(round(Age / 10, 0))]","object_name_linter" +"tests/testthat/test_helpers.R",18,6,"style","Variable and function name style should be snake_case.","df[, AgeCat := as.factor(ifelse(Age > 30, ""Old"", ""Young""))]","object_name_linter" +"tests/testthat/test_helpers.R",19,6,"style","Variable and function name style should be snake_case.","df[, ID := NULL]","object_name_linter" diff --git a/.dev/revdep_emails/xgboost/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/xgboost/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..d660a746d --- /dev/null +++ b/.dev/revdep_emails/xgboost/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,367 @@ +"filename","line_number","column_number","type","message","line","linter" +"demo/basic_walkthrough.R",6,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" +"demo/basic_walkthrough.R",7,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" +"demo/basic_walkthrough.R",10,81,"style","Lines should not be more than 80 characters.","# the loaded data is stored in sparseMatrix, and label is a numeric vector in {0,1}","line_length_linter" +"demo/basic_walkthrough.R",16,81,"style","Lines should not be more than 80 characters.","# note: we are putting in sparse matrix here, xgboost naturally handles sparse input","line_length_linter" +"demo/basic_walkthrough.R",17,81,"style","Lines should not be more than 80 characters.","# use sparse matrix when your feature is sparse(e.g. when you are using one-hot encoding vector)","line_length_linter" +"demo/basic_walkthrough.R",19,81,"style","Lines should not be more than 80 characters.","bst <- xgboost(data = train$data, label = train$label, max_depth = 2, eta = 1, nrounds = 2,","line_length_linter" +"demo/basic_walkthrough.R",23,81,"style","Lines should not be more than 80 characters.","bst <- xgboost(data = as.matrix(train$data), label = train$label, max_depth = 2, eta = 1, nrounds = 2,","line_length_linter" +"demo/basic_walkthrough.R",26,81,"style","Lines should not be more than 80 characters.","# you can also put in xgb.DMatrix object, which stores label, data and other meta datas needed for advanced features","line_length_linter" +"demo/basic_walkthrough.R",44,81,"style","Lines should not be more than 80 characters.","# since we do not have this file with us, the following line is just for illustration","line_length_linter" +"demo/basic_walkthrough.R",45,3,"style","Commented code should be removed.","# bst <- xgboost(data = 'agaricus.train.svm', max_depth = 2, eta = 1, nrounds = 2,objective = ""binary:logistic"")","commented_code_linter" +"demo/basic_walkthrough.R",45,81,"style","Lines should not be more than 80 characters.","# bst <- xgboost(data = 'agaricus.train.svm', max_depth = 2, eta = 1, nrounds = 2,objective = ""binary:logistic"")","line_length_linter" +"demo/basic_walkthrough.R",81,81,"style","Lines should not be more than 80 characters.","bst <- xgb.train(data = dtrain, max_depth = 2, eta = 1, nrounds = 2, watchlist = watchlist,","line_length_linter" +"demo/basic_walkthrough.R",85,81,"style","Lines should not be more than 80 characters.","bst <- xgb.train(data = dtrain, max_depth = 2, eta = 1, nrounds = 2, watchlist = watchlist,","line_length_linter" +"demo/basic_walkthrough.R",93,81,"style","Lines should not be more than 80 characters.","bst <- xgb.train(data = dtrain2, max_depth = 2, eta = 1, nrounds = 2, watchlist = watchlist,","line_length_linter" +"demo/basic_walkthrough.R",102,35,"style","Only use double-quotes.","dump_path <- file.path(tempdir(), 'dump.raw.txt')","single_quotes_linter" +"demo/boost_from_prediction.R",3,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" +"demo/boost_from_prediction.R",4,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" +"demo/boost_from_prediction.R",12,7,"style","Only use double-quotes.","print('start running example to start from a initial prediction')","single_quotes_linter" +"demo/boost_from_prediction.R",14,64,"style","Only use double-quotes.","param <- list(max_depth = 2, eta = 1, nthread = 2, objective = 'binary:logistic')","single_quotes_linter" +"demo/boost_from_prediction.R",14,81,"style","Lines should not be more than 80 characters.","param <- list(max_depth = 2, eta = 1, nthread = 2, objective = 'binary:logistic')","line_length_linter" +"demo/boost_from_prediction.R",16,81,"style","Lines should not be more than 80 characters.","# Note: we need the margin value instead of transformed prediction in set_base_margin","line_length_linter" +"demo/boost_from_prediction.R",17,81,"style","Lines should not be more than 80 characters.","# do predict with output_margin=TRUE, will always give you margin values before logistic transformation","line_length_linter" +"demo/boost_from_prediction.R",25,7,"style","Only use double-quotes.","print('this is result of boost from initial prediction')","single_quotes_linter" +"demo/boost_from_prediction.R",26,81,"style","Lines should not be more than 80 characters.","bst <- xgb.train(params = param, data = dtrain, nrounds = 1, watchlist = watchlist)","line_length_linter" +"demo/caret_wrapper.R",11,81,"style","Lines should not be more than 80 characters.","# Create a copy of the dataset with data.table package (data.table is 100% compliant with R dataframe but its syntax is a lot more consistent and its performance are really good).","line_length_linter" +"demo/caret_wrapper.R",14,81,"style","Lines should not be more than 80 characters.","# Let's add some new categorical features to see if it helps. Of course these feature are highly correlated to the Age feature. Usually it's not a good thing in ML, but Tree algorithms (including boosted trees) are able to select the best features, even in case of highly correlated features.","line_length_linter" +"demo/caret_wrapper.R",15,81,"style","Lines should not be more than 80 characters.","# For the first feature we create groups of age by rounding the real age. Note that we transform it to factor (categorical data) so the algorithm treat them as independant values.","line_length_linter" +"demo/caret_wrapper.R",18,81,"style","Lines should not be more than 80 characters.","# Here is an even stronger simplification of the real age with an arbitrary split at 30 years old. I choose this value based on nothing. We will see later if simplifying the information based on arbitrary values is a good strategy (I am sure you already have an idea of how well it will work!).","line_length_linter" +"demo/caret_wrapper.R",21,81,"style","Lines should not be more than 80 characters.","# We remove ID as there is nothing to learn from this feature (it will just add some noise as the dataset is small).","line_length_linter" +"demo/caret_wrapper.R",26,81,"style","Lines should not be more than 80 characters.","# Here we use 10-fold cross-validation, repeating twice, and using random search for tuning hyper-parameters.","line_length_linter" +"demo/caret_wrapper.R",27,1,"style","Variable and function name style should be snake_case or symbols.","fitControl <- trainControl(method = ""repeatedcv"", number = 10, repeats = 2, search = ""random"")","object_name_linter" +"demo/caret_wrapper.R",27,81,"style","Lines should not be more than 80 characters.","fitControl <- trainControl(method = ""repeatedcv"", number = 10, repeats = 2, search = ""random"")","line_length_linter" +"demo/caret_wrapper.R",29,32,"style","Put spaces around all infix operators.","model <- train(factor(Improved)~., data = df, method = ""xgbTree"", trControl = fitControl)","infix_spaces_linter" +"demo/caret_wrapper.R",29,81,"style","Lines should not be more than 80 characters.","model <- train(factor(Improved)~., data = df, method = ""xgbTree"", trControl = fitControl)","line_length_linter" +"demo/caret_wrapper.R",31,81,"style","Lines should not be more than 80 characters.","# Instead of tree for our boosters, you can also fit a linear regression or logistic regression model using xgbLinear","line_length_linter" +"demo/caret_wrapper.R",32,3,"style","Commented code should be removed.","# model <- train(factor(Improved)~., data = df, method = ""xgbLinear"", trControl = fitControl)","commented_code_linter" +"demo/caret_wrapper.R",32,81,"style","Lines should not be more than 80 characters.","# model <- train(factor(Improved)~., data = df, method = ""xgbLinear"", trControl = fitControl)","line_length_linter" +"demo/create_sparse_matrix.R",5,20,"style","Only use double-quotes."," install.packages('vcd') #Available in CRAN. Used for its dataset with categorical values.","single_quotes_linter" +"demo/create_sparse_matrix.R",5,81,"style","Lines should not be more than 80 characters."," install.packages('vcd') #Available in CRAN. Used for its dataset with categorical values.","line_length_linter" +"demo/create_sparse_matrix.R",10,81,"style","Lines should not be more than 80 characters.","# A categorical variable is one which have a fixed number of values. By example, if for each observation a variable called ""Colour"" can have only ""red"", ""blue"" or ""green"" as value, it is a categorical variable.","line_length_linter" +"demo/create_sparse_matrix.R",15,81,"style","Lines should not be more than 80 characters.","# In this demo we will see how to transform a dense dataframe with categorical variables to a sparse matrix before analyzing it in XGBoost.","line_length_linter" +"demo/create_sparse_matrix.R",21,81,"style","Lines should not be more than 80 characters.","# create a copy of the dataset with data.table package (data.table is 100% compliant with R dataframe but its syntax is a lot more consistent and its performance are really good).","line_length_linter" +"demo/create_sparse_matrix.R",28,81,"style","Lines should not be more than 80 characters.","# 2 columns have factor type, one has ordinal type (ordinal variable is a categorical variable with values which can be ordered, here: None > Some > Marked).","line_length_linter" +"demo/create_sparse_matrix.R",32,81,"style","Lines should not be more than 80 characters.","# Let's add some new categorical features to see if it helps. Of course these feature are highly correlated to the Age feature. Usually it's not a good thing in ML, but Tree algorithms (including boosted trees) are able to select the best features, even in case of highly correlated features.","line_length_linter" +"demo/create_sparse_matrix.R",34,81,"style","Lines should not be more than 80 characters.","# For the first feature we create groups of age by rounding the real age. Note that we transform it to factor (categorical data) so the algorithm treat them as independent values.","line_length_linter" +"demo/create_sparse_matrix.R",37,81,"style","Lines should not be more than 80 characters.","# Here is an even stronger simplification of the real age with an arbitrary split at 30 years old. I choose this value based on nothing. We will see later if simplifying the information based on arbitrary values is a good strategy (I am sure you already have an idea of how well it will work!).","line_length_linter" +"demo/create_sparse_matrix.R",40,81,"style","Lines should not be more than 80 characters.","# We remove ID as there is nothing to learn from this feature (it will just add some noise as the dataset is small).","line_length_linter" +"demo/create_sparse_matrix.R",49,81,"style","Lines should not be more than 80 characters.","# The purpose is to transform each value of each categorical feature in one binary feature.","line_length_linter" +"demo/create_sparse_matrix.R",51,81,"style","Lines should not be more than 80 characters.","# Let's take, the column Treatment will be replaced by two columns, Placebo, and Treated. Each of them will be binary. For example an observation which had the value Placebo in column Treatment before the transformation will have, after the transformation, the value 1 in the new column Placebo and the value 0 in the new column Treated.","line_length_linter" +"demo/create_sparse_matrix.R",53,81,"style","Lines should not be more than 80 characters.","# Formulae Improved~.-1 used below means transform all categorical features but column Improved to binary values.","line_length_linter" +"demo/create_sparse_matrix.R",54,81,"style","Lines should not be more than 80 characters.","# Column Improved is excluded because it will be our output column, the one we want to predict.","line_length_linter" +"demo/create_sparse_matrix.R",69,81,"style","Lines should not be more than 80 characters."," eta = 1, nthread = 2, nrounds = 10, objective = ""binary:logistic"")","line_length_linter" +"demo/create_sparse_matrix.R",71,81,"style","Lines should not be more than 80 characters.","importance <- xgb.importance(feature_names = colnames(sparse_matrix), model = bst)","line_length_linter" +"demo/create_sparse_matrix.R",73,81,"style","Lines should not be more than 80 characters.","# According to the matrix below, the most important feature in this dataset to predict if the treatment will work is the Age. The second most important feature is having received a placebo or not. The sex is third. Then we see our generated features (AgeDiscret). We can see that their contribution is very low (Gain column).","line_length_linter" +"demo/create_sparse_matrix.R",85,81,"style","Lines should not be more than 80 characters.","# The perfectly random split I did between young and old at 30 years old have a low correlation of 2. It's a result we may expect as may be in my mind > 30 years is being old (I am 32 and starting feeling old, this may explain that), but for the illness we are studying, the age to be vulnerable is not the same. Don't let your ""gut"" lower the quality of your model. In ""data science"", there is science :-)","line_length_linter" +"demo/create_sparse_matrix.R",87,81,"style","Lines should not be more than 80 characters.","# As you can see, in general destroying information by simplifying it won't improve your model. Chi2 just demonstrates that. But in more complex cases, creating a new feature based on existing one which makes link with the outcome more obvious may help the algorithm and improve the model. The case studied here is not enough complex to show that. Check Kaggle forum for some challenging datasets.","line_length_linter" +"demo/create_sparse_matrix.R",89,81,"style","Lines should not be more than 80 characters.","# Moreover, you can notice that even if we have added some not useful new features highly correlated with other features, the boosting tree algorithm have been able to choose the best one, which in this case is the Age. Linear model may not be that strong in these scenario.","line_length_linter" +"demo/cross_validation.R",3,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" +"demo/cross_validation.R",4,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" +"demo/cross_validation.R",9,64,"style","Only use double-quotes.","param <- list(max_depth = 2, eta = 1, nthread = 2, objective = 'binary:logistic')","single_quotes_linter" +"demo/cross_validation.R",9,81,"style","Lines should not be more than 80 characters.","param <- list(max_depth = 2, eta = 1, nthread = 2, objective = 'binary:logistic')","line_length_linter" +"demo/cross_validation.R",11,5,"style","Only use double-quotes.","cat('running cross validation\n')","single_quotes_linter" +"demo/cross_validation.R",15,53,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","xgb.cv(param, dtrain, nrounds, nfold = 5, metrics = {'error'})","brace_linter" +"demo/cross_validation.R",15,54,"style","Only use double-quotes.","xgb.cv(param, dtrain, nrounds, nfold = 5, metrics = {'error'})","single_quotes_linter" +"demo/cross_validation.R",17,5,"style","Only use double-quotes.","cat('running cross validation, disable standard deviation display\n')","single_quotes_linter" +"demo/cross_validation.R",22,18,"style","Only use double-quotes."," metrics = 'error', showsd = FALSE)","single_quotes_linter" +"demo/cross_validation.R",28,6,"style","Remove spaces before the left parenthesis in a function call.","print ('running cross validation, with customized loss function')","function_left_parentheses_linter" +"demo/cross_validation.R",28,8,"style","Only use double-quotes.","print ('running cross validation, with customized loss function')","single_quotes_linter" +"demo/cross_validation.R",49,81,"style","Lines should not be more than 80 characters.","res <- xgb.cv(params = param, data = dtrain, nrounds = nrounds, nfold = 5, prediction = TRUE)","line_length_linter" +"demo/custom_objective.R",3,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" +"demo/custom_objective.R",4,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" +"demo/custom_objective.R",14,81,"style","Lines should not be more than 80 characters.","# user define objective function, given prediction, return gradient and second order gradient","line_length_linter" +"demo/custom_objective.R",25,81,"style","Lines should not be more than 80 characters.","# NOTE: when you do customized loss function, the default prediction value is margin","line_length_linter" +"demo/custom_objective.R",27,81,"style","Lines should not be more than 80 characters.","# for example, we are doing logistic loss, the prediction is score before logistic transformation","line_length_linter" +"demo/custom_objective.R",29,81,"style","Lines should not be more than 80 characters.","# Take this in mind when you use the customization, and maybe you need write customized evaluation function","line_length_linter" +"demo/custom_objective.R",38,6,"style","Remove spaces before the left parenthesis in a function call.","print ('start training with user customized objective')","function_left_parentheses_linter" +"demo/custom_objective.R",38,8,"style","Only use double-quotes.","print ('start training with user customized objective')","single_quotes_linter" +"demo/custom_objective.R",48,81,"style","Lines should not be more than 80 characters.","# set label attribute of dtrain to be label, we use label as an example, it can be anything","line_length_linter" +"demo/custom_objective.R",49,14,"style","Only use double-quotes.","attr(dtrain, 'label') <- getinfo(dtrain, 'label')","single_quotes_linter" +"demo/custom_objective.R",49,42,"style","Only use double-quotes.","attr(dtrain, 'label') <- getinfo(dtrain, 'label')","single_quotes_linter" +"demo/custom_objective.R",54,26,"style","Only use double-quotes."," labels <- attr(dtrain, 'label')","single_quotes_linter" +"demo/custom_objective.R",62,6,"style","Remove spaces before the left parenthesis in a function call.","print ('start training with user customized objective, with additional attributes in DMatrix')","function_left_parentheses_linter" +"demo/custom_objective.R",62,8,"style","Only use double-quotes.","print ('start training with user customized objective, with additional attributes in DMatrix')","single_quotes_linter" +"demo/custom_objective.R",62,81,"style","Lines should not be more than 80 characters.","print ('start training with user customized objective, with additional attributes in DMatrix')","line_length_linter" +"demo/early_stopping.R",3,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" +"demo/early_stopping.R",4,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" +"demo/early_stopping.R",13,81,"style","Lines should not be more than 80 characters.","# user define objective function, given prediction, return gradient and second order gradient","line_length_linter" +"demo/early_stopping.R",23,81,"style","Lines should not be more than 80 characters.","# NOTE: when you do customized loss function, the default prediction value is margin","line_length_linter" +"demo/early_stopping.R",25,81,"style","Lines should not be more than 80 characters.","# for example, we are doing logistic loss, the prediction is score before logistic transformation","line_length_linter" +"demo/early_stopping.R",27,81,"style","Lines should not be more than 80 characters.","# Take this in mind when you use the customization, and maybe you need write customized evaluation function","line_length_linter" +"demo/early_stopping.R",33,6,"style","Remove spaces before the left parenthesis in a function call.","print ('start training with early Stopping setting')","function_left_parentheses_linter" +"demo/early_stopping.R",33,8,"style","Only use double-quotes.","print ('start training with early Stopping setting')","single_quotes_linter" +"demo/early_stopping.R",36,81,"style","Lines should not be more than 80 characters."," objective = logregobj, eval_metric = evalerror, maximize = FALSE,","line_length_linter" +"demo/generalized_linear_model.R",3,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" +"demo/generalized_linear_model.R",4,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" +"demo/generalized_linear_model.R",32,26,"style","Only use double-quotes.","labels <- getinfo(dtest, 'label')","single_quotes_linter" +"demo/generalized_linear_model.R",33,5,"style","Only use double-quotes.","cat('error of preds=', mean(as.numeric(ypred > 0.5) != labels), '\n')","single_quotes_linter" +"demo/generalized_linear_model.R",33,65,"style","Only use double-quotes.","cat('error of preds=', mean(as.numeric(ypred > 0.5) != labels), '\n')","single_quotes_linter" +"demo/gpu_accelerated.R",10,9,"style","Only use double-quotes.","library('xgboost')","single_quotes_linter" +"demo/gpu_accelerated.R",12,81,"style","Lines should not be more than 80 characters.","# Simulate N x p random matrix with some binomial response dependent on pp columns","line_length_linter" +"demo/gpu_accelerated.R",14,1,"style","Variable and function name style should be snake_case or symbols.","N <- 1000000","object_name_linter" +"demo/gpu_accelerated.R",17,1,"style","Variable and function name style should be snake_case or symbols.","X <- matrix(runif(N * p), ncol = p)","object_name_linter" +"demo/gpu_accelerated.R",35,27,"style","Only use double-quotes.","param <- list(objective = 'reg:logistic', eval_metric = 'auc', subsample = 0.5, nthread = 4,","single_quotes_linter" +"demo/gpu_accelerated.R",35,57,"style","Only use double-quotes.","param <- list(objective = 'reg:logistic', eval_metric = 'auc', subsample = 0.5, nthread = 4,","single_quotes_linter" +"demo/gpu_accelerated.R",35,81,"style","Lines should not be more than 80 characters.","param <- list(objective = 'reg:logistic', eval_metric = 'auc', subsample = 0.5, nthread = 4,","line_length_linter" +"demo/gpu_accelerated.R",36,43,"style","Only use double-quotes."," max_bin = 64, tree_method = 'gpu_hist')","single_quotes_linter" +"demo/gpu_accelerated.R",42,22,"style","Only use double-quotes.","param$tree_method <- 'hist'","single_quotes_linter" +"demo/interaction_constraints.R",6,81,"style","Lines should not be more than 80 characters.","# Function to obtain a list of interactions fitted in trees, requires input of maximum depth","line_length_linter" +"demo/interaction_constraints.R",7,1,"style","Variable and function name style should be snake_case or symbols.","treeInteractions <- function(input_tree, input_max_depth) {","object_name_linter" +"demo/interaction_constraints.R",8,3,"style","Variable and function name style should be snake_case or symbols."," ID_merge <- i.id <- i.feature <- NULL # Suppress warning ""no visible binding for global variable""","object_name_linter" +"demo/interaction_constraints.R",8,15,"style","Variable and function name style should be snake_case or symbols."," ID_merge <- i.id <- i.feature <- NULL # Suppress warning ""no visible binding for global variable""","object_name_linter" +"demo/interaction_constraints.R",8,23,"style","Variable and function name style should be snake_case or symbols."," ID_merge <- i.id <- i.feature <- NULL # Suppress warning ""no visible binding for global variable""","object_name_linter" +"demo/interaction_constraints.R",8,81,"style","Lines should not be more than 80 characters."," ID_merge <- i.id <- i.feature <- NULL # Suppress warning ""no visible binding for global variable""","line_length_linter" +"demo/interaction_constraints.R",10,81,"style","Lines should not be more than 80 characters."," trees <- data.table::copy(input_tree) # copy tree input to prevent overwriting","line_length_linter" +"demo/interaction_constraints.R",16,77,"style","Only use double-quotes."," if (i == 2) trees[, ID_merge := ID] else trees[, ID_merge := get(paste0('parent_', i - 2))]","single_quotes_linter" +"demo/interaction_constraints.R",16,81,"style","Lines should not be more than 80 characters."," if (i == 2) trees[, ID_merge := ID] else trees[, ID_merge := get(paste0('parent_', i - 2))]","line_length_linter" +"demo/interaction_constraints.R",17,81,"style","Lines should not be more than 80 characters."," parents_left <- trees[!is.na(Split), list(i.id = ID, i.feature = Feature, ID_merge = Yes)]","line_length_linter" +"demo/interaction_constraints.R",18,81,"style","Lines should not be more than 80 characters."," parents_right <- trees[!is.na(Split), list(i.id = ID, i.feature = Feature, ID_merge = No)]","line_length_linter" +"demo/interaction_constraints.R",20,34,"style","Only use double-quotes."," data.table::setorderv(trees, 'ID_merge')","single_quotes_linter" +"demo/interaction_constraints.R",21,41,"style","Only use double-quotes."," data.table::setorderv(parents_left, 'ID_merge')","single_quotes_linter" +"demo/interaction_constraints.R",22,42,"style","Only use double-quotes."," data.table::setorderv(parents_right, 'ID_merge')","single_quotes_linter" +"demo/interaction_constraints.R",24,46,"style","Only use double-quotes."," trees <- merge(trees, parents_left, by = 'ID_merge', all.x = TRUE)","single_quotes_linter" +"demo/interaction_constraints.R",25,34,"style","Only use double-quotes."," trees[!is.na(i.id), c(paste0('parent_', i - 1), paste0('parent_feat_', i - 1))","single_quotes_linter" +"demo/interaction_constraints.R",25,60,"style","Only use double-quotes."," trees[!is.na(i.id), c(paste0('parent_', i - 1), paste0('parent_feat_', i - 1))","single_quotes_linter" +"demo/interaction_constraints.R",25,81,"style","Lines should not be more than 80 characters."," trees[!is.na(i.id), c(paste0('parent_', i - 1), paste0('parent_feat_', i - 1))","line_length_linter" +"demo/interaction_constraints.R",27,15,"style","Only use double-quotes."," trees[, c('i.id', 'i.feature') := NULL]","single_quotes_linter" +"demo/interaction_constraints.R",27,23,"style","Only use double-quotes."," trees[, c('i.id', 'i.feature') := NULL]","single_quotes_linter" +"demo/interaction_constraints.R",29,47,"style","Only use double-quotes."," trees <- merge(trees, parents_right, by = 'ID_merge', all.x = TRUE)","single_quotes_linter" +"demo/interaction_constraints.R",30,34,"style","Only use double-quotes."," trees[!is.na(i.id), c(paste0('parent_', i - 1), paste0('parent_feat_', i - 1))","single_quotes_linter" +"demo/interaction_constraints.R",30,60,"style","Only use double-quotes."," trees[!is.na(i.id), c(paste0('parent_', i - 1), paste0('parent_feat_', i - 1))","single_quotes_linter" +"demo/interaction_constraints.R",30,81,"style","Lines should not be more than 80 characters."," trees[!is.na(i.id), c(paste0('parent_', i - 1), paste0('parent_feat_', i - 1))","line_length_linter" +"demo/interaction_constraints.R",32,15,"style","Only use double-quotes."," trees[, c('i.id', 'i.feature') := NULL]","single_quotes_linter" +"demo/interaction_constraints.R",32,23,"style","Only use double-quotes."," trees[, c('i.id', 'i.feature') := NULL]","single_quotes_linter" +"demo/interaction_constraints.R",36,53,"warning","no visible binding for global variable β€˜parent_1’"," interaction_trees <- trees[!is.na(Split) & !is.na(parent_1),","object_usage_linter" +"demo/interaction_constraints.R",37,32,"style","Only use double-quotes."," c('Feature', paste0('parent_feat_', 1:(input_max_depth - 1))),","single_quotes_linter" +"demo/interaction_constraints.R",37,50,"style","Only use double-quotes."," c('Feature', paste0('parent_feat_', 1:(input_max_depth - 1))),","single_quotes_linter" +"demo/interaction_constraints.R",37,81,"style","Lines should not be more than 80 characters."," c('Feature', paste0('parent_feat_', 1:(input_max_depth - 1))),","line_length_linter" +"demo/interaction_constraints.R",39,81,"style","Lines should not be more than 80 characters."," interaction_trees_split <- split(interaction_trees, seq_len(nrow(interaction_trees)))","line_length_linter" +"demo/interaction_constraints.R",60,34,"style","Only use double-quotes.","y <- -1 * x[, rowSums(.SD)] + x[['V1']] * x[['V2']] + x[['V3']] * x[['V4']] * x[['V5']]","single_quotes_linter" +"demo/interaction_constraints.R",60,46,"style","Only use double-quotes.","y <- -1 * x[, rowSums(.SD)] + x[['V1']] * x[['V2']] + x[['V3']] * x[['V4']] * x[['V5']]","single_quotes_linter" +"demo/interaction_constraints.R",60,58,"style","Only use double-quotes.","y <- -1 * x[, rowSums(.SD)] + x[['V1']] * x[['V2']] + x[['V3']] * x[['V4']] * x[['V5']]","single_quotes_linter" +"demo/interaction_constraints.R",60,70,"style","Only use double-quotes.","y <- -1 * x[, rowSums(.SD)] + x[['V1']] * x[['V2']] + x[['V3']] * x[['V4']] * x[['V5']]","single_quotes_linter" +"demo/interaction_constraints.R",60,81,"style","Lines should not be more than 80 characters.","y <- -1 * x[, rowSums(.SD)] + x[['V1']] * x[['V2']] + x[['V3']] * x[['V4']] * x[['V5']]","line_length_linter" +"demo/interaction_constraints.R",60,82,"style","Only use double-quotes.","y <- -1 * x[, rowSums(.SD)] + x[['V1']] * x[['V2']] + x[['V3']] * x[['V4']] * x[['V5']]","single_quotes_linter" +"demo/interaction_constraints.R",61,40,"style","Only use double-quotes."," + rnorm(1000, 0.001) + 3 * sin(x[['V7']])","single_quotes_linter" +"demo/interaction_constraints.R",66,28,"style","Only use double-quotes.","interaction_list <- list(c('V1', 'V2'), c('V3', 'V4', 'V5'))","single_quotes_linter" +"demo/interaction_constraints.R",66,34,"style","Only use double-quotes.","interaction_list <- list(c('V1', 'V2'), c('V3', 'V4', 'V5'))","single_quotes_linter" +"demo/interaction_constraints.R",66,43,"style","Only use double-quotes.","interaction_list <- list(c('V1', 'V2'), c('V3', 'V4', 'V5'))","single_quotes_linter" +"demo/interaction_constraints.R",66,49,"style","Only use double-quotes.","interaction_list <- list(c('V1', 'V2'), c('V3', 'V4', 'V5'))","single_quotes_linter" +"demo/interaction_constraints.R",66,55,"style","Only use double-quotes.","interaction_list <- list(c('V1', 'V2'), c('V3', 'V4', 'V5'))","single_quotes_linter" +"demo/interaction_constraints.R",70,3,"style","Variable and function name style should be snake_case or symbols."," LUT <- seq_along(col_names) - 1","object_name_linter" +"demo/interaction_constraints.R",71,9,"style","Variable and function name style should be snake_case or symbols."," names(LUT) <- col_names","object_name_linter" +"demo/interaction_constraints.R",102,81,"style","Lines should not be more than 80 characters.","# Show monotonic constraints still apply by checking scores after incrementing V1","line_length_linter" +"demo/interaction_constraints.R",103,22,"style","Only use double-quotes.","x1 <- sort(unique(x[['V1']]))","single_quotes_linter" +"demo/interaction_constraints.R",105,27,"style","Only use double-quotes."," testdata <- copy(x[, - ('V1')])","single_quotes_linter" +"demo/interaction_constraints.R",106,13,"style","Only use double-quotes."," testdata[['V1']] <- x1[i]","single_quotes_linter" +"demo/interaction_constraints.R",107,33,"style","Only use double-quotes."," testdata <- testdata[, paste0('V', 1:10), with = FALSE]","single_quotes_linter" +"demo/poisson_regression.R",4,28,"style","Only use double-quotes."," objective = 'count:poisson', nrounds = 5)","single_quotes_linter" +"demo/predict_first_ntree.R",3,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" +"demo/predict_first_ntree.R",4,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" +"demo/predict_first_ntree.R",8,51,"style","Only use double-quotes.","param <- list(max_depth = 2, eta = 1, objective = 'binary:logistic')","single_quotes_linter" +"demo/predict_first_ntree.R",14,5,"style","Only use double-quotes.","cat('start testing prediction from first n trees\n')","single_quotes_linter" +"demo/predict_first_ntree.R",15,26,"style","Only use double-quotes.","labels <- getinfo(dtest, 'label')","single_quotes_linter" +"demo/predict_first_ntree.R",22,5,"style","Only use double-quotes.","cat('error of ypred1=', mean(as.numeric(ypred1 > 0.5) != labels), '\n')","single_quotes_linter" +"demo/predict_first_ntree.R",22,67,"style","Only use double-quotes.","cat('error of ypred1=', mean(as.numeric(ypred1 > 0.5) != labels), '\n')","single_quotes_linter" +"demo/predict_first_ntree.R",23,5,"style","Only use double-quotes.","cat('error of ypred2=', mean(as.numeric(ypred2 > 0.5) != labels), '\n')","single_quotes_linter" +"demo/predict_first_ntree.R",23,67,"style","Only use double-quotes.","cat('error of ypred2=', mean(as.numeric(ypred2 > 0.5) != labels), '\n')","single_quotes_linter" +"demo/predict_leaf_indices.R",8,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" +"demo/predict_leaf_indices.R",9,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" +"demo/predict_leaf_indices.R",13,51,"style","Only use double-quotes.","param <- list(max_depth = 2, eta = 1, objective = 'binary:logistic')","single_quotes_linter" +"demo/predict_leaf_indices.R",20,1,"style","Variable and function name style should be snake_case or symbols.","accuracy.before <- (sum((predict(bst, agaricus.test$data) >= 0.5) == agaricus.test$label)","object_name_linter" +"demo/predict_leaf_indices.R",20,81,"style","Lines should not be more than 80 characters.","accuracy.before <- (sum((predict(bst, agaricus.test$data) >= 0.5) == agaricus.test$label)","line_length_linter" +"demo/predict_leaf_indices.R",27,1,"style","Variable and function name style should be snake_case or symbols.","create.new.tree.features <- function(model, original.features){","object_name_linter" +"demo/predict_leaf_indices.R",27,45,"style","Variable and function name style should be snake_case or symbols.","create.new.tree.features <- function(model, original.features){","object_name_linter" +"demo/predict_leaf_indices.R",27,63,"style","There should be a space before an opening curly brace.","create.new.tree.features <- function(model, original.features){","brace_linter" +"demo/predict_leaf_indices.R",27,63,"style","There should be a space between a right parenthesis and a body expression.","create.new.tree.features <- function(model, original.features){","paren_body_linter" +"demo/predict_leaf_indices.R",31,81,"style","Lines should not be more than 80 characters."," # max is not the real max but it s not important for the purpose of adding features","line_length_linter" +"demo/predict_leaf_indices.R",32,5,"style","Variable and function name style should be snake_case or symbols."," leaf.id <- sort(unique(pred_with_leaf[, i]))","object_name_linter" +"demo/predict_leaf_indices.R",39,1,"style","Variable and function name style should be snake_case or symbols.","new.features.train <- create.new.tree.features(bst, agaricus.train$data)","object_name_linter" +"demo/predict_leaf_indices.R",40,1,"style","Variable and function name style should be snake_case or symbols.","new.features.test <- create.new.tree.features(bst, agaricus.test$data)","object_name_linter" +"demo/predict_leaf_indices.R",41,10,"style","Variable and function name style should be snake_case or symbols.","colnames(new.features.test) <- colnames(new.features.train)","object_name_linter" +"demo/predict_leaf_indices.R",44,1,"style","Variable and function name style should be snake_case or symbols.","new.dtrain <- xgb.DMatrix(data = new.features.train, label = agaricus.train$label)","object_name_linter" +"demo/predict_leaf_indices.R",44,81,"style","Lines should not be more than 80 characters.","new.dtrain <- xgb.DMatrix(data = new.features.train, label = agaricus.train$label)","line_length_linter" +"demo/predict_leaf_indices.R",45,1,"style","Variable and function name style should be snake_case or symbols.","new.dtest <- xgb.DMatrix(data = new.features.test, label = agaricus.test$label)","object_name_linter" +"demo/predict_leaf_indices.R",47,81,"style","Lines should not be more than 80 characters.","bst <- xgb.train(params = param, data = new.dtrain, nrounds = nrounds, nthread = 2)","line_length_linter" +"demo/predict_leaf_indices.R",50,1,"style","Variable and function name style should be snake_case or symbols.","accuracy.after <- (sum((predict(bst, new.dtest) >= 0.5) == agaricus.test$label)","object_name_linter" +"demo/predict_leaf_indices.R",54,81,"style","Lines should not be more than 80 characters.","cat(paste(""The accuracy was"", accuracy.before, ""before adding leaf features and it is now"",","line_length_linter" +"demo/runall.R",2,35,"style","Only use double-quotes.","demo(basic_walkthrough, package = 'xgboost')","single_quotes_linter" +"demo/runall.R",3,34,"style","Only use double-quotes.","demo(custom_objective, package = 'xgboost')","single_quotes_linter" +"demo/runall.R",4,39,"style","Only use double-quotes.","demo(boost_from_prediction, package = 'xgboost')","single_quotes_linter" +"demo/runall.R",5,37,"style","Only use double-quotes.","demo(predict_first_ntree, package = 'xgboost')","single_quotes_linter" +"demo/runall.R",6,42,"style","Only use double-quotes.","demo(generalized_linear_model, package = 'xgboost')","single_quotes_linter" +"demo/runall.R",7,34,"style","Only use double-quotes.","demo(cross_validation, package = 'xgboost')","single_quotes_linter" +"demo/runall.R",8,38,"style","Only use double-quotes.","demo(create_sparse_matrix, package = 'xgboost')","single_quotes_linter" +"demo/runall.R",9,38,"style","Only use double-quotes.","demo(predict_leaf_indices, package = 'xgboost')","single_quotes_linter" +"demo/runall.R",10,32,"style","Only use double-quotes.","demo(early_stopping, package = 'xgboost')","single_quotes_linter" +"demo/runall.R",11,36,"style","Only use double-quotes.","demo(poisson_regression, package = 'xgboost')","single_quotes_linter" +"demo/runall.R",12,31,"style","Only use double-quotes.","demo(caret_wrapper, package = 'xgboost')","single_quotes_linter" +"demo/runall.R",13,36,"style","Only use double-quotes.","demo(tweedie_regression, package = 'xgboost')","single_quotes_linter" +"demo/runall.R",14,2,"style","Commented code should be removed.","#demo(gpu_accelerated, package = 'xgboost') # can only run when built with GPU support","commented_code_linter" +"demo/runall.R",14,81,"style","Lines should not be more than 80 characters.","#demo(gpu_accelerated, package = 'xgboost') # can only run when built with GPU support","line_length_linter" +"demo/tweedie_regression.R",11,14,"style","Only use double-quotes.","exclude <- c('POLICYNO', 'PLCYDATE', 'CLM_FREQ5', 'CLM_AMT5', 'CLM_FLAG', 'IN_YY')","single_quotes_linter" +"demo/tweedie_regression.R",11,26,"style","Only use double-quotes.","exclude <- c('POLICYNO', 'PLCYDATE', 'CLM_FREQ5', 'CLM_AMT5', 'CLM_FLAG', 'IN_YY')","single_quotes_linter" +"demo/tweedie_regression.R",11,38,"style","Only use double-quotes.","exclude <- c('POLICYNO', 'PLCYDATE', 'CLM_FREQ5', 'CLM_AMT5', 'CLM_FLAG', 'IN_YY')","single_quotes_linter" +"demo/tweedie_regression.R",11,51,"style","Only use double-quotes.","exclude <- c('POLICYNO', 'PLCYDATE', 'CLM_FREQ5', 'CLM_AMT5', 'CLM_FLAG', 'IN_YY')","single_quotes_linter" +"demo/tweedie_regression.R",11,63,"style","Only use double-quotes.","exclude <- c('POLICYNO', 'PLCYDATE', 'CLM_FREQ5', 'CLM_AMT5', 'CLM_FLAG', 'IN_YY')","single_quotes_linter" +"demo/tweedie_regression.R",11,75,"style","Only use double-quotes.","exclude <- c('POLICYNO', 'PLCYDATE', 'CLM_FREQ5', 'CLM_AMT5', 'CLM_FLAG', 'IN_YY')","single_quotes_linter" +"demo/tweedie_regression.R",11,81,"style","Lines should not be more than 80 characters.","exclude <- c('POLICYNO', 'PLCYDATE', 'CLM_FREQ5', 'CLM_AMT5', 'CLM_FLAG', 'IN_YY')","line_length_linter" +"demo/tweedie_regression.R",15,21,"style","Only use double-quotes.","options(na.action = 'na.pass')","single_quotes_linter" +"demo/tweedie_regression.R",17,21,"style","Only use double-quotes.","options(na.action = 'na.omit')","single_quotes_linter" +"demo/tweedie_regression.R",32,15,"style","Only use double-quotes."," objective = 'reg:tweedie',","single_quotes_linter" +"demo/tweedie_regression.R",33,17,"style","Only use double-quotes."," eval_metric = 'rmse',","single_quotes_linter" +"demo/tweedie_regression.R",45,35,"style","Only use double-quotes.","var_imp <- xgb.importance(attr(x, 'Dimnames')[[2]], model = bst)","single_quotes_linter" +"R/callbacks.R",617,12,"style","Either both or neither branch in `if`/`else` should use curly braces."," } else if (!is.null(env$bst_folds)) { # xgb.cv:","brace_linter" +"R/xgb.Booster.R",55,1,"style","Variable and function name style should be snake_case or symbols.","is.null.handle <- function(handle) {","object_name_linter" +"R/xgb.Booster.R",632,43,"style","Trailing semicolons are not needed."," .Call(XGBoosterSaveJsonConfig_R, handle);","semicolon_linter" +"R/xgb.cv.R",121,62,"style","Put spaces around all infix operators."," prediction = FALSE, showsd = TRUE, metrics=list(),","infix_spaces_linter" +"R/xgb.cv.R",123,49,"style","Put spaces around all infix operators."," verbose = TRUE, print_every_n=1L,","infix_spaces_linter" +"R/xgb.DMatrix.R",388,15,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (verbose & !is.null(cnames)) {","vector_logic_linter" +"R/xgb.plot.multi.trees.R",97,25,"warning","1:min(...) is likely to be wrong in the empty edge case. Use seq_len() instead."," Feature[1:min(length(Feature), features_keep)],","seq_linter" +"R/xgb.plot.shap.R",276,29,"warning","1:min(...) is likely to be wrong in the empty edge case. Use seq_len() instead."," features <- imp$Feature[1:min(top_n, NROW(imp))]","seq_linter" +"tests/testthat/test_basic.R",407,40,"style","Trailing semicolons are not needed."," expect_equal(config, reloaded_config);","semicolon_linter" +"tests/testthat/test_helpers.R",95,12,"style","Variable and function name style should be snake_case or symbols."," colnames(X) <- NULL","object_name_linter" +"tests/testthat/test_helpers.R",173,11,"style","Any function spanning multiple lines should use curly braces."," pr <- function(...)","brace_linter" +"tests/testthat/test_helpers.R",191,3,"style","Variable and function name style should be snake_case or symbols."," list.ch <- list.val[order(names(list.val))]","object_name_linter" +"tests/testthat/test_helpers.R",192,3,"style","Variable and function name style should be snake_case or symbols."," list.ch <- lapply(list.ch, as.character)","object_name_linter" +"tests/testthat/test_helpers.R",194,3,"style","Variable and function name style should be snake_case or symbols."," list.default <- list(niter = as.character(nrounds - 1))","object_name_linter" +"tests/testthat/test_helpers.R",195,3,"style","Variable and function name style should be snake_case or symbols."," list.ch <- c(list.ch, list.default)","object_name_linter" +"tests/testthat/test_helpers.R",202,12,"style","Variable and function name style should be snake_case or symbols."," xgb.attr(bst.Tree, ""my_attr"") <- val","object_name_linter" +"tests/testthat/test_helpers.R",204,18,"style","Variable and function name style should be snake_case or symbols."," xgb.attributes(bst.Tree) <- list.val","object_name_linter" +"tests/testthat/test_helpers.R",235,18,"style","Variable and function name style should be snake_case or symbols."," xgb.attr(bst.Tree, ""x"") <- x","object_name_linter" +"tests/testthat/test_helpers.R",237,24,"style","Variable and function name style should be snake_case or symbols."," xgb.attributes(bst.Tree) <- list(a = ""A"", b = x)","object_name_linter" +"tests/testthat/test_helpers.R",274,3,"style","Variable and function name style should be snake_case or symbols."," bst.Tree.x$feature_names <- NULL","object_name_linter" +"tests/testthat/test_helpers.R",302,3,"style","Variable and function name style should be snake_case or symbols."," bst.Tree.x$feature_names <- NULL","object_name_linter" +"vignettes/discoverYourData.Rmd",31,14,"style","Only use double-quotes.","if (!require('vcd')) install.packages('vcd')","single_quotes_linter" +"vignettes/discoverYourData.Rmd",31,39,"style","Only use double-quotes.","if (!require('vcd')) install.packages('vcd')","single_quotes_linter" +"vignettes/discoverYourData.Rmd",103,10,"style","Commas should always have a space after.","head(df[,AgeDiscret := as.factor(round(Age/10,0))])","commas_linter" +"vignettes/discoverYourData.Rmd",103,43,"style","Put spaces around all infix operators.","head(df[,AgeDiscret := as.factor(round(Age/10,0))])","infix_spaces_linter" +"vignettes/discoverYourData.Rmd",103,47,"style","Commas should always have a space after.","head(df[,AgeDiscret := as.factor(round(Age/10,0))])","commas_linter" +"vignettes/discoverYourData.Rmd",111,10,"style","Commas should always have a space after.","head(df[,AgeCat:= as.factor(ifelse(Age > 30, ""Old"", ""Young""))])","commas_linter" +"vignettes/discoverYourData.Rmd",111,16,"style","Put spaces around all infix operators.","head(df[,AgeCat:= as.factor(ifelse(Age > 30, ""Old"", ""Young""))])","infix_spaces_linter" +"vignettes/discoverYourData.Rmd",127,5,"style","Commas should always have a space after.","df[,ID:=NULL]","commas_linter" +"vignettes/discoverYourData.Rmd",127,7,"style","Put spaces around all infix operators.","df[,ID:=NULL]","infix_spaces_linter" +"vignettes/discoverYourData.Rmd",133,12,"style","Commas should always have a space after.","levels(df[,Treatment])","commas_linter" +"vignettes/discoverYourData.Rmd",150,64,"style","Commas should always have a space after.","sparse_matrix <- sparse.model.matrix(Improved ~ ., data = df)[,-1]","commas_linter" +"vignettes/discoverYourData.Rmd",159,15,"style","Use <-, not =, for assignment.","output_vector = df[,Improved] == ""Marked""","assignment_linter" +"vignettes/discoverYourData.Rmd",159,21,"style","Commas should always have a space after.","output_vector = df[,Improved] == ""Marked""","commas_linter" +"vignettes/discoverYourData.Rmd",173,51,"style","Commas should always have a space after."," eta = 1, nthread = 2, nrounds = 10,objective = ""binary:logistic"")","commas_linter" +"vignettes/discoverYourData.Rmd",196,81,"style","Lines should not be more than 80 characters.","importance <- xgb.importance(feature_names = colnames(sparse_matrix), model = bst)","line_length_linter" +"vignettes/discoverYourData.Rmd",219,1,"style","Variable and function name style should be snake_case or symbols.","importanceRaw <- xgb.importance(feature_names = colnames(sparse_matrix), model = bst, data = sparse_matrix, label = output_vector)","object_name_linter" +"vignettes/discoverYourData.Rmd",219,81,"style","Lines should not be more than 80 characters.","importanceRaw <- xgb.importance(feature_names = colnames(sparse_matrix), model = bst, data = sparse_matrix, label = output_vector)","line_length_linter" +"vignettes/discoverYourData.Rmd",222,1,"style","Variable and function name style should be snake_case or symbols.","importanceClean <- importanceRaw[,`:=`(Cover=NULL, Frequency=NULL)]","object_name_linter" +"vignettes/discoverYourData.Rmd",222,35,"style","Commas should always have a space after.","importanceClean <- importanceRaw[,`:=`(Cover=NULL, Frequency=NULL)]","commas_linter" +"vignettes/discoverYourData.Rmd",222,45,"style","Put spaces around all infix operators.","importanceClean <- importanceRaw[,`:=`(Cover=NULL, Frequency=NULL)]","infix_spaces_linter" +"vignettes/discoverYourData.Rmd",222,61,"style","Put spaces around all infix operators.","importanceClean <- importanceRaw[,`:=`(Cover=NULL, Frequency=NULL)]","infix_spaces_linter" +"vignettes/discoverYourData.Rmd",324,29,"style","Put spaces around all infix operators.","data(agaricus.train, package='xgboost')","infix_spaces_linter" +"vignettes/discoverYourData.Rmd",324,30,"style","Only use double-quotes.","data(agaricus.train, package='xgboost')","single_quotes_linter" +"vignettes/discoverYourData.Rmd",325,28,"style","Put spaces around all infix operators.","data(agaricus.test, package='xgboost')","infix_spaces_linter" +"vignettes/discoverYourData.Rmd",325,29,"style","Only use double-quotes.","data(agaricus.test, package='xgboost')","single_quotes_linter" +"vignettes/discoverYourData.Rmd",330,81,"style","Lines should not be more than 80 characters.","bst <- xgboost(data = train$data, label = train$label, max_depth = 4, num_parallel_tree = 1000, subsample = 0.5, colsample_bytree =0.5, nrounds = 1, objective = ""binary:logistic"")","line_length_linter" +"vignettes/discoverYourData.Rmd",330,131,"style","Put spaces around all infix operators.","bst <- xgboost(data = train$data, label = train$label, max_depth = 4, num_parallel_tree = 1000, subsample = 0.5, colsample_bytree =0.5, nrounds = 1, objective = ""binary:logistic"")","infix_spaces_linter" +"vignettes/discoverYourData.Rmd",333,81,"style","Lines should not be more than 80 characters.","bst <- xgboost(data = train$data, label = train$label, max_depth = 4, nrounds = 3, objective = ""binary:logistic"")","line_length_linter" +"vignettes/xgboost.Rnw",19,13,"style","Only use double-quotes.","if (require('knitr')) opts_chunk$set(fig.width = 5, fig.height = 5, fig.align = 'center', tidy = FALSE, warning = FALSE, cache = TRUE)","single_quotes_linter" +"vignettes/xgboost.Rnw",19,81,"style","Lines should not be more than 80 characters.","if (require('knitr')) opts_chunk$set(fig.width = 5, fig.height = 5, fig.align = 'center', tidy = FALSE, warning = FALSE, cache = TRUE)","line_length_linter" +"vignettes/xgboost.Rnw",19,81,"style","Only use double-quotes.","if (require('knitr')) opts_chunk$set(fig.width = 5, fig.height = 5, fig.align = 'center', tidy = FALSE, warning = FALSE, cache = TRUE)","single_quotes_linter" +"vignettes/xgboost.Rnw",24,1,"style","Variable and function name style should be snake_case or symbols.","xgboost.version <- packageDescription(""xgboost"")$Version","object_name_linter" +"vignettes/xgboost.Rnw",84,29,"style","Put spaces around all infix operators.","data(agaricus.train, package='xgboost')","infix_spaces_linter" +"vignettes/xgboost.Rnw",84,30,"style","Only use double-quotes.","data(agaricus.train, package='xgboost')","single_quotes_linter" +"vignettes/xgboost.Rnw",85,28,"style","Put spaces around all infix operators.","data(agaricus.test, package='xgboost')","infix_spaces_linter" +"vignettes/xgboost.Rnw",85,29,"style","Only use double-quotes.","data(agaricus.test, package='xgboost')","single_quotes_linter" +"vignettes/xgboost.Rnw",90,15,"style","Only use double-quotes.","xgb.save(bst, 'model.save')","single_quotes_linter" +"vignettes/xgboost.Rnw",91,5,"style","Use <-, not =, for assignment.","bst = xgb.load('model.save')","assignment_linter" +"vignettes/xgboost.Rnw",91,16,"style","Only use double-quotes.","bst = xgb.load('model.save')","single_quotes_linter" +"vignettes/xgboost.Rnw",102,15,"style","Only use double-quotes.","xgb.dump(bst, 'model.dump')","single_quotes_linter" +"vignettes/xgboost.Rnw",132,21,"style","Commas should always have a space after.","head(getinfo(dtrain,'label'))","commas_linter" +"vignettes/xgboost.Rnw",132,21,"style","Only use double-quotes.","head(getinfo(dtrain,'label'))","single_quotes_linter" +"vignettes/xgboost.Rnw",138,26,"style","Only use double-quotes.","xgb.DMatrix.save(dtrain, 'xgb.DMatrix')","single_quotes_linter" +"vignettes/xgboost.Rnw",139,8,"style","Use <-, not =, for assignment.","dtrain = xgb.DMatrix('xgb.DMatrix')","assignment_linter" +"vignettes/xgboost.Rnw",139,22,"style","Only use double-quotes.","dtrain = xgb.DMatrix('xgb.DMatrix')","single_quotes_linter" +"vignettes/xgboost.Rnw",152,14,"style","Put spaces around all infix operators."," preds <- 1/(1 + exp(-preds))","infix_spaces_linter" +"vignettes/xgboost.Rnw",152,15,"style","Place a space before left parenthesis, except in a function call."," preds <- 1/(1 + exp(-preds))","spaces_left_parentheses_linter" +"vignettes/xgboost.Rnw",160,26,"style","Put spaces around all infix operators."," err <- sqrt(mean((preds-labels)^2))","infix_spaces_linter" +"vignettes/xgboost.Rnw",168,81,"style","Lines should not be more than 80 characters.","bst <- xgb.train(param, dtrain, nrounds = 2, watchlist, logregobj, evalerror, maximize = FALSE)","line_length_linter" +"vignettes/xgboostfromJSON.Rmd",33,15,"style","Put spaces around all infix operators.","options(digits=22)","infix_spaces_linter" +"vignettes/xgboostfromJSON.Rmd",53,41,"style","Put spaces around all infix operators.","data <- data.frame(dates = dates, labels=labels)","infix_spaces_linter" +"vignettes/xgboostfromJSON.Rmd",56,32,"style","Trailing whitespace is superfluous."," data = as.matrix(data$dates), ","trailing_whitespace_linter" +"vignettes/xgboostfromJSON.Rmd",72,58,"style","Put spaces around all infix operators.","bst_json <- xgb.dump(bst, with_stats = FALSE, dump_format='json')","infix_spaces_linter" +"vignettes/xgboostfromJSON.Rmd",72,59,"style","Only use double-quotes.","bst_json <- xgb.dump(bst, with_stats = FALSE, dump_format='json')","single_quotes_linter" +"vignettes/xgboostfromJSON.Rmd",81,34,"style","Commas should always have a space after.","bst_preds_logodds <- predict(bst,as.matrix(data$dates), outputmargin = TRUE)","commas_linter" +"vignettes/xgboostfromJSON.Rmd",84,43,"style","Put spaces around all infix operators.","bst_from_json_logodds <- ifelse(data$dates 0.5) != label))/length(label)","infix_spaces_linter" +"vignettes/xgboostPresentation.Rmd",399,51,"style","Put spaces around all infix operators.","print(paste(""sum(abs(pred2-pred))="", sum(abs(pred2-pred))))","infix_spaces_linter" +"vignettes/xgboostPresentation.Rmd",413,1,"style","Variable and function name style should be snake_case or symbols.","rawVec <- xgb.serialize(bst)","object_name_linter" +"vignettes/xgboostPresentation.Rmd",423,51,"style","Put spaces around all infix operators.","print(paste(""sum(abs(pred3-pred))="", sum(abs(pred2-pred))))","infix_spaces_linter" diff --git a/.dev/revdep_emails/xgboost/email-body b/.dev/revdep_emails/xgboost/email-body new file mode 100644 index 000000000..76282c6d5 --- /dev/null +++ b/.dev/revdep_emails/xgboost/email-body @@ -0,0 +1,27 @@ +Hello Jiaming Yuan! Thank you for using {lintr} in your package {xgboost}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/dmlc/xgboost using +the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 69s on CRAN vs. 50s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + From 89bbb298698de57f261efbbedbad58e724949fbc Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Sun, 5 Jun 2022 14:10:15 -0700 Subject: [PATCH 35/49] tweak printing order --- .dev/revdep_compare_releases.R | 18 ++++++++++++++---- 1 file changed, 14 insertions(+), 4 deletions(-) diff --git a/.dev/revdep_compare_releases.R b/.dev/revdep_compare_releases.R index a68b028b6..68b71e25a 100755 --- a/.dev/revdep_compare_releases.R +++ b/.dev/revdep_compare_releases.R @@ -171,13 +171,23 @@ summarize_lint_delta <- function(new, old) { message("Count of these by linter:") print(new_only[, .N, by = linter][order(-N)]) message("Sample of <=10 hits from each linter:") - print(new_only[sample(.N), head(.SD, 10L), by = linter][, .(package, filename, linter, line)]) + new_only[ + sample(.N), + head(.SD, 10L), + by = linter + ][, .(line, linter, location = paste0(package, ":", filename)) + ][, print(.SD)] message("Count of lints found on ", old_version, " but not on ", new_version, ": ", nrow(old_only)) message("Count of these by linter:") print(old_only[, .N, by = linter][order(-N)]) message("Sample of <=10 hits from each linter:") - print(old_only[sample(.N), head(.SD, 10L), by = linter][, .(package, filename, linter, line)]) + old_only[ + sample(.N), + head(.SD, 10L), + by = linter + ][, .(line, linter, location = paste0(package, ":", filename)) + ][, print(.SD)] } # ---- Main linting execution ---- @@ -288,7 +298,7 @@ for (ii in seq_len(nrow(repo_data))) { main_only_lints <- main_lints[package == PKG][!old_lints, on = c("package", "filename", "line_number")] if (nrow(main_only_lints) > 0L) { utils::write.csv( - main_only_lints[c("filename", "line_number", "column_number", "type", "message", "line", "linter")], + main_only_lints[, c("filename", "line_number", "column_number", "type", "message", "line", "linter")], file.path(attachments_dir, "lints_in_devel_not_cran.csv"), row.names = FALSE ) @@ -297,7 +307,7 @@ for (ii in seq_len(nrow(repo_data))) { old_only_lints <- old_lints[package == PKG][!main_lints, on = c("package", "filename", "line_number")] if (nrow(old_only_lints) > 0L) { utils::write.csv( - old_only_lints[c("filename", "line_number", "column_number", "type", "message", "line", "linter")], + old_only_lints[, c("filename", "line_number", "column_number", "type", "message", "line", "linter")], file.path(attachments_dir, "lints_in_cran_not_devel.csv"), row.names = FALSE ) From e1ead96a23dca55daacb6c19e6ba3b71e044044c Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Sun, 5 Jun 2022 14:12:42 -0700 Subject: [PATCH 36/49] robust shebang usage --- .dev/revdep_get_repos.R | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/.dev/revdep_get_repos.R b/.dev/revdep_get_repos.R index 7be967a3d..ef5a46cd2 100755 --- a/.dev/revdep_get_repos.R +++ b/.dev/revdep_get_repos.R @@ -1,4 +1,4 @@ -#!/usr/bin/Rscript +#!/usr/bin/env Rscript # Script to get URL keys from CRAN # of packags that Suggest or Import lintr From 52302847a53c7cb3aab39f0eede98b1fcddd27b4 Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Sun, 5 Jun 2022 14:12:54 -0700 Subject: [PATCH 37/49] reset repo state for fresh run from scratch --- .dev/revdep-no-repos | 15 - .dev/revdep-repos | 79 - .../BTYDplus/attachments/BTYDplus.warnings | 2 - .../attachments/lints_in_cran_not_devel.csv | 11 - .../attachments/lints_in_devel_not_cran.csv | 227 - .dev/revdep_emails/BTYDplus/email-body | 27 - .../attachments/BiasCorrector.warnings | 1 - .../attachments/lints_in_devel_not_cran.csv | 33 - .dev/revdep_emails/BiasCorrector/email-body | 27 - .dev/revdep_emails/ConNEcT/email-body | 27 - .dev/revdep_emails/DBItest/email-body | 27 - .dev/revdep_emails/DataFakeR/email-body | 27 - .../DepthProc/attachments/DepthProc.failure | 1 - .dev/revdep_emails/DepthProc/email-body | 27 - .../DominoDataCapture/email-body | 27 - .../attachments/FSelectorRcpp.warnings | 1 - .../attachments/lints_in_cran_not_devel.csv | 5 - .../attachments/lints_in_devel_not_cran.csv | 68 - .dev/revdep_emails/FSelectorRcpp/email-body | 27 - .dev/revdep_emails/NHSRplotthedots/email-body | 27 - .../attachments/lints_in_cran_not_devel.csv | 3 - .../attachments/lints_in_devel_not_cran.csv | 82 - .dev/revdep_emails/OpenML/email-body | 27 - .../attachments/PWFSLSmoke.warnings | 2 - .../attachments/lints_in_cran_not_devel.csv | 3 - .../attachments/lints_in_devel_not_cran.csv | 219 - .dev/revdep_emails/PWFSLSmoke/email-body | 27 - .dev/revdep_emails/Plasmidprofiler/email-body | 27 - .../attachments/lints_in_devel_not_cran.csv | 24 - .../PosteriorBootstrap/email-body | 27 - .../RSQL/attachments/RSQL.warnings | 2 - .../attachments/lints_in_devel_not_cran.csv | 25 - .dev/revdep_emails/RSQL/email-body | 27 - .../RestRserve/attachments/RestRserve.failure | 1 - .../attachments/RestRserve.warnings | 1 - .dev/revdep_emails/RestRserve/email-body | 27 - .dev/revdep_emails/SamplerCompare/email-body | 27 - .dev/revdep_emails/TDA/email-body | 27 - .../WikidataQueryServiceR.warnings | 2 - .../WikidataQueryServiceR/email-body | 27 - .../attachments/WoodburyMatrix.warnings | 1 - .dev/revdep_emails/WoodburyMatrix/email-body | 27 - .dev/revdep_emails/abbyyR/email-body | 27 - .dev/revdep_emails/adaptalint/email-body | 27 - .dev/revdep_emails/admiral/email-body | 27 - .dev/revdep_emails/autoharp/email-body | 27 - .dev/revdep_emails/aws.alexa/email-body | 27 - .../attachments/lints_in_devel_not_cran.csv | 5 - .dev/revdep_emails/babette/email-body | 27 - .../attachments/lints_in_devel_not_cran.csv | 3 - .dev/revdep_emails/beautier/email-body | 27 - .dev/revdep_emails/biolink/email-body | 27 - .../attachments/lints_in_cran_not_devel.csv | 8 - .../attachments/lints_in_devel_not_cran.csv | 114 - .dev/revdep_emails/caretEnsemble/email-body | 27 - .../cattonum/attachments/cattonum.warnings | 1 - .../attachments/lints_in_cran_not_devel.csv | 2 - .dev/revdep_emails/cattonum/email-body | 27 - .../cleaR/attachments/cleaR.warnings | 1 - .../attachments/lints_in_devel_not_cran.csv | 29 - .dev/revdep_emails/cleaR/email-body | 27 - .../attachments/lints_in_cran_not_devel.csv | 19 - .../attachments/lints_in_devel_not_cran.csv | 25 - .dev/revdep_emails/cloudos/email-body | 27 - .../attachments/lints_in_devel_not_cran.csv | 9 - .dev/revdep_emails/connectwidgets/email-body | 27 - .../crunch/attachments/crunch.warnings | 2 - .../attachments/lints_in_cran_not_devel.csv | 2 - .../attachments/lints_in_devel_not_cran.csv | 765 - .dev/revdep_emails/crunch/email-body | 27 - .../dampack/attachments/dampack.warnings | 2 - .../attachments/lints_in_devel_not_cran.csv | 331 - .dev/revdep_emails/dampack/email-body | 27 - .../attachments/dashboardthemes.warnings | 263 - .../attachments/lints_in_devel_not_cran.csv | 3 - .dev/revdep_emails/dashboardthemes/email-body | 27 - .../attachments/lints_in_cran_not_devel.csv | 7 - .../attachments/lints_in_devel_not_cran.csv | 44 - .dev/revdep_emails/dat/email-body | 27 - .dev/revdep_emails/datarobot/email-body | 27 - .../attachments/datastructures.failure | 1 - .dev/revdep_emails/datastructures/email-body | 27 - .../attachments/lints_in_cran_not_devel.csv | 2 - .dev/revdep_emails/describer/email-body | 27 - .dev/revdep_emails/devtools/email-body | 27 - .../diffusr/attachments/diffusr.failure | 1 - .dev/revdep_emails/diffusr/email-body | 27 - .../dittodb/attachments/dittodb.warnings | 1 - .../attachments/lints_in_devel_not_cran.csv | 728 - .dev/revdep_emails/dittodb/email-body | 27 - .../dupree/attachments/dupree.warnings | 1 - .dev/revdep_emails/dupree/email-body | 27 - .../edgarWebR/attachments/edgarWebR.warnings | 2 - .../attachments/lints_in_devel_not_cran.csv | 19916 ---------------- .dev/revdep_emails/edgarWebR/email-body | 27 - .../attachments/epigraphdb.warnings | 1 - .dev/revdep_emails/epigraphdb/email-body | 27 - .../attachments/lints_in_cran_not_devel.csv | 2 - .../attachments/lints_in_devel_not_cran.csv | 2 - .dev/revdep_emails/fakemake/email-body | 27 - .../fixtuRes/attachments/fixtuRes.warnings | 1 - .../attachments/lints_in_devel_not_cran.csv | 3 - .dev/revdep_emails/fixtuRes/email-body | 27 - .../attachments/lints_in_devel_not_cran.csv | 12 - .dev/revdep_emails/fst/email-body | 27 - .dev/revdep_emails/geofacet/email-body | 27 - .dev/revdep_emails/geogrid/email-body | 27 - .../attachments/lints_in_cran_not_devel.csv | 12 - .../attachments/lints_in_devel_not_cran.csv | 357 - .dev/revdep_emails/ggRandomForests/email-body | 27 - .../ggcharts/attachments/ggcharts.warnings | 1 - .../attachments/lints_in_cran_not_devel.csv | 3 - .../attachments/lints_in_devel_not_cran.csv | 5 - .dev/revdep_emails/ggcharts/email-body | 27 - .../attachments/lints_in_cran_not_devel.csv | 118 - .../attachments/lints_in_devel_not_cran.csv | 190 - .dev/revdep_emails/ggfortify/email-body | 27 - .../ggthemes/attachments/ggthemes.warnings | 2 - .../attachments/lints_in_cran_not_devel.csv | 2 - .../attachments/lints_in_devel_not_cran.csv | 48 - .dev/revdep_emails/ggthemes/email-body | 27 - .../attachments/healthcareai.warnings | 2 - .../attachments/lints_in_devel_not_cran.csv | 149 - .dev/revdep_emails/healthcareai/email-body | 27 - .../attachments/lints_in_devel_not_cran.csv | 345 - .dev/revdep_emails/i18n/email-body | 27 - .../jpmesh/attachments/jpmesh.warnings | 1 - .../attachments/lints_in_devel_not_cran.csv | 3 - .dev/revdep_emails/jpmesh/email-body | 27 - .../attachments/languageserver.warnings | 2 - .dev/revdep_emails/languageserver/email-body | 27 - .../attachments/lints_in_cran_not_devel.csv | 35 - .../attachments/lints_in_devel_not_cran.csv | 331 - .dev/revdep_emails/latrend/email-body | 27 - .../attachments/lints_in_cran_not_devel.csv | 5 - .../attachments/lints_in_devel_not_cran.csv | 24 - .dev/revdep_emails/lifecycle/email-body | 27 - .../attachments/lints_in_cran_not_devel.csv | 14 - .../attachments/lints_in_devel_not_cran.csv | 67 - .dev/revdep_emails/lightgbm/email-body | 27 - .../attachments/lints_in_cran_not_devel.csv | 3 - .../attachments/lints_in_devel_not_cran.csv | 12 - .../mlflow/attachments/mlflow.warnings | 2 - .dev/revdep_emails/mlflow/email-body | 27 - .../attachments/lints_in_cran_not_devel.csv | 152 - .../attachments/lints_in_devel_not_cran.csv | 791 - .../mlr/attachments/mlr.warnings | 2 - .dev/revdep_emails/mlr/email-body | 27 - .../attachments/lints_in_cran_not_devel.csv | 4 - .../attachments/lints_in_devel_not_cran.csv | 441 - .dev/revdep_emails/mlrCPO/email-body | 27 - .../attachments/lints_in_devel_not_cran.csv | 12 - .../modules/attachments/modules.warnings | 1 - .dev/revdep_emails/modules/email-body | 27 - .../attachments/lints_in_devel_not_cran.csv | 2 - .dev/revdep_emails/nLTT/email-body | 27 - .dev/revdep_emails/newsmd/email-body | 27 - .../attachments/openbankeR.warnings | 68 - .dev/revdep_emails/openbankeR/email-body | 27 - .../attachments/lints_in_devel_not_cran.csv | 8 - .../osfr/attachments/osfr.warnings | 1 - .dev/revdep_emails/osfr/email-body | 27 - .../attachments/lints_in_cran_not_devel.csv | 5 - .../attachments/lints_in_devel_not_cran.csv | 29 - .../packager/attachments/packager.warnings | 1 - .dev/revdep_emails/packager/email-body | 27 - .../attachments/lints_in_devel_not_cran.csv | 58 - .../attachments/physiology.warnings | 2 - .dev/revdep_emails/physiology/email-body | 27 - .../attachments/lints_in_cran_not_devel.csv | 8 - .../attachments/lints_in_devel_not_cran.csv | 17 - .dev/revdep_emails/precommit/email-body | 27 - .../attachments/lints_in_devel_not_cran.csv | 23 - .../prettyB/attachments/prettyB.warnings | 1 - .dev/revdep_emails/prettyB/email-body | 27 - .../attachments/lints_in_devel_not_cran.csv | 110 - .../attachments/rBiasCorrection.warnings | 1 - .dev/revdep_emails/rBiasCorrection/email-body | 27 - .dev/revdep_emails/rasterpdf/email-body | 27 - .dev/revdep_emails/rbokeh/email-body | 27 - .../attachments/lints_in_devel_not_cran.csv | 12 - .dev/revdep_emails/rde/email-body | 27 - .../attachments/lints_in_devel_not_cran.csv | 65 - .dev/revdep_emails/rnrfa/email-body | 27 - .dev/revdep_emails/roadoi/email-body | 27 - .../attachments/scriptexec.warnings | 1 - .dev/revdep_emails/scriptexec/email-body | 27 - .../attachments/lints_in_cran_not_devel.csv | 17 - .../attachments/lints_in_devel_not_cran.csv | 41 - .dev/revdep_emails/secuTrialR/email-body | 27 - .../attachments/lints_in_cran_not_devel.csv | 5 - .../attachments/lints_in_devel_not_cran.csv | 8 - .../semantic.dashboard/email-body | 27 - .../attachments/lints_in_cran_not_devel.csv | 3 - .../attachments/lints_in_devel_not_cran.csv | 3 - .dev/revdep_emails/shiny.info/email-body | 27 - .../attachments/lints_in_cran_not_devel.csv | 30 - .../attachments/lints_in_devel_not_cran.csv | 24 - .dev/revdep_emails/shiny.semantic/email-body | 27 - .../attachments/lints_in_devel_not_cran.csv | 93 - .dev/revdep_emails/smerc/email-body | 27 - .../attachments/lints_in_devel_not_cran.csv | 3 - .../attachments/stencilaschema.warnings | 1 - .dev/revdep_emails/stencilaschema/email-body | 27 - .../attachments/lints_in_devel_not_cran.csv | 4 - .../supernova/attachments/supernova.warnings | 1 - .dev/revdep_emails/supernova/email-body | 27 - .../attachments/lints_in_cran_not_devel.csv | 2 - .../attachments/lints_in_devel_not_cran.csv | 2 - .../tsviz/attachments/tsviz.warnings | 1 - .dev/revdep_emails/tsviz/email-body | 27 - .../tuber/attachments/tuber.failure | 1 - .../tuber/attachments/tuber.warnings | 1 - .dev/revdep_emails/tuber/email-body | 27 - .../attachments/lints_in_cran_not_devel.csv | 5 - .../attachments/lints_in_devel_not_cran.csv | 8 - .dev/revdep_emails/unifir/email-body | 27 - .dev/revdep_emails/virustotal/email-body | 27 - .dev/revdep_emails/wavefunction/email-body | 27 - .../attachments/lints_in_cran_not_devel.csv | 29 - .../attachments/lints_in_devel_not_cran.csv | 367 - .dev/revdep_emails/xgboost/email-body | 27 - 222 files changed, 29824 deletions(-) delete mode 100644 .dev/revdep-no-repos delete mode 100644 .dev/revdep-repos delete mode 100644 .dev/revdep_emails/BTYDplus/attachments/BTYDplus.warnings delete mode 100644 .dev/revdep_emails/BTYDplus/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/BTYDplus/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/BTYDplus/email-body delete mode 100644 .dev/revdep_emails/BiasCorrector/attachments/BiasCorrector.warnings delete mode 100644 .dev/revdep_emails/BiasCorrector/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/BiasCorrector/email-body delete mode 100644 .dev/revdep_emails/ConNEcT/email-body delete mode 100644 .dev/revdep_emails/DBItest/email-body delete mode 100644 .dev/revdep_emails/DataFakeR/email-body delete mode 100644 .dev/revdep_emails/DepthProc/attachments/DepthProc.failure delete mode 100644 .dev/revdep_emails/DepthProc/email-body delete mode 100644 .dev/revdep_emails/DominoDataCapture/email-body delete mode 100644 .dev/revdep_emails/FSelectorRcpp/attachments/FSelectorRcpp.warnings delete mode 100644 .dev/revdep_emails/FSelectorRcpp/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/FSelectorRcpp/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/FSelectorRcpp/email-body delete mode 100644 .dev/revdep_emails/NHSRplotthedots/email-body delete mode 100644 .dev/revdep_emails/OpenML/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/OpenML/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/OpenML/email-body delete mode 100644 .dev/revdep_emails/PWFSLSmoke/attachments/PWFSLSmoke.warnings delete mode 100644 .dev/revdep_emails/PWFSLSmoke/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/PWFSLSmoke/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/PWFSLSmoke/email-body delete mode 100644 .dev/revdep_emails/Plasmidprofiler/email-body delete mode 100644 .dev/revdep_emails/PosteriorBootstrap/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/PosteriorBootstrap/email-body delete mode 100644 .dev/revdep_emails/RSQL/attachments/RSQL.warnings delete mode 100644 .dev/revdep_emails/RSQL/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/RSQL/email-body delete mode 100644 .dev/revdep_emails/RestRserve/attachments/RestRserve.failure delete mode 100644 .dev/revdep_emails/RestRserve/attachments/RestRserve.warnings delete mode 100644 .dev/revdep_emails/RestRserve/email-body delete mode 100644 .dev/revdep_emails/SamplerCompare/email-body delete mode 100644 .dev/revdep_emails/TDA/email-body delete mode 100644 .dev/revdep_emails/WikidataQueryServiceR/attachments/WikidataQueryServiceR.warnings delete mode 100644 .dev/revdep_emails/WikidataQueryServiceR/email-body delete mode 100644 .dev/revdep_emails/WoodburyMatrix/attachments/WoodburyMatrix.warnings delete mode 100644 .dev/revdep_emails/WoodburyMatrix/email-body delete mode 100644 .dev/revdep_emails/abbyyR/email-body delete mode 100644 .dev/revdep_emails/adaptalint/email-body delete mode 100644 .dev/revdep_emails/admiral/email-body delete mode 100644 .dev/revdep_emails/autoharp/email-body delete mode 100644 .dev/revdep_emails/aws.alexa/email-body delete mode 100644 .dev/revdep_emails/babette/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/babette/email-body delete mode 100644 .dev/revdep_emails/beautier/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/beautier/email-body delete mode 100644 .dev/revdep_emails/biolink/email-body delete mode 100644 .dev/revdep_emails/caretEnsemble/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/caretEnsemble/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/caretEnsemble/email-body delete mode 100644 .dev/revdep_emails/cattonum/attachments/cattonum.warnings delete mode 100644 .dev/revdep_emails/cattonum/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/cattonum/email-body delete mode 100644 .dev/revdep_emails/cleaR/attachments/cleaR.warnings delete mode 100644 .dev/revdep_emails/cleaR/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/cleaR/email-body delete mode 100644 .dev/revdep_emails/cloudos/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/cloudos/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/cloudos/email-body delete mode 100644 .dev/revdep_emails/connectwidgets/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/connectwidgets/email-body delete mode 100644 .dev/revdep_emails/crunch/attachments/crunch.warnings delete mode 100644 .dev/revdep_emails/crunch/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/crunch/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/crunch/email-body delete mode 100644 .dev/revdep_emails/dampack/attachments/dampack.warnings delete mode 100644 .dev/revdep_emails/dampack/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/dampack/email-body delete mode 100644 .dev/revdep_emails/dashboardthemes/attachments/dashboardthemes.warnings delete mode 100644 .dev/revdep_emails/dashboardthemes/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/dashboardthemes/email-body delete mode 100644 .dev/revdep_emails/dat/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/dat/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/dat/email-body delete mode 100644 .dev/revdep_emails/datarobot/email-body delete mode 100644 .dev/revdep_emails/datastructures/attachments/datastructures.failure delete mode 100644 .dev/revdep_emails/datastructures/email-body delete mode 100644 .dev/revdep_emails/describer/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/describer/email-body delete mode 100644 .dev/revdep_emails/devtools/email-body delete mode 100644 .dev/revdep_emails/diffusr/attachments/diffusr.failure delete mode 100644 .dev/revdep_emails/diffusr/email-body delete mode 100644 .dev/revdep_emails/dittodb/attachments/dittodb.warnings delete mode 100644 .dev/revdep_emails/dittodb/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/dittodb/email-body delete mode 100644 .dev/revdep_emails/dupree/attachments/dupree.warnings delete mode 100644 .dev/revdep_emails/dupree/email-body delete mode 100644 .dev/revdep_emails/edgarWebR/attachments/edgarWebR.warnings delete mode 100644 .dev/revdep_emails/edgarWebR/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/edgarWebR/email-body delete mode 100644 .dev/revdep_emails/epigraphdb/attachments/epigraphdb.warnings delete mode 100644 .dev/revdep_emails/epigraphdb/email-body delete mode 100644 .dev/revdep_emails/fakemake/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/fakemake/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/fakemake/email-body delete mode 100644 .dev/revdep_emails/fixtuRes/attachments/fixtuRes.warnings delete mode 100644 .dev/revdep_emails/fixtuRes/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/fixtuRes/email-body delete mode 100644 .dev/revdep_emails/fst/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/fst/email-body delete mode 100644 .dev/revdep_emails/geofacet/email-body delete mode 100644 .dev/revdep_emails/geogrid/email-body delete mode 100644 .dev/revdep_emails/ggRandomForests/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/ggRandomForests/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/ggRandomForests/email-body delete mode 100644 .dev/revdep_emails/ggcharts/attachments/ggcharts.warnings delete mode 100644 .dev/revdep_emails/ggcharts/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/ggcharts/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/ggcharts/email-body delete mode 100644 .dev/revdep_emails/ggfortify/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/ggfortify/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/ggfortify/email-body delete mode 100644 .dev/revdep_emails/ggthemes/attachments/ggthemes.warnings delete mode 100644 .dev/revdep_emails/ggthemes/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/ggthemes/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/ggthemes/email-body delete mode 100644 .dev/revdep_emails/healthcareai/attachments/healthcareai.warnings delete mode 100644 .dev/revdep_emails/healthcareai/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/healthcareai/email-body delete mode 100644 .dev/revdep_emails/i18n/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/i18n/email-body delete mode 100644 .dev/revdep_emails/jpmesh/attachments/jpmesh.warnings delete mode 100644 .dev/revdep_emails/jpmesh/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/jpmesh/email-body delete mode 100644 .dev/revdep_emails/languageserver/attachments/languageserver.warnings delete mode 100644 .dev/revdep_emails/languageserver/email-body delete mode 100644 .dev/revdep_emails/latrend/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/latrend/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/latrend/email-body delete mode 100644 .dev/revdep_emails/lifecycle/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/lifecycle/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/lifecycle/email-body delete mode 100644 .dev/revdep_emails/lightgbm/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/lightgbm/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/lightgbm/email-body delete mode 100644 .dev/revdep_emails/mlflow/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/mlflow/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/mlflow/attachments/mlflow.warnings delete mode 100644 .dev/revdep_emails/mlflow/email-body delete mode 100644 .dev/revdep_emails/mlr/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/mlr/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/mlr/attachments/mlr.warnings delete mode 100644 .dev/revdep_emails/mlr/email-body delete mode 100644 .dev/revdep_emails/mlrCPO/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/mlrCPO/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/mlrCPO/email-body delete mode 100644 .dev/revdep_emails/modules/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/modules/attachments/modules.warnings delete mode 100644 .dev/revdep_emails/modules/email-body delete mode 100644 .dev/revdep_emails/nLTT/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/nLTT/email-body delete mode 100644 .dev/revdep_emails/newsmd/email-body delete mode 100644 .dev/revdep_emails/openbankeR/attachments/openbankeR.warnings delete mode 100644 .dev/revdep_emails/openbankeR/email-body delete mode 100644 .dev/revdep_emails/osfr/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/osfr/attachments/osfr.warnings delete mode 100644 .dev/revdep_emails/osfr/email-body delete mode 100644 .dev/revdep_emails/packager/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/packager/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/packager/attachments/packager.warnings delete mode 100644 .dev/revdep_emails/packager/email-body delete mode 100644 .dev/revdep_emails/physiology/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/physiology/attachments/physiology.warnings delete mode 100644 .dev/revdep_emails/physiology/email-body delete mode 100644 .dev/revdep_emails/precommit/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/precommit/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/precommit/email-body delete mode 100644 .dev/revdep_emails/prettyB/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/prettyB/attachments/prettyB.warnings delete mode 100644 .dev/revdep_emails/prettyB/email-body delete mode 100644 .dev/revdep_emails/rBiasCorrection/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/rBiasCorrection/attachments/rBiasCorrection.warnings delete mode 100644 .dev/revdep_emails/rBiasCorrection/email-body delete mode 100644 .dev/revdep_emails/rasterpdf/email-body delete mode 100644 .dev/revdep_emails/rbokeh/email-body delete mode 100644 .dev/revdep_emails/rde/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/rde/email-body delete mode 100644 .dev/revdep_emails/rnrfa/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/rnrfa/email-body delete mode 100644 .dev/revdep_emails/roadoi/email-body delete mode 100644 .dev/revdep_emails/scriptexec/attachments/scriptexec.warnings delete mode 100644 .dev/revdep_emails/scriptexec/email-body delete mode 100644 .dev/revdep_emails/secuTrialR/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/secuTrialR/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/secuTrialR/email-body delete mode 100644 .dev/revdep_emails/semantic.dashboard/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/semantic.dashboard/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/semantic.dashboard/email-body delete mode 100644 .dev/revdep_emails/shiny.info/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/shiny.info/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/shiny.info/email-body delete mode 100644 .dev/revdep_emails/shiny.semantic/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/shiny.semantic/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/shiny.semantic/email-body delete mode 100644 .dev/revdep_emails/smerc/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/smerc/email-body delete mode 100644 .dev/revdep_emails/stencilaschema/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/stencilaschema/attachments/stencilaschema.warnings delete mode 100644 .dev/revdep_emails/stencilaschema/email-body delete mode 100644 .dev/revdep_emails/supernova/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/supernova/attachments/supernova.warnings delete mode 100644 .dev/revdep_emails/supernova/email-body delete mode 100644 .dev/revdep_emails/tsviz/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/tsviz/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/tsviz/attachments/tsviz.warnings delete mode 100644 .dev/revdep_emails/tsviz/email-body delete mode 100644 .dev/revdep_emails/tuber/attachments/tuber.failure delete mode 100644 .dev/revdep_emails/tuber/attachments/tuber.warnings delete mode 100644 .dev/revdep_emails/tuber/email-body delete mode 100644 .dev/revdep_emails/unifir/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/unifir/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/unifir/email-body delete mode 100644 .dev/revdep_emails/virustotal/email-body delete mode 100644 .dev/revdep_emails/wavefunction/email-body delete mode 100644 .dev/revdep_emails/xgboost/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/xgboost/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/xgboost/email-body diff --git a/.dev/revdep-no-repos b/.dev/revdep-no-repos deleted file mode 100644 index 708abff58..000000000 --- a/.dev/revdep-no-repos +++ /dev/null @@ -1,15 +0,0 @@ -package,repo -adaptalint,https://github.com/cran/adaptalint -admiral,https://github.com/cran/admiral -autoharp,https://github.com/cran/autoharp -aws.alexa,https://github.com/cran/aws.alexa -biolink,https://github.com/cran/biolink -ConNEcT,https://github.com/cran/ConNEcT -DataFakeR,https://github.com/cran/DataFakeR -datarobot,https://github.com/cran/datarobot -DominoDataCapture,https://github.com/cran/DominoDataCapture -NHSRplotthedots,https://github.com/cran/NHSRplotthedots -Plasmidprofiler,https://github.com/cran/Plasmidprofiler -SamplerCompare,https://github.com/cran/SamplerCompare -TDA,https://github.com/cran/TDA -wavefunction,https://github.com/cran/wavefunction diff --git a/.dev/revdep-repos b/.dev/revdep-repos deleted file mode 100644 index 1ff507d5e..000000000 --- a/.dev/revdep-repos +++ /dev/null @@ -1,79 +0,0 @@ -package,repo -BTYDplus,https://github.com/mplatzer/BTYDplus -BiasCorrector,https://github.com/kapsner/BiasCorrector -DBItest,https://github.com/r-dbi/DBItest -DepthProc,https://github.com/zzawadz/DepthProc -FSelectorRcpp,https://github.com/mi2-warsaw/FSelectorRcpp -OpenML,https://github.com/openml/openml-r -PWFSLSmoke,https://github.com/MazamaScience/PWFSLSmoke -PosteriorBootstrap,https://github.com/alan-turing-institute/PosteriorBootstrap -RSQL,https://github.com/rOpenStats/RSQL -RestRserve,https://github.com/rexyai/RestRserve -WikidataQueryServiceR,https://github.com/bearloga/WikidataQueryServiceR -WoodburyMatrix,https://github.com/mbertolacci/WoodburyMatrix -abbyyR,http://github.com/soodoku/abbyyR -babette,https://github.com/ropensci/babette -beautier,https://github.com/ropensci/beautier -caretEnsemble,https://github.com/zachmayer/caretEnsemble -cattonum,https://github.com/bfgray3/cattonum -cleaR,https://github.com/joundso/cleaR -cloudos,https://github.com/lifebit-ai/cloudos -connectwidgets,https://github.com/rstudio/connectwidgets -crunch,https://github.com/Crunch-io/rcrunch -dampack,https://github.com/DARTH-git/dampack -dashboardthemes,https://github.com/nik01010/dashboardthemes -dat,https://github.com/wahani/dat -datastructures,https://github.com/dirmeier/datastructures -describer,https://github.com/paulhendricks/describer -devtools,https://github.com/r-lib/devtools -diffusr,https://github.com/dirmeier/diffusr -dittodb,https://github.com/ropensci/dittodb -dupree,https://github.com/russHyde/dupree -edgarWebR,https://github.com/mwaldstein/edgarWebR -epigraphdb,https://github.com/MRCIEU/epigraphdb-r -fakemake,https://gitlab.com/fvafrcu/fakemake -fixtuRes,https://github.com/jakubnowicki/fixtuRes -fst,https://github.com/fstpackage/fst -geofacet,https://github.com/hafen/geofacet -geogrid,https://github.com/jbaileyh/geogrid -ggRandomForests,https://github.com/ehrlinger/ggRandomForests -ggcharts,https://github.com/thomas-neitmann/ggcharts -ggfortify,https://github.com/sinhrks/ggfortify -ggthemes,https://github.com/jrnold/ggthemes -healthcareai,https://github.com/HealthCatalyst/healthcareai-r -i18n,https://github.com/rich-iannone/i18n -jpmesh,https://github.com/uribo/jpmesh -languageserver,https://github.com/REditorSupport/languageserver -latrend,https://github.com/philips-software/latrend -lifecycle,https://github.com/r-lib/lifecycle -mlflow,https://github.com/mlflow/mlflow -mlr,https://github.com/mlr-org/mlr -mlrCPO,https://github.com/mlr-org/mlrCPO -modules,https://github.com/wahani/modules -nLTT,https://github.com/thijsjanzen/nLTT -newsmd,https://github.com/Dschaykib/newsmd -openbankeR,https://github.com/nik01010/openbankeR -osfr,https://github.com/ropensci/osfr -packager,https://gitlab.com/fvafrCU/packager -physiology,https://github.com/jackwasey/physiology -precommit,https://github.com/lorenzwalthert/precommit -prettyB,https://github.com/jumpingrivers/prettyB -rBiasCorrection,https://github.com/kapsner/rBiasCorrection -rasterpdf,https://github.com/ilarischeinin/rasterpdf -rbokeh,https://github.com/bokeh/rbokeh -rde,https://github.com/kloppen/rde -rnrfa,https://github.com/cvitolo/rnrfa -roadoi,https://github.com/ropensci/roadoi -scriptexec,https://github.com/sagiegurari/scriptexec -secuTrialR,https://github.com/SwissClinicalTrialOrganisation/secuTrialR -semantic.dashboard,https://github.com/Appsilon/semantic.dashboard -shiny.info,https://github.com/Appsilon/shiny.info -shiny.semantic,https://github.com/Appsilon/shiny.semantic -smerc,https://github.com/jfrench/smerc -stencilaschema,https://github.com/stencila/schema -supernova,https://github.com/UCLATALL/supernova -tsviz,https://github.com/donlelef/tsviz -tuber,http://github.com/soodoku/tuber -unifir,https://github.com/ropensci/unifir -virustotal,https://github.com/themains/virustotal -xgboost,https://github.com/dmlc/xgboost diff --git a/.dev/revdep_emails/BTYDplus/attachments/BTYDplus.warnings b/.dev/revdep_emails/BTYDplus/attachments/BTYDplus.warnings deleted file mode 100644 index 2043731ef..000000000 --- a/.dev/revdep_emails/BTYDplus/attachments/BTYDplus.warnings +++ /dev/null @@ -1,2 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Trying to remove β€˜multiple_dots_linter’ and β€˜camel_case_linter’, which are not in `defaults`. diff --git a/.dev/revdep_emails/BTYDplus/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/BTYDplus/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index ec2a8edb8..000000000 --- a/.dev/revdep_emails/BTYDplus/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,11 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/helpers.R",72,13,"style","Variable and function name style should be snake_case."," elog_dt[, N := .N, by = ""cust""]","object_name_linter" -"R/helpers.R",399,26,"style","Variable and function name style should be snake_case."," grid <- grid[is.na(N), N := 0L]","object_name_linter" -"tests/testthat/test-bg-cnbd-k.R",76,7,"style","Variable and function name style should be snake_case."," cbs$x.est32 <- bgcnbd.ConditionalExpectedTransactions(params, 32, cbs$x, cbs$t.x, cbs$T.cal)","object_name_linter" -"tests/testthat/test-bg-cnbd-k.R",77,7,"style","Variable and function name style should be snake_case."," cbs$x.est64 <- bgcnbd.ConditionalExpectedTransactions(params, 64, cbs$x, cbs$t.x, cbs$T.cal)","object_name_linter" -"tests/testthat/test-mbg-cnbd-k.R",28,7,"style","Variable and function name style should be snake_case."," cbs$x.est <- mbgcnbd.ConditionalExpectedTransactions(params, cbs$T.star, cbs$x, cbs$t.x, cbs$T.cal)","object_name_linter" -"tests/testthat/test-mbg-cnbd-k.R",67,9,"style","Variable and function name style should be snake_case."," cbs$x.est <- mbgcnbd.ConditionalExpectedTransactions(params, cbs$T.star, cbs$x, cbs$t.x, cbs$T.cal)","object_name_linter" -"tests/testthat/test-nbd.R",18,7,"style","Variable and function name style should be snake_case."," cbs$x.est <- nbd.ConditionalExpectedTransactions(params, cbs$T.star, cbs$x, cbs$T.cal)","object_name_linter" -"tests/testthat/test-pareto-ggg-mcmc.R",49,7,"style","Variable and function name style should be snake_case."," cbs$x.est <- apply(xstar, 2, mean)","object_name_linter" -"tests/testthat/test-pareto-nbd-abe.R",76,7,"style","Variable and function name style should be snake_case."," cbs$x.est <- apply(xstar, 2, mean)","object_name_linter" -"tests/testthat/test-pareto-nbd-mcmc.R",79,7,"style","Variable and function name style should be snake_case."," cbs$x.est <- apply(xstar, 2, mean)","object_name_linter" diff --git a/.dev/revdep_emails/BTYDplus/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/BTYDplus/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index fb5385eb6..000000000 --- a/.dev/revdep_emails/BTYDplus/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,227 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"demo/cdnow.R",3,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog <- read.csv(system.file(""data/cdnowElog.csv"", package = ""BTYD""),","object_name_linter" -"demo/cdnow.R",6,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog$date <- as.Date(as.character(cdnowElog$date), format = ""%Y%m%d"")","object_name_linter" -"demo/cdnow.R",22,2,"style","Variable and function name style should be snake_case or symbols.","(params.nbd <- nbd.EstimateParameters(cbs))","object_name_linter" -"demo/cdnow.R",38,2,"style","Variable and function name style should be snake_case or symbols.","(params.mbgcnbd <- mbgcnbd.EstimateParameters(cbs))","object_name_linter" -"demo/cdnow.R",65,1,"style","Variable and function name style should be snake_case or symbols.","params.pnbd <- BTYD::pnbd.EstimateParameters(cbs) # estimate Pareto/NBD","object_name_linter" -"demo/cdnow.R",66,1,"style","Variable and function name style should be snake_case or symbols.","params.bgcnbd <- bgcnbd.EstimateParameters(cbs) # estimate BG/CNBD-k","object_name_linter" -"demo/cdnow.R",111,33,"style","Put spaces around all infix operators."," ""BIAS"" = function(a, f) sum(f)/sum(a) - 1)","infix_spaces_linter" -"demo/cdnow.R",137,1,"style","Variable and function name style should be snake_case or symbols.","spend.params <- BTYD::spend.EstimateParameters(cbs$sales.avg, cbs$x + 1)","object_name_linter" -"demo/mbg-cnbd-k.R",14,2,"style","Variable and function name style should be snake_case or symbols.","(k.est <- estimateRegularity(groceryElog))","object_name_linter" -"demo/mbg-cnbd-k.R",24,2,"style","Variable and function name style should be snake_case or symbols.","(params.mbgcnbd <- mbgcnbd.EstimateParameters(cbs))","object_name_linter" -"demo/mbg-cnbd-k.R",51,1,"style","Variable and function name style should be snake_case or symbols.","params.nbd <- nbd.EstimateParameters(cbs) # estimate NBD","object_name_linter" -"demo/mbg-cnbd-k.R",52,1,"style","Variable and function name style should be snake_case or symbols.","params.pnbd <- BTYD::pnbd.EstimateParameters(cbs) # estimate Pareto/NBD","object_name_linter" -"demo/mbg-cnbd-k.R",53,1,"style","Variable and function name style should be snake_case or symbols.","params.bgnbd <- BTYD::bgnbd.EstimateParameters(cbs) # estimate BG/NBD","object_name_linter" -"demo/mbg-cnbd-k.R",54,1,"style","Variable and function name style should be snake_case or symbols.","params.mbgnbd <- mbgnbd.EstimateParameters(cbs) # estimate MBG/NBD","object_name_linter" -"demo/mbg-cnbd-k.R",79,33,"style","Put spaces around all infix operators."," ""BIAS"" = function(a, f) sum(f)/sum(a) - 1)","infix_spaces_linter" -"demo/mbg-cnbd-k.R",107,1,"style","Variable and function name style should be snake_case or symbols.","T.tot <- max(cbs$T.cal+cbs$T.star)","object_name_linter" -"demo/mbg-cnbd-k.R",107,23,"style","Put spaces around all infix operators.","T.tot <- max(cbs$T.cal+cbs$T.star)","infix_spaces_linter" -"demo/pareto-abe.R",3,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog <- read.csv(system.file(""data/cdnowElog.csv"", package = ""BTYD""),","object_name_linter" -"demo/pareto-abe.R",6,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog$date <- as.Date(as.character(cdnowElog$date), format = ""%Y%m%d"")","object_name_linter" -"demo/pareto-abe.R",18,1,"style","Variable and function name style should be snake_case or symbols.","draws.m1 <- abe.mcmc.DrawParameters(","object_name_linter" -"demo/pareto-abe.R",34,1,"style","Variable and function name style should be snake_case or symbols.","draws.m2 <- abe.mcmc.DrawParameters(","object_name_linter" -"demo/pareto-abe.R",52,1,"style","Variable and function name style should be snake_case or symbols.","xstar.m1.draws <- mcmc.DrawFutureTransactions(cbs, draws.m1, T.star = cbs$T.star)","object_name_linter" -"demo/pareto-abe.R",53,1,"style","Variable and function name style should be snake_case or symbols.","xstar.m2.draws <- mcmc.DrawFutureTransactions(cbs, draws.m2, T.star = cbs$T.star)","object_name_linter" -"demo/pareto-ggg.R",16,1,"style","Variable and function name style should be snake_case or symbols.","pnbd.draws <- pnbd.mcmc.DrawParameters(cal.cbs = cbs, mc.cores = 1)","object_name_linter" -"demo/pareto-ggg.R",20,1,"style","Variable and function name style should be snake_case or symbols.","pggg.draws <- pggg.mcmc.DrawParameters(cal.cbs = cbs,","object_name_linter" -"demo/pareto-ggg.R",24,25,"style","Put spaces around all infix operators.","round(rbind(`Pareto/GGG`= summary(pggg.draws$level_2)$quantiles[, ""50%""],","infix_spaces_linter" -"demo/pareto-ggg.R",41,1,"style","Variable and function name style should be snake_case or symbols.","xstar.pnbd.draws <- mcmc.DrawFutureTransactions(cbs, pnbd.draws, T.star = cbs$T.star, sample_size = 400)","object_name_linter" -"demo/pareto-ggg.R",42,1,"style","Variable and function name style should be snake_case or symbols.","xstar.pggg.draws <- mcmc.DrawFutureTransactions(cbs, pggg.draws, T.star = cbs$T.star, sample_size = 400)","object_name_linter" -"demo/pareto-ggg.R",59,20,"style","Put spaces around all infix operators.","(lift <- 1 - mae[1]/mae[2])","infix_spaces_linter" -"R/helpers.R",58,32,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!""date"" %in% names(elog) & !""t"" %in% names(elog))","vector_logic_linter" -"R/helpers.R",179,3,"style","Variable and function name style should be snake_case or symbols."," T.0 <- min(elog_dt$t)","object_name_linter" -"R/helpers.R",181,5,"style","Variable and function name style should be snake_case or symbols."," T.cal <- max(elog_dt$t)","object_name_linter" -"R/helpers.R",183,5,"style","Variable and function name style should be snake_case or symbols."," T.cal <- as.numeric(as.Date(T.cal))","object_name_linter" -"R/helpers.R",186,5,"style","Variable and function name style should be snake_case or symbols."," T.tot <- max(elog_dt$t)","object_name_linter" -"R/helpers.R",188,5,"style","Variable and function name style should be snake_case or symbols."," T.tot <- as.numeric(as.Date(T.tot))","object_name_linter" -"R/helpers.R",293,32,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (""sales"" %in% names(elog) & !is.numeric(elog$sales)) stop(""`sales` field must be numeric"")","vector_logic_linter" -"R/helpers.R",295,23,"style","Variable and function name style should be snake_case or symbols."," if (is.null(T.cal)) T.cal <- max(elog$date)","object_name_linter" -"R/helpers.R",296,23,"style","Variable and function name style should be snake_case or symbols."," if (is.null(T.tot)) T.tot <- max(elog$date)","object_name_linter" -"R/helpers.R",297,28,"style","Variable and function name style should be snake_case or symbols."," if (is.character(T.cal)) T.cal <- if (class(elog$date)[1] == ""Date"") as.Date(T.cal) else as.POSIXct(T.cal)","object_name_linter" -"R/helpers.R",298,28,"style","Variable and function name style should be snake_case or symbols."," if (is.character(T.tot)) T.tot <- if (class(elog$date)[1] == ""Date"") as.Date(T.tot) else as.POSIXct(T.tot)","object_name_linter" -"R/helpers.R",299,22,"style","Variable and function name style should be snake_case or symbols."," if (T.tot < T.cal) T.tot <- T.cal","object_name_linter" -"R/helpers.R",460,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(legend) & length(legend) == 2) {","vector_logic_linter" -"R/helpers.R",475,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(x) != length(actual) | length(x) != length(expected) |","vector_logic_linter" -"R/helpers.R",475,67,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(x) != length(actual) | length(x) != length(expected) |","vector_logic_linter" -"R/helpers.R",476,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !is.numeric(x) | !is.numeric(actual) | !is.numeric(expected) |","vector_logic_linter" -"R/helpers.R",476,44,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !is.numeric(x) | !is.numeric(actual) | !is.numeric(expected) |","vector_logic_linter" -"R/helpers.R",476,68,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !is.numeric(x) | !is.numeric(actual) | !is.numeric(expected) |","vector_logic_linter" -"R/helpers.R",477,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," any(x < 0) | any(actual < 0) | any(expected < 0))","vector_logic_linter" -"R/helpers.R",477,36,"warning","Conditional expressions require scalar logical operators (&& and ||)"," any(x < 0) | any(actual < 0) | any(expected < 0))","vector_logic_linter" -"R/helpers.R",488,3,"style","Variable and function name style should be snake_case or symbols."," col.names <- paste(rep(""freq"", length(censor + 1)), (0:censor), sep = ""."")","object_name_linter" -"R/helpers.R",489,3,"style","Variable and function name style should be snake_case or symbols."," col.names[censor + 1] <- paste0(col.names[censor + 1], ""+"")","object_name_linter" -"R/helpers.R",496,7,"style","Variable and function name style should be snake_case or symbols."," x.labels[censor + 1] <- paste0(censor, ""+"")","object_name_linter" -"R/helpers.R",518,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(t.x) != length(actual) | length(t.x) != length(expected) |","vector_logic_linter" -"R/helpers.R",518,71,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(t.x) != length(actual) | length(t.x) != length(expected) |","vector_logic_linter" -"R/helpers.R",519,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !is.numeric(t.x) | !is.numeric(actual) | !is.numeric(expected) |","vector_logic_linter" -"R/helpers.R",519,46,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !is.numeric(t.x) | !is.numeric(actual) | !is.numeric(expected) |","vector_logic_linter" -"R/helpers.R",519,70,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !is.numeric(t.x) | !is.numeric(actual) | !is.numeric(expected) |","vector_logic_linter" -"R/helpers.R",520,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," any(t.x < 0) | any(actual < 0) | any(expected < 0))","vector_logic_linter" -"R/helpers.R",520,38,"warning","Conditional expressions require scalar logical operators (&& and ||)"," any(t.x < 0) | any(actual < 0) | any(expected < 0))","vector_logic_linter" -"R/mbg-cnbd-k.R",78,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(k) & !""litt"" %in% colnames(cal.cbs))","vector_logic_linter" -"R/mbg-cnbd-k.R",96,7,"style","Variable and function name style should be snake_case or symbols."," LL[k] <- xbgcnbd.cbs.LL(params = params[[k]], cal.cbs = cal.cbs, dropout_at_zero = dropout_at_zero)","object_name_linter" -"R/mbg-cnbd-k.R",107,5,"style","Variable and function name style should be snake_case or symbols."," cal.cbs[, ""litt""] <- 0","object_name_linter" -"R/mbg-cnbd-k.R",116,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (trace > 0 & count %% trace == 0) {","vector_logic_linter" -"R/mbg-cnbd-k.R",129,3,"style","Variable and function name style should be snake_case or symbols."," estimated.params[estimated.params > max.param.value] <- max.param.value","object_name_linter" -"R/mbg-cnbd-k.R",131,9,"style","Variable and function name style should be snake_case or symbols."," names(estimated.params) <- c(""k"", ""r"", ""alpha"", ""a"", ""b"")","object_name_linter" -"R/mbg-cnbd-k.R",191,12,"style","Variable and function name style should be snake_case or symbols."," tryCatch(T.cal <- cal.cbs$T.cal,","object_name_linter" -"R/mbg-cnbd-k.R",194,13,"style","Any function spanning multiple lines should use curly braces."," error = function(e) stop(""cal.cbs must have a column for "",","brace_linter" -"R/mbg-cnbd-k.R",204,3,"style","Variable and function name style should be snake_case or symbols."," max.length <- max(length(x), length(t.x), length(T.cal))","object_name_linter" -"R/mbg-cnbd-k.R",214,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (params[1] != floor(params[1]) | params[1] < 1)","vector_logic_linter" -"R/mbg-cnbd-k.R",224,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = max.length)","object_name_linter" -"R/mbg-cnbd-k.R",293,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (params[1] != floor(params[1]) | params[1] < 1)","vector_logic_linter" -"R/mbg-cnbd-k.R",412,3,"style","Variable and function name style should be snake_case or symbols."," max.length <- max(length(x), length(t.x), length(T.cal))","object_name_linter" -"R/mbg-cnbd-k.R",420,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (params[1] != floor(params[1]) | params[1] < 1)","vector_logic_linter" -"R/mbg-cnbd-k.R",430,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = max.length)","object_name_linter" -"R/mbg-cnbd-k.R",501,3,"style","Variable and function name style should be snake_case or symbols."," max.length <- max(length(T.star), length(x), length(t.x), length(T.cal))","object_name_linter" -"R/mbg-cnbd-k.R",511,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (params[1] != floor(params[1]) | params[1] < 1)","vector_logic_linter" -"R/mbg-cnbd-k.R",523,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = max.length)","object_name_linter" -"R/mbg-cnbd-k.R",524,3,"style","Variable and function name style should be snake_case or symbols."," T.star <- rep(T.star, length.out = max.length)","object_name_linter" -"R/mbg-cnbd-k.R",565,5,"style","Variable and function name style should be snake_case or symbols."," sum.cal <- sum(xbgcnbd.Expectation(params = params, t = T.cal, dropout_at_zero = dropout_at_zero))","object_name_linter" -"R/mbg-cnbd-k.R",566,5,"style","Variable and function name style should be snake_case or symbols."," sum.tot <- sum(xbgcnbd.Expectation(params = params, t = T.cal + T.star, dropout_at_zero = dropout_at_zero))","object_name_linter" -"R/mbg-cnbd-k.R",628,12,"style","Variable and function name style should be snake_case or symbols."," tryCatch(T.cal <- cal.cbs$T.cal,","object_name_linter" -"R/mbg-cnbd-k.R",1016,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (params[1] != floor(params[1]) | params[1] < 1)","vector_logic_linter" -"R/mbg-cnbd-k.R",1027,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = n)","object_name_linter" -"R/mbg-cnbd-k.R",1028,3,"style","Variable and function name style should be snake_case or symbols."," T.zero <- T.cal.fix - T.cal","object_name_linter" -"R/mbg-cnbd-k.R",1029,3,"style","Variable and function name style should be snake_case or symbols."," date.zero <- as.POSIXct(date.zero)","object_name_linter" -"R/mbg-cnbd-k.R",1058,3,"style","Variable and function name style should be snake_case or symbols."," date.cal <- date.zero + T.cal.fix * 3600 * 24 * 7","object_name_linter" -"R/mbg-cnbd-k.R",1059,3,"style","Variable and function name style should be snake_case or symbols."," date.tot <- date.cal + T.star * 3600 * 24 * 7","object_name_linter" -"R/mcmc.R",67,5,"style","Variable and function name style should be snake_case or symbols."," T.star <- rep(T.star, nr_of_cust)","object_name_linter" -"R/mcmc.R",109,7,"style","Variable and function name style should be snake_case or symbols."," x.stars[draw, cust] <- sum(cumsum(itts) < minT)","object_name_linter" -"R/mcmc.R",114,7,"style","Variable and function name style should be snake_case or symbols."," x.stars[!alive, cust] <- 0","object_name_linter" -"R/mcmc.R",154,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (burnin < start(draws$level_2) | burnin > end(draws$level_2))","vector_logic_linter" -"R/mcmc.R",183,86,"style","Use FALSE instead of the symbol F."," plot(spls.x, spls.y, typ = ""b"", xlim = c(0, 1), ylim = c(0, 1), frame = 0, axes = F,","T_and_F_symbol_linter" -"R/mcmc.R",364,11,"style","Variable and function name style should be snake_case or symbols."," names(uEs) <- unique(t)","object_name_linter" -"R/nbd.R",30,3,"style","Variable and function name style should be snake_case or symbols."," estimated.params[estimated.params > max.param.value] <- max.param.value","object_name_linter" -"R/nbd.R",31,9,"style","Variable and function name style should be snake_case or symbols."," names(estimated.params) <- c(""r"", ""alpha"")","object_name_linter" -"R/nbd.R",53,12,"style","Variable and function name style should be snake_case or symbols."," tryCatch(T.cal <- cal.cbs$T.cal,","object_name_linter" -"R/nbd.R",70,3,"style","Variable and function name style should be snake_case or symbols."," max.length <- max(length(x), length(T.cal))","object_name_linter" -"R/nbd.R",81,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = max.length)","object_name_linter" -"R/nbd.R",116,3,"style","Variable and function name style should be snake_case or symbols."," max.length <- max(length(T.star), length(x), length(T.cal))","object_name_linter" -"R/nbd.R",130,3,"style","Variable and function name style should be snake_case or symbols."," T.star <- rep(T.star, length.out = max.length)","object_name_linter" -"R/nbd.R",132,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = max.length)","object_name_linter" -"R/nbd.R",164,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = n)","object_name_linter" -"R/nbd.R",165,3,"style","Variable and function name style should be snake_case or symbols."," T.zero <- T.cal.fix - T.cal","object_name_linter" -"R/nbd.R",166,3,"style","Variable and function name style should be snake_case or symbols."," date.zero <- as.POSIXct(date.zero)","object_name_linter" -"R/nbd.R",188,3,"style","Variable and function name style should be snake_case or symbols."," date.cal <- date.zero + T.cal.fix * 3600 * 24 * 7","object_name_linter" -"R/nbd.R",189,3,"style","Variable and function name style should be snake_case or symbols."," date.tot <- date.cal + T.star * 3600 * 24 * 7","object_name_linter" -"R/pareto-ggg-mcmc.R",300,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = n)","object_name_linter" -"R/pareto-ggg-mcmc.R",301,3,"style","Variable and function name style should be snake_case or symbols."," T.zero <- T.cal.fix - T.cal","object_name_linter" -"R/pareto-ggg-mcmc.R",302,3,"style","Variable and function name style should be snake_case or symbols."," date.zero <- as.POSIXct(date.zero)","object_name_linter" -"R/pareto-ggg-mcmc.R",348,3,"style","Variable and function name style should be snake_case or symbols."," date.cal <- date.zero + T.cal.fix * 3600 * 24 * 7","object_name_linter" -"R/pareto-ggg-mcmc.R",349,3,"style","Variable and function name style should be snake_case or symbols."," date.tot <- date.cal + T.star * 3600 * 24 * 7","object_name_linter" -"R/pareto-nbd-abe.R",228,3,"style","Variable and function name style should be snake_case or symbols."," cal.cbs[, ""intercept""] <- 1","object_name_linter" -"R/pareto-nbd-abe.R",283,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = n)","object_name_linter" -"R/pareto-nbd-abe.R",284,3,"style","Variable and function name style should be snake_case or symbols."," T.zero <- T.cal.fix - T.cal","object_name_linter" -"R/pareto-nbd-abe.R",285,3,"style","Variable and function name style should be snake_case or symbols."," date.zero <- as.POSIXct(date.zero)","object_name_linter" -"R/pareto-nbd-abe.R",297,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(colnames(covars)) & ncol(covars) > 1)","vector_logic_linter" -"R/pareto-nbd-abe.R",340,3,"style","Variable and function name style should be snake_case or symbols."," date.cal <- date.zero + T.cal.fix * 3600 * 24 * 7","object_name_linter" -"R/pareto-nbd-abe.R",341,3,"style","Variable and function name style should be snake_case or symbols."," date.tot <- date.cal + T.star * 3600 * 24 * 7","object_name_linter" -"R/pareto-nbd-mcmc.R",74,5,"style","Variable and function name style should be snake_case or symbols."," T.cal <- data$T.cal","object_name_linter" -"tests/testthat/test-bg-cnbd-k.R",9,3,"style","Variable and function name style should be snake_case or symbols."," date.zero <- ""2010-01-01""","object_name_linter" -"tests/testthat/test-elog2cbs.R",11,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- Sys.Date() + 21","object_name_linter" -"tests/testthat/test-elog2cbs.R",12,3,"style","Variable and function name style should be snake_case or symbols."," T.tot <- Sys.Date() + 30","object_name_linter" -"tests/testthat/test-pareto-nbd-abe.R",67,52,"style","Use TRUE instead of the symbol T."," expect_equal(matrix(est[1:6], ncol = 2, byrow = T), params$beta, tolerance = 0.05)","T_and_F_symbol_linter" -"tests/testthat/test-pareto-nbd-mcmc.R",8,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- c(26, 26, 28.5, 52, 52)","object_name_linter" -"tests/testthat/test-pareto-nbd-mcmc.R",9,3,"style","Variable and function name style should be snake_case or symbols."," T.star <- 52","object_name_linter" -"tests/testthat/test-pareto-nbd-mcmc.R",10,3,"style","Variable and function name style should be snake_case or symbols."," date.zero <- ""2010-01-01""","object_name_linter" -"tests/testthat/test-pareto-nbd-mcmc.R",24,3,"style","Variable and function name style should be snake_case or symbols."," date.zero <- min(sim_elog$date)","object_name_linter" -"tests/testthat/test-pareto-nbd-mcmc.R",40,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(52, n)","object_name_linter" -"tests/testthat/test-pareto-nbd-mcmc.R",43,3,"style","Variable and function name style should be snake_case or symbols."," T.cal[n] <- 52","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",76,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog <- read.csv(system.file(""data/cdnowElog.csv"", package = ""BTYD""),","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",79,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog$date <- as.Date(as.character(cdnowElog$date), format = ""%Y%m%d"")","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",132,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS <- elog2cbs(groceryElog, T.cal = ""2006-12-31"")","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",145,2,"style","Variable and function name style should be snake_case or symbols.","(k.wheat <- estimateRegularity(groceryElog, method = ""wheat"", ","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",145,62,"style","Trailing whitespace is superfluous.","(k.wheat <- estimateRegularity(groceryElog, method = ""wheat"", ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",147,2,"style","Variable and function name style should be snake_case or symbols.","(k.mle <- estimateRegularity(groceryElog, method = ""mle"", ","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",147,58,"style","Trailing whitespace is superfluous.","(k.mle <- estimateRegularity(groceryElog, method = ""mle"", ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",168,3,"style","Variable and function name style should be snake_case or symbols."," groceryCBS <- elog2cbs(groceryElog, T.cal = ""2006-12-31"")","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",171,7,"style","Variable and function name style should be snake_case or symbols.","round(params.nbd <- nbd.EstimateParameters(groceryCBS), 3)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",181,62,"style","Trailing whitespace is superfluous.","# calculate expected future transactions for customers who've ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",183,1,"style","Variable and function name style should be snake_case or symbols.","est5.nbd <- nbd.ConditionalExpectedTransactions(params.nbd, ","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",183,60,"style","Trailing whitespace is superfluous.","est5.nbd <- nbd.ConditionalExpectedTransactions(params.nbd, ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",192,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$xstar.nbd <- nbd.ConditionalExpectedTransactions(","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",193,54,"style","Trailing whitespace is superfluous."," params = params.nbd, T.star = 52, ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",196,57,"style","Trailing whitespace is superfluous.","rbind(`Actuals` = c(`Holdout` = sum(groceryCBS$x.star)), ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",212,3,"style","Variable and function name style should be snake_case or symbols."," groceryCBS <- elog2cbs(groceryElog, T.cal = ""2006-12-31"")","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",215,1,"style","Variable and function name style should be snake_case or symbols.","params.pnbd <- BTYD::pnbd.EstimateParameters(groceryCBS[, c(""x"", ""t.x"", ""T.cal"")])","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",216,7,"style","Variable and function name style should be snake_case or symbols.","names(params.pnbd) <- c(""r"", ""alpha"", ""s"", ""beta"")","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",227,62,"style","Trailing whitespace is superfluous.","# calculate expected future transactions for customers who've ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",230,1,"style","Variable and function name style should be snake_case or symbols.","est5.pnbd <- BTYD::pnbd.ConditionalExpectedTransactions(params.pnbd, ","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",230,69,"style","Trailing whitespace is superfluous.","est5.pnbd <- BTYD::pnbd.ConditionalExpectedTransactions(params.pnbd, ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",239,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$xstar.pnbd <- BTYD::pnbd.ConditionalExpectedTransactions(","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",240,56,"style","Trailing whitespace is superfluous."," params = params.pnbd, T.star = 52, ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",244,60,"style","Trailing whitespace is superfluous.","rbind(`Actuals` = c(`Holdout` = sum(groceryCBS$x.star)), ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",251,65,"style","Trailing whitespace is superfluous.","# P(alive) for customers who've had 1 to 5 transactions in first ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",253,1,"style","Variable and function name style should be snake_case or symbols.","palive.pnbd <- BTYD::pnbd.PAlive(params.pnbd, ","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",253,46,"style","Trailing whitespace is superfluous.","palive.pnbd <- BTYD::pnbd.PAlive(params.pnbd, ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",256,45,"style","Put spaces around all infix operators."," cat(""x ="", i, "":"", sprintf(""%5.2f %%"", 100*palive.pnbd[i]), ""\n"")","infix_spaces_linter" -"vignettes/BTYDplus-HowTo.Rmd",270,3,"style","Variable and function name style should be snake_case or symbols."," groceryCBS <- elog2cbs(groceryElog, T.cal = ""2006-12-31"")","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",273,1,"style","Variable and function name style should be snake_case or symbols.","params.bgnbd <- BTYD::bgnbd.EstimateParameters(groceryCBS) # BG/NBD","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",273,64,"style","Commented code should be removed.","params.bgnbd <- BTYD::bgnbd.EstimateParameters(groceryCBS) # BG/NBD","commented_code_linter" -"vignettes/BTYDplus-HowTo.Rmd",274,1,"style","Variable and function name style should be snake_case or symbols.","params.bgcnbd <- bgcnbd.EstimateParameters(groceryCBS) # BG/CNBD-k","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",274,64,"style","Commented code should be removed.","params.bgcnbd <- bgcnbd.EstimateParameters(groceryCBS) # BG/CNBD-k","commented_code_linter" -"vignettes/BTYDplus-HowTo.Rmd",275,1,"style","Variable and function name style should be snake_case or symbols.","params.mbgnbd <- mbgnbd.EstimateParameters(groceryCBS) # MBG/NBD","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",275,64,"style","Commented code should be removed.","params.mbgnbd <- mbgnbd.EstimateParameters(groceryCBS) # MBG/NBD","commented_code_linter" -"vignettes/BTYDplus-HowTo.Rmd",276,1,"style","Variable and function name style should be snake_case or symbols.","params.mbgcnbd <- mbgcnbd.EstimateParameters(groceryCBS) # MBG/CNBD-k","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",276,64,"style","Commented code should be removed.","params.mbgcnbd <- mbgcnbd.EstimateParameters(groceryCBS) # MBG/CNBD-k","commented_code_linter" -"vignettes/BTYDplus-HowTo.Rmd",277,25,"style","Variable and function name style should be snake_case or symbols.","row <- function(params, LL) { ","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",277,30,"style","Trailing whitespace is superfluous.","row <- function(params, LL) { ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",281,45,"style","Trailing whitespace is superfluous.","rbind(`BG/NBD` = row(c(1, params.bgnbd), ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",283,40,"style","Trailing whitespace is superfluous."," `BG/CNBD-k` = row(params.bgcnbd, ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",285,40,"style","Trailing whitespace is superfluous."," `MBG/NBD` = row(params.mbgnbd, ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",287,41,"style","Trailing whitespace is superfluous."," `MBG/CNBD-k` = row(params.mbgcnbd, ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",294,62,"style","Trailing whitespace is superfluous.","# calculate expected future transactions for customers who've ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",297,1,"style","Variable and function name style should be snake_case or symbols.","est5.mbgcnbd <- mbgcnbd.ConditionalExpectedTransactions(params.mbgcnbd,","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",305,65,"style","Trailing whitespace is superfluous.","# P(alive) for customers who've had 1 to 5 transactions in first ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",307,1,"style","Variable and function name style should be snake_case or symbols.","palive.mbgcnbd <- mbgcnbd.PAlive(params.mbgcnbd, ","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",307,49,"style","Trailing whitespace is superfluous.","palive.mbgcnbd <- mbgcnbd.PAlive(params.mbgcnbd, ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",310,45,"style","Put spaces around all infix operators."," cat(""x ="", i, "":"", sprintf(""%5.2f %%"", 100*palive.mbgcnbd[i]), ""\n"")","infix_spaces_linter" -"vignettes/BTYDplus-HowTo.Rmd",318,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$xstar.mbgcnbd <- mbgcnbd.ConditionalExpectedTransactions(","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",320,64,"style","Trailing whitespace is superfluous."," x = groceryCBS$x, t.x = groceryCBS$t.x, ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",342,24,"style","Put spaces around all infix operators."," stopifnot(length(act)==length(est))","infix_spaces_linter" -"vignettes/BTYDplus-HowTo.Rmd",343,14,"style","Put spaces around all infix operators."," sum(abs(act-est)) / length(act)","infix_spaces_linter" -"vignettes/BTYDplus-HowTo.Rmd",345,1,"style","Variable and function name style should be snake_case or symbols.","mae.nbd <- mae(groceryCBS$x.star, groceryCBS$xstar.nbd)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",346,1,"style","Variable and function name style should be snake_case or symbols.","mae.pnbd <- mae(groceryCBS$x.star, groceryCBS$xstar.pnbd)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",347,1,"style","Variable and function name style should be snake_case or symbols.","mae.mbgcnbd <- mae(groceryCBS$x.star, groceryCBS$xstar.mbgcnbd)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",352,60,"style","Put spaces around all infix operators.","cat(""Lift in MAE for MBG/CNBD-k vs. Pareto/NBD:"", round(100*lift, 1), ""%"")","infix_spaces_linter" -"vignettes/BTYDplus-HowTo.Rmd",372,3,"style","Variable and function name style should be snake_case or symbols."," groceryCBS <- elog2cbs(groceryElog, T.cal = ""2006-12-31"")","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",375,1,"style","Variable and function name style should be snake_case or symbols.","pnbd.draws <- pnbd.mcmc.DrawParameters(groceryCBS)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",377,1,"style","Variable and function name style should be snake_case or symbols.","pnbd.xstar.draws <- mcmc.DrawFutureTransactions(groceryCBS, pnbd.draws)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",379,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$xstar.pnbd.hb <- apply(pnbd.xstar.draws, 2, mean)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",380,3,"style","Commented code should be removed.","# P(active)","commented_code_linter" -"vignettes/BTYDplus-HowTo.Rmd",381,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$pactive.pnbd.hb <- mcmc.PActive(pnbd.xstar.draws)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",382,3,"style","Commented code should be removed.","# P(alive)","commented_code_linter" -"vignettes/BTYDplus-HowTo.Rmd",383,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$palive.pnbd.hb <- mcmc.PAlive(pnbd.draws)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",397,68,"style","Trailing whitespace is superfluous.","# convert cohort-level draws from coda::mcmc.list to a matrix, with ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",399,1,"style","Variable and function name style should be snake_case or symbols.","cohort.draws <- pnbd.draws$level_2","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",428,1,"style","Variable and function name style should be snake_case or symbols.","customer4.draws <- pnbd.draws$level_1[[customer4]]","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",463,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog <- read.csv(","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",467,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog$date <- as.Date(as.character(cdnowElog$date), ","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",467,56,"style","Trailing whitespace is superfluous.","cdnowElog$date <- as.Date(as.character(cdnowElog$date), ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",470,1,"style","Variable and function name style should be snake_case or symbols.","cdnowCbs <- elog2cbs(cdnowElog, ","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",470,32,"style","Trailing whitespace is superfluous.","cdnowCbs <- elog2cbs(cdnowElog, ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",474,1,"style","Variable and function name style should be snake_case or symbols.","draws.m1 <- abe.mcmc.DrawParameters(cdnowCbs, ","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",474,46,"style","Trailing whitespace is superfluous.","draws.m1 <- abe.mcmc.DrawParameters(cdnowCbs, ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",488,1,"style","Variable and function name style should be snake_case or symbols.","cdnowCbs <- merge(cdnowCbs, first, by = ""cust"")","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",491,1,"style","Variable and function name style should be snake_case or symbols.","draws.m2 <- abe.mcmc.DrawParameters(cdnowCbs, ","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",491,46,"style","Trailing whitespace is superfluous.","draws.m2 <- abe.mcmc.DrawParameters(cdnowCbs, ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",518,3,"style","Variable and function name style should be snake_case or symbols."," groceryCBS <- elog2cbs(groceryElog, T.cal = ""2006-12-31"")","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",521,1,"style","Variable and function name style should be snake_case or symbols.","pggg.draws <- pggg.mcmc.DrawParameters(groceryCBS) # ~2mins on 2015 MacBook Pro","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",523,1,"style","Variable and function name style should be snake_case or symbols.","pggg.xstar.draws <- mcmc.DrawFutureTransactions(groceryCBS, pggg.draws)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",525,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$xstar.pggg <- apply(pggg.xstar.draws, 2, mean)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",526,3,"style","Commented code should be removed.","# P(active)","commented_code_linter" -"vignettes/BTYDplus-HowTo.Rmd",527,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$pactive.pggg <- mcmc.PActive(pggg.xstar.draws)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",528,3,"style","Commented code should be removed.","# P(alive)","commented_code_linter" -"vignettes/BTYDplus-HowTo.Rmd",529,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$palive.pggg <- mcmc.PAlive(pggg.draws)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",531,42,"style","Trailing whitespace is superfluous.","head(groceryCBS[, c(""x"", ""t.x"", ""x.star"", ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",543,39,"style","Trailing whitespace is superfluous.","#> t gamma r alpha s beta ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",544,39,"style","Trailing whitespace is superfluous.","#> 1.695 0.373 0.948 5.243 0.432 4.348 ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",550,36,"style","Trailing whitespace is superfluous.","#> k lambda mu tau z ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",551,37,"style","Trailing whitespace is superfluous.","#> 3.892 0.160 0.065 69.546 0.316 ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",572,24,"style","Put spaces around all infix operators."," stopifnot(length(act)==length(est))","infix_spaces_linter" -"vignettes/BTYDplus-HowTo.Rmd",573,14,"style","Put spaces around all infix operators."," sum(abs(act-est)) / length(act)","infix_spaces_linter" -"vignettes/BTYDplus-HowTo.Rmd",575,1,"style","Variable and function name style should be snake_case or symbols.","mae.pggg <- mae(groceryCBS$x.star, groceryCBS$xstar.pggg)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",576,1,"style","Variable and function name style should be snake_case or symbols.","mae.mbgcnbd <- mae(groceryCBS$x.star, groceryCBS$xstar.mbgcnbd)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",577,1,"style","Variable and function name style should be snake_case or symbols.","mae.pnbd.hb <- mae(groceryCBS$x.star, groceryCBS$xstar.pnbd.hb)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",587,30,"style","Put spaces around all infix operators.","cat(""Lift in MAE:"", round(100*lift, 1), ""%"")","infix_spaces_linter" diff --git a/.dev/revdep_emails/BTYDplus/email-body b/.dev/revdep_emails/BTYDplus/email-body deleted file mode 100644 index 259805876..000000000 --- a/.dev/revdep_emails/BTYDplus/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Michael Platzer! Thank you for using {lintr} in your package {BTYDplus}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/mplatzer/BTYDplus using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 39s on CRAN vs. 28s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/BiasCorrector/attachments/BiasCorrector.warnings b/.dev/revdep_emails/BiasCorrector/attachments/BiasCorrector.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/BiasCorrector/attachments/BiasCorrector.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/BiasCorrector/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/BiasCorrector/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 85c6be2eb..000000000 --- a/.dev/revdep_emails/BiasCorrector/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,33 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"data-raw/devstuffs.R",11,81,"style","Lines should not be more than 80 characters."," person(""Lorenz A."", ""Kapsner"", email = ""lorenz.kapsner@gmail.com"", role = c(""cre"", ""aut"", ""cph""),","line_length_linter" -"data-raw/devstuffs.R",21,81,"style","Lines should not be more than 80 characters.","my_desc$set(Title = ""A GUI to Correct Measurement Bias in DNA Methylation Analyses"")","line_length_linter" -"data-raw/devstuffs.R",24,81,"style","Lines should not be more than 80 characters."," ""A GUI to correct measurement bias in DNA methylation analyses. The 'BiasCorrector' package "",","line_length_linter" -"data-raw/devstuffs.R",25,81,"style","Lines should not be more than 80 characters."," ""just wraps the functions implemented in the 'R' package 'rBiasCorrection' into a "",","line_length_linter" -"data-raw/devstuffs.R",43,2,"style","Commented code should be removed.","#usethis::use_gpl3_license(name = ""Lorenz Kapsner"")","commented_code_linter" -"data-raw/devstuffs.R",49,81,"style","Lines should not be more than 80 characters.","# https://cran.r-project.org/web/packages/data.table/vignettes/datatable-importing.html","line_length_linter" -"data-raw/devstuffs.R",63,3,"style","Commented code should be removed.","# tag <- ""development""","commented_code_linter" -"data-raw/devstuffs.R",64,3,"style","Commented code should be removed.","# devtools::install_github(repo = ""kapsner/rBiasCorrection"", ref = tag, upgrade = ""always"")","commented_code_linter" -"data-raw/devstuffs.R",64,81,"style","Lines should not be more than 80 characters.","# devtools::install_github(repo = ""kapsner/rBiasCorrection"", ref = tag, upgrade = ""always"")","line_length_linter" -"data-raw/devstuffs.R",65,3,"style","Commented code should be removed.","# # https://cran.r-project.org/web/packages/devtools/vignettes/dependencies.html","commented_code_linter" -"data-raw/devstuffs.R",66,3,"style","Commented code should be removed.","# desc::desc_set_remotes(paste0(""github::kapsner/rBiasCorrection@"", tag), file = usethis::proj_get())","commented_code_linter" -"data-raw/devstuffs.R",66,81,"style","Lines should not be more than 80 characters.","# desc::desc_set_remotes(paste0(""github::kapsner/rBiasCorrection@"", tag), file = usethis::proj_get())","line_length_linter" -"data-raw/devstuffs.R",100,3,"style","Commented code should be removed.","# BiasCorrection(experimental = ""../19_PCR-bias/data/example_data/type1/example_data_type1_experimentaldata.csv"", calibration = ""../19_PCR-bias/data/example_data/type1/example_data_type1_calibrationdata.csv"", samplelocusname = ""Test"")","commented_code_linter" -"data-raw/devstuffs.R",100,81,"style","Lines should not be more than 80 characters.","# BiasCorrection(experimental = ""../19_PCR-bias/data/example_data/type1/example_data_type1_experimentaldata.csv"", calibration = ""../19_PCR-bias/data/example_data/type1/example_data_type1_calibrationdata.csv"", samplelocusname = ""Test"")","line_length_linter" -"data-raw/devstuffs.R",101,3,"style","Commented code should be removed.","# covr::package_coverage()","commented_code_linter" -"data-raw/devstuffs.R",102,3,"style","Commented code should be removed.","# lintr::lint_package()","commented_code_linter" -"inst/application/server.R",20,20,"style","Use FALSE instead of the symbol F."," exp_filereq = F,","T_and_F_symbol_linter" -"inst/application/server.R",28,21,"style","Use TRUE instead of the symbol T."," modal_closed = T,","T_and_F_symbol_linter" -"inst/application/server.R",104,25,"style","Use TRUE instead of the symbol T."," rv$modal_closed <- T","T_and_F_symbol_linter" -"inst/application/server.R",250,30,"style","Use TRUE instead of the symbol T."," startExpanded = T,","T_and_F_symbol_linter" -"inst/application/server.R",255,27,"style","Use TRUE instead of the symbol T."," selected = T","T_and_F_symbol_linter" -"inst/application/server.R",316,30,"style","Use FALSE instead of the symbol F."," startExpanded = F,","T_and_F_symbol_linter" -"inst/application/server.R",321,27,"style","Use TRUE instead of the symbol T."," selected = T","T_and_F_symbol_linter" -"inst/application/server.R",372,30,"style","Use FALSE instead of the symbol F."," startExpanded = F,","T_and_F_symbol_linter" -"inst/application/server.R",377,27,"style","Use TRUE instead of the symbol T."," selected = T","T_and_F_symbol_linter" -"inst/application/server.R",451,30,"style","Use FALSE instead of the symbol F."," startExpanded = F,","T_and_F_symbol_linter" -"inst/application/server.R",502,30,"style","Use FALSE instead of the symbol F."," startExpanded = F,","T_and_F_symbol_linter" -"R/app_utils.R",19,23,"style","Use FALSE instead of the symbol F."," rv$modal_closed <- F","T_and_F_symbol_linter" -"R/moduleFileupload.R",71,24,"style","Use TRUE instead of the symbol T."," rv$exp_filereq <- T","T_and_F_symbol_linter" -"R/moduleFileupload.R",134,30,"style","Use TRUE instead of the symbol T."," rv$exp_filereq <- T","T_and_F_symbol_linter" -"R/moduleFileupload.R",165,30,"style","Use TRUE instead of the symbol T."," rv$exp_filereq <- T","T_and_F_symbol_linter" -"R/type2Files.R",33,47,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (rv$calibr_steps[, min(get(""step""))] < 0 |","vector_logic_linter" diff --git a/.dev/revdep_emails/BiasCorrector/email-body b/.dev/revdep_emails/BiasCorrector/email-body deleted file mode 100644 index d7f328aba..000000000 --- a/.dev/revdep_emails/BiasCorrector/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Lorenz A. Kapsner! Thank you for using {lintr} in your package {BiasCorrector}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/kapsner/BiasCorrector using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 27s on CRAN vs. 9s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/ConNEcT/email-body b/.dev/revdep_emails/ConNEcT/email-body deleted file mode 100644 index 6af09e93c..000000000 --- a/.dev/revdep_emails/ConNEcT/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Nadja Bodner! Thank you for using {lintr} in your package {ConNEcT}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cran/ConNEcT using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took NAs on CRAN vs. NAs in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/DBItest/email-body b/.dev/revdep_emails/DBItest/email-body deleted file mode 100644 index 20f6fa5e9..000000000 --- a/.dev/revdep_emails/DBItest/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Kirill MΓΌller! Thank you for using {lintr} in your package {DBItest}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/r-dbi/DBItest using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 0s on CRAN vs. 0s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/DataFakeR/email-body b/.dev/revdep_emails/DataFakeR/email-body deleted file mode 100644 index 397ada326..000000000 --- a/.dev/revdep_emails/DataFakeR/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Krystian Igras! Thank you for using {lintr} in your package {DataFakeR}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cran/DataFakeR using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took NAs on CRAN vs. NAs in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/DepthProc/attachments/DepthProc.failure b/.dev/revdep_emails/DepthProc/attachments/DepthProc.failure deleted file mode 100644 index c3d4a1db0..000000000 --- a/.dev/revdep_emails/DepthProc/attachments/DepthProc.failure +++ /dev/null @@ -1 +0,0 @@ -object 'absolute_paths_linter' not found diff --git a/.dev/revdep_emails/DepthProc/email-body b/.dev/revdep_emails/DepthProc/email-body deleted file mode 100644 index fa7afca20..000000000 --- a/.dev/revdep_emails/DepthProc/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Zygmunt Zawadzki! Thank you for using {lintr} in your package {DepthProc}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/zzawadz/DepthProc using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 12s on CRAN vs. 0s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/DominoDataCapture/email-body b/.dev/revdep_emails/DominoDataCapture/email-body deleted file mode 100644 index 455d437af..000000000 --- a/.dev/revdep_emails/DominoDataCapture/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Vivekananda Tadala! Thank you for using {lintr} in your package {DominoDataCapture}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cran/DominoDataCapture using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took NAs on CRAN vs. NAs in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/FSelectorRcpp/attachments/FSelectorRcpp.warnings b/.dev/revdep_emails/FSelectorRcpp/attachments/FSelectorRcpp.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/FSelectorRcpp/attachments/FSelectorRcpp.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/FSelectorRcpp/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/FSelectorRcpp/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 4269c64e0..000000000 --- a/.dev/revdep_emails/FSelectorRcpp/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,5 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/discretize_transform.R",47,1,"style","Variable and function names should not be longer than 30 characters.","discretize_transform.FsDiscretizeTransformer <-","object_length_linter" -"R/discretize.R",183,1,"style","Variable and function name style should be snake_case.","discretize.data.frame <- function(x, y,","object_name_linter" -"R/relief.R",82,13,"style","Place a space before left parenthesis, except in a function call."," next()","spaces_left_parentheses_linter" -"R/relief.R",85,13,"style","Place a space before left parenthesis, except in a function call."," next()","spaces_left_parentheses_linter" diff --git a/.dev/revdep_emails/FSelectorRcpp/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/FSelectorRcpp/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 1c3604445..000000000 --- a/.dev/revdep_emails/FSelectorRcpp/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,68 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/benchmarks/bench-cutOff.R",18,10,"style","Variable and function name style should be snake_case or symbols.","rownames(testDataFrame) <- paste0(""row_"", 1:100000)","object_name_linter" -"inst/benchmarks/bench-discretise.R",16,25,"style","Put spaces around all infix operators.","system.time(Discretize(y~x))","infix_spaces_linter" -"inst/benchmarks/bench-discretise.R",19,55,"style","Put spaces around all infix operators.","all(fs_discretize(x, y) + 1 == as.numeric(Discretize(y~x)[, 1]))","infix_spaces_linter" -"inst/benchmarks/bench-discretise.R",21,44,"style","Put spaces around all infix operators.","microbenchmark::microbenchmark(Discretize(y~x), fs_discretize(x, y))","infix_spaces_linter" -"R/discretize_transform.R",71,14,"style","Variable and function name style should be snake_case or symbols."," attr(data, ""fsSplitPointsList"") <- splitPoints","object_name_linter" -"R/discretize_transform.R",99,7,"style","Any function spanning multiple lines should use curly braces."," function(x, y)","brace_linter" -"R/discretize.R",136,17,"style","Variable and function name style should be snake_case or symbols."," attr(res, ""SplitValues"") <- control$breaks","object_name_linter" -"R/discretize.R",155,7,"style","Variable and function name style should be snake_case or symbols."," splitPointsList[[col]] <- splitVals","object_name_linter" -"R/discretize.R",164,7,"style","Variable and function name style should be snake_case or symbols."," splitPointsList[[col]] <- NA","object_name_linter" -"R/discretize.R",174,14,"style","Variable and function name style should be snake_case or symbols."," attr(data, ""fsSplitPointsList"") <- c(","object_name_linter" -"R/utils.R",154,5,"style","Variable and function name style should be snake_case or symbols."," toSub[withBrackets] <- gsub(pattern = ""]]"", replacement = """",","object_name_linter" -"R/utils.R",156,5,"style","Variable and function name style should be snake_case or symbols."," toSub[withBrackets] <- strsplit(x = toSub[withBrackets], split = ""[["",","object_name_linter" -"R/utils.R",158,5,"style","Variable and function name style should be snake_case or symbols."," toSub[withBrackets] <- lapply(toSub[withBrackets], get_colname)","object_name_linter" -"R/utils.R",159,5,"style","Variable and function name style should be snake_case or symbols."," toSub[-withBrackets] <- gsub(pattern = "".*\\$"", replacement = """",","object_name_linter" -"tests/testthat/test-cutoff.R",9,14,"style","Variable and function name style should be snake_case or symbols."," rownames(testDataFrame) <- testDataFrame[[1]]","object_name_linter" -"tests/testthat/test-discretize.R",264,28,"style","Put spaces around all infix operators."," expect_error(discretize(y~., dt, discIntegers = FALSE))","infix_spaces_linter" -"tests/testthat/test-na.R",11,5,"style","Variable and function name style should be snake_case or symbols."," dtIris[1, 1] <- NA","object_name_linter" -"tests/testthat/test-na.R",12,5,"style","Variable and function name style should be snake_case or symbols."," dtIris[2, 2] <- NA","object_name_linter" -"tests/testthat/test-na.R",13,5,"style","Variable and function name style should be snake_case or symbols."," dtIris[3, 5] <- NA","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",18,1,"style","Variable and function name style should be snake_case or symbols.","is.pkg <- all(c(""RTCGA.rnaseq"", ""microbenchmark"", ""RWeka"", ""pkgdown"") %in% rownames(installed.packages()))","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",19,3,"style","Place a space before left parenthesis, except in a function call.","if(!is.pkg) {","spaces_left_parentheses_linter" -"vignettes/benchmarks_discretize.Rmd",23,3,"style","Place a space before left parenthesis, except in a function call.","if(is.pkg && !pkgdown::in_pkgdown()) {","spaces_left_parentheses_linter" -"vignettes/benchmarks_discretize.Rmd",24,3,"style","Variable and function name style should be snake_case or symbols."," is.pkg <- FALSE","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",28,20,"style","Trailing whitespace is superfluous."," paste(sep = """", ","trailing_whitespace_linter" -"vignettes/benchmarks_discretize.Rmd",39,1,"style","Variable and function name style should be snake_case or symbols.","fig.path <- if(pkgdown::in_pkgdown()) {","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",39,15,"style","Place a space before left parenthesis, except in a function call.","fig.path <- if(pkgdown::in_pkgdown()) {","spaces_left_parentheses_linter" -"vignettes/benchmarks_discretize.Rmd",47,19,"style","Trailing whitespace is superfluous."," fig.width = 8, ","trailing_whitespace_linter" -"vignettes/benchmarks_discretize.Rmd",102,1,"style","Variable and function name style should be snake_case or symbols.","BRCA.rnaseq <- RTCGA.rnaseq::BRCA.rnaseq","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",103,1,"style","Variable and function name style should be snake_case or symbols.","BRCA.rnaseq$bcr_patient_barcode <- ","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",103,35,"style","Trailing whitespace is superfluous.","BRCA.rnaseq$bcr_patient_barcode <- ","trailing_whitespace_linter" -"vignettes/benchmarks_discretize.Rmd",105,7,"style","Variable and function name style should be snake_case or symbols.","names(BRCA.rnaseq) <- gsub(pattern = ""?"", replacement = ""q"",","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",107,7,"style","Variable and function name style should be snake_case or symbols.","names(BRCA.rnaseq) <- gsub(pattern = ""[[:punct:]]"", replacement = ""_"",","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",122,22,"style","Variable and function name style should be snake_case or symbols.","names_by <- function(nameBy, vecBy) {","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",122,30,"style","Variable and function name style should be snake_case or symbols.","names_by <- function(nameBy, vecBy) {","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",127,22,"style","Trailing whitespace is superfluous."," }), ","trailing_whitespace_linter" -"vignettes/benchmarks_discretize.Rmd",131,28,"style","Variable and function name style should be snake_case or symbols.","get_times <- function(fun, vecRows, vecCols, nTimes) {","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",131,37,"style","Variable and function name style should be snake_case or symbols.","get_times <- function(fun, vecRows, vecCols, nTimes) {","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",131,46,"style","Variable and function name style should be snake_case or symbols.","get_times <- function(fun, vecRows, vecCols, nTimes) {","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",132,3,"style","Variable and function name style should be snake_case or symbols."," forRows <- pblapply(vecRows, function(nRows) {","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",132,41,"style","Variable and function name style should be snake_case or symbols."," forRows <- pblapply(vecRows, function(nRows) {","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",133,5,"style","Variable and function name style should be snake_case or symbols."," forCols <- pblapply(vecCols + 1, function(nCols) {","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",133,47,"style","Variable and function name style should be snake_case or symbols."," forCols <- pblapply(vecCols + 1, function(nCols) {","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",138,5,"style","Variable and function name style should be snake_case or symbols."," colsNames <- names_by(nameBy = ""columns_"", vecBy = vecCols)","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",141,3,"style","Variable and function name style should be snake_case or symbols."," rowsNames <- names_by(nameBy = ""rows_"", vecBy = vecRows)","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",167,18,"style","Variable and function name style should be snake_case or symbols."," function(setOfCols) {","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",195,3,"style","Variable and function name style should be snake_case or symbols."," yUnit <- gsub(pattern = ""time"",","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",198,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/get_started.Rmd",38,18,"style","Only use double-quotes.","install.packages('FSelectorRcpp') # stable release version on CRAN","single_quotes_linter" -"vignettes/get_started.Rmd",39,26,"style","Only use double-quotes.","devtools::install_github('mi2-warsaw/FSelectorRcpp') # dev version","single_quotes_linter" -"vignettes/get_started.Rmd",70,8,"style","Trailing whitespace is superfluous."," ) %>% ","trailing_whitespace_linter" -"vignettes/get_started.Rmd",73,8,"style","Trailing whitespace is superfluous."," ) %>% ","trailing_whitespace_linter" -"vignettes/get_started.Rmd",74,67,"style","Trailing whitespace is superfluous."," to_formula( # Create a new formula object with ","trailing_whitespace_linter" -"vignettes/get_started.Rmd",76,22,"style","Trailing whitespace is superfluous."," class = ""Species"" ","trailing_whitespace_linter" -"vignettes/get_started.Rmd",80,17,"style","Trailing whitespace is superfluous."," data = iris, ","trailing_whitespace_linter" -"vignettes/get_started.Rmd",81,24,"style","Trailing whitespace is superfluous."," family = ""binomial"" ","trailing_whitespace_linter" -"vignettes/get_started.Rmd",83,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/get_started.Rmd",89,1,"style","Variable and function name style should be snake_case or symbols.","evaluator_R2_lm <- # Create a scorer function.","object_name_linter" -"vignettes/get_started.Rmd",93,16,"style","Trailing whitespace is superfluous."," dependent = ","trailing_whitespace_linter" -"vignettes/get_started.Rmd",98,78,"style","Trailing whitespace is superfluous."," to_formula( # This is the score to use to choose between considered ","trailing_whitespace_linter" -"vignettes/get_started.Rmd",107,15,"style","Trailing whitespace is superfluous."," attributes = ","trailing_whitespace_linter" -"vignettes/get_started.Rmd",109,87,"style","Trailing whitespace is superfluous."," fun = evaluator_R2_lm, # And it calculates the score of a subset that depends on the ","trailing_whitespace_linter" -"vignettes/get_started.Rmd",111,68,"style","Trailing whitespace is superfluous."," mode = ""exhaustive"", # exhaustive - means to check all possible ","trailing_whitespace_linter" -"vignettes/get_started.Rmd",112,59,"style","Trailing whitespace is superfluous."," sizes = # attributes' subset combinations ","trailing_whitespace_linter" -"vignettes/get_started.Rmd",113,5,"warning","1:length(...) is likely to be wrong in the empty edge case. Use seq_along() instead."," 1:length(attributes) # of sizes passed in sizes.","seq_linter" -"vignettes/integer-variables.Rmd",63,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/integer-variables.Rmd",70,35,"style","Commas should always have a space after.","can_discretize(as.integer(c(rep(1,10), rep(2, 10))))","commas_linter" -"vignettes/integer-variables.Rmd",78,26,"style","Commas should always have a space after."," z = as.integer(c(rep(1,10), rep(2, 10)))","commas_linter" diff --git a/.dev/revdep_emails/FSelectorRcpp/email-body b/.dev/revdep_emails/FSelectorRcpp/email-body deleted file mode 100644 index 2ff56a6f9..000000000 --- a/.dev/revdep_emails/FSelectorRcpp/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Zygmunt Zawadzki! Thank you for using {lintr} in your package {FSelectorRcpp}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/mi2-warsaw/FSelectorRcpp using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 20s on CRAN vs. 13s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/NHSRplotthedots/email-body b/.dev/revdep_emails/NHSRplotthedots/email-body deleted file mode 100644 index def19ebec..000000000 --- a/.dev/revdep_emails/NHSRplotthedots/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Christopher Reading! Thank you for using {lintr} in your package {NHSRplotthedots}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cran/NHSRplotthedots using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took NAs on CRAN vs. NAs in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/OpenML/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/OpenML/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 848f53f4a..000000000 --- a/.dev/revdep_emails/OpenML/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,3 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/uploadOMLFlow.R",79,52,"style","There should be a space between right parenthesis and an opening curly brace.","# if (!(is.null(sourcefile) || is.na(sourcefile))){","paren_brace_linter" -"R/uploadOMLFlow.R",110,39,"style","There should be a space between right parenthesis and an opening curly brace.","# createLearnerSourcefile = function(x){","paren_brace_linter" diff --git a/.dev/revdep_emails/OpenML/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/OpenML/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index f9a790b5d..000000000 --- a/.dev/revdep_emails/OpenML/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,82 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/chunkOMLlist.R",21,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(args$limit) | !is.null(args$offset))","vector_logic_linter" -"R/config_helpers.R",45,32,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nchar(conf$apikey) != 32 & conf$apikey %nin% c("""", ""PLEASE CHANGE ME""))","vector_logic_linter" -"R/convertOMLDataSetToMlr.R",44,3,"style","Variable and function name style should be snake_case or symbols."," drop.levels = TRUE,","object_name_linter" -"R/convertOMLDataSetToMlr.R",62,42,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (any(!is.na(desc$ignore.attribute)) & ignore.flagged.attributes) {","vector_logic_linter" -"R/convertOMLDataSetToMlr.R",114,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.factor(target) | is.logical(target))","vector_logic_linter" -"R/convertOMLRunToBMR.R",62,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (all(!conf.cols.intergish) & pred.class == ""PredictionClassif"") {","vector_logic_linter" -"R/convertOMLTaskToMlr.R",32,3,"style","Variable and function name style should be snake_case or symbols."," drop.levels = TRUE,","object_name_linter" -"R/downloadOMLObject.R",40,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (f[[xml.ind]]$found & !overwrite) {","vector_logic_linter" -"R/downloadOMLObject.R",72,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(source.url) & !is.null(binary.url)) {","vector_logic_linter" -"R/downloadOMLObject.R",102,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(url) & length(url) != 0) {","vector_logic_linter" -"R/downloadOMLObject.R",103,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (f[[file.ind]]$found & !overwrite) {","vector_logic_linter" -"R/getCachedOMLDataSetStatus.R",31,51,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (any(cached.ds$status == ""deactivated"") > 0L & show.warnings) {","vector_logic_linter" -"R/OMLFlow_Class.R",99,3,"style","Variable and function name style should be snake_case or symbols."," source.url = NA_character_,","object_name_linter" -"R/OMLFlow_Class.R",101,3,"style","Variable and function name style should be snake_case or symbols."," source.format = NA_character_,","object_name_linter" -"R/OMLFlow_Class.R",103,3,"style","Variable and function name style should be snake_case or symbols."," source.md5 = NA_character_,","object_name_linter" -"R/OMLFlow_Class.R",105,3,"style","Variable and function name style should be snake_case or symbols."," source.path = NA_character_,","object_name_linter" -"R/OMLStudy_Class.R",41,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(flow.id) | !is.null(run.id))","vector_logic_linter" -"R/tagOMLObject.R",18,15,"style","Any function spanning multiple lines should use curly braces."," lapply(ids, function(id)","brace_linter" -"R/tagOMLObject.R",26,15,"style","Any function spanning multiple lines should use curly braces."," lapply(ids, function(id)","brace_linter" -"R/uploadOMLFlow.R",61,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(x$object) & !testFile(binaryfile)) {","vector_logic_linter" -"R/uploadOMLFlow.R",66,3,"style","Either both or neither branch in `if`/`else` should use curly braces."," if (testFile(binaryfile)) {","brace_linter" -"R/uploadOMLRun.R",60,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(flow$object) & !is.null(bmr)) {","vector_logic_linter" -"tests/testthat/helper_testthat.R",17,18,"warning","no visible global function definition for β€˜getBMRMeasures’"," expect_equal(getBMRMeasures(bmr)[[j]], bmr$measures[[j]])","object_usage_linter" -"tests/testthat/helper_testthat.R",18,18,"warning","no visible global function definition for β€˜getBMRMeasureIds’"," expect_equal(getBMRMeasureIds(bmr)[[j]], bmr$measures[[j]]$id)","object_usage_linter" -"tests/testthat/helper_with.r",11,3,"warning","no visible global function definition for β€˜with_reset_config’"," with_reset_config({","object_usage_linter" -"tests/testthat/helper_with.r",19,3,"warning","no visible global function definition for β€˜with_reset_config’"," with_reset_config({","object_usage_linter" -"tests/testthat/helper_with.r",29,3,"warning","no visible global function definition for β€˜with_reset_config’"," with_reset_config({","object_usage_linter" -"tests/testthat/helper_with.r",36,3,"warning","no visible global function definition for β€˜with_reset_config’"," with_reset_config({","object_usage_linter" -"vignettes/OpenML.Rmd",16,3,"style","Commented code should be removed.","# library(""knitr"")","commented_code_linter" -"vignettes/OpenML.Rmd",17,3,"style","Commented code should be removed.","# opts_chunk$set(cache = TRUE)","commented_code_linter" -"vignettes/OpenML.Rmd",19,58,"style","Trailing whitespace is superfluous.","setOMLConfig(apikey = ""c1994bdb7ecb3c6f3c8f3b35f4b47f1f"", ","trailing_whitespace_linter" -"vignettes/OpenML.Rmd",82,6,"style","Use <-, not =, for assignment.","task = getOMLTask(task.id = 1L)","assignment_linter" -"vignettes/OpenML.Rmd",99,5,"style","Use <-, not =, for assignment.","lrn = makeLearner(""classif.randomForest"")","assignment_linter" -"vignettes/OpenML.Rmd",103,1,"style","Variable and function name style should be snake_case or symbols.","flow.id = uploadOMLFlow(lrn)","object_name_linter" -"vignettes/OpenML.Rmd",103,9,"style","Use <-, not =, for assignment.","flow.id = uploadOMLFlow(lrn)","assignment_linter" -"vignettes/OpenML.Rmd",105,1,"style","Variable and function name style should be snake_case or symbols.","run.mlr = runTaskMlr(task, lrn)","object_name_linter" -"vignettes/OpenML.Rmd",105,9,"style","Use <-, not =, for assignment.","run.mlr = runTaskMlr(task, lrn)","assignment_linter" -"vignettes/OpenML.Rmd",106,1,"style","Variable and function name style should be snake_case or symbols.","run.id = uploadOMLRun(run.mlr)","object_name_linter" -"vignettes/OpenML.Rmd",106,8,"style","Use <-, not =, for assignment.","run.id = uploadOMLRun(run.mlr)","assignment_linter" -"vignettes/OpenML.Rmd",136,7,"style","Use <-, not =, for assignment.","apikey=c1994bdb7ecb3c6f3c8f3b35f4b47f1f","assignment_linter" -"vignettes/OpenML.Rmd",136,7,"style","Put spaces around all infix operators.","apikey=c1994bdb7ecb3c6f3c8f3b35f4b47f1f","infix_spaces_linter" -"vignettes/OpenML.Rmd",188,10,"style","Use <-, not =, for assignment.","datasets = listOMLDataSets() # returns active data sets","assignment_linter" -"vignettes/OpenML.Rmd",226,7,"style","Use <-, not =, for assignment.","tasks = listOMLTasks()","assignment_linter" -"vignettes/OpenML.Rmd",246,81,"style","Lines should not be more than 80 characters.","head(subset(tasks, task.type == ""Supervised Classification"" & data.id == 61L)[, 1:5])","line_length_linter" -"vignettes/OpenML.Rmd",252,7,"style","Use <-, not =, for assignment.","flows = listOMLFlows()","assignment_linter" -"vignettes/OpenML.Rmd",263,6,"style","Use <-, not =, for assignment.","runs = listOMLRuns(task.id = 59L) # must be specified with the task, setup and/or implementation ID","assignment_linter" -"vignettes/OpenML.Rmd",263,81,"style","Lines should not be more than 80 characters.","runs = listOMLRuns(task.id = 59L) # must be specified with the task, setup and/or implementation ID","line_length_linter" -"vignettes/OpenML.Rmd",266,1,"style","Variable and function name style should be snake_case or symbols.","run.results = listOMLRunEvaluations(task.id = 59L)","object_name_linter" -"vignettes/OpenML.Rmd",266,13,"style","Use <-, not =, for assignment.","run.results = listOMLRunEvaluations(task.id = 59L)","assignment_linter" -"vignettes/OpenML.Rmd",287,1,"style","Variable and function name style should be snake_case or symbols.","iris.data = getOMLDataSet(data.id = 61L) # the iris data set has the data set ID 61","object_name_linter" -"vignettes/OpenML.Rmd",287,11,"style","Use <-, not =, for assignment.","iris.data = getOMLDataSet(data.id = 61L) # the iris data set has the data set ID 61","assignment_linter" -"vignettes/OpenML.Rmd",287,81,"style","Lines should not be more than 80 characters.","iris.data = getOMLDataSet(data.id = 61L) # the iris data set has the data set ID 61","line_length_linter" -"vignettes/OpenML.Rmd",293,6,"style","Use <-, not =, for assignment.","task = getOMLTask(task.id = 59L)","assignment_linter" -"vignettes/OpenML.Rmd",309,1,"style","Variable and function name style should be snake_case or symbols.","iris.data = task$input$data.set$data","object_name_linter" -"vignettes/OpenML.Rmd",309,11,"style","Use <-, not =, for assignment.","iris.data = task$input$data.set$data","assignment_linter" -"vignettes/OpenML.Rmd",316,6,"style","Use <-, not =, for assignment.","flow = getOMLFlow(flow.id = 2700L)","assignment_linter" -"vignettes/OpenML.Rmd",325,1,"style","Variable and function name style should be snake_case or symbols.","task.list = listOMLRuns(task.id = 59L)","object_name_linter" -"vignettes/OpenML.Rmd",325,11,"style","Use <-, not =, for assignment.","task.list = listOMLRuns(task.id = 59L)","assignment_linter" -"vignettes/OpenML.Rmd",327,5,"style","Use <-, not =, for assignment.","run = getOMLRun(run.id = 524027L)","assignment_linter" -"vignettes/OpenML.Rmd",355,6,"style","Use <-, not =, for assignment.","task = getOMLTask(task.id = 59L)","assignment_linter" -"vignettes/OpenML.Rmd",357,5,"style","Use <-, not =, for assignment.","lrn = makeLearner(""classif.rpart"")","assignment_linter" -"vignettes/OpenML.Rmd",358,1,"style","Variable and function name style should be snake_case or symbols.","run.mlr = runTaskMlr(task, lrn)","object_name_linter" -"vignettes/OpenML.Rmd",358,9,"style","Use <-, not =, for assignment.","run.mlr = runTaskMlr(task, lrn)","assignment_linter" -"vignettes/OpenML.Rmd",380,5,"style","Use <-, not =, for assignment.","dsc = ""Daily air quality measurements in New York, May to September 1973.","assignment_linter" -"vignettes/OpenML.Rmd",382,5,"style","Use <-, not =, for assignment.","cit = ""Chambers, J. M., Cleveland, W. S., Kleiner, B. and Tukey, P. A. (1983)","assignment_linter" -"vignettes/OpenML.Rmd",385,6,"style","Use <-, not =, for assignment.","desc = makeOMLDataSetDescription(name = ""airquality"",","assignment_linter" -"vignettes/OpenML.Rmd",387,81,"style","Lines should not be more than 80 characters."," creator = ""New York State Department of Conservation (ozone data) and the National","line_length_linter" -"vignettes/OpenML.Rmd",392,81,"style","Lines should not be more than 80 characters."," url = ""https://stat.ethz.ch/R-manual/R-devel/library/datasets/html/00Index.html"",","line_length_linter" -"vignettes/OpenML.Rmd",397,1,"style","Variable and function name style should be snake_case or symbols.","air.data = makeOMLDataSet(desc = desc,","object_name_linter" -"vignettes/OpenML.Rmd",397,10,"style","Use <-, not =, for assignment.","air.data = makeOMLDataSet(desc = desc,","assignment_linter" -"vignettes/OpenML.Rmd",406,2,"style","Commented code should be removed.","#dataset.id = uploadOMLDataSet(air.data)","commented_code_linter" -"vignettes/OpenML.Rmd",420,5,"style","Use <-, not =, for assignment.","lrn = makeLearner(""classif.randomForest"")","assignment_linter" -"vignettes/OpenML.Rmd",421,1,"style","Variable and function name style should be snake_case or symbols.","flow.id = uploadOMLFlow(lrn)","object_name_linter" -"vignettes/OpenML.Rmd",421,9,"style","Use <-, not =, for assignment.","flow.id = uploadOMLFlow(lrn)","assignment_linter" -"vignettes/OpenML.Rmd",432,10,"style","Use <-, not =, for assignment.","learners = list(","assignment_linter" -"vignettes/OpenML.Rmd",437,1,"style","Variable and function name style should be snake_case or symbols.","task.ids = c(57, 59, 2382)","object_name_linter" -"vignettes/OpenML.Rmd",437,10,"style","Use <-, not =, for assignment.","task.ids = c(57, 59, 2382)","assignment_linter" -"vignettes/OpenML.Rmd",440,10,"style","Use <-, not =, for assignment."," task = getOMLTask(id)","assignment_linter" -"vignettes/OpenML.Rmd",441,9,"style","Use <-, not =, for assignment."," res = runTaskMlr(task, lrn)$run","assignment_linter" -"vignettes/OpenML.Rmd",442,5,"style","Variable and function name style should be snake_case or symbols."," run.id = uploadOMLRun(res) # upload results","object_name_linter" -"vignettes/OpenML.Rmd",442,12,"style","Use <-, not =, for assignment."," run.id = uploadOMLRun(res) # upload results","assignment_linter" diff --git a/.dev/revdep_emails/OpenML/email-body b/.dev/revdep_emails/OpenML/email-body deleted file mode 100644 index c4b9fe6d7..000000000 --- a/.dev/revdep_emails/OpenML/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Giuseppe Casalicchio! Thank you for using {lintr} in your package {OpenML}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/openml/openml-r using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 66s on CRAN vs. 42s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/PWFSLSmoke/attachments/PWFSLSmoke.warnings b/.dev/revdep_emails/PWFSLSmoke/attachments/PWFSLSmoke.warnings deleted file mode 100644 index be09e01a7..000000000 --- a/.dev/revdep_emails/PWFSLSmoke/attachments/PWFSLSmoke.warnings +++ /dev/null @@ -1,2 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Trying to remove β€˜todo_comment_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/PWFSLSmoke/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/PWFSLSmoke/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 13c26c4df..000000000 --- a/.dev/revdep_emails/PWFSLSmoke/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,3 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/addMarker.R",91,24,"style","Place a space before left parenthesis, except in a function call."," top <- newXY$newY[-(seq_along(latitude))]","spaces_left_parentheses_linter" -"R/addMarker.R",93,26,"style","Place a space before left parenthesis, except in a function call."," right <- newXY$newX[-(seq_along(longitude))]","spaces_left_parentheses_linter" diff --git a/.dev/revdep_emails/PWFSLSmoke/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/PWFSLSmoke/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 7ee01cd92..000000000 --- a/.dev/revdep_emails/PWFSLSmoke/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,219 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/addShadedBackground.R",21,39,"style","Put spaces around all infix operators."," breaks=stats::quantile(param, na.rm = TRUE),","infix_spaces_linter" -"R/airsis_load.R",10,29,"style","Put spaces around all infix operators.","airsis_load <- function(year=2017,","infix_spaces_linter" -"R/createEmptyMetaDataframe.R",26,42,"style","Put spaces around all infix operators.","createEmptyMetaDataframe <- function(rows=0) {","infix_spaces_linter" -"R/epa_load.R",12,7,"style","Put spaces around all infix operators."," year=strftime(lubridate::now(tzone = ""UTC""), ""%Y"", tz = ""UTC""),","infix_spaces_linter" -"R/monitor_aqi.R",81,46,"style","Put spaces around all infix operators.",".assignBreakpointsTable <- function(parameter=""pm25"") {","infix_spaces_linter" -"R/monitor_asDataframe.R",54,42,"style","Put spaces around all infix operators."," monitorID=NULL,","infix_spaces_linter" -"R/monitor_asDataframe.R",55,45,"style","Put spaces around all infix operators."," extraColumns=NULL,","infix_spaces_linter" -"R/monitor_asDataframe.R",56,44,"style","Put spaces around all infix operators."," metaColumns=NULL,","infix_spaces_linter" -"R/monitor_asDataframe.R",57,37,"style","Put spaces around all infix operators."," tlim=NULL) {","infix_spaces_linter" -"R/monitor_collapse.R",111,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ( !is.null(longitude) & !is.null(latitude) ) {","vector_logic_linter" -"R/monitor_dailyStatistic.R",98,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (hoursAfter > 0 & hoursAfter <= 1) dayNum <- dayNum + 1","vector_logic_linter" -"R/monitor_dailyStatistic.R",103,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (hoursAfter > 0 & hoursAfter <= 1) dayNum <- dayNum + 1","vector_logic_linter" -"R/monitor_dailyThreshold.R",68,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (hoursAfter > 0 & hoursAfter <= 1) dayNum <- dayNum + 1","vector_logic_linter" -"R/monitor_dailyThreshold.R",71,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (hoursAfter > 0 & hoursAfter <= 1) dayNum <- dayNum + 1","vector_logic_linter" -"R/monitor_getCurrentStatus.R",367,3,"warning","local variable β€˜get_nAvg’ assigned but may not be used"," get_nAvg <- function(monitorDataColumn, timeIndex, n) {","object_usage_linter" -"R/monitor_getCurrentStatus.R",437,3,"warning","local variable β€˜get_previousDayAvg’ assigned but may not be used"," get_previousDayAvg <- function(ws_data, timezone, endTimeUTC) {","object_usage_linter" -"R/monitor_loadAnnual.R",128,7,"warning","local variable β€˜result’ assigned but may not be used"," result <- try({","object_usage_linter" -"R/monitor_performance.R",58,9,"style","Put spaces around all infix operators."," metric=NULL,","infix_spaces_linter" -"R/monitor_performanceMap.R",190,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ( showLegend & !is.null(colorBy) ) {","vector_logic_linter" -"R/monitor_print.R",111,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/monitor_writeCurrentStatusGeoJSON.R",106,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(propertyNames) & length(propertyNames) == length(properties))","vector_logic_linter" -"R/PWFSLSmoke-deprecated.R",96,12,"style","Put spaces around all infix operators."," monitorID=NULL,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",97,7,"style","Put spaces around all infix operators."," tlim=NULL,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",98,7,"style","Put spaces around all infix operators."," ylim=NULL,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",99,11,"style","Put spaces around all infix operators."," aqiLines=TRUE,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",100,14,"style","Put spaces around all infix operators."," shadedNight=TRUE,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",101,8,"style","Put spaces around all infix operators."," title=NULL,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",233,12,"style","Put spaces around all infix operators."," monitorID=NULL,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",234,7,"style","Put spaces around all infix operators."," tlim=NULL,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",235,11,"style","Put spaces around all infix operators."," minHours=18,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",238,10,"style","Put spaces around all infix operators."," gridLwd=0.5,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",240,17,"style","Put spaces around all infix operators."," labels_x_nudge=0,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",241,17,"style","Put spaces around all infix operators."," labels_y_nudge=0,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",286,53,"style","Put spaces around all infix operators.","monitorPlot_noData <- function(ws_monitor, monitorID=NULL, cex=2.5) {","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",286,63,"style","Put spaces around all infix operators.","monitorPlot_noData <- function(ws_monitor, monitorID=NULL, cex=2.5) {","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",294,12,"style","Put spaces around all infix operators."," monitorID=NULL,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",295,8,"style","Put spaces around all infix operators."," width=3,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",296,8,"style","Put spaces around all infix operators."," align=""center"",","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",297,14,"style","Put spaces around all infix operators."," data.thresh=75,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",298,7,"style","Put spaces around all infix operators."," tlim=NULL,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",299,7,"style","Put spaces around all infix operators."," ylim=NULL,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",300,12,"style","Put spaces around all infix operators."," localTime=TRUE,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",301,14,"style","Put spaces around all infix operators."," shadedNight=FALSE,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",302,11,"style","Put spaces around all infix operators."," aqiLines=TRUE,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",303,17,"style","Put spaces around all infix operators."," gridHorizontal=FALSE,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",304,11,"style","Put spaces around all infix operators."," grid24hr=FALSE,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",305,10,"style","Put spaces around all infix operators."," grid3hr=FALSE,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",306,13,"style","Put spaces around all infix operators."," showLegend=TRUE","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",318,12,"style","Put spaces around all infix operators."," monitorID=NULL,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",319,7,"style","Put spaces around all infix operators."," tlim=NULL,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",320,12,"style","Put spaces around all infix operators."," localTime=TRUE,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",321,8,"style","Put spaces around all infix operators."," style=NULL,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",322,14,"style","Put spaces around all infix operators."," shadedNight=FALSE,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",323,6,"style","Put spaces around all infix operators."," add=FALSE,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",326,10,"style","Put spaces around all infix operators."," gridLwd=1,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",328,9,"style","Put spaces around all infix operators."," dayLwd=0,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",329,10,"style","Put spaces around all infix operators."," hourLwd=0,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",330,15,"style","Put spaces around all infix operators."," hourInterval=6,","infix_spaces_linter" -"R/skill_confusionMatrix.R",69,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ( !is.logical(predicted) | !is.logical(observed) ) {","vector_logic_linter" -"R/wrcc_load.R",10,27,"style","Put spaces around all infix operators.","wrcc_load <- function(year=2017,","infix_spaces_linter" -"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",56,80,"style","Trailing whitespace is superfluous.","monitorIDs <- c(""080310002_01"", ""080131001_01"", ""080130003_01"", ""081230006_01"", ","trailing_whitespace_linter" -"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",63,15,"style","Trailing whitespace is superfluous.","my_monitors <- ","trailing_whitespace_linter" -"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",81,15,"style","Trailing whitespace is superfluous."," my_monitors, ","trailing_whitespace_linter" -"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",82,50,"style","Trailing whitespace is superfluous."," title = ""Front Range AQIs - Feb 15 - 18, 2021"", ","trailing_whitespace_linter" -"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",102,44,"style","Only use double-quotes.","monitor_timeseriesPlot(my_monitors, type = 'l')","single_quotes_linter" -"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",103,45,"style","Only use double-quotes.","monitor_timeseriesPlot(my_monitors, style = 'aqidots', pch=16, cex = 1, add = TRUE)","single_quotes_linter" -"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",103,59,"style","Put spaces around all infix operators.","monitor_timeseriesPlot(my_monitors, style = 'aqidots', pch=16, cex = 1, add = TRUE)","infix_spaces_linter" -"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",125,75,"style","Trailing whitespace is superfluous.","# After looking at my_monitors$meta$siteName, help ggplot out by assigning ","trailing_whitespace_linter" -"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",135,6,"style","Trailing whitespace is superfluous.","gg <- ","trailing_whitespace_linter" -"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",143,32,"style","Trailing whitespace is superfluous."," stat_AQCategory(color = NA) + ","trailing_whitespace_linter" -"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",144,37,"style","Trailing whitespace is superfluous."," facet_grid(rows = vars(shortName)) ","trailing_whitespace_linter" -"vignettes/articles/Example_Save_Data_as_CSV.Rmd",40,13,"style","Trailing whitespace is superfluous.","airsis_ca <- ","trailing_whitespace_linter" -"vignettes/articles/Example_Save_Data_as_CSV.Rmd",69,12,"style","Trailing whitespace is superfluous.","Mariposa <- ","trailing_whitespace_linter" -"vignettes/articles/Example_Save_Data_as_CSV.Rmd",82,12,"style","Trailing whitespace is superfluous."," Mariposa, ","trailing_whitespace_linter" -"vignettes/articles/Example_Save_Data_as_CSV.Rmd",98,13,"style","Trailing whitespace is superfluous."," airsis_ca, ","trailing_whitespace_linter" -"vignettes/articles/Example_Save_Data_as_CSV.Rmd",107,13,"style","Trailing whitespace is superfluous."," airsis_ca, ","trailing_whitespace_linter" -"vignettes/articles/Example_Save_Data_as_CSV.Rmd",136,47,"style","Trailing whitespace is superfluous."," monitor_nowcast(includeShortTerm = TRUE) %>% ","trailing_whitespace_linter" -"vignettes/articles/Loading_Monitoring_Data.Rmd",144,101,"style","Lines should not be more than 100 characters.","AirNow_hourly <- get(load(url(""https://haze.airfire.org/monitoring/latest/RData/airnow_PM2.5_latest10.RData"")))","line_length_linter" -"vignettes/articles/Loading_Monitoring_Data.Rmd",158,13,"style","Only use double-quotes.","parameter = 'PM2.5',","single_quotes_linter" -"vignettes/articles/Loading_Monitoring_Data.Rmd",160,16,"style","Trailing whitespace is superfluous.","dataDir = NULL) ","trailing_whitespace_linter" -"vignettes/articles/Loading_Monitoring_Data.Rmd",167,13,"style","Only use double-quotes.","parameter = 'PM2.5',","single_quotes_linter" -"vignettes/articles/Loading_Monitoring_Data.Rmd",169,16,"style","Trailing whitespace is superfluous.","dataDir = NULL) ","trailing_whitespace_linter" -"vignettes/articles/Loading_Monitoring_Data.Rmd",177,13,"style","Only use double-quotes.","parameter = 'PM2.5',","single_quotes_linter" -"vignettes/articles/Loading_Monitoring_Data.Rmd",179,16,"style","Trailing whitespace is superfluous.","dataDir = NULL) ","trailing_whitespace_linter" -"vignettes/articles/Loading_Monitoring_Data.Rmd",239,28,"style","Put spaces around all infix operators."," monitor_subset(stateCodes= 'WA')","infix_spaces_linter" -"vignettes/articles/Loading_Monitoring_Data.Rmd",239,30,"style","Only use double-quotes."," monitor_subset(stateCodes= 'WA')","single_quotes_linter" -"vignettes/articles/Loading_Monitoring_Data.Rmd",242,43,"style","Only use double-quotes.","monitor_timeseriesPlot(airnow_wa, style = 'gnats')","single_quotes_linter" -"vignettes/articles/Loading_Monitoring_Data.Rmd",273,37,"style","Only use double-quotes.","monitor_timeseriesPlot(pnw, style = 'gnats')","single_quotes_linter" -"vignettes/Data_Model.Rmd",90,67,"style","Trailing whitespace is superfluous.","# NOTE: 'tlim' is interpreted as UTC unless we specify 'timezone' ","trailing_whitespace_linter" -"vignettes/Data_Model.Rmd",94,40,"style","Only use double-quotes.","WA <- monitor_subset(N_M, stateCodes = 'WA')","single_quotes_linter" -"vignettes/Data_Model.Rmd",109,44,"style","Commas should always have a space after.","all(rownames(WA$meta) == colnames(WA$data[,-1]))","commas_linter" -"vignettes/Data_Model.Rmd",140,12,"style","Only use double-quotes.","TwispID <- '530470009_01'","single_quotes_linter" -"vignettes/Data_Model.Rmd",141,15,"style","Only use double-quotes.","WinthropID <- '530470010_01'","single_quotes_linter" -"vignettes/Data_Model.Rmd",142,27,"style","Trailing whitespace is superfluous.","Methow_Valley_JulyMeans <- ","trailing_whitespace_linter" -"vignettes/Data_Model.Rmd",144,41,"style","Commas should always have a space after."," monitor_subset(monitorIDs = c(TwispID,WinthropID)) %>%","commas_linter" -"vignettes/Data_Model.Rmd",145,32,"style","Only use double-quotes."," monitor_collapse(monitorID = 'MethowValley') %>%","single_quotes_linter" -"vignettes/Data_Model.Rmd",146,22,"style","Put spaces around all infix operators."," monitor_subset(tlim=c(20150701, 20150731), timezone = 'America/Los_Angeles') %>%","infix_spaces_linter" -"vignettes/Data_Model.Rmd",146,57,"style","Only use double-quotes."," monitor_subset(tlim=c(20150701, 20150731), timezone = 'America/Los_Angeles') %>%","single_quotes_linter" -"vignettes/Data_Model.Rmd",149,34,"style","Commas should always have a space after.","Methow_Valley_JulyMeans$data[1:7,]","commas_linter" -"vignettes/Data_Model.Rmd",164,27,"style","Commas should always have a space after.","Spokane_3hr_squared$data[,-1] <- (Spokane_3hr$data[,-1])^2 # exclude the 'datetime' column","commas_linter" -"vignettes/Data_Model.Rmd",164,53,"style","Commas should always have a space after.","Spokane_3hr_squared$data[,-1] <- (Spokane_3hr$data[,-1])^2 # exclude the 'datetime' column","commas_linter" -"vignettes/Data_Model.Rmd",172,33,"style","Commas should always have a space after.","data <- Spokane_daily_3hr$data[,-1] # exclude the 'datetime' column","commas_linter" -"vignettes/Data_Model.Rmd",173,17,"style","Only use double-quotes.","cor(data, use = 'complete.obs')","single_quotes_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",54,2,"style","Commented code should be removed.","#monitor_leaflet(PacNW_24, slice = max)","commented_code_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",67,42,"style","Only use double-quotes.","monitor_timeseriesPlot(NezPerce, style = 'gnats')","single_quotes_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",90,23,"style","Commas should always have a space after.","opar <- par(mar = c(1,1,1,1))","commas_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",90,25,"style","Commas should always have a space after.","opar <- par(mar = c(1,1,1,1))","commas_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",90,27,"style","Commas should always have a space after.","opar <- par(mar = c(1,1,1,1))","commas_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",93,40,"style","Only use double-quotes."," siteName <- NezPerce$meta[monitorID, 'siteName']","single_quotes_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",95,14,"style","Trailing whitespace is superfluous."," NezPerce, ","trailing_whitespace_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",96,27,"style","Trailing whitespace is superfluous."," monitorID = monitorID, ","trailing_whitespace_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",97,21,"style","Trailing whitespace is superfluous."," main = siteName, ","trailing_whitespace_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",99,4,"style","Trailing whitespace is superfluous."," ) ","trailing_whitespace_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",110,21,"style","Commas should always have a space after.","data <- PacNW$data[,-1] # omit 'datetime' column","commas_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",112,101,"style","Lines should not be more than 100 characters.","worstAcute <- names(sort(maxPM25, decreasing = TRUE))[1:6] # monitorIDs for the six worst sites in PacNW","line_length_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",114,26,"style","Commas should always have a space after.","PacNW$meta[worstAcute[1],c('siteName','countyName','stateCode')]","commas_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",114,28,"style","Only use double-quotes.","PacNW$meta[worstAcute[1],c('siteName','countyName','stateCode')]","single_quotes_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",114,39,"style","Commas should always have a space after.","PacNW$meta[worstAcute[1],c('siteName','countyName','stateCode')]","commas_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",114,39,"style","Only use double-quotes.","PacNW$meta[worstAcute[1],c('siteName','countyName','stateCode')]","single_quotes_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",114,52,"style","Commas should always have a space after.","PacNW$meta[worstAcute[1],c('siteName','countyName','stateCode')]","commas_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",114,52,"style","Only use double-quotes.","PacNW$meta[worstAcute[1],c('siteName','countyName','stateCode')]","single_quotes_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",127,30,"style","Commas should always have a space after.","data <- PacNW_dailyAvg$data[,-1]","commas_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",128,45,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","unhealthyDays <- apply(data, 2, function(x) { sum(x >= AQI$breaks_24[4], na.rm = TRUE) })","brace_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",131,28,"style","Commas should always have a space after.","PacNW$meta[worstChronic[1],c('siteName','countyName','stateCode')]","commas_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",131,30,"style","Only use double-quotes.","PacNW$meta[worstChronic[1],c('siteName','countyName','stateCode')]","single_quotes_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",131,41,"style","Commas should always have a space after.","PacNW$meta[worstChronic[1],c('siteName','countyName','stateCode')]","commas_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",131,41,"style","Only use double-quotes.","PacNW$meta[worstChronic[1],c('siteName','countyName','stateCode')]","single_quotes_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",131,54,"style","Commas should always have a space after.","PacNW$meta[worstChronic[1],c('siteName','countyName','stateCode')]","commas_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",131,54,"style","Only use double-quotes.","PacNW$meta[worstChronic[1],c('siteName','countyName','stateCode')]","single_quotes_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",156,18,"style","Trailing whitespace is superfluous."," PacNW_dailyAvg, ","trailing_whitespace_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",158,13,"style","Only use double-quotes."," maptype = 'terrain',","single_quotes_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",159,20,"style","Trailing whitespace is superfluous."," centerLon = -118, ","trailing_whitespace_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",160,18,"style","Trailing whitespace is superfluous."," centerLat = 47, ","trailing_whitespace_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",161,11,"style","Trailing whitespace is superfluous."," zoom = 7 ","trailing_whitespace_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",163,9,"style","Only use double-quotes.","addIcon('redFlame', fireLons, fireLats, expansion = .002)","single_quotes_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",182,8,"style","Trailing whitespace is superfluous."," Omak, ","trailing_whitespace_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",184,24,"style","Trailing whitespace is superfluous."," labels_x_nudge = 0.8, ","trailing_whitespace_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",188,10,"style","Trailing whitespace is superfluous."," Kamiah, ","trailing_whitespace_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",189,7,"style","Put spaces around all infix operators."," main=""August Daily AQI -- Kamiah, ID"",","infix_spaces_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",190,24,"style","Trailing whitespace is superfluous."," labels_x_nudge = 0.8, ","trailing_whitespace_linter" -"vignettes/NowCast.Rmd",306,48,"style","Put spaces around all infix operators.","N_M <- monitor_subset(Northwest_Megafires, tlim=c(20150801,20150831),","infix_spaces_linter" -"vignettes/NowCast.Rmd",306,60,"style","Commas should always have a space after.","N_M <- monitor_subset(Northwest_Megafires, tlim=c(20150801,20150831),","commas_linter" -"vignettes/NowCast.Rmd",307,31,"style","Put spaces around all infix operators."," timezone=""America/Los_Angeles"")","infix_spaces_linter" -"vignettes/NowCast.Rmd",308,39,"style","Put spaces around all infix operators.","Omak <- monitor_subset(N_M, monitorIDs='530470013_01')","infix_spaces_linter" -"vignettes/NowCast.Rmd",308,40,"style","Only use double-quotes.","Omak <- monitor_subset(N_M, monitorIDs='530470013_01')","single_quotes_linter" -"vignettes/NowCast.Rmd",313,34,"style","Put spaces around all infix operators.","monitor_timeseriesPlot(Omak, type='l', lwd=2)","infix_spaces_linter" -"vignettes/NowCast.Rmd",313,35,"style","Only use double-quotes.","monitor_timeseriesPlot(Omak, type='l', lwd=2)","single_quotes_linter" -"vignettes/NowCast.Rmd",313,43,"style","Put spaces around all infix operators.","monitor_timeseriesPlot(Omak, type='l', lwd=2)","infix_spaces_linter" -"vignettes/NowCast.Rmd",314,41,"style","Put spaces around all infix operators.","monitor_timeseriesPlot(Omak_nowcast, add=TRUE, type='l', col='purple', lwd=2)","infix_spaces_linter" -"vignettes/NowCast.Rmd",314,52,"style","Put spaces around all infix operators.","monitor_timeseriesPlot(Omak_nowcast, add=TRUE, type='l', col='purple', lwd=2)","infix_spaces_linter" -"vignettes/NowCast.Rmd",314,53,"style","Only use double-quotes.","monitor_timeseriesPlot(Omak_nowcast, add=TRUE, type='l', col='purple', lwd=2)","single_quotes_linter" -"vignettes/NowCast.Rmd",314,61,"style","Put spaces around all infix operators.","monitor_timeseriesPlot(Omak_nowcast, add=TRUE, type='l', col='purple', lwd=2)","infix_spaces_linter" -"vignettes/NowCast.Rmd",314,62,"style","Only use double-quotes.","monitor_timeseriesPlot(Omak_nowcast, add=TRUE, type='l', col='purple', lwd=2)","single_quotes_linter" -"vignettes/NowCast.Rmd",314,75,"style","Put spaces around all infix operators.","monitor_timeseriesPlot(Omak_nowcast, add=TRUE, type='l', col='purple', lwd=2)","infix_spaces_linter" -"vignettes/NowCast.Rmd",316,17,"style","Put spaces around all infix operators.","addAQILegend(lwd=1, pch=NULL, 'topleft')","infix_spaces_linter" -"vignettes/NowCast.Rmd",316,24,"style","Put spaces around all infix operators.","addAQILegend(lwd=1, pch=NULL, 'topleft')","infix_spaces_linter" -"vignettes/NowCast.Rmd",316,31,"style","Only use double-quotes.","addAQILegend(lwd=1, pch=NULL, 'topleft')","single_quotes_linter" -"vignettes/NowCast.Rmd",317,23,"style","Put spaces around all infix operators.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","infix_spaces_linter" -"vignettes/NowCast.Rmd",317,30,"style","Put spaces around all infix operators.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","infix_spaces_linter" -"vignettes/NowCast.Rmd",317,33,"style","Only use double-quotes.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","single_quotes_linter" -"vignettes/NowCast.Rmd",317,41,"style","Commas should always have a space after.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","commas_linter" -"vignettes/NowCast.Rmd",317,41,"style","Only use double-quotes.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","single_quotes_linter" -"vignettes/NowCast.Rmd",317,58,"style","Put spaces around all infix operators.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","infix_spaces_linter" -"vignettes/NowCast.Rmd",317,61,"style","Only use double-quotes.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","single_quotes_linter" -"vignettes/NowCast.Rmd",317,70,"style","Commas should always have a space after.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","commas_linter" -"vignettes/NowCast.Rmd",317,70,"style","Only use double-quotes.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","single_quotes_linter" -"vignettes/NowCast.Rmd",332,45,"style","Put spaces around all infix operators.","Omak_2015_08_21 <- monitor_subset(Omak, tlim=c(2015082100, 2015082111))","infix_spaces_linter" -"vignettes/NowCast.Rmd",346,32,"style","Put spaces around all infix operators.","(w_star <- min(example1_values)/max(example1_values))","infix_spaces_linter" -"vignettes/NowCast.Rmd",353,12,"style","Put spaces around all infix operators.","(w <- max(1/2, w_star))","infix_spaces_linter" -"vignettes/NowCast.Rmd",370,23,"style","Put spaces around all infix operators.","(numer <- sum(w^(0:11)*example1_values))","infix_spaces_linter" -"vignettes/NowCast.Rmd",392,6,"style","Put spaces around all infix operators.","numer/denom","infix_spaces_linter" -"vignettes/NowCast.Rmd",401,34,"style","Put spaces around all infix operators.","monitor_subset(Omak_nowcast, tlim=rep(2015082111, 2))$data","infix_spaces_linter" -"vignettes/NowCast.Rmd",413,45,"style","Put spaces around all infix operators.","Omak_2015_08_24 <- monitor_subset(Omak, tlim=c(2015082412, 2015082423))","infix_spaces_linter" -"vignettes/NowCast.Rmd",436,37,"style","Put spaces around all infix operators.","w_star <- min(example2_values, na.rm=TRUE)/max(example2_values, na.rm=TRUE)","infix_spaces_linter" -"vignettes/NowCast.Rmd",436,43,"style","Put spaces around all infix operators.","w_star <- min(example2_values, na.rm=TRUE)/max(example2_values, na.rm=TRUE)","infix_spaces_linter" -"vignettes/NowCast.Rmd",436,70,"style","Put spaces around all infix operators.","w_star <- min(example2_values, na.rm=TRUE)/max(example2_values, na.rm=TRUE)","infix_spaces_linter" -"vignettes/NowCast.Rmd",437,12,"style","Put spaces around all infix operators.","(w <- max(1/2, w_star))","infix_spaces_linter" -"vignettes/NowCast.Rmd",445,29,"style","Put spaces around all infix operators.","numer <- sum(w^(validIndexes-1)*example2_values[validIndexes])","infix_spaces_linter" -"vignettes/NowCast.Rmd",445,32,"style","Put spaces around all infix operators.","numer <- sum(w^(validIndexes-1)*example2_values[validIndexes])","infix_spaces_linter" -"vignettes/NowCast.Rmd",446,29,"style","Put spaces around all infix operators.","denom <- sum(w^(validIndexes-1))","infix_spaces_linter" -"vignettes/NowCast.Rmd",447,6,"style","Put spaces around all infix operators.","numer/denom","infix_spaces_linter" -"vignettes/NowCast.Rmd",456,34,"style","Put spaces around all infix operators.","monitor_subset(Omak_nowcast, tlim=rep(2015082423, 2))$data","infix_spaces_linter" -"vignettes/NowCast.Rmd",468,57,"style","Put spaces around all infix operators.","example2_df$nowcast <- monitor_subset(Omak_nowcast, tlim=c(2015082412, 2015082423))$data$`530470013_01`","infix_spaces_linter" -"vignettes/NowCast.Rmd",468,101,"style","Lines should not be more than 100 characters.","example2_df$nowcast <- monitor_subset(Omak_nowcast, tlim=c(2015082412, 2015082423))$data$`530470013_01`","line_length_linter" -"vignettes/NowCast.Rmd",478,45,"style","Put spaces around all infix operators.","Omak_2015_08_23 <- monitor_subset(Omak, tlim=c(2015082312, 2015082323))","infix_spaces_linter" -"vignettes/NowCast.Rmd",501,37,"style","Put spaces around all infix operators.","w_star <- min(example3_values, na.rm=TRUE)/max(example3_values, na.rm=TRUE)","infix_spaces_linter" -"vignettes/NowCast.Rmd",501,43,"style","Put spaces around all infix operators.","w_star <- min(example3_values, na.rm=TRUE)/max(example3_values, na.rm=TRUE)","infix_spaces_linter" -"vignettes/NowCast.Rmd",501,70,"style","Put spaces around all infix operators.","w_star <- min(example3_values, na.rm=TRUE)/max(example3_values, na.rm=TRUE)","infix_spaces_linter" -"vignettes/NowCast.Rmd",502,12,"style","Put spaces around all infix operators.","(w <- max(1/2, w_star))","infix_spaces_linter" -"vignettes/NowCast.Rmd",510,29,"style","Put spaces around all infix operators.","numer <- sum(w^(validIndexes-1)*example3_values[validIndexes])","infix_spaces_linter" -"vignettes/NowCast.Rmd",510,32,"style","Put spaces around all infix operators.","numer <- sum(w^(validIndexes-1)*example3_values[validIndexes])","infix_spaces_linter" -"vignettes/NowCast.Rmd",511,29,"style","Put spaces around all infix operators.","denom <- sum(w^(validIndexes-1))","infix_spaces_linter" -"vignettes/NowCast.Rmd",512,6,"style","Put spaces around all infix operators.","numer/denom","infix_spaces_linter" -"vignettes/NowCast.Rmd",521,34,"style","Put spaces around all infix operators.","monitor_subset(Omak_nowcast, tlim=rep(2015082323, 2))$data","infix_spaces_linter" -"vignettes/NowCast.Rmd",532,57,"style","Put spaces around all infix operators.","example3_df$nowcast <- monitor_subset(Omak_nowcast, tlim=c(2015082312, 2015082323))$data$`530470013_01`","infix_spaces_linter" -"vignettes/NowCast.Rmd",532,101,"style","Lines should not be more than 100 characters.","example3_df$nowcast <- monitor_subset(Omak_nowcast, tlim=c(2015082312, 2015082323))$data$`530470013_01`","line_length_linter" -"vignettes/NowCast.Rmd",618,22,"style","Commas should always have a space after.","tlim <- c(2015082500,2015082523)","commas_linter" -"vignettes/NowCast.Rmd",619,50,"style","Put spaces around all infix operators.","Omak2 <- monitor_subset(Northwest_Megafires, tlim=tlim, monitorIDs = '530470013_01')","infix_spaces_linter" -"vignettes/NowCast.Rmd",619,70,"style","Only use double-quotes.","Omak2 <- monitor_subset(Northwest_Megafires, tlim=tlim, monitorIDs = '530470013_01')","single_quotes_linter" -"vignettes/NowCast.Rmd",644,49,"style","Put spaces around all infix operators.","example4_df <- monitor_subset(Omak_nowcast, tlim=tlim)$data","infix_spaces_linter" -"vignettes/NowCast.Rmd",668,37,"style","Put spaces around all infix operators.","example5_df <- data.frame(""datetime""=Omak$data$datetime,","infix_spaces_linter" -"vignettes/NowCast.Rmd",669,38,"style","Put spaces around all infix operators."," ""monitored""=Omak$data$`530470013_01`,","infix_spaces_linter" -"vignettes/NowCast.Rmd",670,32,"style","Put spaces around all infix operators."," ""aqi""=aqi$data$`530470013_01`)","infix_spaces_linter" -"vignettes/NowCast.Rmd",671,36,"style","Commas should always have a space after.","example5_df <- example5_df[500:650,]","commas_linter" -"vignettes/NowCast.Rmd",672,55,"style","Put spaces around all infix operators.","plot(example5_df$datetime, example5_df$monitored, xlab='Date', ylab='')","infix_spaces_linter" -"vignettes/NowCast.Rmd",672,56,"style","Only use double-quotes.","plot(example5_df$datetime, example5_df$monitored, xlab='Date', ylab='')","single_quotes_linter" -"vignettes/NowCast.Rmd",672,68,"style","Put spaces around all infix operators.","plot(example5_df$datetime, example5_df$monitored, xlab='Date', ylab='')","infix_spaces_linter" -"vignettes/NowCast.Rmd",672,69,"style","Only use double-quotes.","plot(example5_df$datetime, example5_df$monitored, xlab='Date', ylab='')","single_quotes_linter" -"vignettes/NowCast.Rmd",673,49,"style","Put spaces around all infix operators.","lines(example5_df$datetime, example5_df$aqi, col=""blue"")","infix_spaces_linter" -"vignettes/PWFSLSmoke.Rmd",139,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/PWFSLSmoke.Rmd",172,31,"style","Only use double-quotes."," monitor_subset(monitorIDs = '060670010_01')","single_quotes_linter" -"vignettes/PWFSLSmoke.Rmd",176,8,"style","Put spaces around all infix operators."," style='aqidots',","infix_spaces_linter" -"vignettes/PWFSLSmoke.Rmd",176,9,"style","Only use double-quotes."," style='aqidots',","single_quotes_linter" -"vignettes/PWFSLSmoke.Rmd",177,6,"style","Put spaces around all infix operators."," pch=16,","infix_spaces_linter" -"vignettes/PWFSLSmoke.Rmd",178,7,"style","Put spaces around all infix operators."," xlab=""2018""","infix_spaces_linter" -"vignettes/PWFSLSmoke.Rmd",182,17,"style","Put spaces around all infix operators.","addAQILegend(cex=0.8)","infix_spaces_linter" -"vignettes/PWFSLSmoke.Rmd",204,40,"style","Trailing whitespace is superfluous.","monitor_timeseriesPlot(Sacramento_area, ","trailing_whitespace_linter" -"vignettes/PWFSLSmoke.Rmd",205,32,"style","Only use double-quotes."," style = 'gnats',","single_quotes_linter" diff --git a/.dev/revdep_emails/PWFSLSmoke/email-body b/.dev/revdep_emails/PWFSLSmoke/email-body deleted file mode 100644 index edf18a6f0..000000000 --- a/.dev/revdep_emails/PWFSLSmoke/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Jonathan Callahan! Thank you for using {lintr} in your package {PWFSLSmoke}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/MazamaScience/PWFSLSmoke using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 152s on CRAN vs. 99s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/Plasmidprofiler/email-body b/.dev/revdep_emails/Plasmidprofiler/email-body deleted file mode 100644 index eea597fb9..000000000 --- a/.dev/revdep_emails/Plasmidprofiler/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Adrian Zetner! Thank you for using {lintr} in your package {Plasmidprofiler}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cran/Plasmidprofiler using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took NAs on CRAN vs. NAs in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/PosteriorBootstrap/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/PosteriorBootstrap/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 70bcbaaa1..000000000 --- a/.dev/revdep_emails/PosteriorBootstrap/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,24 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/PosteriorBootstrap.R",145,39,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(all(is.numeric(gamma_mean)) & all(is.numeric(gamma_vcov)))) {","vector_logic_linter" -"vignettes/PosteriorBootstrap.Rmd",16,12,"style","Put spaces around all infix operators."," fig.width=7,","infix_spaces_linter" -"vignettes/PosteriorBootstrap.Rmd",17,13,"style","Put spaces around all infix operators."," fig.height=3","infix_spaces_linter" -"vignettes/PosteriorBootstrap.Rmd",153,81,"style","Lines should not be more than 80 characters."," train_dat <- list(n = length(german$y), p = ncol(german$x), x = german$x, y = german$y, beta_sd = prior_sd)","line_length_linter" -"vignettes/PosteriorBootstrap.Rmd",186,81,"style","Lines should not be more than 80 characters."," anpl_sample <- PosteriorBootstrap::draw_logit_samples(x = german$x, y = german$y,","line_length_linter" -"vignettes/PosteriorBootstrap.Rmd",187,81,"style","Lines should not be more than 80 characters."," concentration = concentration,","line_length_linter" -"vignettes/PosteriorBootstrap.Rmd",188,81,"style","Lines should not be more than 80 characters."," n_bootstrap = n_bootstrap,","line_length_linter" -"vignettes/PosteriorBootstrap.Rmd",189,81,"style","Lines should not be more than 80 characters."," posterior_sample = stan_vb_sample,","line_length_linter" -"vignettes/PosteriorBootstrap.Rmd",191,81,"style","Lines should not be more than 80 characters."," show_progress = TRUE)","line_length_linter" -"vignettes/PosteriorBootstrap.Rmd",214,81,"style","Lines should not be more than 80 characters."," plot_df <- append_to_plot(plot_df, sample = anpl_samples[[toString(concentration)]],","line_length_linter" -"vignettes/PosteriorBootstrap.Rmd",239,81,"style","Lines should not be more than 80 characters."," data = dplyr::filter(plot_df, plot_df$Method != ""Bayes-Stan"")) +","line_length_linter" -"vignettes/PosteriorBootstrap.Rmd",246,62,"style","Put spaces around all infix operators."," labeller = ggplot2::label_bquote(c ~"" = ""~","infix_spaces_linter" -"vignettes/PosteriorBootstrap.Rmd",246,68,"style","Put spaces around all infix operators."," labeller = ggplot2::label_bquote(c ~"" = ""~","infix_spaces_linter" -"vignettes/PosteriorBootstrap.Rmd",301,39,"style","Do not place spaces before parentheses.","if (""Windows"" != Sys.info()[""sysname""] ) {","spaces_inside_linter" -"vignettes/PosteriorBootstrap.Rmd",311,81,"style","Lines should not be more than 80 characters."," anpl_samples <- PosteriorBootstrap::draw_logit_samples(x = german$x, y = german$y,","line_length_linter" -"vignettes/PosteriorBootstrap.Rmd",313,81,"style","Lines should not be more than 80 characters."," n_bootstrap = n_bootstrap,","line_length_linter" -"vignettes/PosteriorBootstrap.Rmd",314,81,"style","Lines should not be more than 80 characters."," gamma_mean = rep(0, ncol(german$x)),","line_length_linter" -"vignettes/PosteriorBootstrap.Rmd",315,81,"style","Lines should not be more than 80 characters."," gamma_vcov = diag(1, ncol(german$x)),","line_length_linter" -"vignettes/PosteriorBootstrap.Rmd",317,81,"style","Lines should not be more than 80 characters."," num_cores = num_cores)","line_length_linter" -"vignettes/PosteriorBootstrap.Rmd",322,81,"style","Lines should not be more than 80 characters."," speedups <- rbind(speedups, c(num_cores, n_bootstrap, one_core_duration / lap))","line_length_linter" -"vignettes/PosteriorBootstrap.Rmd",348,39,"style","Do not place spaces before parentheses.","if (""Windows"" != Sys.info()[""sysname""] ) {","spaces_inside_linter" -"vignettes/PosteriorBootstrap.Rmd",353,81,"style","Lines should not be more than 80 characters."," speedups$proportion <- (1 / speedups$speedup - 1) / (1 / speedups$Num_cores - 1)","line_length_linter" -"vignettes/PosteriorBootstrap.Rmd",355,81,"style","Lines should not be more than 80 characters."," ggplot2::qplot(proportion, data = speedups, fill = N_bootstrap, binwidth = 0.005) +","line_length_linter" diff --git a/.dev/revdep_emails/PosteriorBootstrap/email-body b/.dev/revdep_emails/PosteriorBootstrap/email-body deleted file mode 100644 index 1eb75b5aa..000000000 --- a/.dev/revdep_emails/PosteriorBootstrap/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello James Robinson! Thank you for using {lintr} in your package {PosteriorBootstrap}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/alan-turing-institute/PosteriorBootstrap using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 6s on CRAN vs. 5s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/RSQL/attachments/RSQL.warnings b/.dev/revdep_emails/RSQL/attachments/RSQL.warnings deleted file mode 100644 index 328bcbcc8..000000000 --- a/.dev/revdep_emails/RSQL/attachments/RSQL.warnings +++ /dev/null @@ -1,2 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Trying to remove β€˜paren_brace_linter’ and β€˜function_left_parentheses’, which are not in `defaults`. diff --git a/.dev/revdep_emails/RSQL/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/RSQL/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index ce8c349d9..000000000 --- a/.dev/revdep_emails/RSQL/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,25 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/sql-lib.R",129,5,"style","`else` should come on the same line as the previous `}`."," else{","brace_linter" -"R/sql-lib.R",129,9,"style","There should be a space before an opening curly brace."," else{","brace_linter" -"R/sql-lib.R",138,42,"style","There should be a space before an opening curly brace."," setupResultClassFromDriver = function(){","brace_linter" -"R/sql-lib.R",138,42,"style","There should be a space between a right parenthesis and a body expression."," setupResultClassFromDriver = function(){","paren_body_linter" -"R/sql-lib.R",141,47,"style","There should be a space before an opening curly brace."," if (inherits(self$driver, ""SQLiteDriver"")){","brace_linter" -"R/sql-lib.R",141,47,"style","There should be a space between a right parenthesis and a body expression."," if (inherits(self$driver, ""SQLiteDriver"")){","paren_body_linter" -"R/sql-lib.R",145,43,"style","There should be a space before an opening curly brace."," if (inherits(self$driver, ""PqDriver"")){","brace_linter" -"R/sql-lib.R",145,43,"style","There should be a space between a right parenthesis and a body expression."," if (inherits(self$driver, ""PqDriver"")){","paren_body_linter" -"R/sql-lib.R",148,37,"style","There should be a space before an opening curly brace."," if (is.null(self$results.class)){","brace_linter" -"R/sql-lib.R",148,37,"style","There should be a space between a right parenthesis and a body expression."," if (is.null(self$results.class)){","paren_body_linter" -"R/sql-lib.R",412,31,"style","There should be a space before an opening curly brace."," clearLastResult = function(){","brace_linter" -"R/sql-lib.R",412,31,"style","There should be a space between a right parenthesis and a body expression."," clearLastResult = function(){","paren_body_linter" -"R/sql-lib.R",413,63,"style","There should be a space before an opening curly brace."," if (!is.null(self$results.class) & !is.null(self$last.rs)){","brace_linter" -"R/sql-lib.R",413,63,"style","There should be a space between a right parenthesis and a body expression."," if (!is.null(self$results.class) & !is.null(self$last.rs)){","paren_body_linter" -"R/sql-lib.R",414,54,"style","There should be a space before an opening curly brace."," if (inherits(self$last.rs, self$results.class)){","brace_linter" -"R/sql-lib.R",414,54,"style","There should be a space between a right parenthesis and a body expression."," if (inherits(self$last.rs, self$results.class)){","paren_body_linter" -"R/sql-lib.R",425,26,"style","There should be a space before an opening curly brace."," getSummary = function(){","brace_linter" -"R/sql-lib.R",425,26,"style","There should be a space between a right parenthesis and a body expression."," getSummary = function(){","paren_body_linter" -"R/sql-lib.R",575,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," while (!ret & i <= length(quotes_symbols)) {","vector_logic_linter" -"R/sql-lib.R",683,38,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (quotes == substr(text, 1, 1) & quotes == substr(text, nchar(text), nchar(text))) {","vector_logic_linter" -"R/sql-lib.R",906,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(where_fields) > 0 & !(length(where_fields) == 1 & nchar(where_fields[1]) ==","vector_logic_linter" -"R/sql-lib.R",906,64,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(where_fields) > 0 & !(length(where_fields) == 1 & nchar(where_fields[1]) ==","vector_logic_linter" -"R/sql-lib.R",1022,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(values_df) > 1 & !inherits(values_df, ""data.frame"")) {","vector_logic_linter" -"R/sql-lib.R",1258,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nrow(values) > 0 & nrow(values) != nrow(values_uk)) {","vector_logic_linter" diff --git a/.dev/revdep_emails/RSQL/email-body b/.dev/revdep_emails/RSQL/email-body deleted file mode 100644 index 8a1ce010e..000000000 --- a/.dev/revdep_emails/RSQL/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Alejandro Baranek! Thank you for using {lintr} in your package {RSQL}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/rOpenStats/RSQL using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 6s on CRAN vs. 3s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/RestRserve/attachments/RestRserve.failure b/.dev/revdep_emails/RestRserve/attachments/RestRserve.failure deleted file mode 100644 index 08edf6748..000000000 --- a/.dev/revdep_emails/RestRserve/attachments/RestRserve.failure +++ /dev/null @@ -1 +0,0 @@ -`defaults` must be a named list. diff --git a/.dev/revdep_emails/RestRserve/attachments/RestRserve.warnings b/.dev/revdep_emails/RestRserve/attachments/RestRserve.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/RestRserve/attachments/RestRserve.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/RestRserve/email-body b/.dev/revdep_emails/RestRserve/email-body deleted file mode 100644 index 27b3c8e20..000000000 --- a/.dev/revdep_emails/RestRserve/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Dmitry Selivanov! Thank you for using {lintr} in your package {RestRserve}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/rexyai/RestRserve using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 23s on CRAN vs. 0s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/SamplerCompare/email-body b/.dev/revdep_emails/SamplerCompare/email-body deleted file mode 100644 index 78ef66965..000000000 --- a/.dev/revdep_emails/SamplerCompare/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Madeleine Thompson! Thank you for using {lintr} in your package {SamplerCompare}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cran/SamplerCompare using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took NAs on CRAN vs. NAs in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/TDA/email-body b/.dev/revdep_emails/TDA/email-body deleted file mode 100644 index 5af2fe801..000000000 --- a/.dev/revdep_emails/TDA/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Jisu Kim! Thank you for using {lintr} in your package {TDA}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cran/TDA using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took NAs on CRAN vs. NAs in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/WikidataQueryServiceR/attachments/WikidataQueryServiceR.warnings b/.dev/revdep_emails/WikidataQueryServiceR/attachments/WikidataQueryServiceR.warnings deleted file mode 100644 index 2bb977138..000000000 --- a/.dev/revdep_emails/WikidataQueryServiceR/attachments/WikidataQueryServiceR.warnings +++ /dev/null @@ -1,2 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Trying to remove β€˜closed_curly_linter’, β€˜open_curly_linter’ and β€˜camel_case_linter’, which are not in `defaults`. diff --git a/.dev/revdep_emails/WikidataQueryServiceR/email-body b/.dev/revdep_emails/WikidataQueryServiceR/email-body deleted file mode 100644 index bf8dcef9b..000000000 --- a/.dev/revdep_emails/WikidataQueryServiceR/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Mikhail Popov! Thank you for using {lintr} in your package {WikidataQueryServiceR}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/bearloga/WikidataQueryServiceR using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 2s on CRAN vs. 1s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/WoodburyMatrix/attachments/WoodburyMatrix.warnings b/.dev/revdep_emails/WoodburyMatrix/attachments/WoodburyMatrix.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/WoodburyMatrix/attachments/WoodburyMatrix.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/WoodburyMatrix/email-body b/.dev/revdep_emails/WoodburyMatrix/email-body deleted file mode 100644 index e82bd6bca..000000000 --- a/.dev/revdep_emails/WoodburyMatrix/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Michael Bertolacci! Thank you for using {lintr} in your package {WoodburyMatrix}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/mbertolacci/WoodburyMatrix using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 5s on CRAN vs. 3s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/abbyyR/email-body b/.dev/revdep_emails/abbyyR/email-body deleted file mode 100644 index ec6dd0959..000000000 --- a/.dev/revdep_emails/abbyyR/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Gaurav Sood! Thank you for using {lintr} in your package {abbyyR}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at http://github.com/soodoku/abbyyR using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 0s on CRAN vs. 0s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/adaptalint/email-body b/.dev/revdep_emails/adaptalint/email-body deleted file mode 100644 index 38ffd6003..000000000 --- a/.dev/revdep_emails/adaptalint/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Max Conway! Thank you for using {lintr} in your package {adaptalint}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cran/adaptalint using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took NAs on CRAN vs. NAs in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/admiral/email-body b/.dev/revdep_emails/admiral/email-body deleted file mode 100644 index 47d3f3ae9..000000000 --- a/.dev/revdep_emails/admiral/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Thomas Neitmann! Thank you for using {lintr} in your package {admiral}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cran/admiral using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took NAs on CRAN vs. NAs in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/autoharp/email-body b/.dev/revdep_emails/autoharp/email-body deleted file mode 100644 index 07b6f67da..000000000 --- a/.dev/revdep_emails/autoharp/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Vik Gopal! Thank you for using {lintr} in your package {autoharp}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cran/autoharp using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took NAs on CRAN vs. NAs in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/aws.alexa/email-body b/.dev/revdep_emails/aws.alexa/email-body deleted file mode 100644 index beb7aba41..000000000 --- a/.dev/revdep_emails/aws.alexa/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Gaurav Sood! Thank you for using {lintr} in your package {aws.alexa}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cran/aws.alexa using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took NAs on CRAN vs. NAs in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/babette/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/babette/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 1e3a63aa0..000000000 --- a/.dev/revdep_emails/babette/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,5 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"vignettes/nested_sampling.Rmd",122,4,"style","Trailing whitespace is superfluous."," ) ","trailing_whitespace_linter" -"vignettes/step_by_step.Rmd",51,45,"style","Trailing whitespace is superfluous."," pattern = ""treelog_"", fileext = "".trees"" ","trailing_whitespace_linter" -"vignettes/step_by_step.Rmd",145,81,"style","Lines should not be more than 80 characters."," knitr::kable(head(parse_beast_tracelog_file(inference_model$mcmc$tracelog$filename)))","line_length_linter" -"vignettes/step_by_step.Rmd",161,81,"style","Lines should not be more than 80 characters."," knitr::kable(head(parse_beast_state_operators(beast2_options$output_state_filename)))","line_length_linter" diff --git a/.dev/revdep_emails/babette/email-body b/.dev/revdep_emails/babette/email-body deleted file mode 100644 index 1955454b4..000000000 --- a/.dev/revdep_emails/babette/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello RichΓ¨l J.C. Bilderbeek! Thank you for using {lintr} in your package {babette}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/ropensci/babette using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 21s on CRAN vs. 14s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/beautier/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/beautier/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index f632afb05..000000000 --- a/.dev/revdep_emails/beautier/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,3 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/create_branch_rate_model_xml.R",106,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/remove_empty_lines.R",13,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" diff --git a/.dev/revdep_emails/beautier/email-body b/.dev/revdep_emails/beautier/email-body deleted file mode 100644 index ea0df4f14..000000000 --- a/.dev/revdep_emails/beautier/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello RichΓ¨l J.C. Bilderbeek! Thank you for using {lintr} in your package {beautier}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/ropensci/beautier using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 258s on CRAN vs. 144s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/biolink/email-body b/.dev/revdep_emails/biolink/email-body deleted file mode 100644 index aab48ed52..000000000 --- a/.dev/revdep_emails/biolink/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Aaron Wolen! Thank you for using {lintr} in your package {biolink}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cran/biolink using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took NAs on CRAN vs. NAs in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/caretEnsemble/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/caretEnsemble/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index b96c5293a..000000000 --- a/.dev/revdep_emails/caretEnsemble/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,8 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/caretEnsemble.R",235,12,"style","Variable and function name style should be snake_case."," object$modelType <- extractModelTypes(object$models)[1]","object_name_linter" -"R/caretEnsemble.R",355,7,"style","Variable and function name style should be snake_case."," dat$metricSD <- dat[[paste0(metricLab, ""SD"")]]","object_name_linter" -"R/caretList.R",95,7,"style","Variable and function name style should be snake_case."," x$savePredictions <- ""final""","object_name_linter" -"R/caretList.R",100,7,"style","Variable and function name style should be snake_case."," x$savePredictions <- ""final""","object_name_linter" -"tests/testthat/test-caretList.R",143,15,"style","Variable and function name style should be snake_case."," models[[1]]$modelType <- ""Bogus""","object_name_linter" -"tests/testthat/test-caretList.R",202,3,"style","There should be a space between right parenthesis and an opening curly brace."," ){","paren_brace_linter" -"tests/testthat/test-caretList.R",252,3,"style","There should be a space between right parenthesis and an opening curly brace."," ){","paren_brace_linter" diff --git a/.dev/revdep_emails/caretEnsemble/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/caretEnsemble/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index aa0425e79..000000000 --- a/.dev/revdep_emails/caretEnsemble/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,114 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/caretEnsemble.R",93,9,"style","Variable and function name style should be snake_case or symbols."," names(modRes)[2:3] <- c(metric, paste0(metric, ""SD""))","object_name_linter" -"R/caretEnsemble.R",307,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/caretEnsemble.R",325,5,"style","Variable and function name style should be snake_case or symbols."," datList[[i]] <- model$models[[i]]$trainingData","object_name_linter" -"R/caretEnsemble.R",408,3,"style","Variable and function name style should be snake_case or symbols."," wghtFrame$method <- row.names(wghtFrame)","object_name_linter" -"R/caretEnsemble.R",409,9,"style","Variable and function name style should be snake_case or symbols."," names(wghtFrame) <- c(""weights"", ""method"")","object_name_linter" -"R/caretList.R",233,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/caretList.R",238,9,"style","Variable and function name style should be snake_case or symbols."," names(modelList) <- names(tuneList)","object_name_linter" -"R/caretList.R",245,9,"style","Variable and function name style should be snake_case or symbols."," class(modelList) <- c(""caretList"")","object_name_linter" -"R/caretList.R",344,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/caretList.R",349,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/caretStack.R",67,18,"style","Put spaces around all infix operators."," object, newdata=NULL,","infix_spaces_linter" -"R/caretStack.R",68,5,"style","Put spaces around all infix operators."," se=FALSE, level=0.95,","infix_spaces_linter" -"R/caretStack.R",68,18,"style","Put spaces around all infix operators."," se=FALSE, level=0.95,","infix_spaces_linter" -"R/caretStack.R",69,17,"style","Put spaces around all infix operators."," return_weights=FALSE,","infix_spaces_linter" -"R/caretStack.R",84,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/caretStack.R",87,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/caretStack.R",110,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/helper_functions.R",61,27,"style","Compound semicolons are discouraged. Replace them by a newline."," w <- w[i <- !is.na(x)]; x <- x[i]","semicolon_linter" -"tests/testthat/test-caretList.R",49,9,"style","Variable and function name style should be snake_case or symbols."," names(tuneList) <- all_models","object_name_linter" -"tests/testthat/test-caretList.R",50,9,"style","Variable and function name style should be snake_case or symbols."," names(tuneList)[c(1, 5, 10)] <- """"","object_name_linter" -"tests/testthat/test-caretList.R",155,9,"style","Variable and function name style should be snake_case or symbols."," class(modelList) <- ""list""","object_name_linter" -"tests/testthat/test-classSelection.R",109,15,"style","Any function spanning multiple lines should use curly braces."," refactor <- function(d) factor(","brace_linter" -"tests/testthat/test-ensemble.R",141,9,"style","Variable and function name style should be snake_case or symbols."," class(nestedList) <- ""caretList""","object_name_linter" -"tests/testthat/test-ensemble.R",149,3,"style","Variable and function name style should be snake_case or symbols."," X_reg_new[2, 3] <- NA","object_name_linter" -"tests/testthat/test-ensemble.R",150,3,"style","Variable and function name style should be snake_case or symbols."," X_reg_new[25, 3] <- NA","object_name_linter" -"tests/testthat/test-ensemble.R",197,3,"style","Variable and function name style should be snake_case or symbols."," custom.rf$method <- ""custom.rf""","object_name_linter" -"tests/testthat/test-ensemble.R",200,3,"style","Variable and function name style should be snake_case or symbols."," custom.rpart$method <- ""custom.rpart""","object_name_linter" -"tests/testthat/test-ensembleMethods.R",20,9,"style","Variable and function name style should be snake_case or symbols."," class(models.subset) <- ""caretList""","object_name_linter" -"tests/testthat/test-ensembleMethods.R",36,9,"style","Variable and function name style should be snake_case or symbols."," class(models.subset) <- ""caretList""","object_name_linter" -"tests/testthat/test-ensembleMethods.R",58,9,"style","Variable and function name style should be snake_case or symbols."," class(models.subset) <- ""caretList""","object_name_linter" -"tests/testthat/test-ensembleMethods.R",93,9,"style","Variable and function name style should be snake_case or symbols."," class(models.subset) <- ""caretList""","object_name_linter" -"tests/testthat/test-ensembleMethods.R",138,9,"style","Variable and function name style should be snake_case or symbols."," class(models.subset) <- ""caretList""","object_name_linter" -"tests/testthat/test-ensembleMethods.R",181,9,"style","Variable and function name style should be snake_case or symbols."," class(models.subset) <- ""caretList""","object_name_linter" -"tests/testthat/test-ensembleMethods.R",203,14,"style","Variable and function name style should be snake_case or symbols."," attributes(mr2.tmp1) <- NULL","object_name_linter" -"tests/testthat/test-ensembleMethods.R",242,9,"style","Variable and function name style should be snake_case or symbols."," class(models.subset) <- ""caretList""","object_name_linter" -"tests/testthat/test-ensembleMethods.R",257,9,"style","Variable and function name style should be snake_case or symbols."," class(models.class2) <- ""caretList""","object_name_linter" -"tests/testthat/test-ensembleMethods.R",260,3,"style","Variable and function name style should be snake_case or symbols."," newDat[2, 2] <- NA","object_name_linter" -"tests/testthat/test-ensembleMethods.R",261,3,"style","Variable and function name style should be snake_case or symbols."," newDat[3, 3] <- NA","object_name_linter" -"tests/testthat/test-ensembleMethods.R",262,3,"style","Variable and function name style should be snake_case or symbols."," newDat[4, 4] <- NA","object_name_linter" -"tests/testthat/test-ensembleMethods.R",289,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"tests/testthat/test-ensembleMethods.R",296,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"tests/testthat/test-ensembleMethods.R",318,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"tests/testthat/test-ensembleMethods.R",325,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"vignettes/caretEnsemble-intro.Rmd",33,1,"style","Variable and function name style should be snake_case or symbols.","inTrain <- createDataPartition(y = Sonar$Class, p = .75, list = FALSE)","object_name_linter" -"vignettes/caretEnsemble-intro.Rmd",34,19,"style","Do not place spaces after square brackets.","training <- Sonar[ inTrain,]","spaces_inside_linter" -"vignettes/caretEnsemble-intro.Rmd",34,28,"style","Commas should always have a space after.","training <- Sonar[ inTrain,]","commas_linter" -"vignettes/caretEnsemble-intro.Rmd",35,27,"style","Commas should always have a space after.","testing <- Sonar[-inTrain,]","commas_linter" -"vignettes/caretEnsemble-intro.Rmd",37,9,"style","Put spaces around all infix operators."," method=""boot"",","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",38,9,"style","Put spaces around all infix operators."," number=25,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",39,18,"style","Put spaces around all infix operators."," savePredictions=""final"",","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",40,13,"style","Put spaces around all infix operators."," classProbs=TRUE,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",41,8,"style","Put spaces around all infix operators."," index=createResample(training$Class, 25),","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",42,18,"style","Put spaces around all infix operators."," summaryFunction=twoClassSummary","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",52,8,"style","Put spaces around all infix operators."," Class~., data=training,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",52,16,"style","Put spaces around all infix operators."," Class~., data=training,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",53,12,"style","Put spaces around all infix operators."," trControl=my_control,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",54,13,"style","Put spaces around all infix operators."," methodList=c(""glm"", ""rpart"")","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",60,47,"style","Put spaces around all infix operators.","p <- as.data.frame(predict(model_list, newdata=head(testing)))","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",78,8,"style","Put spaces around all infix operators."," Class~., data=training,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",78,16,"style","Put spaces around all infix operators."," Class~., data=training,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",79,12,"style","Put spaces around all infix operators."," trControl=my_control,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",80,9,"style","Put spaces around all infix operators."," metric=""ROC"",","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",81,13,"style","Put spaces around all infix operators."," methodList=c(""glm"", ""rpart""),","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",82,11,"style","Put spaces around all infix operators."," tuneList=list(","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",83,8,"style","Put spaces around all infix operators."," rf1=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=2)),","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",83,30,"style","Put spaces around all infix operators."," rf1=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=2)),","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",83,45,"style","Put spaces around all infix operators."," rf1=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=2)),","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",83,62,"style","Put spaces around all infix operators."," rf1=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=2)),","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",84,8,"style","Put spaces around all infix operators."," rf2=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=10), preProcess=""pca""),","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",84,30,"style","Put spaces around all infix operators."," rf2=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=10), preProcess=""pca""),","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",84,45,"style","Put spaces around all infix operators."," rf2=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=10), preProcess=""pca""),","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",84,62,"style","Put spaces around all infix operators."," rf2=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=10), preProcess=""pca""),","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",84,78,"style","Put spaces around all infix operators."," rf2=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=10), preProcess=""pca""),","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",84,81,"style","Lines should not be more than 80 characters."," rf2=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=10), preProcess=""pca""),","line_length_linter" -"vignettes/caretEnsemble-intro.Rmd",85,7,"style","Put spaces around all infix operators."," nn=caretModelSpec(method=""nnet"", tuneLength=2, trace=FALSE)","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",85,29,"style","Put spaces around all infix operators."," nn=caretModelSpec(method=""nnet"", tuneLength=2, trace=FALSE)","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",85,48,"style","Put spaces around all infix operators."," nn=caretModelSpec(method=""nnet"", tuneLength=2, trace=FALSE)","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",85,57,"style","Put spaces around all infix operators."," nn=caretModelSpec(method=""nnet"", tuneLength=2, trace=FALSE)","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",108,14,"style","Trailing whitespace is superfluous."," model_list, ","trailing_whitespace_linter" -"vignettes/caretEnsemble-intro.Rmd",109,9,"style","Put spaces around all infix operators."," metric=""ROC"",","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",110,12,"style","Put spaces around all infix operators."," trControl=trainControl(","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",111,11,"style","Put spaces around all infix operators."," number=2,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",112,20,"style","Put spaces around all infix operators."," summaryFunction=twoClassSummary,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",113,15,"style","Put spaces around all infix operators."," classProbs=TRUE","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",121,51,"style","Put spaces around all infix operators.","model_preds <- lapply(model_list, predict, newdata=testing, type=""prob"")","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",121,65,"style","Put spaces around all infix operators.","model_preds <- lapply(model_list, predict, newdata=testing, type=""prob"")","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",122,51,"style","Commas should always have a space after.","model_preds <- lapply(model_preds, function(x) x[,""M""])","commas_linter" -"vignettes/caretEnsemble-intro.Rmd",124,46,"style","Put spaces around all infix operators.","ens_preds <- predict(greedy_ensemble, newdata=testing, type=""prob"")","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",124,60,"style","Put spaces around all infix operators.","ens_preds <- predict(greedy_ensemble, newdata=testing, type=""prob"")","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",147,9,"style","Put spaces around all infix operators."," method=""glm"",","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",148,9,"style","Put spaces around all infix operators."," metric=""ROC"",","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",149,12,"style","Put spaces around all infix operators."," trControl=trainControl(","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",150,11,"style","Put spaces around all infix operators."," method=""boot"",","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",151,11,"style","Put spaces around all infix operators."," number=10,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",152,20,"style","Put spaces around all infix operators."," savePredictions=""final"",","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",153,15,"style","Put spaces around all infix operators."," classProbs=TRUE,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",154,20,"style","Put spaces around all infix operators."," summaryFunction=twoClassSummary","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",158,55,"style","Put spaces around all infix operators.","model_preds2$ensemble <- predict(glm_ensemble, newdata=testing, type=""prob"")","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",158,69,"style","Put spaces around all infix operators.","model_preds2$ensemble <- predict(glm_ensemble, newdata=testing, type=""prob"")","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",159,1,"style","Variable and function name style should be snake_case or symbols.","CF <- coef(glm_ensemble$ens_model$finalModel)[-1]","object_name_linter" -"vignettes/caretEnsemble-intro.Rmd",161,3,"style","Put spaces around all infix operators.","CF/sum(CF)","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",175,9,"style","Put spaces around all infix operators."," method=""gbm"",","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",176,10,"style","Put spaces around all infix operators."," verbose=FALSE,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",177,13,"style","Put spaces around all infix operators."," tuneLength=10,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",178,9,"style","Put spaces around all infix operators."," metric=""ROC"",","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",179,12,"style","Put spaces around all infix operators."," trControl=trainControl(","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",180,11,"style","Put spaces around all infix operators."," method=""boot"",","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",181,11,"style","Put spaces around all infix operators."," number=10,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",182,20,"style","Put spaces around all infix operators."," savePredictions=""final"",","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",183,15,"style","Put spaces around all infix operators."," classProbs=TRUE,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",184,20,"style","Put spaces around all infix operators."," summaryFunction=twoClassSummary","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",188,55,"style","Put spaces around all infix operators.","model_preds3$ensemble <- predict(gbm_ensemble, newdata=testing, type=""prob"")","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",188,69,"style","Put spaces around all infix operators.","model_preds3$ensemble <- predict(gbm_ensemble, newdata=testing, type=""prob"")","infix_spaces_linter" diff --git a/.dev/revdep_emails/caretEnsemble/email-body b/.dev/revdep_emails/caretEnsemble/email-body deleted file mode 100644 index 612602379..000000000 --- a/.dev/revdep_emails/caretEnsemble/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Zachary A. Deane-Mayer! Thank you for using {lintr} in your package {caretEnsemble}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/zachmayer/caretEnsemble using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 25s on CRAN vs. 15s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/cattonum/attachments/cattonum.warnings b/.dev/revdep_emails/cattonum/attachments/cattonum.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/cattonum/attachments/cattonum.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/cattonum/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/cattonum/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 2625ea5b8..000000000 --- a/.dev/revdep_emails/cattonum/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,2 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/cattonum.R",18,1,"style","Variable and function name style should be snake_case.",".onAttach <- function(libname, pkgname) {","object_name_linter" diff --git a/.dev/revdep_emails/cattonum/email-body b/.dev/revdep_emails/cattonum/email-body deleted file mode 100644 index 3ac067be3..000000000 --- a/.dev/revdep_emails/cattonum/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Bernie Gray! Thank you for using {lintr} in your package {cattonum}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/bfgray3/cattonum using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 12s on CRAN vs. 8s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/cleaR/attachments/cleaR.warnings b/.dev/revdep_emails/cleaR/attachments/cleaR.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/cleaR/attachments/cleaR.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/cleaR/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/cleaR/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 6d25f7316..000000000 --- a/.dev/revdep_emails/cleaR/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,29 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"data-raw/devstuffs.R",57,2,"style","Commented code should be removed.","#usethis::use_gpl3_license(name = ""UniversitΓ€tsklinikum Erlangen"")","commented_code_linter" -"data-raw/devstuffs.R",61,81,"style","Lines should not be more than 80 characters.","# Listing a package in either Depends or Imports ensures that it’s installed when needed","line_length_linter" -"data-raw/devstuffs.R",63,81,"style","Lines should not be more than 80 characters.","# Loading will load code, data and any DLLs; register S3 and S4 methods; and run the .onLoad() function.","line_length_linter" -"data-raw/devstuffs.R",64,81,"style","Lines should not be more than 80 characters.","## After loading, the package is available in memory, but because it’s not in the search path,","line_length_linter" -"data-raw/devstuffs.R",66,81,"style","Lines should not be more than 80 characters.","## Confusingly, :: will also load a package automatically if it isn’t already loaded.","line_length_linter" -"data-raw/devstuffs.R",67,81,"style","Lines should not be more than 80 characters.","## It’s rare to load a package explicitly, but you can do so with requireNamespace() or loadNamespace().","line_length_linter" -"data-raw/devstuffs.R",68,81,"style","Lines should not be more than 80 characters.","# Attaching puts the package in the search path. You can’t attach a package without first loading it,","line_length_linter" -"data-raw/devstuffs.R",78,3,"style","Commented code should be removed.","# usethis::use_package(""config"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",79,3,"style","Commented code should be removed.","# usethis::use_package(""magrittr"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",80,3,"style","Commented code should be removed.","# usethis::use_package(""data.table"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",82,3,"style","Commented code should be removed.","# usethis::use_package(""Hmisc"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",84,3,"style","Commented code should be removed.","# usethis::use_package(""parsedate"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",86,3,"style","Commented code should be removed.","# usethis::use_package(""psych"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",88,3,"style","Commented code should be removed.","# usethis::use_package(""RJSONIO"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",89,3,"style","Commented code should be removed.","# usethis::use_package(""shiny"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",90,3,"style","Commented code should be removed.","# usethis::use_package(""shinyjs"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",92,3,"style","Commented code should be removed.","# usethis::use_package(""xml2"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",94,3,"style","Commented code should be removed.","# usethis::use_package(""logger"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",100,3,"style","Commented code should be removed.","# usethis::use_package(""shiny"", type = ""Suggests"")","commented_code_linter" -"data-raw/devstuffs.R",101,3,"style","Commented code should be removed.","# usethis::use_package(""shinyjs"", type = ""Suggests"")","commented_code_linter" -"data-raw/devstuffs.R",112,81,"style","Lines should not be more than 80 characters.","usethis::use_build_ignore(""## Please apply changes in `./data-raw/devstuffs.R`!"")","line_length_linter" -"data-raw/devstuffs.R",170,3,"style","Commented code should be removed.","# covr::package_coverage()","commented_code_linter" -"data-raw/devstuffs.R",173,3,"style","Commented code should be removed.","# lintr::lint_package()","commented_code_linter" -"data-raw/devstuffs.R",176,3,"style","Commented code should be removed.","# devtools::test()","commented_code_linter" -"data-raw/devstuffs.R",179,3,"style","Commented code should be removed.","# rcmdcheck::rcmdcheck()","commented_code_linter" -"data-raw/devstuffs.R",180,3,"style","Commented code should be removed.","# rcmdcheck::rcmdcheck(args = ""--no-vignettes"", build_args = ""--no-build-vignettes"")","commented_code_linter" -"data-raw/devstuffs.R",180,81,"style","Lines should not be more than 80 characters.","# rcmdcheck::rcmdcheck(args = ""--no-vignettes"", build_args = ""--no-build-vignettes"")","line_length_linter" -"data-raw/devstuffs.R",188,3,"style","Commented code should be removed.","# build|ci|docs|feat|fix|perf|refactor|test","commented_code_linter" diff --git a/.dev/revdep_emails/cleaR/email-body b/.dev/revdep_emails/cleaR/email-body deleted file mode 100644 index de101ff46..000000000 --- a/.dev/revdep_emails/cleaR/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Jonathan M. Mang! Thank you for using {lintr} in your package {cleaR}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/joundso/cleaR using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 1s on CRAN vs. 1s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/cloudos/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/cloudos/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 69f2dd16c..000000000 --- a/.dev/revdep_emails/cloudos/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,19 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/cb_cohort_extract.R",124,36,"style","Variable and function name style should be snake_case."," req_body$criteria$pagination$pageNumber <- i","object_name_linter" -"R/cb_cohort_extract.R",125,36,"style","Variable and function name style should be snake_case."," req_body$criteria$pagination$pageSize <- page_size","object_name_linter" -"R/cb_cohort_extract.R",224,33,"style","There should be a space between right parenthesis and an opening curly brace."," for (col in res$header$columns){","paren_brace_linter" -"R/cb_cohort_extract.R",301,25,"style","There should be a space between right parenthesis and an opening curly brace."," for (col in res$header){","paren_brace_linter" -"R/cb_cohort_extract.R",349,35,"style","There should be a space between right parenthesis and an opening curly brace."," for (colname in colnames(res_df)){","paren_brace_linter" -"R/cb_cohort_extract.R",426,25,"style","There should be a space between right parenthesis and an opening curly brace."," for (col in res$header){","paren_brace_linter" -"R/cb_cohort_extract.R",474,27,"style","There should be a space between right parenthesis and an opening curly brace."," for (group in datagroups){","paren_brace_linter" -"R/cb_cohort_extract.R",476,33,"style","There should be a space between right parenthesis and an opening curly brace."," for (colname in colnames(df)){","paren_brace_linter" -"R/cb_cohort_extract.R",485,37,"style","There should be a space between right parenthesis and an opening curly brace."," for (colname in colnames(final_df)){","paren_brace_linter" -"R/cb_cohorts_list.R",85,11,"style","Variable and function name style should be snake_case."," cohorts$numberOfFilters <- sapply(cohorts$phenotypeFilters, nrow)","object_name_linter" -"R/cb_filter_apply.R",10,26,"style","There should be a space between right parenthesis and an opening curly brace."," for (filter in unnested){","paren_brace_linter" -"R/cb_filter_explore.R",117,25,"style","Variable and function name style should be snake_case."," req_body$criteria$pageNumber <- i","object_name_linter" -"R/cb_filter_explore.R",118,25,"style","Variable and function name style should be snake_case."," req_body$criteria$pageSize <- page_size","object_name_linter" -"R/cb_filter_explore.R",195,1,"style","Variable and function names should not be longer than 30 characters.",".cb_get_phenotype_statistics_v1 <- function(cohort, pheno_id) {","object_length_linter" -"R/cb_filter_explore.R",199,45,"style","There should be a space between right parenthesis and an opening curly brace."," for (filter in .unnest_query(cohort@query)){","paren_brace_linter" -"R/cb_json.R",42,26,"style","There should be a space between right parenthesis and an opening curly brace."," for (filter in unnested){","paren_brace_linter" -"R/zzz.R",1,1,"style","Variable and function name style should be snake_case.",".onLoad <- function(libname, pkgname, ...) {","object_name_linter" -"R/zzz.R",5,1,"style","Variable and function name style should be snake_case.",".onAttach <- function(libname, pkgname, ...) {","object_name_linter" diff --git a/.dev/revdep_emails/cloudos/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/cloudos/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 83b188f3a..000000000 --- a/.dev/revdep_emails/cloudos/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,25 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/cb_class.R",84,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/cb_cohort_extract.R",109,67,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(req_body, auto_unbox = T),","T_and_F_symbol_linter" -"R/cb_cohort_extract.R",129,71,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(req_body, auto_unbox = T),","T_and_F_symbol_linter" -"R/cb_cohort_extract.R",197,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/cb_cohort_extract.R",213,35,"style","Use TRUE instead of the symbol T."," auto_unbox = T),","T_and_F_symbol_linter" -"R/cb_cohorts_list.R",39,48,"style","Use TRUE instead of the symbol T."," res <- httr::content(r, simplifyDataFrame = T)","T_and_F_symbol_linter" -"R/cb_filter_apply.R",59,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," starting_depth > 1 &","vector_logic_linter" -"R/cb_filter_apply.R",77,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (keep_query & !identical(cohort@query, list())) {","vector_logic_linter" -"R/cb_filter_apply.R",81,3,"style","`else` should come on the same line as the previous `}`."," else if (keep_query) {","brace_linter" -"R/cb_filter_apply.R",96,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !is.null(x$operator) &","vector_logic_linter" -"R/cb_filter_apply.R",171,64,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(r_body, auto_unbox = T),","T_and_F_symbol_linter" -"R/cb_filter_apply.R",192,80,"style","Use FALSE instead of the symbol F."," no_participants <- cb_participant_count(cohort, query = query, keep_query = F)","T_and_F_symbol_linter" -"R/cb_filter_apply.R",212,64,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(r_body, auto_unbox = T),","T_and_F_symbol_linter" -"R/cb_filter_explore.R",95,67,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(req_body, auto_unbox = T),","T_and_F_symbol_linter" -"R/cb_filter_explore.R",114,16,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (iter_all & paged) {","vector_logic_linter" -"R/cb_filter_explore.R",122,71,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(req_body, auto_unbox = T),","T_and_F_symbol_linter" -"R/cb_filter_explore.R",149,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(item$children) > 0 & depth < max_depth) {","vector_logic_linter" -"R/cb_filter_explore.R",224,65,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(r_body, auto_unbox = T),","T_and_F_symbol_linter" -"R/cb_filter_explore.R",328,65,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(r_body, auto_unbox = T),","T_and_F_symbol_linter" -"R/cb_filter_explore.R",346,67,"style","Use TRUE instead of the symbol T."," r_body <- jsonlite::toJSON(list(query = query), auto_unbox = T)","T_and_F_symbol_linter" -"R/cb_plots.R",118,12,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/cb_set_columns.R",77,64,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(r_body, auto_unbox = T),","T_and_F_symbol_linter" -"R/cb_set_columns.R",112,64,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(r_body, auto_unbox = T),","T_and_F_symbol_linter" -"tests/testthat/helper.R",6,5,"style","Missing terminal newline.","# })","trailing_blank_lines_linter" diff --git a/.dev/revdep_emails/cloudos/email-body b/.dev/revdep_emails/cloudos/email-body deleted file mode 100644 index b88ea514d..000000000 --- a/.dev/revdep_emails/cloudos/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Sangram Keshari Sahu! Thank you for using {lintr} in your package {cloudos}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/lifebit-ai/cloudos using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 17s on CRAN vs. 10s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/connectwidgets/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/connectwidgets/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index f739c78e0..000000000 --- a/.dev/revdep_emails/connectwidgets/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,9 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/rmarkdown/templates/connectwidgets/skeleton/skeleton.Rmd",14,5,"style","Commented code should be removed."," # api_key = Sys.getenv(""CONNECT_API_KEY"")","commented_code_linter" -"R/connect.R",46,56,"style","Use TRUE instead of the symbol T."," jsonlite::fromJSON(results, simplifyDataFrame = T)","T_and_F_symbol_linter" -"R/theme.R",274,47,"style","Trailing semicolons are not needed."," page_btns_style[""background""] <- ""#5A5B5A"";","semicolon_linter" -"tests/testthat/setup.R",11,3,"warning","no visible global function definition for β€˜stub_request’"," stub_request(""get"", ""https://example.com/__api__/server_settings"") %>%","object_usage_linter" -"tests/testthat/setup.R",12,5,"warning","no visible global function definition for β€˜to_return’"," to_return(","object_usage_linter" -"tests/testthat/setup.R",31,3,"warning","no visible global function definition for β€˜stub_request’"," stub_request(","object_usage_linter" -"tests/testthat/setup.R",34,9,"warning","no visible global function definition for β€˜to_return’"," ) %>% to_return(","object_usage_linter" -"vignettes/using-crosstalk.Rmd",80,81,"style","Lines should not be more than 80 characters."," rsc_grid(crosstalk::SharedData$new(..2, key = ~ guid, group = ""xfilter""))","line_length_linter" diff --git a/.dev/revdep_emails/connectwidgets/email-body b/.dev/revdep_emails/connectwidgets/email-body deleted file mode 100644 index ffb96660d..000000000 --- a/.dev/revdep_emails/connectwidgets/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Brian Smith! Thank you for using {lintr} in your package {connectwidgets}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/rstudio/connectwidgets using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 15s on CRAN vs. 8s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/crunch/attachments/crunch.warnings b/.dev/revdep_emails/crunch/attachments/crunch.warnings deleted file mode 100644 index 7c377045e..000000000 --- a/.dev/revdep_emails/crunch/attachments/crunch.warnings +++ /dev/null @@ -1,2 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Trying to remove β€˜closed_curly_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/crunch/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/crunch/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 6b5a8ff9a..000000000 --- a/.dev/revdep_emails/crunch/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,2 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"tests/testthat/test-misc.R",203,9,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" diff --git a/.dev/revdep_emails/crunch/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/crunch/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index fbb66262f..000000000 --- a/.dev/revdep_emails/crunch/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,765 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"data-raw/SO-survey.R",1,101,"style","Lines should not be more than 100 characters.","stack_df <- read.csv(""data-raw/survey_results_public.csv"") ## This file is big and not checked into git","line_length_linter" -"R/case-variables.R",98,29,"style","Any function spanning multiple lines should use curly braces."," cases <- mapply(function(e, n) list(","brace_linter" -"R/case-variables.R",248,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(case$id) & !is.whole(case$id)) {","vector_logic_linter" -"R/case-variables.R",264,38,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(case$numeric_value) & !is.numeric(case$numeric_value)) {","vector_logic_linter" -"R/case-variables.R",267,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.logical(case$missing) | is.na(case$missing)) {","vector_logic_linter" -"R/categories.R",157,5,"warning","local variable β€˜out’ assigned but may not be used"," out <- handleMissingCategoryLookup(ix, value, strict = TRUE)","object_usage_linter" -"R/categories.R",321,9,"warning","local variable β€˜ent’ assigned but may not be used"," ent <- setEntitySlot(entity(x), ""categories"", value)","object_usage_linter" -"R/categories.R",331,9,"warning","local variable β€˜ent’ assigned but may not be used"," ent <- setEntitySlot(entity(x), ""categories"", value)","object_usage_linter" -"R/change-category-id.R",32,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(is.numeric(from) & length(from) == 1)) {","vector_logic_linter" -"R/change-category-id.R",36,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(is.numeric(to) & length(to) == 1)) {","vector_logic_linter" -"R/combine-categories.R",52,41,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (is.Categorical(variable) | is.CategoricalArray(variable)) {","vector_logic_linter" -"R/combine-categories.R",66,36,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(is.Categorical(variable) | is.CategoricalArray(variable) | is.Expr(variable))) {","vector_logic_linter" -"R/combine-categories.R",66,68,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(is.Categorical(variable) | is.CategoricalArray(variable) | is.Expr(variable))) {","vector_logic_linter" -"R/combine-categories.R",102,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(is.MR(variable) | is.Expr(variable))) {","vector_logic_linter" -"R/conditional-transform.R",99,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (type != ""categorical"" & !is.null(categories)) {","vector_logic_linter" -"R/crunch-data-frame.R",101,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(out) == 1 & drop) {","vector_logic_linter" -"R/crunch-data-frame.R",160,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (is.numeric(j) | is.logical(j)) {","vector_logic_linter" -"R/crunch-data-frame.R",248,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(value) & missing(row_inds)) {","vector_logic_linter" -"R/crunch-data-frame.R",257,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(value) == 1 & length(row_inds) > 1) {","vector_logic_linter" -"R/cube-residuals.R",142,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((dim == ""cols"" & startsWith(dim_types[2], ""mr_"")) |","vector_logic_linter" -"R/cube-residuals.R",142,59,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((dim == ""cols"" & startsWith(dim_types[2], ""mr_"")) |","vector_logic_linter" -"R/cube-residuals.R",143,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," (dim == ""rows"" & startsWith(dim_types[1], ""mr_""))) {","vector_logic_linter" -"R/cube-residuals.R",292,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(dim(values)) & identical(dim(values), as.integer(c(nrow, ncol)))) {","vector_logic_linter" -"R/expressions.R",674,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(category_order) | is.numeric(category_order)) {","vector_logic_linter" -"R/fill-variable.R",36,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(dots) == 0 & missing(fills)) {","vector_logic_linter" -"R/fill-variable.R",39,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(dots) > 0 & !missing(fills)) {","vector_logic_linter" -"R/filters.R",45,13,"warning","local variable β€˜f’ assigned but may not be used"," f <- .newFilter(i, value, catalog_url = self(x))","object_usage_linter" -"R/folders.R",57,5,"warning","local variable β€˜fns’ assigned but may not be used"," fns <- list(","object_usage_linter" -"R/folders.R",323,5,"warning","local variable β€˜out’ assigned but may not be used"," out <- lapply(seq_along(folder), function(i) {","object_usage_linter" -"R/folders.R",379,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.dataset(source) | !is.dataset(target)) {","vector_logic_linter" -"R/formula.R",247,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (is.CA(x) | is.NumericArray(x)) {","vector_logic_linter" -"R/geo.R",61,9,"warning","local variable β€˜ent’ assigned but may not be used"," ent <- setEntitySlot(entity(x), ""view"", geodata)","object_usage_linter" -"R/geo.R",135,61,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(unique(match_scores$geodatum_name)) == 1 &","vector_logic_linter" -"R/hide-variables.R",140,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" -"R/insertions.R",110,50,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.character(anchor) && (anchor == ""top"" | anchor == ""bottom"")) {","vector_logic_linter" -"R/make-array.R",221,35,"style","Any function spanning multiple lines should use curly braces."," subvarderivs <- lapply(items, function(x) createSubvarDeriv(","brace_linter" -"R/make-array.R",339,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.list(x) & !is.VarDef(x)) {","vector_logic_linter" -"R/merge-crunch-data-frame.R",120,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.data.frame(data) & all(!class(data) %in% ""CrunchDataFrame"")) {","vector_logic_linter" -"R/multitables.R",38,13,"warning","local variable β€˜f’ assigned but may not be used"," f <- newMultitable(","object_usage_linter" -"R/ordering.R",131,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.dataset(source) | !is.dataset(target)) {","vector_logic_linter" -"R/ordering.R",179,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(group) == 1 & is.character(group)) {","vector_logic_linter" -"R/project-folder.R",49,13,"warning","local variable β€˜proj’ assigned but may not be used"," proj <- do.call(","object_usage_linter" -"R/shoji-order.R",54,13,"style","Any function spanning multiple lines should use curly braces."," function(a) do.call(","brace_linter" -"R/show.R",70,19,"style","Any function spanning multiple lines should use curly braces.","showInsertions <- function(x) do.call(","brace_linter" -"R/show.R",702,9,"warning","local variable β€˜along’ assigned but may not be used"," along <- ifelse(num_unique_dims == 3, 2, num_unique_dims)","object_usage_linter" -"R/subtotals-and-headings.R",268,5,"warning","local variable β€˜ent’ assigned but may not be used"," ent <- setEntitySlot(entity(x), ""view"", bd)","object_usage_linter" -"R/subtotals-and-headings.R",284,9,"warning","local variable β€˜ent’ assigned but may not be used"," ent <- setEntitySlot(entity(x), ""view"", bd)","object_usage_linter" -"R/subtotals-and-headings.R",453,36,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (is.na(func(insert)) & !is.na(anchor(insert))) {","vector_logic_linter" -"R/subtotals-and-headings.R",730,5,"warning","local variable β€˜ent’ assigned but may not be used"," ent <- setEntitySlot(entity(x), ""view"", bd)","object_usage_linter" -"R/subtotals-and-headings.R",746,9,"warning","local variable β€˜ent’ assigned but may not be used"," ent <- setEntitySlot(entity(x), ""view"", bd)","object_usage_linter" -"R/subtotals-and-headings.R",915,36,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (is.na(func(insert)) & !is.na(anchor(insert))) {","vector_logic_linter" -"R/subvariables.R",44,36,"warning","no visible binding for global variable β€˜subvariables_catalog’"," catalog_url <- absoluteURL(tup$subvariables_catalog, base = tup@index_url)","object_usage_linter" -"R/subvariables.R",45,22,"warning","no visible binding for global variable β€˜subreferences’"," if (!is.null(tup$subreferences)) {","object_usage_linter" -"R/subvariables.R",66,34,"warning","no visible binding for global variable β€˜subvariables_catalog’"," catalog_url <- absoluteURL(x$subvariables_catalog, base = x@index_url) %||% """"","object_usage_linter" -"R/subvariables.R",67,18,"warning","no visible binding for global variable β€˜subreferences’"," subvars <- x$subreferences","object_usage_linter" -"R/summary-insertions.R",141,9,"warning","local variable β€˜args’ assigned but may not be used"," args <- ids(var_items)","object_usage_linter" -"R/summary-insertions.R",283,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(opts$after) & is.null(opts$position)) opts$position <- ""bottom""","vector_logic_linter" -"R/teams.R",40,13,"warning","local variable β€˜u’ assigned but may not be used"," u <- crPOST(self(x), body = toJSON(list(name = i)))","object_usage_linter" -"R/variable-update.R",254,13,"warning","local variable β€˜out’ assigned but may not be used"," out <- .updateVariable(x, value, filter = .dispatchFilter(i))","object_usage_linter" -"R/versions.R",60,5,"warning","local variable β€˜out’ assigned but may not be used"," out <- crPOST(u,","object_usage_linter" -"R/weight.R",157,54,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.variable(vars) || (length(vars) == 1) & !is.character(vars)) {","vector_logic_linter" -"tests/testthat/setup.R",24,2,"style","Missing terminal newline.",")","trailing_blank_lines_linter" -"tests/testthat/test-cube-subset.R",23,80,"style","Use TRUE instead of the symbol T."," replaceCharWithNumeric(dimnames, c(""cats"", ""llamas""), visible = c(T, F, T)),","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",23,83,"style","Use FALSE instead of the symbol F."," replaceCharWithNumeric(dimnames, c(""cats"", ""llamas""), visible = c(T, F, T)),","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",23,86,"style","Use TRUE instead of the symbol T."," replaceCharWithNumeric(dimnames, c(""cats"", ""llamas""), visible = c(T, F, T)),","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",50,26,"style","Use TRUE instead of the symbol T."," not_hidden <- c(T, T, F, F)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",50,29,"style","Use TRUE instead of the symbol T."," not_hidden <- c(T, T, F, F)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",50,32,"style","Use FALSE instead of the symbol F."," not_hidden <- c(T, T, F, F)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",50,35,"style","Use FALSE instead of the symbol F."," not_hidden <- c(T, T, F, F)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",56,26,"style","Use FALSE instead of the symbol F."," not_hidden <- c(F, T, F, F, T, T)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",56,29,"style","Use TRUE instead of the symbol T."," not_hidden <- c(F, T, F, F, T, T)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",56,32,"style","Use FALSE instead of the symbol F."," not_hidden <- c(F, T, F, F, T, T)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",56,35,"style","Use FALSE instead of the symbol F."," not_hidden <- c(F, T, F, F, T, T)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",56,38,"style","Use TRUE instead of the symbol T."," not_hidden <- c(F, T, F, F, T, T)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",56,41,"style","Use TRUE instead of the symbol T."," not_hidden <- c(F, T, F, F, T, T)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",62,26,"style","Use FALSE instead of the symbol F."," not_hidden <- c(F, T, T)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",62,29,"style","Use TRUE instead of the symbol T."," not_hidden <- c(F, T, T)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",62,32,"style","Use TRUE instead of the symbol T."," not_hidden <- c(F, T, T)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",69,26,"style","Use FALSE instead of the symbol F."," not_hidden <- c(F, T, T, F)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",69,29,"style","Use TRUE instead of the symbol T."," not_hidden <- c(F, T, T, F)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",69,32,"style","Use TRUE instead of the symbol T."," not_hidden <- c(F, T, T, F)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",69,35,"style","Use FALSE instead of the symbol F."," not_hidden <- c(F, T, T, F)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",72,23,"style","Use TRUE instead of the symbol T."," visible <- c(T, T, T, F)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",72,26,"style","Use TRUE instead of the symbol T."," visible <- c(T, T, T, F)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",72,29,"style","Use TRUE instead of the symbol T."," visible <- c(T, T, T, F)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",72,32,"style","Use FALSE instead of the symbol F."," visible <- c(T, T, T, F)","T_and_F_symbol_linter" -"tests/testthat/test-formula.R",57,44,"style","Put spaces around all infix operators."," formulaToQuery(mean(ds$birthyr)~1),","infix_spaces_linter" -"vignettes/abstract-categories.Rmd",51,34,"style","Put spaces around all infix operators.","income <- AbstractCategories(data=income_list)","infix_spaces_linter" -"vignettes/abstract-categories.Rmd",120,65,"style","Trailing whitespace is superfluous."," Subtotal(name = ""Generally Happy"", after = ""Somewhat Happy"", ","trailing_whitespace_linter" -"vignettes/abstract-categories.Rmd",122,52,"style","Trailing whitespace is superfluous."," Subtotal(name = ""Generally Unhappy"", after = 5, ","trailing_whitespace_linter" -"vignettes/abstract-categories.Rmd",142,101,"style","Lines should not be more than 100 characters.","feeling_insertions <- Insertions(data = lapply(feeling_subtotals, makeInsertion, var_items = feeling_cats))","line_length_linter" -"vignettes/analyze.Rmd",16,14,"style","Put spaces around all infix operators.","options(width=120)","infix_spaces_linter" -"vignettes/analyze.Rmd",31,28,"style","Put spaces around all infix operators.","tab1 <- crtabs(~ educ, data=ds)","infix_spaces_linter" -"vignettes/analyze.Rmd",41,37,"style","Put spaces around all infix operators.","tab2 <- crtabs(~ educ + gender, data=ds)","infix_spaces_linter" -"vignettes/analyze.Rmd",67,29,"style","Put spaces around all infix operators.","crtabs(~ educ + gender, data=ds)","infix_spaces_linter" -"vignettes/analyze.Rmd",76,29,"style","Put spaces around all infix operators.","crtabs(~ educ + gender, data=ds, weight=NULL)","infix_spaces_linter" -"vignettes/analyze.Rmd",76,40,"style","Put spaces around all infix operators.","crtabs(~ educ + gender, data=ds, weight=NULL)","infix_spaces_linter" -"vignettes/analyze.Rmd",98,10,"style","Put spaces around all infix operators.","round(100*prop.table(tab2, 2))","infix_spaces_linter" -"vignettes/analyze.Rmd",105,38,"style","Put spaces around all infix operators.","tab3 <- crtabs(~ imiss + gender, data=ds)","infix_spaces_linter" -"vignettes/analyze.Rmd",123,40,"style","Put spaces around all infix operators.","tab3mr <- crtabs(~ imiss + gender, data=ds)","infix_spaces_linter" -"vignettes/analyze.Rmd",139,10,"style","Put spaces around all infix operators.","round(100*prop.table(tab3mr, 2))","infix_spaces_linter" -"vignettes/analyze.Rmd",145,38,"style","Put spaces around all infix operators.","crtabs(~ imiss$imiss_f + gender, data=ds)","infix_spaces_linter" -"vignettes/analyze.Rmd",156,43,"style","Put spaces around all infix operators.","round(crtabs(~ imiss + educ + gender, data=ds))","infix_spaces_linter" -"vignettes/analyze.Rmd",172,39,"style","Put spaces around all infix operators.","crtabs(mean(age) ~ educ + gender, data=ds)","infix_spaces_linter" -"vignettes/analyze.Rmd",181,38,"style","Put spaces around all infix operators.","crtabs(min(age) ~ educ + gender, data=ds)","infix_spaces_linter" -"vignettes/analyze.Rmd",190,26,"style","Put spaces around all infix operators.","crtabs(min(age) ~ 1, data=ds)","infix_spaces_linter" -"vignettes/analyze.Rmd",208,47,"style","Put spaces around all infix operators.","round(crtabs(mean(track) ~ educ + gender, data=ds), 2)","infix_spaces_linter" -"vignettes/analyze.Rmd",221,47,"style","Put spaces around all infix operators.","round(crtabs(mean(track) ~ educ + gender, data=ds[ds$pid3 == ""Democrat"",]), 2)","infix_spaces_linter" -"vignettes/analyze.Rmd",242,28,"style","Put spaces around all infix operators.","cat(snowdenleakapp.var, sep=""\n"")","infix_spaces_linter" -"vignettes/analyze.Rmd",249,9,"style","Put spaces around all infix operators."," data=ds)","infix_spaces_linter" -"vignettes/analyze.Rmd",262,11,"style","Put spaces around all infix operators."," family=binomial(link=""logit""), data=ds)","infix_spaces_linter" -"vignettes/analyze.Rmd",262,25,"style","Put spaces around all infix operators."," family=binomial(link=""logit""), data=ds)","infix_spaces_linter" -"vignettes/analyze.Rmd",262,40,"style","Put spaces around all infix operators."," family=binomial(link=""logit""), data=ds)","infix_spaces_linter" -"vignettes/array-variables.Rmd",30,33,"style","Put spaces around all infix operators.","grep(""^imiss_"", names(ds), value=TRUE)","infix_spaces_linter" -"vignettes/array-variables.Rmd",33,47,"style","Put spaces around all infix operators.","grep(""^imiss_"", names(start_make_array), value=TRUE)","infix_spaces_linter" -"vignettes/array-variables.Rmd",42,22,"style","Put spaces around all infix operators.","cat(show_imiss_b, sep=""\n"")","infix_spaces_linter" -"vignettes/array-variables.Rmd",48,59,"style","Put spaces around all infix operators.","ds$imiss <- makeArray(ds[grep(""^imiss_"", names(ds))], name=""Issue importance"")","infix_spaces_linter" -"vignettes/array-variables.Rmd",52,20,"style","Put spaces around all infix operators.","cat(show_imiss, sep=""\n"")","infix_spaces_linter" -"vignettes/array-variables.Rmd",63,28,"style","Put spaces around all infix operators.","cat(show_imiss_subvars, sep=""\n"")","infix_spaces_linter" -"vignettes/array-variables.Rmd",72,22,"style","Put spaces around all infix operators.","cat(show_imiss_b, sep=""\n"")","infix_spaces_linter" -"vignettes/array-variables.Rmd",98,29,"style","Put spaces around all infix operators.","cat(show_imiss_subvars2, sep=""\n"")","infix_spaces_linter" -"vignettes/array-variables.Rmd",109,29,"style","Put spaces around all infix operators.","cat(show_imiss_subvars3, sep=""\n"")","infix_spaces_linter" -"vignettes/array-variables.Rmd",122,21,"style","Put spaces around all infix operators.","cat(show_boap_4, sep=""\n"")","infix_spaces_linter" -"vignettes/array-variables.Rmd",131,9,"style","Put spaces around all infix operators."," name=""Approval of Obama on issues"",","infix_spaces_linter" -"vignettes/array-variables.Rmd",132,15,"style","Put spaces around all infix operators."," selections=c(""Strongly approve"", ""Somewhat approve""))","infix_spaces_linter" -"vignettes/array-variables.Rmd",136,19,"style","Put spaces around all infix operators.","cat(show_boap, sep=""\n"")","infix_spaces_linter" -"vignettes/array-variables.Rmd",150,20,"style","Put spaces around all infix operators.","cat(show_boap2, sep=""\n"")","infix_spaces_linter" -"vignettes/array-variables.Rmd",160,20,"style","Put spaces around all infix operators.","cat(show_boap3, sep=""\n"")","infix_spaces_linter" -"vignettes/array-variables.Rmd",168,30,"style","Put spaces around all infix operators.","grep(""boap"", names(ds), value=TRUE)","infix_spaces_linter" -"vignettes/array-variables.Rmd",186,30,"style","Put spaces around all infix operators.","grep(""boap"", names(ds), value=TRUE)","infix_spaces_linter" -"vignettes/crunch.Rmd",36,76,"style","Trailing whitespace is superfluous.","# like ""update all packages from CRAN"" if it asks which packages to update, ","trailing_whitespace_linter" -"vignettes/crunch.Rmd",89,33,"style","Put spaces around all infix operators.","ds <- newDataset(SO_survey, name=""Stack Overflow Developer Survey 2017"")","infix_spaces_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Mon, 04 May 2020 21:39:23 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",3,66,"style","Trailing whitespace is superfluous."," `content-length` = ""176"", location = ""/api/datasets/c25696/"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",5,64,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",7,63,"style","Trailing whitespace is superfluous.",")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",8,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:23 GMT"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",9,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""176"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",10,62,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/c25696/"", server = ""nginx"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",11,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",12,68,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",13,61,"style","Trailing whitespace is superfluous."," `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",14,64,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = "".crunch.io"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",15,101,"style","Lines should not be more than 100 characters."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164363, class = c(""POSIXct"", ","line_length_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",15,101,"style","Trailing whitespace is superfluous."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164363, class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",16,71,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = ""token"", value = ""REDACTED""), row.names = c(NA, ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",17,101,"style","Lines should not be more than 100 characters.","-1L), class = ""data.frame""), content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",17,144,"style","Trailing whitespace is superfluous.","-1L), class = ""data.frame""), content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",19,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 3.1e-05, ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",20,73,"style","Trailing whitespace is superfluous."," connect = 3.2e-05, pretransfer = 0.000134, starttransfer = 0.000139, ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/c25696/batches/"", status_code = 202L, ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:26 GMT"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""178"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",4,101,"style","Lines should not be more than 100 characters."," location = ""/api/datasets/c25696/batches/import_batch%3Ac25696%245f5c3f13-f95f-4cbe-b60a-1a30e139cf18/"", ","line_length_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",4,113,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/c25696/batches/import_batch%3Ac25696%245f5c3f13-f95f-4cbe-b60a-1a30e139cf18/"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",5,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",7,61,"style","Trailing whitespace is superfluous."," `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",8,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",9,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:26 GMT"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",10,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",11,101,"style","Lines should not be more than 100 characters."," `content-length` = ""178"", location = ""/api/datasets/c25696/batches/import_batch%3Ac25696%245f5c3f13-f95f-4cbe-b60a-1a30e139cf18/"", ","line_length_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",11,143,"style","Trailing whitespace is superfluous."," `content-length` = ""178"", location = ""/api/datasets/c25696/batches/import_batch%3Ac25696%245f5c3f13-f95f-4cbe-b60a-1a30e139cf18/"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",12,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",13,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",14,65,"style","Trailing whitespace is superfluous."," `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",15,68,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = "".crunch.io"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",16,101,"style","Lines should not be more than 100 characters."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164366, class = c(""POSIXct"", ","line_length_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",16,105,"style","Trailing whitespace is superfluous."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164366, class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",17,75,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = ""token"", value = ""REDACTED""), row.names = c(NA, ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",18,101,"style","Lines should not be more than 100 characters."," -1L), class = ""data.frame""), content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/c25696/batches/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",18,163,"style","Trailing whitespace is superfluous."," -1L), class = ""data.frame""), content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/c25696/batches/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",20,67,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2e-05, ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",21,71,"style","Trailing whitespace is superfluous."," connect = 2.2e-05, pretransfer = 8.9e-05, starttransfer = 9.3e-05, ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Mon, 04 May 2020 21:39:26 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",3,64,"style","Trailing whitespace is superfluous."," `content-length` = ""86"", location = ""/api/sources/cec83c/"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",5,101,"style","Lines should not be more than 100 characters."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","line_length_linter" -"vignettes/crunch/0/api/sources-POST.R",5,110,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",6,69,"style","Trailing whitespace is superfluous.","""list"")), all_headers = list(list(status = 201L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",7,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:26 GMT"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",8,84,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""86"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",9,61,"style","Trailing whitespace is superfluous."," location = ""/api/sources/cec83c/"", server = ""nginx"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",10,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",11,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",12,61,"style","Trailing whitespace is superfluous."," `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",13,64,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = "".crunch.io"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",14,101,"style","Lines should not be more than 100 characters."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164366, class = c(""POSIXct"", ","line_length_linter" -"vignettes/crunch/0/api/sources-POST.R",14,101,"style","Trailing whitespace is superfluous."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164366, class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",15,71,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = ""token"", value = ""REDACTED""), row.names = c(NA, ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",16,101,"style","Lines should not be more than 100 characters.","-1L), class = ""data.frame""), content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/sources/\""}""), ","line_length_linter" -"vignettes/crunch/0/api/sources-POST.R",16,112,"style","Trailing whitespace is superfluous.","-1L), class = ""data.frame""), content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/sources/\""}""), ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",18,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.6e-05, ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",19,72,"style","Trailing whitespace is superfluous."," connect = 2.7e-05, pretransfer = 0.00014, starttransfer = 0.000145, ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",1,76,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/c25696/variables/"", status_code = 201L, ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:32 GMT"", ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",3,83,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""0"", ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",4,61,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/c25696/variables/d270c8/"", ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",5,101,"style","Lines should not be more than 100 characters."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, PATCH, POST"", ","line_length_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",5,103,"style","Trailing whitespace is superfluous."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, PATCH, POST"", ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",6,61,"style","Trailing whitespace is superfluous."," `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",7,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 201L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",8,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:32 GMT"", ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",9,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",10,89,"style","Trailing whitespace is superfluous."," `content-length` = ""0"", location = ""/api/datasets/c25696/variables/d270c8/"", ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",11,64,"style","Trailing whitespace is superfluous."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",12,101,"style","Lines should not be more than 100 characters."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","line_length_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",12,108,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",13,68,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = "".crunch.io"", ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",14,101,"style","Lines should not be more than 100 characters."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164372, class = c(""POSIXct"", ","line_length_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",14,105,"style","Trailing whitespace is superfluous."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164372, class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",15,75,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = ""token"", value = ""REDACTED""), row.names = c(NA, ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",16,101,"style","Lines should not be more than 100 characters."," -1L), class = ""data.frame""), content = charToRaw(""""), date = structure(1588628372, class = c(""POSIXct"", ","line_length_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",16,108,"style","Trailing whitespace is superfluous."," -1L), class = ""data.frame""), content = charToRaw(""""), date = structure(1588628372, class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",17,77,"style","Trailing whitespace is superfluous."," ""POSIXt""), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.8e-05, ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",18,72,"style","Trailing whitespace is superfluous."," connect = 2.9e-05, pretransfer = 9.8e-05, starttransfer = 0.000103, ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",1,76,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/c25696/variables/"", status_code = 201L, ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:37 GMT"", ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",3,83,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""0"", ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",4,61,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/c25696/variables/6af3ce/"", ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",5,101,"style","Lines should not be more than 100 characters."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, PATCH, POST"", ","line_length_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",5,103,"style","Trailing whitespace is superfluous."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, PATCH, POST"", ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",6,61,"style","Trailing whitespace is superfluous."," `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",7,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 201L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",8,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:37 GMT"", ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",9,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",10,89,"style","Trailing whitespace is superfluous."," `content-length` = ""0"", location = ""/api/datasets/c25696/variables/6af3ce/"", ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",11,64,"style","Trailing whitespace is superfluous."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",12,101,"style","Lines should not be more than 100 characters."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","line_length_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",12,108,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",13,68,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = "".crunch.io"", ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",14,101,"style","Lines should not be more than 100 characters."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164377, class = c(""POSIXct"", ","line_length_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",14,105,"style","Trailing whitespace is superfluous."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164377, class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",15,75,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = ""token"", value = ""REDACTED""), row.names = c(NA, ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",16,101,"style","Lines should not be more than 100 characters."," -1L), class = ""data.frame""), content = charToRaw(""""), date = structure(1588628377, class = c(""POSIXct"", ","line_length_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",16,108,"style","Trailing whitespace is superfluous."," -1L), class = ""data.frame""), content = charToRaw(""""), date = structure(1588628377, class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",17,77,"style","Trailing whitespace is superfluous."," ""POSIXt""), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.4e-05, ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",18,71,"style","Trailing whitespace is superfluous."," connect = 2.5e-05, pretransfer = 8.8e-05, starttransfer = 9.3e-05, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",76,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",77,27,"style","Trailing whitespace is superfluous."," mean(ndogs) ~ country, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",102,18,"style","Trailing whitespace is superfluous."," private_deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",103,9,"style","Trailing whitespace is superfluous."," ~q1, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",104,40,"style","Trailing whitespace is superfluous."," title = ""Bar Plot of Favorite Pet"", ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",133,8,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",134,47,"style","Trailing whitespace is superfluous."," ""This survey was collected by ACME surveys"", ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",179,101,"style","Lines should not be more than 100 characters.","# (Note this controls the order of the slides in a deck, which controls how they appear in the web app's","line_length_linter" -"vignettes/deck-cookbook.Rmd",180,101,"style","Lines should not be more than 100 characters.","# deck viewer and Excel and PowerPoint exports, but does not change order or position of an existing ","line_length_linter" -"vignettes/deck-cookbook.Rmd",180,101,"style","Trailing whitespace is superfluous.","# deck viewer and Excel and PowerPoint exports, but does not change order or position of an existing ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",228,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",229,9,"style","Trailing whitespace is superfluous."," ~q1, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",244,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",245,19,"style","Trailing whitespace is superfluous."," ~q1 + country, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",251,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",252,26,"style","Trailing whitespace is superfluous."," ~q1 + country + wave, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",270,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",271,14,"style","Trailing whitespace is superfluous."," ~allpets, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",276,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",277,50,"style","Trailing whitespace is superfluous."," ~categories(allpets) + subvariables(allpets), ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",312,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",318,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",337,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",338,34,"style","Trailing whitespace is superfluous."," ~scorecard(allpets, allpets), ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",369,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",370,9,"style","Trailing whitespace is superfluous."," ~q1, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",380,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",381,48,"style","Trailing whitespace is superfluous."," ~categories(petloc) + subvariables(petloc), ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",400,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",401,9,"style","Trailing whitespace is superfluous."," ~q1, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",422,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",423,9,"style","Trailing whitespace is superfluous."," ~q1, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",451,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",452,19,"style","Trailing whitespace is superfluous."," ~q1 + country, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",459,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",460,16,"style","Trailing whitespace is superfluous."," ~q1 + wave, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",480,19,"style","Trailing whitespace is superfluous."," template_deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",481,9,"style","Trailing whitespace is superfluous."," ~q1, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",496,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",540,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",561,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",583,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",585,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",589,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",609,14,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",620,14,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",631,14,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/derive.Rmd",16,14,"style","Put spaces around all infix operators.","options(width=120)","infix_spaces_linter" -"vignettes/export.Rmd",15,14,"style","Put spaces around all infix operators.","options(width=120)","infix_spaces_linter" -"vignettes/export.Rmd",33,36,"style","Put spaces around all infix operators.","party_id <- as.vector(ds$pid3, mode=""id"")","infix_spaces_linter" -"vignettes/export.Rmd",64,30,"style","Put spaces around all infix operators.","df <- as.data.frame(ds, force=TRUE)","infix_spaces_linter" -"vignettes/export.Rmd",76,81,"style","Put spaces around all infix operators.","df <- as.data.frame(ds[ds$pid3 == ""Democrat"", c(""age"", ""educ"", ""gender"")], force=TRUE)","infix_spaces_linter" -"vignettes/export.Rmd",115,23,"style","Put spaces around all infix operators.","exportDataset(ds, file=""econ.sav"", format=""spss"")","infix_spaces_linter" -"vignettes/export.Rmd",115,42,"style","Put spaces around all infix operators.","exportDataset(ds, file=""econ.sav"", format=""spss"")","infix_spaces_linter" -"vignettes/export.Rmd",121,19,"style","Put spaces around all infix operators.","write.csv(ds, file=""econ.csv"")","infix_spaces_linter" -"vignettes/export.Rmd",129,70,"style","Put spaces around all infix operators.","write.csv(ds[ds$pid3 == ""Democrat"", c(""age"", ""educ"", ""gender"")], file=""demo-demos.csv"")","infix_spaces_linter" -"vignettes/filters.Rmd",15,14,"style","Put spaces around all infix operators.","options(width=120)","infix_spaces_linter" -"vignettes/filters.Rmd",33,19,"style","Put spaces around all infix operators.","cat(printdems, sep=""\n"")","infix_spaces_linter" -"vignettes/filters.Rmd",37,47,"style","Put spaces around all infix operators.","round(crtabs(mean(track) ~ educ + gender, data=dems), 2)","infix_spaces_linter" -"vignettes/filters.Rmd",90,28,"style","Put spaces around all infix operators.","cat(print.young.males1, sep=""\n"")","infix_spaces_linter" -"vignettes/filters.Rmd",125,28,"style","Put spaces around all infix operators.","cat(print.young.males2, sep=""\n"")","infix_spaces_linter" -"vignettes/filters.Rmd",144,27,"style","Put spaces around all infix operators.","cat(high_perc_skipped, sep=""\n"")","infix_spaces_linter" -"vignettes/fork-and-merge.Rmd",50,101,"style","Lines should not be more than 100 characters.","forked_ds$ImportantHiringCA <- makeArray(forked_ds[, c(""ImportantHiringTechExp"", ""ImportantHiringPMExp"")],","line_length_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Thu, 25 Mar 2021 15:16:07 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",3,66,"style","Trailing whitespace is superfluous."," `content-length` = ""176"", location = ""/api/datasets/5b6c9f/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",5,64,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",6,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",6,111,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",7,68,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",8,69,"style","Trailing whitespace is superfluous.","""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",9,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:16:07 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",10,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""176"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",11,62,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/5b6c9f/"", server = ""nginx"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",12,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",13,68,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",14,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",14,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",15,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",16,62,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",17,63,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",19,95,"style","Trailing whitespace is superfluous."," )), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",20,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",20,119,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.8e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",23,69,"style","Trailing whitespace is superfluous."," connect = 3e-05, pretransfer = 8.6e-05, starttransfer = 9.1e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/5b6c9f/batches/"", status_code = 202L, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:28 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""179"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",4,101,"style","Lines should not be more than 100 characters."," location = ""/api/datasets/5b6c9f/batches/import_batch%3A5b6c9f%24c6f12343-98a7-414c-b850-f4bc7ab927e2/"", ","line_length_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",4,113,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/5b6c9f/batches/import_batch%3A5b6c9f%24c6f12343-98a7-414c-b850-f4bc7ab927e2/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",5,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",7,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",7,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",8,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",9,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",10,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:28 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",11,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",12,101,"style","Lines should not be more than 100 characters."," `content-length` = ""179"", location = ""/api/datasets/5b6c9f/batches/import_batch%3A5b6c9f%24c6f12343-98a7-414c-b850-f4bc7ab927e2/"", ","line_length_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",12,143,"style","Trailing whitespace is superfluous."," `content-length` = ""179"", location = ""/api/datasets/5b6c9f/batches/import_batch%3A5b6c9f%24c6f12343-98a7-414c-b850-f4bc7ab927e2/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",13,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",14,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",15,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",15,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",16,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",17,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",18,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",19,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",20,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",20,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",21,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/batches/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",21,134,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/batches/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",23,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.8e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",24,69,"style","Trailing whitespace is superfluous."," connect = 2.9e-05, pretransfer = 8.5e-05, starttransfer = 9e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",1,72,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/5b6c9f/forks/"", status_code = 202L, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:31 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""176"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",4,62,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/9540f6/"", server = ""nginx"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",5,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",7,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",7,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",8,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",9,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",10,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:31 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",11,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",12,74,"style","Trailing whitespace is superfluous."," `content-length` = ""176"", location = ""/api/datasets/9540f6/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",13,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",14,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",15,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",15,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",16,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",17,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",18,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",19,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",20,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",20,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",21,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/forks/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",21,132,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/forks/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",23,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.3e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",24,71,"style","Trailing whitespace is superfluous."," connect = 2.4e-05, pretransfer = 7.5e-05, starttransfer = 7.9e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Thu, 25 Mar 2021 15:18:27 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",3,64,"style","Trailing whitespace is superfluous."," `content-length` = ""86"", location = ""/api/sources/16269c/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",5,95,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",6,73,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",7,68,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",8,69,"style","Trailing whitespace is superfluous.","""list"")), all_headers = list(list(status = 201L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",9,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:27 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",10,84,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""86"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",11,61,"style","Trailing whitespace is superfluous."," location = ""/api/sources/16269c/"", server = ""nginx"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",12,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",13,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",14,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",14,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",15,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",16,62,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",17,63,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",19,95,"style","Trailing whitespace is superfluous."," )), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",20,87,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/sources/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.8e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",23,71,"style","Trailing whitespace is superfluous."," connect = 3e-05, pretransfer = 0.000183, starttransfer = 0.000189, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",1,76,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/9540f6/variables/"", status_code = 201L, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:35 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",3,83,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""0"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",4,61,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/9540f6/variables/a57c56/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",5,101,"style","Lines should not be more than 100 characters."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, PATCH, POST"", ","line_length_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",5,103,"style","Trailing whitespace is superfluous."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, PATCH, POST"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",6,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",6,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",7,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",8,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 201L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",9,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:35 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",10,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",11,89,"style","Trailing whitespace is superfluous."," `content-length` = ""0"", location = ""/api/datasets/9540f6/variables/a57c56/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",12,64,"style","Trailing whitespace is superfluous."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",13,93,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",14,81,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",15,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",16,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",17,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",18,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",19,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",19,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",20,79,"style","Trailing whitespace is superfluous."," content = charToRaw(""""), date = structure(1616685515, class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",21,77,"style","Trailing whitespace is superfluous."," ""POSIXt""), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.7e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",22,71,"style","Trailing whitespace is superfluous."," connect = 2.9e-05, pretransfer = 8.9e-05, starttransfer = 9.4e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/5b6c9f/actions/"", status_code = 202L, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:37 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""178"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",4,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",5,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",6,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",6,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",7,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",8,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",9,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:37 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",10,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",11,85,"style","Trailing whitespace is superfluous."," `content-length` = ""178"", server = ""nginx"", `content-encoding` = ""gzip"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",12,82,"style","Trailing whitespace is superfluous."," vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, POST"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",13,67,"style","Trailing whitespace is superfluous."," `x-timing` = """", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",14,81,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",15,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",16,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",17,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",18,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",19,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",19,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",20,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/actions/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",20,134,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/actions/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.5e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",23,71,"style","Trailing whitespace is superfluous."," connect = 2.6e-05, pretransfer = 7.9e-05, starttransfer = 8.4e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Thu, 25 Mar 2021 15:18:40 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",3,66,"style","Trailing whitespace is superfluous."," `content-length` = ""176"", location = ""/api/datasets/25c7c7/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",5,64,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",6,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",6,111,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",7,68,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",8,69,"style","Trailing whitespace is superfluous.","""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",9,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:40 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",10,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""176"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",11,62,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/25c7c7/"", server = ""nginx"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",12,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",13,68,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",14,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",14,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",15,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",16,62,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",17,63,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",19,95,"style","Trailing whitespace is superfluous."," )), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",20,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",20,119,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.5e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",23,73,"style","Trailing whitespace is superfluous."," connect = 2.6e-05, pretransfer = 0.000106, starttransfer = 0.000109, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/25c7c7/batches/"", status_code = 202L, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:21:29 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""179"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",4,101,"style","Lines should not be more than 100 characters."," location = ""/api/datasets/25c7c7/batches/import_batch%3A25c7c7%24f8ecc6af-28ee-4ae1-8877-566f570f1b96/"", ","line_length_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",4,113,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/25c7c7/batches/import_batch%3A25c7c7%24f8ecc6af-28ee-4ae1-8877-566f570f1b96/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",5,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",7,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",7,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",8,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",9,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",10,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:21:29 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",11,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",12,101,"style","Lines should not be more than 100 characters."," `content-length` = ""179"", location = ""/api/datasets/25c7c7/batches/import_batch%3A25c7c7%24f8ecc6af-28ee-4ae1-8877-566f570f1b96/"", ","line_length_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",12,143,"style","Trailing whitespace is superfluous."," `content-length` = ""179"", location = ""/api/datasets/25c7c7/batches/import_batch%3A25c7c7%24f8ecc6af-28ee-4ae1-8877-566f570f1b96/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",13,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",14,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",15,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",15,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",16,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",17,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",18,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",19,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",20,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",20,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",21,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/25c7c7/batches/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",21,134,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/25c7c7/batches/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",23,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.7e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",24,71,"style","Trailing whitespace is superfluous."," connect = 2.8e-05, pretransfer = 8.1e-05, starttransfer = 8.6e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Thu, 25 Mar 2021 15:21:29 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",3,64,"style","Trailing whitespace is superfluous."," `content-length` = ""86"", location = ""/api/sources/e2adbc/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",5,95,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",6,73,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",7,68,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",8,69,"style","Trailing whitespace is superfluous.","""list"")), all_headers = list(list(status = 201L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",9,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:21:29 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",10,84,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""86"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",11,61,"style","Trailing whitespace is superfluous."," location = ""/api/sources/e2adbc/"", server = ""nginx"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",12,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",13,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",14,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",14,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",15,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",16,62,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",17,63,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",19,95,"style","Trailing whitespace is superfluous."," )), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",20,87,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/sources/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.4e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",23,73,"style","Trailing whitespace is superfluous."," connect = 2.5e-05, pretransfer = 0.000137, starttransfer = 0.000142, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",1,72,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/5b6c9f/forks/"", status_code = 202L, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:21:31 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""175"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",4,62,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/d04628/"", server = ""nginx"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",5,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",7,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",7,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",8,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",9,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",10,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:21:31 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",11,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",12,74,"style","Trailing whitespace is superfluous."," `content-length` = ""175"", location = ""/api/datasets/d04628/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",13,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",14,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",15,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",15,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",16,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",17,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",18,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",19,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",20,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",20,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",21,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/forks/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",21,132,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/forks/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",23,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.5e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",24,71,"style","Trailing whitespace is superfluous."," connect = 2.6e-05, pretransfer = 7.8e-05, starttransfer = 8.3e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/d04628/batches/"", status_code = 202L, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:22:41 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""177"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",4,101,"style","Lines should not be more than 100 characters."," location = ""/api/datasets/d04628/batches/import_batch%3Ad04628%2427437777-7092-4ad7-8705-4e154e217872/"", ","line_length_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",4,113,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/d04628/batches/import_batch%3Ad04628%2427437777-7092-4ad7-8705-4e154e217872/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",5,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",7,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",7,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",8,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",9,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",10,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:22:41 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",11,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",12,101,"style","Lines should not be more than 100 characters."," `content-length` = ""177"", location = ""/api/datasets/d04628/batches/import_batch%3Ad04628%2427437777-7092-4ad7-8705-4e154e217872/"", ","line_length_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",12,143,"style","Trailing whitespace is superfluous."," `content-length` = ""177"", location = ""/api/datasets/d04628/batches/import_batch%3Ad04628%2427437777-7092-4ad7-8705-4e154e217872/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",13,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",14,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",15,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",15,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",16,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",17,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",18,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",19,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",20,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",20,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",21,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/d04628/batches/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",21,134,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/d04628/batches/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",23,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.5e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",24,71,"style","Trailing whitespace is superfluous."," connect = 2.7e-05, pretransfer = 7.4e-05, starttransfer = 7.9e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/5b6c9f/actions/"", status_code = 202L, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:51 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""179"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",4,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",5,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",6,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",6,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",7,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",8,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",9,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:51 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",10,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",11,85,"style","Trailing whitespace is superfluous."," `content-length` = ""179"", server = ""nginx"", `content-encoding` = ""gzip"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",12,82,"style","Trailing whitespace is superfluous."," vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, POST"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",13,67,"style","Trailing whitespace is superfluous."," `x-timing` = """", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",14,81,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",15,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",16,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",17,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",18,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",19,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",19,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",20,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/actions/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",20,134,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/actions/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.9e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",23,71,"style","Trailing whitespace is superfluous."," connect = 3.1e-05, pretransfer = 8.8e-05, starttransfer = 9.2e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Thu, 25 Mar 2021 15:23:55 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",3,66,"style","Trailing whitespace is superfluous."," `content-length` = ""176"", location = ""/api/datasets/b5a775/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",5,64,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",6,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",6,111,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",7,68,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",8,69,"style","Trailing whitespace is superfluous.","""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",9,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:55 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",10,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""176"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",11,62,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/b5a775/"", server = ""nginx"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",12,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",13,68,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",14,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",14,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",15,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",16,62,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",17,63,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",19,95,"style","Trailing whitespace is superfluous."," )), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",20,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",20,119,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.7e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",23,71,"style","Trailing whitespace is superfluous."," connect = 2.8e-05, pretransfer = 8.1e-05, starttransfer = 8.6e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",1,72,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/5b6c9f/forks/"", status_code = 202L, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:59 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""176"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",4,62,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/91e745/"", server = ""nginx"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",5,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",7,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",7,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",8,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",9,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",10,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:59 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",11,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",12,74,"style","Trailing whitespace is superfluous."," `content-length` = ""176"", location = ""/api/datasets/91e745/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",13,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",14,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",15,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",15,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",16,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",17,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",18,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",19,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",20,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",20,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",21,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/forks/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",21,132,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/forks/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",23,67,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",24,71,"style","Trailing whitespace is superfluous."," connect = 2.1e-05, pretransfer = 6.1e-05, starttransfer = 6.4e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",1,76,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/91e745/variables/"", status_code = 202L, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:26:22 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""208"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",4,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",5,89,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",6,77,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",7,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",8,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",9,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:26:22 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",10,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",11,85,"style","Trailing whitespace is superfluous."," `content-length` = ""208"", server = ""nginx"", `content-encoding` = ""gzip"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",12,89,"style","Trailing whitespace is superfluous."," vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, PATCH, POST"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",13,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",13,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",14,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",15,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",16,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",17,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",18,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",18,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",19,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""description\"": \""Progress status of adapt job\"", \""value\"": \""/api/progress/\"", \""element\"": \""shoji:view\""}""), ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",19,140,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""description\"": \""Progress status of adapt job\"", \""value\"": \""/api/progress/\"", \""element\"": \""shoji:view\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",21,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.6e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",22,69,"style","Trailing whitespace is superfluous."," connect = 2.7e-05, pretransfer = 7.7e-05, starttransfer = 9e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/b5a775/batches/"", status_code = 202L, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:57 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""178"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",4,101,"style","Lines should not be more than 100 characters."," location = ""/api/datasets/b5a775/batches/import_batch%3Ab5a775%24125593e4-5a97-42e8-b680-fb537a150a66/"", ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",4,113,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/b5a775/batches/import_batch%3Ab5a775%24125593e4-5a97-42e8-b680-fb537a150a66/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",5,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",7,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",7,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",8,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",9,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",10,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:57 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",11,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",12,101,"style","Lines should not be more than 100 characters."," `content-length` = ""178"", location = ""/api/datasets/b5a775/batches/import_batch%3Ab5a775%24125593e4-5a97-42e8-b680-fb537a150a66/"", ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",12,143,"style","Trailing whitespace is superfluous."," `content-length` = ""178"", location = ""/api/datasets/b5a775/batches/import_batch%3Ab5a775%24125593e4-5a97-42e8-b680-fb537a150a66/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",13,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",14,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",15,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",15,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",16,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",17,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",18,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",19,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",20,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",20,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",21,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/b5a775/batches/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",21,134,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/b5a775/batches/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",23,67,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 3e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",24,71,"style","Trailing whitespace is superfluous."," connect = 3.2e-05, pretransfer = 8.9e-05, starttransfer = 9.4e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Thu, 25 Mar 2021 15:23:56 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",3,64,"style","Trailing whitespace is superfluous."," `content-length` = ""86"", location = ""/api/sources/4f9156/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",5,95,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",6,73,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",7,68,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",8,69,"style","Trailing whitespace is superfluous.","""list"")), all_headers = list(list(status = 201L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",9,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:56 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",10,84,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""86"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",11,61,"style","Trailing whitespace is superfluous."," location = ""/api/sources/4f9156/"", server = ""nginx"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",12,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",13,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",14,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",14,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",15,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",16,62,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",17,63,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",19,95,"style","Trailing whitespace is superfluous."," )), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",20,87,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/sources/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.4e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",23,73,"style","Trailing whitespace is superfluous."," connect = 2.5e-05, pretransfer = 0.000155, starttransfer = 0.000161, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/5b6c9f/actions/"", status_code = 202L, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:26:26 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""178"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",4,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",5,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",6,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",6,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",7,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",8,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",9,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:26:26 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",10,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",11,85,"style","Trailing whitespace is superfluous."," `content-length` = ""178"", server = ""nginx"", `content-encoding` = ""gzip"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",12,82,"style","Trailing whitespace is superfluous."," vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, POST"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",13,67,"style","Trailing whitespace is superfluous."," `x-timing` = """", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",14,81,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",15,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",16,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",17,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",18,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",19,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",19,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",20,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/actions/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",20,134,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/actions/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.6e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",23,71,"style","Trailing whitespace is superfluous."," connect = 2.7e-05, pretransfer = 8.2e-05, starttransfer = 8.7e-05, ","trailing_whitespace_linter" -"vignettes/subtotals.Rmd",19,14,"style","Put spaces around all infix operators.","options(width=120)","infix_spaces_linter" -"vignettes/subtotals.Rmd",27,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/subtotals.Rmd",33,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/subtotals.Rmd",187,101,"style","Lines should not be more than 100 characters.","transforms(cube)$q1$insertions <- list(Heading(""Mammals"", position = ""top""), Heading(""Other"", after = ""Dog""))","line_length_linter" -"vignettes/variable-order.Rmd",15,14,"style","Put spaces around all infix operators.","options(width=120)","infix_spaces_linter" -"vignettes/variables.Rmd",20,14,"style","Put spaces around all infix operators.","options(width=120)","infix_spaces_linter" -"vignettes/variables.Rmd",61,27,"style","Put spaces around all infix operators.","cat(summary.track.var, sep=""\n"")","infix_spaces_linter" -"vignettes/variables.Rmd",68,101,"style","Lines should not be more than 100 characters.","description(track.var) <- ""In your opinon, is the country going in the right direction, or is it on the wrong track?""","line_length_linter" -"vignettes/variables.Rmd",211,73,"style","Put spaces around all infix operators.","ids(categories(track.var)) <- sample(ids(categories(track.var)), replace=FALSE)","infix_spaces_linter" diff --git a/.dev/revdep_emails/crunch/email-body b/.dev/revdep_emails/crunch/email-body deleted file mode 100644 index fcdb9cd0f..000000000 --- a/.dev/revdep_emails/crunch/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Greg Freedman Ellis! Thank you for using {lintr} in your package {crunch}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/Crunch-io/rcrunch using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 335s on CRAN vs. 187s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/dampack/attachments/dampack.warnings b/.dev/revdep_emails/dampack/attachments/dampack.warnings deleted file mode 100644 index 182961f94..000000000 --- a/.dev/revdep_emails/dampack/attachments/dampack.warnings +++ /dev/null @@ -1,2 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Trying to remove β€˜camel_case_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/dampack/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/dampack/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index d34293462..000000000 --- a/.dev/revdep_emails/dampack/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,331 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/calculate_outcome.R",32,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (outcome == ""nhb_loss"" | outcome == ""nmb_loss"") {","vector_logic_linter" -"R/calculate_outcome.R",43,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (outcome == ""nhb_loss_voi"" | outcome == ""nmb_loss_voi"") {","vector_logic_linter" -"R/create_sa.R",146,17,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (all_strat | (x$n_strategies <= n_trunc)) {","vector_logic_linter" -"R/evsi.R",140,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(length(n) == 1 | length(n) == n_params)) {","vector_logic_linter" -"R/evsi.R",144,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(length(n0) == 1 | length(n0) == n_params)) {","vector_logic_linter" -"R/evsi.R",315,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(unique(x$WTP)) == 1 & ""n"" %in% names(x)) {","vector_logic_linter" -"R/evsi.R",319,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (!(""n"" %in% names(x)) | (""n"" %in% names(x) & length(unique(x$n)) == 1)) {","vector_logic_linter" -"R/evsi.R",319,56,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (!(""n"" %in% names(x)) | (""n"" %in% names(x) & length(unique(x$n)) == 1)) {","vector_logic_linter" -"R/evsi.R",323,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (length(unique(x$WTP > 1)) & length(unique(x$n)) > 1) {","vector_logic_linter" -"R/icers.R",63,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (n_cost != n_eff | n_eff != n_strat) {","vector_logic_linter" -"R/icers.R",221,7,"warning","no visible global function definition for β€˜pivot_longer’"," pivot_longer(cols = everything(), names_to = ""Strategy"") %>%","object_usage_linter" -"R/icers.R",227,7,"warning","no visible global function definition for β€˜pivot_longer’"," pivot_longer(cols = everything(), names_to = ""Strategy"") %>%","object_usage_linter" -"R/metamodel.R",62,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (length(params) != 2 & analysis == ""twoway"") {","vector_logic_linter" -"R/metamodel.R",111,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (analysis == ""twoway"" | analysis == ""multiway"") {","vector_logic_linter" -"R/metamodel.R",324,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(i) & length(i) != 2) {","vector_logic_linter" -"R/metamodel.R",446,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (p_range[1] < psa_range[1] | p_range[2] > psa_range[2]) {","vector_logic_linter" -"R/owsa.R",136,7,"warning","no visible global function definition for β€˜pivot_longer’"," pivot_longer(cols = everything(),","object_usage_linter" -"R/owsa.R",181,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (min_rel_diff < 0 | min_rel_diff > 1) {","vector_logic_linter" -"R/psa.R",163,5,"warning","no visible global function definition for β€˜pivot_longer’"," pivot_longer(cost,","object_usage_linter" -"R/psa.R",169,5,"warning","no visible global function definition for β€˜pivot_longer’"," pivot_longer(effectiveness,","object_usage_linter" -"R/psa.R",204,32,"warning","no visible binding for global variable β€˜Effectiveness’"," ellipse(cor(Effectiveness, Cost),","object_usage_linter" -"R/psa.R",204,32,"warning","no visible binding for global variable β€˜Effectiveness’"," ellipse(cor(Effectiveness, Cost),","object_usage_linter" -"R/psa.R",204,32,"warning","no visible binding for global variable β€˜Effectiveness’"," ellipse(cor(Effectiveness, Cost),","object_usage_linter" -"R/psa.R",204,47,"warning","no visible binding for global variable β€˜Cost’"," ellipse(cor(Effectiveness, Cost),","object_usage_linter" -"R/psa.R",204,47,"warning","no visible binding for global variable β€˜Cost’"," ellipse(cor(Effectiveness, Cost),","object_usage_linter" -"R/psa.R",204,47,"warning","no visible binding for global variable β€˜Cost’"," ellipse(cor(Effectiveness, Cost),","object_usage_linter" -"R/run_dsa.R",52,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.list(params_basecase) | is.null(names(params_basecase))) {","vector_logic_linter" -"R/run_dsa.R",215,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.list(params_basecase) | is.null(names(params_basecase)))","vector_logic_linter" -"R/run_psa.R",85,78,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (i / (nrow(psa_samp) / 10) == round(i / (nrow(psa_samp) / 10), 0) & progress == TRUE) {","vector_logic_linter" -"R/run_psa.R",96,78,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (i / (nrow(psa_samp) / 10) == round(i / (nrow(psa_samp) / 10), 0) & progress == TRUE) {","vector_logic_linter" -"R/twsa.R",28,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(param1) | is.null(param2)) {","vector_logic_linter" -"tests/testthat/util_models_detfun.R",41,64,"style","Use FALSE instead of the symbol F."," nrow = length(state_name), byrow = F)","T_and_F_symbol_linter" -"vignettes/basic_cea.Rmd",71,33,"style","Put spaces around all infix operators.","icer_hiv <- calculate_icers(cost=v_hiv_costs, ","infix_spaces_linter" -"vignettes/basic_cea.Rmd",71,46,"style","Trailing whitespace is superfluous.","icer_hiv <- calculate_icers(cost=v_hiv_costs, ","trailing_whitespace_linter" -"vignettes/basic_cea.Rmd",72,35,"style","Put spaces around all infix operators."," effect=v_hiv_qalys, ","infix_spaces_linter" -"vignettes/basic_cea.Rmd",72,48,"style","Trailing whitespace is superfluous."," effect=v_hiv_qalys, ","trailing_whitespace_linter" -"vignettes/basic_cea.Rmd",73,39,"style","Put spaces around all infix operators."," strategies=v_hiv_strat_names)","infix_spaces_linter" -"vignettes/basic_cea.Rmd",101,15,"style","Trailing whitespace is superfluous.","plot(icer_hiv, ","trailing_whitespace_linter" -"vignettes/basic_cea.Rmd",102,11,"style","Put spaces around all infix operators."," label=""all"")","infix_spaces_linter" -"vignettes/basic_cea.Rmd",107,15,"style","Trailing whitespace is superfluous.","plot(icer_hiv, ","trailing_whitespace_linter" -"vignettes/basic_cea.Rmd",108,11,"style","Put spaces around all infix operators."," label=""all"") +","infix_spaces_linter" -"vignettes/basic_cea.Rmd",157,25,"style","Put spaces around all infix operators."," filter(Status == ""ND"")%>%","infix_spaces_linter" -"vignettes/dsa_generation.Rmd",43,80,"style","Trailing whitespace is superfluous."," # -- disease progression parameters (annual): r_HD, p_S1S2, hr_S1D, hr_S2D, ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",49,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",51,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",55,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",57,24,"warning","no visible binding for global variable β€˜r_disc’"," v_dw <- 1 / ((1 + r_disc) ^ (0:n_cycles))","object_usage_linter" -"vignettes/dsa_generation.Rmd",57,37,"warning","no visible binding for global variable β€˜n_cycles’"," v_dw <- 1 / ((1 + r_disc) ^ (0:n_cycles))","object_usage_linter" -"vignettes/dsa_generation.Rmd",58,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",60,29,"warning","no visible binding for global variable β€˜c_H’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" -"vignettes/dsa_generation.Rmd",60,41,"warning","no visible binding for global variable β€˜c_S1’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" -"vignettes/dsa_generation.Rmd",60,54,"warning","no visible binding for global variable β€˜c_S2’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" -"vignettes/dsa_generation.Rmd",60,66,"warning","no visible binding for global variable β€˜c_D’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" -"vignettes/dsa_generation.Rmd",61,32,"warning","no visible binding for global variable β€˜u_H’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" -"vignettes/dsa_generation.Rmd",61,44,"warning","no visible binding for global variable β€˜u_S1’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" -"vignettes/dsa_generation.Rmd",61,57,"warning","no visible binding for global variable β€˜u_S2’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" -"vignettes/dsa_generation.Rmd",61,69,"warning","no visible binding for global variable β€˜u_D’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" -"vignettes/dsa_generation.Rmd",62,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",64,14,"warning","no visible binding for global variable β€˜hr_S1D’"," r_S1D <- hr_S1D * r_HD # rate of death in sick state","object_usage_linter" -"vignettes/dsa_generation.Rmd",64,23,"warning","no visible binding for global variable β€˜r_HD’"," r_S1D <- hr_S1D * r_HD # rate of death in sick state","object_usage_linter" -"vignettes/dsa_generation.Rmd",65,14,"warning","no visible binding for global variable β€˜hr_S2D’"," r_S2D <- hr_S2D * r_HD # rate of death in sicker state","object_usage_linter" -"vignettes/dsa_generation.Rmd",65,23,"warning","no visible binding for global variable β€˜r_HD’"," r_S2D <- hr_S2D * r_HD # rate of death in sicker state","object_usage_linter" -"vignettes/dsa_generation.Rmd",68,23,"warning","no visible binding for global variable β€˜r_HD’"," p_HD <- 1 - exp(-r_HD) # probability of dying when healthy","object_usage_linter" -"vignettes/dsa_generation.Rmd",69,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",70,48,"style","Trailing whitespace is superfluous."," ## Initialize transition probability matrix ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",71,85,"style","Trailing whitespace is superfluous."," # all transitions to a non-death state are assumed to be conditional on survival ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",72,21,"style","Trailing whitespace is superfluous."," m_P <- matrix(0, ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",73,52,"style","Trailing whitespace is superfluous."," nrow = n_states, ncol = n_states, ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",77,42,"warning","no visible binding for global variable β€˜p_HS1’"," m_P[""H"", ""H""] <- (1 - p_HD) * (1 - p_HS1) ","object_usage_linter" -"vignettes/dsa_generation.Rmd",77,48,"style","Trailing whitespace is superfluous."," m_P[""H"", ""H""] <- (1 - p_HD) * (1 - p_HS1) ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",78,37,"warning","no visible binding for global variable β€˜p_HS1’"," m_P[""H"", ""S1""] <- (1 - p_HD) * p_HS1 ","object_usage_linter" -"vignettes/dsa_generation.Rmd",78,42,"style","Trailing whitespace is superfluous."," m_P[""H"", ""S1""] <- (1 - p_HD) * p_HS1 ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",81,38,"warning","no visible binding for global variable β€˜p_S1H’"," m_P[""S1"", ""H""] <- (1 - p_S1D) * p_S1H","object_usage_linter" -"vignettes/dsa_generation.Rmd",82,44,"warning","no visible binding for global variable β€˜p_S1H’"," m_P[""S1"", ""S1""] <- (1 - p_S1D) * (1 - (p_S1H + p_S1S2))","object_usage_linter" -"vignettes/dsa_generation.Rmd",82,52,"warning","no visible binding for global variable β€˜p_S1S2’"," m_P[""S1"", ""S1""] <- (1 - p_S1D) * (1 - (p_S1H + p_S1S2))","object_usage_linter" -"vignettes/dsa_generation.Rmd",83,38,"warning","no visible binding for global variable β€˜p_S1S2’"," m_P[""S1"", ""S2""] <- (1 - p_S1D) * p_S1S2","object_usage_linter" -"vignettes/dsa_generation.Rmd",90,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",91,67,"style","Trailing whitespace is superfluous."," # check that all transition matrix entries are between 0 and 1 ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",92,7,"style","Place a space before left parenthesis, except in a function call."," if(!all(m_P <= 1 & m_P >= 0)){","spaces_left_parentheses_linter" -"vignettes/dsa_generation.Rmd",92,34,"style","There should be a space before an opening curly brace."," if(!all(m_P <= 1 & m_P >= 0)){","brace_linter" -"vignettes/dsa_generation.Rmd",92,34,"style","There should be a space between a right parenthesis and a body expression."," if(!all(m_P <= 1 & m_P >= 0)){","paren_body_linter" -"vignettes/dsa_generation.Rmd",96,47,"style","Commas should always have a space after."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","commas_linter" -"vignettes/dsa_generation.Rmd",96,53,"style","Commas should always have a space after."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","commas_linter" -"vignettes/dsa_generation.Rmd",96,64,"style","There should be a space before an opening curly brace."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","brace_linter" -"vignettes/dsa_generation.Rmd",96,64,"style","There should be a space between a right parenthesis and a body expression."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","paren_body_linter" -"vignettes/dsa_generation.Rmd",99,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",102,34,"warning","no visible binding for global variable β€˜n_cycles’"," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","object_usage_linter" -"vignettes/dsa_generation.Rmd",102,34,"warning","no visible binding for global variable β€˜n_cycles’"," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","object_usage_linter" -"vignettes/dsa_generation.Rmd",102,46,"style","Commas should never have a space before."," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","commas_linter" -"vignettes/dsa_generation.Rmd",102,48,"style","Trailing whitespace is superfluous."," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",105,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",107,36,"warning","no visible binding for global variable β€˜n_cycles’"," v_C <- v_Q <- numeric(length = n_cycles + 1)","object_usage_linter" -"vignettes/dsa_generation.Rmd",108,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",110,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",111,21,"warning","no visible binding for global variable β€˜v_s_init’"," m_Trace[1, ] <- v_s_init # initialize Markov trace","object_usage_linter" -"vignettes/dsa_generation.Rmd",114,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",115,17,"warning","no visible binding for global variable β€˜n_cycles’"," for (t in 1:n_cycles){ # throughout the number of cycles","object_usage_linter" -"vignettes/dsa_generation.Rmd",117,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",119,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",121,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",123,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",125,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",128,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",131,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",133,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",136,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",144,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",156,56,"style","There should be a space before an opening curly brace.","simulate_strategies <- function(l_params, wtp = 100000){","brace_linter" -"vignettes/dsa_generation.Rmd",156,56,"style","There should be a space between a right parenthesis and a body expression.","simulate_strategies <- function(l_params, wtp = 100000){","paren_body_linter" -"vignettes/dsa_generation.Rmd",159,80,"style","Trailing whitespace is superfluous."," # -- disease progression parameters (annual): r_HD, p_S1S2, hr_S1D, hr_S2D, ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",169,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",171,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",177,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",180,18,"warning","no visible binding for global variable β€˜u_trtA’"," u_S1_trtA <- u_trtA","object_usage_linter" -"vignettes/dsa_generation.Rmd",182,18,"warning","no visible binding for global variable β€˜c_S1’"," c_S1_trtA <- c_S1 + c_trtA","object_usage_linter" -"vignettes/dsa_generation.Rmd",182,25,"warning","no visible binding for global variable β€˜c_trtA’"," c_S1_trtA <- c_S1 + c_trtA","object_usage_linter" -"vignettes/dsa_generation.Rmd",183,18,"warning","no visible binding for global variable β€˜c_S2’"," c_S2_trtA <- c_S2 + c_trtA","object_usage_linter" -"vignettes/dsa_generation.Rmd",183,25,"warning","no visible binding for global variable β€˜c_trtA’"," c_S2_trtA <- c_S2 + c_trtA","object_usage_linter" -"vignettes/dsa_generation.Rmd",184,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",187,29,"warning","no visible binding for global variable β€˜p_S1S2’"," r_S1S2_trtB <- -log(1 - p_S1S2) * hr_S1S2_trtB ","object_usage_linter" -"vignettes/dsa_generation.Rmd",187,39,"warning","no visible binding for global variable β€˜hr_S1S2_trtB’"," r_S1S2_trtB <- -log(1 - p_S1S2) * hr_S1S2_trtB ","object_usage_linter" -"vignettes/dsa_generation.Rmd",187,51,"style","Trailing whitespace is superfluous."," r_S1S2_trtB <- -log(1 - p_S1S2) * hr_S1S2_trtB ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",190,18,"warning","no visible binding for global variable β€˜c_S1’"," c_S1_trtB <- c_S1 + c_trtB","object_usage_linter" -"vignettes/dsa_generation.Rmd",190,25,"warning","no visible binding for global variable β€˜c_trtB’"," c_S1_trtB <- c_S1 + c_trtB","object_usage_linter" -"vignettes/dsa_generation.Rmd",191,18,"warning","no visible binding for global variable β€˜c_S2’"," c_S2_trtB <- c_S2 + c_trtB","object_usage_linter" -"vignettes/dsa_generation.Rmd",191,25,"warning","no visible binding for global variable β€˜c_trtB’"," c_S2_trtB <- c_S2 + c_trtB","object_usage_linter" -"vignettes/dsa_generation.Rmd",193,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",194,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",202,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",203,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",206,42,"warning","no visible binding for global variable β€˜n_cycles’"," l_params_markov <- list(n_cycles = n_cycles, r_disc = r_disc, v_s_init = v_s_init,","object_usage_linter" -"vignettes/dsa_generation.Rmd",206,61,"warning","no visible binding for global variable β€˜r_disc’"," l_params_markov <- list(n_cycles = n_cycles, r_disc = r_disc, v_s_init = v_s_init,","object_usage_linter" -"vignettes/dsa_generation.Rmd",206,80,"warning","no visible binding for global variable β€˜v_s_init’"," l_params_markov <- list(n_cycles = n_cycles, r_disc = r_disc, v_s_init = v_s_init,","object_usage_linter" -"vignettes/dsa_generation.Rmd",207,38,"warning","no visible binding for global variable β€˜c_H’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" -"vignettes/dsa_generation.Rmd",207,50,"warning","no visible binding for global variable β€˜c_S2’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" -"vignettes/dsa_generation.Rmd",207,63,"warning","no visible binding for global variable β€˜c_S1’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" -"vignettes/dsa_generation.Rmd",207,75,"warning","no visible binding for global variable β€˜c_D’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" -"vignettes/dsa_generation.Rmd",208,38,"warning","no visible binding for global variable β€˜u_H’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" -"vignettes/dsa_generation.Rmd",208,50,"warning","no visible binding for global variable β€˜u_S2’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" -"vignettes/dsa_generation.Rmd",208,63,"warning","no visible binding for global variable β€˜u_S1’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" -"vignettes/dsa_generation.Rmd",208,75,"warning","no visible binding for global variable β€˜u_D’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" -"vignettes/dsa_generation.Rmd",209,38,"warning","no visible binding for global variable β€˜r_HD’"," r_HD = r_HD, hr_S1D = hr_S1D, hr_S2D = hr_S2D,","object_usage_linter" -"vignettes/dsa_generation.Rmd",209,53,"warning","no visible binding for global variable β€˜hr_S1D’"," r_HD = r_HD, hr_S1D = hr_S1D, hr_S2D = hr_S2D,","object_usage_linter" -"vignettes/dsa_generation.Rmd",209,70,"warning","no visible binding for global variable β€˜hr_S2D’"," r_HD = r_HD, hr_S1D = hr_S1D, hr_S2D = hr_S2D,","object_usage_linter" -"vignettes/dsa_generation.Rmd",210,39,"warning","no visible binding for global variable β€˜p_HS1’"," p_HS1 = p_HS1, p_S1H = p_S1H, p_S1S2 = p_S1S2)","object_usage_linter" -"vignettes/dsa_generation.Rmd",210,54,"warning","no visible binding for global variable β€˜p_S1H’"," p_HS1 = p_HS1, p_S1H = p_S1H, p_S1S2 = p_S1S2)","object_usage_linter" -"vignettes/dsa_generation.Rmd",210,70,"warning","no visible binding for global variable β€˜p_S1S2’"," p_HS1 = p_HS1, p_S1H = p_S1H, p_S1S2 = p_S1S2)","object_usage_linter" -"vignettes/dsa_generation.Rmd",211,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",212,45,"style","There should be a space before an opening curly brace."," if (v_names_strat[i] == ""Treatment_A""){","brace_linter" -"vignettes/dsa_generation.Rmd",212,45,"style","There should be a space between a right parenthesis and a body expression."," if (v_names_strat[i] == ""Treatment_A""){","paren_body_linter" -"vignettes/dsa_generation.Rmd",216,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",217,16,"style","Place a space before left parenthesis, except in a function call."," } else if(v_names_strat[i] == ""Treatment_B""){","spaces_left_parentheses_linter" -"vignettes/dsa_generation.Rmd",217,51,"style","There should be a space before an opening curly brace."," } else if(v_names_strat[i] == ""Treatment_B""){","brace_linter" -"vignettes/dsa_generation.Rmd",217,51,"style","There should be a space between a right parenthesis and a body expression."," } else if(v_names_strat[i] == ""Treatment_B""){","paren_body_linter" -"vignettes/dsa_generation.Rmd",224,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",230,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",242,41,"style","Trailing whitespace is superfluous."," r_HD = 0.002, ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",243,39,"style","Trailing whitespace is superfluous."," hr_S1D = 3, ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",248,41,"style","Trailing whitespace is superfluous."," c_S2 = 15000, ","trailing_whitespace_linter" -"vignettes/psa_analysis.Rmd",98,28,"style","Trailing whitespace is superfluous.","psa_sum <- summary(psa_obj, ","trailing_whitespace_linter" -"vignettes/psa_analysis.Rmd",106,50,"style","Trailing whitespace is superfluous.","icers <- calculate_icers(cost = psa_sum$meanCost, ","trailing_whitespace_linter" -"vignettes/psa_analysis.Rmd",107,54,"style","Trailing whitespace is superfluous."," effect = psa_sum$meanEffect, ","trailing_whitespace_linter" -"vignettes/psa_analysis.Rmd",119,40,"style","Trailing whitespace is superfluous.","ceac_obj <- ceac(wtp = example_psa$wtp, ","trailing_whitespace_linter" -"vignettes/psa_analysis.Rmd",133,15,"style","Trailing whitespace is superfluous.","plot(ceac_obj, ","trailing_whitespace_linter" -"vignettes/psa_analysis.Rmd",134,22,"style","Trailing whitespace is superfluous."," frontier = TRUE, ","trailing_whitespace_linter" -"vignettes/psa_analysis.Rmd",145,43,"style","Trailing whitespace is superfluous.","el <- calc_exp_loss(wtp = example_psa$wtp, ","trailing_whitespace_linter" -"vignettes/psa_analysis.Rmd",148,9,"style","Trailing whitespace is superfluous.","plot(el, ","trailing_whitespace_linter" -"vignettes/psa_analysis.Rmd",149,20,"style","Trailing whitespace is superfluous."," n_x_ticks = 8, ","trailing_whitespace_linter" -"vignettes/psa_analysis.Rmd",183,16,"style","Trailing whitespace is superfluous.","owsa_tornado(o, ","trailing_whitespace_linter" -"vignettes/psa_analysis.Rmd",189,16,"style","Trailing whitespace is superfluous.","owsa_tornado(o, ","trailing_whitespace_linter" -"vignettes/psa_analysis.Rmd",198,18,"style","Trailing whitespace is superfluous.","owsa_opt_strat(o, ","trailing_whitespace_linter" -"vignettes/psa_analysis.Rmd",205,18,"style","Trailing whitespace is superfluous.","owsa_opt_strat(o, ","trailing_whitespace_linter" -"vignettes/psa_analysis.Rmd",214,20,"style","Trailing whitespace is superfluous.","tw <- twsa(psa_obj, ","trailing_whitespace_linter" -"vignettes/psa_analysis.Rmd",215,34,"style","Trailing whitespace is superfluous."," param1 = ""pFailChemo"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",39,80,"style","Trailing whitespace is superfluous."," # -- disease progression parameters (annual): r_HD, p_S1S2, hr_S1D, hr_S2D, ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",45,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",47,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",51,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",53,24,"warning","no visible binding for global variable β€˜r_disc’"," v_dw <- 1 / ((1 + r_disc) ^ (0:n_cycles))","object_usage_linter" -"vignettes/psa_generation.Rmd",53,37,"warning","no visible binding for global variable β€˜n_cycles’"," v_dw <- 1 / ((1 + r_disc) ^ (0:n_cycles))","object_usage_linter" -"vignettes/psa_generation.Rmd",54,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",56,29,"warning","no visible binding for global variable β€˜c_H’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" -"vignettes/psa_generation.Rmd",56,41,"warning","no visible binding for global variable β€˜c_S1’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" -"vignettes/psa_generation.Rmd",56,54,"warning","no visible binding for global variable β€˜c_S2’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" -"vignettes/psa_generation.Rmd",56,66,"warning","no visible binding for global variable β€˜c_D’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" -"vignettes/psa_generation.Rmd",57,32,"warning","no visible binding for global variable β€˜u_H’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" -"vignettes/psa_generation.Rmd",57,44,"warning","no visible binding for global variable β€˜u_S1’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" -"vignettes/psa_generation.Rmd",57,57,"warning","no visible binding for global variable β€˜u_S2’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" -"vignettes/psa_generation.Rmd",57,69,"warning","no visible binding for global variable β€˜u_D’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" -"vignettes/psa_generation.Rmd",58,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",60,14,"warning","no visible binding for global variable β€˜hr_S1D’"," r_S1D <- hr_S1D * r_HD # rate of death in sick state","object_usage_linter" -"vignettes/psa_generation.Rmd",60,23,"warning","no visible binding for global variable β€˜r_HD’"," r_S1D <- hr_S1D * r_HD # rate of death in sick state","object_usage_linter" -"vignettes/psa_generation.Rmd",61,14,"warning","no visible binding for global variable β€˜hr_S2D’"," r_S2D <- hr_S2D * r_HD # rate of death in sicker state","object_usage_linter" -"vignettes/psa_generation.Rmd",61,23,"warning","no visible binding for global variable β€˜r_HD’"," r_S2D <- hr_S2D * r_HD # rate of death in sicker state","object_usage_linter" -"vignettes/psa_generation.Rmd",64,23,"warning","no visible binding for global variable β€˜r_HD’"," p_HD <- 1 - exp(-r_HD) # probability of dying when healthy","object_usage_linter" -"vignettes/psa_generation.Rmd",65,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",66,48,"style","Trailing whitespace is superfluous."," ## Initialize transition probability matrix ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",67,85,"style","Trailing whitespace is superfluous."," # all transitions to a non-death state are assumed to be conditional on survival ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",68,21,"style","Trailing whitespace is superfluous."," m_P <- matrix(0, ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",69,52,"style","Trailing whitespace is superfluous."," nrow = n_states, ncol = n_states, ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",73,42,"warning","no visible binding for global variable β€˜p_HS1’"," m_P[""H"", ""H""] <- (1 - p_HD) * (1 - p_HS1) ","object_usage_linter" -"vignettes/psa_generation.Rmd",73,48,"style","Trailing whitespace is superfluous."," m_P[""H"", ""H""] <- (1 - p_HD) * (1 - p_HS1) ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",74,37,"warning","no visible binding for global variable β€˜p_HS1’"," m_P[""H"", ""S1""] <- (1 - p_HD) * p_HS1 ","object_usage_linter" -"vignettes/psa_generation.Rmd",74,42,"style","Trailing whitespace is superfluous."," m_P[""H"", ""S1""] <- (1 - p_HD) * p_HS1 ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",77,38,"warning","no visible binding for global variable β€˜p_S1H’"," m_P[""S1"", ""H""] <- (1 - p_S1D) * p_S1H","object_usage_linter" -"vignettes/psa_generation.Rmd",78,44,"warning","no visible binding for global variable β€˜p_S1H’"," m_P[""S1"", ""S1""] <- (1 - p_S1D) * (1 - (p_S1H + p_S1S2))","object_usage_linter" -"vignettes/psa_generation.Rmd",78,52,"warning","no visible binding for global variable β€˜p_S1S2’"," m_P[""S1"", ""S1""] <- (1 - p_S1D) * (1 - (p_S1H + p_S1S2))","object_usage_linter" -"vignettes/psa_generation.Rmd",79,38,"warning","no visible binding for global variable β€˜p_S1S2’"," m_P[""S1"", ""S2""] <- (1 - p_S1D) * p_S1S2","object_usage_linter" -"vignettes/psa_generation.Rmd",86,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",87,67,"style","Trailing whitespace is superfluous."," # check that all transition matrix entries are between 0 and 1 ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",88,7,"style","Place a space before left parenthesis, except in a function call."," if(!all(m_P <= 1 & m_P >= 0)){","spaces_left_parentheses_linter" -"vignettes/psa_generation.Rmd",88,34,"style","There should be a space before an opening curly brace."," if(!all(m_P <= 1 & m_P >= 0)){","brace_linter" -"vignettes/psa_generation.Rmd",88,34,"style","There should be a space between a right parenthesis and a body expression."," if(!all(m_P <= 1 & m_P >= 0)){","paren_body_linter" -"vignettes/psa_generation.Rmd",92,47,"style","Commas should always have a space after."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","commas_linter" -"vignettes/psa_generation.Rmd",92,53,"style","Commas should always have a space after."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","commas_linter" -"vignettes/psa_generation.Rmd",92,64,"style","There should be a space before an opening curly brace."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","brace_linter" -"vignettes/psa_generation.Rmd",92,64,"style","There should be a space between a right parenthesis and a body expression."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","paren_body_linter" -"vignettes/psa_generation.Rmd",95,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",98,34,"warning","no visible binding for global variable β€˜n_cycles’"," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","object_usage_linter" -"vignettes/psa_generation.Rmd",98,34,"warning","no visible binding for global variable β€˜n_cycles’"," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","object_usage_linter" -"vignettes/psa_generation.Rmd",98,46,"style","Commas should never have a space before."," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","commas_linter" -"vignettes/psa_generation.Rmd",98,48,"style","Trailing whitespace is superfluous."," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",101,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",103,36,"warning","no visible binding for global variable β€˜n_cycles’"," v_C <- v_Q <- numeric(length = n_cycles + 1)","object_usage_linter" -"vignettes/psa_generation.Rmd",104,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",106,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",107,21,"warning","no visible binding for global variable β€˜v_s_init’"," m_Trace[1, ] <- v_s_init # initialize Markov trace","object_usage_linter" -"vignettes/psa_generation.Rmd",110,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",111,17,"warning","no visible binding for global variable β€˜n_cycles’"," for (t in 1:n_cycles){ # throughout the number of cycles","object_usage_linter" -"vignettes/psa_generation.Rmd",113,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",115,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",117,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",119,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",121,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",124,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",127,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",129,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",132,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",140,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",148,56,"style","There should be a space before an opening curly brace.","simulate_strategies <- function(l_params, wtp = 100000){","brace_linter" -"vignettes/psa_generation.Rmd",148,56,"style","There should be a space between a right parenthesis and a body expression.","simulate_strategies <- function(l_params, wtp = 100000){","paren_body_linter" -"vignettes/psa_generation.Rmd",151,80,"style","Trailing whitespace is superfluous."," # -- disease progression parameters (annual): r_HD, p_S1S2, hr_S1D, hr_S2D, ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",161,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",163,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",169,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",172,18,"warning","no visible binding for global variable β€˜u_trtA’"," u_S1_trtA <- u_trtA","object_usage_linter" -"vignettes/psa_generation.Rmd",174,18,"warning","no visible binding for global variable β€˜c_S1’"," c_S1_trtA <- c_S1 + c_trtA","object_usage_linter" -"vignettes/psa_generation.Rmd",174,25,"warning","no visible binding for global variable β€˜c_trtA’"," c_S1_trtA <- c_S1 + c_trtA","object_usage_linter" -"vignettes/psa_generation.Rmd",175,18,"warning","no visible binding for global variable β€˜c_S2’"," c_S2_trtA <- c_S2 + c_trtA","object_usage_linter" -"vignettes/psa_generation.Rmd",175,25,"warning","no visible binding for global variable β€˜c_trtA’"," c_S2_trtA <- c_S2 + c_trtA","object_usage_linter" -"vignettes/psa_generation.Rmd",176,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",179,29,"warning","no visible binding for global variable β€˜p_S1S2’"," r_S1S2_trtB <- -log(1 - p_S1S2) * hr_S1S2_trtB ","object_usage_linter" -"vignettes/psa_generation.Rmd",179,39,"warning","no visible binding for global variable β€˜hr_S1S2_trtB’"," r_S1S2_trtB <- -log(1 - p_S1S2) * hr_S1S2_trtB ","object_usage_linter" -"vignettes/psa_generation.Rmd",179,51,"style","Trailing whitespace is superfluous."," r_S1S2_trtB <- -log(1 - p_S1S2) * hr_S1S2_trtB ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",182,18,"warning","no visible binding for global variable β€˜c_S1’"," c_S1_trtB <- c_S1 + c_trtB","object_usage_linter" -"vignettes/psa_generation.Rmd",182,25,"warning","no visible binding for global variable β€˜c_trtB’"," c_S1_trtB <- c_S1 + c_trtB","object_usage_linter" -"vignettes/psa_generation.Rmd",183,18,"warning","no visible binding for global variable β€˜c_S2’"," c_S2_trtB <- c_S2 + c_trtB","object_usage_linter" -"vignettes/psa_generation.Rmd",183,25,"warning","no visible binding for global variable β€˜c_trtB’"," c_S2_trtB <- c_S2 + c_trtB","object_usage_linter" -"vignettes/psa_generation.Rmd",185,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",186,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",194,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",195,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",198,42,"warning","no visible binding for global variable β€˜n_cycles’"," l_params_markov <- list(n_cycles = n_cycles, r_disc = r_disc, v_s_init = v_s_init,","object_usage_linter" -"vignettes/psa_generation.Rmd",198,61,"warning","no visible binding for global variable β€˜r_disc’"," l_params_markov <- list(n_cycles = n_cycles, r_disc = r_disc, v_s_init = v_s_init,","object_usage_linter" -"vignettes/psa_generation.Rmd",198,80,"warning","no visible binding for global variable β€˜v_s_init’"," l_params_markov <- list(n_cycles = n_cycles, r_disc = r_disc, v_s_init = v_s_init,","object_usage_linter" -"vignettes/psa_generation.Rmd",199,38,"warning","no visible binding for global variable β€˜c_H’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" -"vignettes/psa_generation.Rmd",199,50,"warning","no visible binding for global variable β€˜c_S2’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" -"vignettes/psa_generation.Rmd",199,63,"warning","no visible binding for global variable β€˜c_S1’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" -"vignettes/psa_generation.Rmd",199,75,"warning","no visible binding for global variable β€˜c_D’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" -"vignettes/psa_generation.Rmd",200,38,"warning","no visible binding for global variable β€˜u_H’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" -"vignettes/psa_generation.Rmd",200,50,"warning","no visible binding for global variable β€˜u_S2’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" -"vignettes/psa_generation.Rmd",200,63,"warning","no visible binding for global variable β€˜u_S1’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" -"vignettes/psa_generation.Rmd",200,75,"warning","no visible binding for global variable β€˜u_D’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" -"vignettes/psa_generation.Rmd",201,38,"warning","no visible binding for global variable β€˜r_HD’"," r_HD = r_HD, hr_S1D = hr_S1D, hr_S2D = hr_S2D,","object_usage_linter" -"vignettes/psa_generation.Rmd",201,53,"warning","no visible binding for global variable β€˜hr_S1D’"," r_HD = r_HD, hr_S1D = hr_S1D, hr_S2D = hr_S2D,","object_usage_linter" -"vignettes/psa_generation.Rmd",201,70,"warning","no visible binding for global variable β€˜hr_S2D’"," r_HD = r_HD, hr_S1D = hr_S1D, hr_S2D = hr_S2D,","object_usage_linter" -"vignettes/psa_generation.Rmd",202,39,"warning","no visible binding for global variable β€˜p_HS1’"," p_HS1 = p_HS1, p_S1H = p_S1H, p_S1S2 = p_S1S2)","object_usage_linter" -"vignettes/psa_generation.Rmd",202,54,"warning","no visible binding for global variable β€˜p_S1H’"," p_HS1 = p_HS1, p_S1H = p_S1H, p_S1S2 = p_S1S2)","object_usage_linter" -"vignettes/psa_generation.Rmd",202,70,"warning","no visible binding for global variable β€˜p_S1S2’"," p_HS1 = p_HS1, p_S1H = p_S1H, p_S1S2 = p_S1S2)","object_usage_linter" -"vignettes/psa_generation.Rmd",203,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",204,45,"style","There should be a space before an opening curly brace."," if (v_names_strat[i] == ""Treatment_A""){","brace_linter" -"vignettes/psa_generation.Rmd",204,45,"style","There should be a space between a right parenthesis and a body expression."," if (v_names_strat[i] == ""Treatment_A""){","paren_body_linter" -"vignettes/psa_generation.Rmd",208,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",209,16,"style","Place a space before left parenthesis, except in a function call."," } else if(v_names_strat[i] == ""Treatment_B""){","spaces_left_parentheses_linter" -"vignettes/psa_generation.Rmd",209,51,"style","There should be a space before an opening curly brace."," } else if(v_names_strat[i] == ""Treatment_B""){","brace_linter" -"vignettes/psa_generation.Rmd",209,51,"style","There should be a space between a right parenthesis and a body expression."," } else if(v_names_strat[i] == ""Treatment_B""){","paren_body_linter" -"vignettes/psa_generation.Rmd",216,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",222,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",238,24,"style","Trailing whitespace is superfluous."," ""p_HS1"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",239,24,"style","Trailing whitespace is superfluous."," ""p_S1H"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",240,25,"style","Trailing whitespace is superfluous."," ""p_S1S2"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",242,24,"style","Trailing whitespace is superfluous."," ""hr_S1"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",246,22,"style","Trailing whitespace is superfluous."," ""c_H"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",247,23,"style","Trailing whitespace is superfluous."," ""c_S1"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",254,23,"style","Trailing whitespace is superfluous."," ""u_S2"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",258,22,"style","Trailing whitespace is superfluous."," ""beta"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",259,22,"style","Trailing whitespace is superfluous."," ""beta"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",263,28,"style","Trailing whitespace is superfluous."," ""log-normal"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",266,23,"style","Trailing whitespace is superfluous."," ""gamma"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",267,23,"style","Trailing whitespace is superfluous."," ""gamma"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",269,23,"style","Trailing whitespace is superfluous."," ""gamma"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",270,23,"style","Trailing whitespace is superfluous."," ""gamma"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",272,34,"style","Trailing whitespace is superfluous."," ""truncated-normal"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",273,34,"style","Trailing whitespace is superfluous."," ""truncated-normal"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",274,34,"style","Trailing whitespace is superfluous."," ""truncated-normal"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",278,39,"style","Trailing whitespace is superfluous."," ""a, b"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",279,39,"style","Trailing whitespace is superfluous."," ""a, b"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",282,43,"style","Trailing whitespace is superfluous."," ""mean, sd"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",283,43,"style","Trailing whitespace is superfluous."," ""mean, sd"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",286,47,"style","Trailing whitespace is superfluous."," ""shape, scale"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",287,47,"style","Trailing whitespace is superfluous."," ""shape, scale"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",292,51,"style","Trailing whitespace is superfluous."," ""mean, sd, ll, ul"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",293,51,"style","Trailing whitespace is superfluous."," ""mean, sd, ll, ul"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",298,38,"style","Trailing whitespace is superfluous."," c(7.5, 42.5), ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",299,35,"style","Trailing whitespace is superfluous."," c(12, 12), ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",302,35,"style","Trailing whitespace is superfluous."," c(3, 0.5), ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",306,37,"style","Trailing whitespace is superfluous."," c(44.5, 45), ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",308,39,"style","Trailing whitespace is superfluous."," c(900, 16.67), ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",313,46,"style","Trailing whitespace is superfluous."," c(0.75, 0.02, NA, 1), ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",316,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",332,41,"style","Trailing whitespace is superfluous."," r_HD = 0.002, ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",333,39,"style","Trailing whitespace is superfluous."," hr_S1D = 3, ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",338,41,"style","Trailing whitespace is superfluous."," c_S2 = 15000, ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",364,62,"style","Trailing whitespace is superfluous.","cea_psa <- make_psa_obj(cost = psa_output$Cost$other_outcome, ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",365,64,"style","Trailing whitespace is superfluous."," effect = psa_output$QALY$other_outcome, ","trailing_whitespace_linter" -"vignettes/voi.Rmd",37,42,"style","Trailing whitespace is superfluous.","psa_big <- make_psa_obj(example_psa$cost, ","trailing_whitespace_linter" -"vignettes/voi.Rmd",39,48,"style","Trailing whitespace is superfluous."," example_psa$parameters, ","trailing_whitespace_linter" -"vignettes/voi.Rmd",54,24,"style","Trailing whitespace is superfluous."," txtsize = 16, ","trailing_whitespace_linter" -"vignettes/voi.Rmd",55,33,"style","Trailing whitespace is superfluous."," effect_units = ""QALY"", ","trailing_whitespace_linter" -"vignettes/voi.Rmd",57,42,"style","Trailing whitespace is superfluous."," xbreaks = seq(0, 200, by = 10), ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/dampack/email-body b/.dev/revdep_emails/dampack/email-body deleted file mode 100644 index 315766631..000000000 --- a/.dev/revdep_emails/dampack/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Greg Knowlton! Thank you for using {lintr} in your package {dampack}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/DARTH-git/dampack using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 27s on CRAN vs. 13s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/dashboardthemes/attachments/dashboardthemes.warnings b/.dev/revdep_emails/dashboardthemes/attachments/dashboardthemes.warnings deleted file mode 100644 index 3c25f3e16..000000000 --- a/.dev/revdep_emails/dashboardthemes/attachments/dashboardthemes.warnings +++ /dev/null @@ -1,263 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Linter closed_curly_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. -Trying to remove β€˜open_curly_linter’, β€˜undesirable_function_linter’, β€˜undesirable_operator_linter’ and β€˜todo_comment_linter’, which are not in `defaults`. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. diff --git a/.dev/revdep_emails/dashboardthemes/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/dashboardthemes/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 35aab9a3a..000000000 --- a/.dev/revdep_emails/dashboardthemes/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,3 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"vignettes/using_dashboardthemes.Rmd",70,3,"error","unexpected symbol"," ...",NA -"vignettes/using_dashboardthemes.Rmd",267,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" diff --git a/.dev/revdep_emails/dashboardthemes/email-body b/.dev/revdep_emails/dashboardthemes/email-body deleted file mode 100644 index c7ed7154b..000000000 --- a/.dev/revdep_emails/dashboardthemes/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Nik Lilovski! Thank you for using {lintr} in your package {dashboardthemes}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/nik01010/dashboardthemes using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 10s on CRAN vs. 8s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/dat/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/dat/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 6e7ec86ce..000000000 --- a/.dev/revdep_emails/dat/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,7 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/DataFrame.R",64,1,"style","Variable and function name style should be snake_case.","as.DataFrame.data.frame <- function(x, ...) {","object_name_linter" -"R/dataTableBackend.R",44,7,"style","Variable and function name style should be snake_case."," env$.__x__ <- x","object_name_linter" -"R/helper.R",20,13,"style","Variable and function name style should be snake_case."," .self$classOfX <- class(xS3)","object_name_linter" -"R/helper.R",23,13,"style","Variable and function name style should be snake_case."," .self$s4Object <- x","object_name_linter" -"R/helper.R",28,13,"style","Variable and function name style should be snake_case."," .self$classOfX <- class(x)","object_name_linter" -"R/useDplyr.R",12,1,"style","Variable and function name style should be snake_case.",".onAttach <- function(libname, pkgname) {","object_name_linter" diff --git a/.dev/revdep_emails/dat/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/dat/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index a856b4180..000000000 --- a/.dev/revdep_emails/dat/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,44 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/as.function.R",30,3,"style","`else` should come on the same line as the previous `}`."," else if (length(x) == 3) {","brace_linter" -"R/as.function.R",30,8,"style","Either both or neither branch in `if`/`else` should use curly braces."," else if (length(x) == 3) {","brace_linter" -"R/dataTableBackend.R",28,9,"style","Variable and function name style should be snake_case or symbols."," names(listOfNames) <- colsTmp","object_name_linter" -"R/FormulaList.R",47,9,"style","Variable and function name style should be snake_case or symbols."," names(formulaList) <- NULL","object_name_linter" -"R/FormulaList.R",62,3,"style","`else` should come on the same line as the previous `}`."," else if (is.list(object@.n)) {","brace_linter" -"R/helper.R",22,29,"style","Variable and function name style should be snake_case or symbols."," S3Part(x, needClass = ""data.frame"") <- data.frame()","object_name_linter" -"R/helper.R",27,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/helper.R",42,5,"style","`else` should come on the same line as the previous `}`."," else if (!is.null(classOfX)) {","brace_linter" -"R/helper.R",45,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/helper.R",81,10,"style","Variable and function name style should be snake_case or symbols."," S3Part(.Object) <- addTypeCheck(.Object@fun, class(.Object@prototype)) %>%","object_name_linter" -"R/helper.R",87,10,"style","Variable and function name style should be snake_case or symbols."," S3Part(.Object) <- addTypeCheck(.Object@fun, .Object@type)","object_name_linter" -"R/helper.R",92,11,"style","Compound semicolons are discouraged. Replace them by a newline."," force(f); force(l)","semicolon_linter" -"R/helper.R",106,11,"style","Compound semicolons are discouraged. Replace them by a newline."," force(f); force(type)","semicolon_linter" -"R/helper.R",196,10,"style","Variable and function name style should be snake_case or symbols."," S3Part(.Object) <- formula(tmp, lhs = 1, rhs = 1)","object_name_linter" -"R/helper.R",198,3,"style","Variable and function name style should be snake_case or symbols."," .Object@.n <- eval(.nUnevaluated, envir = environment(.Object))","object_name_linter" -"R/map.R",111,10,"style","Either both or neither branch in `if`/`else` should use curly braces."," ind <- if (length(p) == 1 && grepl(""^\\^"", p)) {","brace_linter" -"tests/testthat/test-DataFrame.R",85,9,"style","Variable and function name style should be snake_case or symbols."," datRef[""newVar""] <- datRef$x + 1","object_name_linter" -"tests/testthat/test-DataFrame.R",94,9,"style","Variable and function name style should be snake_case or symbols."," datRef[""newVar""] <- datRef$x + 1","object_name_linter" -"tests/testthat/test-DataFrame.R",95,9,"style","Variable and function name style should be snake_case or symbols."," datRef[""newVar1""] <- datRef$x + 2","object_name_linter" -"tests/testthat/test-DataFrame.R",105,9,"style","Variable and function name style should be snake_case or symbols."," datRef[""newVar""] <- datRef$x + 1","object_name_linter" -"tests/testthat/test-DataFrame.R",106,9,"style","Variable and function name style should be snake_case or symbols."," datRef[""newVar1""] <- datRef$x + 2","object_name_linter" -"tests/testthat/test-DataFrame.R",117,9,"style","Variable and function name style should be snake_case or symbols."," datRef[""newVar""] <- datRef$x + 1","object_name_linter" -"tests/testthat/test-DataFrame.R",118,9,"style","Variable and function name style should be snake_case or symbols."," datRef[""newVar1""] <- datRef$x + 2","object_name_linter" -"tests/testthat/test-DataFrame.R",126,9,"style","Variable and function name style should be snake_case or symbols."," datRef$id <- datRef$x > 4","object_name_linter" -"tests/testthat/test-DataFrame.R",128,15,"style","Variable and function name style should be snake_case or symbols."," names(datRef)[2] <- ""count""","object_name_linter" -"vignettes/Introduction.Rmd",136,1,"style","Variable and function name style should be snake_case or symbols.","DataTable <- function(...) {","object_name_linter" -"vignettes/performance.Rmd",56,1,"style","Variable and function name style should be snake_case or symbols.","N <- 2e7 # more is not possible with small laptop","object_name_linter" -"vignettes/performance.Rmd",57,1,"style","Variable and function name style should be snake_case or symbols.","K <- 100","object_name_linter" -"vignettes/performance.Rmd",60,1,"style","Variable and function name style should be snake_case or symbols.","DT <- data.table(","object_name_linter" -"vignettes/performance.Rmd",61,33,"style","Commas should always have a space after."," id1 = sample(sprintf(""id%03d"",1:K), N, TRUE), # large groups (char)","commas_linter" -"vignettes/performance.Rmd",62,33,"style","Commas should always have a space after."," id2 = sample(sprintf(""id%03d"",1:K), N, TRUE), # large groups (char)","commas_linter" -"vignettes/performance.Rmd",63,34,"style","Commas should always have a space after."," id3 = sample(sprintf(""id%010d"",1:(N/K)), N, TRUE), # small groups (char)","commas_linter" -"vignettes/performance.Rmd",63,38,"style","Put spaces around all infix operators."," id3 = sample(sprintf(""id%010d"",1:(N/K)), N, TRUE), # small groups (char)","infix_spaces_linter" -"vignettes/performance.Rmd",66,17,"style","Put spaces around all infix operators."," id6 = sample(N/K, N, TRUE), # small groups (int)","infix_spaces_linter" -"vignettes/performance.Rmd",69,32,"style","Commas should always have a space after."," v3 = sample(round(runif(100,max=100),4), N, TRUE) # numeric e.g. 23.5749","commas_linter" -"vignettes/performance.Rmd",69,35,"style","Put spaces around all infix operators."," v3 = sample(round(runif(100,max=100),4), N, TRUE) # numeric e.g. 23.5749","infix_spaces_linter" -"vignettes/performance.Rmd",69,41,"style","Commas should always have a space after."," v3 = sample(round(runif(100,max=100),4), N, TRUE) # numeric e.g. 23.5749","commas_linter" -"vignettes/performance.Rmd",74,1,"style","Variable and function name style should be snake_case or symbols.","DT4 <- new(""DataTable"", DT)","object_name_linter" -"vignettes/performance.Rmd",76,29,"style","Commas should always have a space after.","cat(""GB ="", round(sum(gc()[,2]) / 1024, 3), ""\n"")","commas_linter" -"vignettes/performance.Rmd",105,81,"style","Lines should not be more than 80 characters.","system.time(group_by(DT, id4) %>% summarise(V1 = mean(v1), V2 = mean(v2), V3 = mean(v3)))","line_length_linter" -"vignettes/performance.Rmd",106,81,"style","Lines should not be more than 80 characters.","system.time(group_by(DT, id4) %>% summarise(V1 = mean(v1), V2 = mean(v2), V3 = mean(v3)))","line_length_linter" -"vignettes/performance.Rmd",112,81,"style","Lines should not be more than 80 characters.","system.time(group_by(DT, id6) %>% summarise(V1 = sum(v1), V2 = sum(v2), V3 = sum(v3)))","line_length_linter" -"vignettes/performance.Rmd",113,81,"style","Lines should not be more than 80 characters.","system.time(group_by(DT, id6) %>% summarise(V1 = sum(v1), V2 = sum(v2), V3 = sum(v3)))","line_length_linter" diff --git a/.dev/revdep_emails/dat/email-body b/.dev/revdep_emails/dat/email-body deleted file mode 100644 index 534a9f5b1..000000000 --- a/.dev/revdep_emails/dat/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Sebastian Warnholz! Thank you for using {lintr} in your package {dat}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/wahani/dat using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 17s on CRAN vs. 11s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/datarobot/email-body b/.dev/revdep_emails/datarobot/email-body deleted file mode 100644 index 8412abf99..000000000 --- a/.dev/revdep_emails/datarobot/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello AJ Alon! Thank you for using {lintr} in your package {datarobot}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cran/datarobot using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took NAs on CRAN vs. NAs in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/datastructures/attachments/datastructures.failure b/.dev/revdep_emails/datastructures/attachments/datastructures.failure deleted file mode 100644 index c3d4a1db0..000000000 --- a/.dev/revdep_emails/datastructures/attachments/datastructures.failure +++ /dev/null @@ -1 +0,0 @@ -object 'absolute_paths_linter' not found diff --git a/.dev/revdep_emails/datastructures/email-body b/.dev/revdep_emails/datastructures/email-body deleted file mode 100644 index b56b8bc9f..000000000 --- a/.dev/revdep_emails/datastructures/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Simon Dirmeier! Thank you for using {lintr} in your package {datastructures}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/dirmeier/datastructures using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 8s on CRAN vs. 0s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/describer/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/describer/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index c18888fb2..000000000 --- a/.dev/revdep_emails/describer/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,2 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/describe.R",83,1,"style","Variable and function name style should be snake_case.","describe.data.frame <- function(.x) {","object_name_linter" diff --git a/.dev/revdep_emails/describer/email-body b/.dev/revdep_emails/describer/email-body deleted file mode 100644 index b0befa241..000000000 --- a/.dev/revdep_emails/describer/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Paul Hendricks! Thank you for using {lintr} in your package {describer}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/paulhendricks/describer using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 3s on CRAN vs. 1s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/devtools/email-body b/.dev/revdep_emails/devtools/email-body deleted file mode 100644 index 344c8e1ca..000000000 --- a/.dev/revdep_emails/devtools/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Jennifer Bryan! Thank you for using {lintr} in your package {devtools}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/r-lib/devtools using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 0s on CRAN vs. 3s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/diffusr/attachments/diffusr.failure b/.dev/revdep_emails/diffusr/attachments/diffusr.failure deleted file mode 100644 index c3d4a1db0..000000000 --- a/.dev/revdep_emails/diffusr/attachments/diffusr.failure +++ /dev/null @@ -1 +0,0 @@ -object 'absolute_paths_linter' not found diff --git a/.dev/revdep_emails/diffusr/email-body b/.dev/revdep_emails/diffusr/email-body deleted file mode 100644 index c869634ce..000000000 --- a/.dev/revdep_emails/diffusr/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Simon Dirmeier! Thank you for using {lintr} in your package {diffusr}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/dirmeier/diffusr using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 2s on CRAN vs. 0s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/dittodb/attachments/dittodb.warnings b/.dev/revdep_emails/dittodb/attachments/dittodb.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/dittodb/attachments/dittodb.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/dittodb/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/dittodb/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 596ce57ed..000000000 --- a/.dev/revdep_emails/dittodb/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,728 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/nycflights13-sql.R",50,41,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (inherits(con, ""SQLiteConnection"") | schema == """") {","vector_logic_linter" -"vignettes/dittodb/nycflights/conInfo-.R",1,69,"style","Trailing whitespace is superfluous.","list(host = ""127.0.0.1"", username = ""travis"", dbname = ""nycflights"", ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/conInfo-.R",2,94,"style","Trailing whitespace is superfluous."," con.type = ""127.0.0.1 via TCP/IP"", db.version = ""10.4.12-MariaDB-1:10.4.12+maria~bionic"", ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/SELECT-16d120.R",1,64,"style","Trailing whitespace is superfluous.","structure(list(day = 1:31, mean_delay = c(0x1.55fd54de872a1p+5, ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/SELECT-16d120.R",2,66,"style","Trailing whitespace is superfluous.","0x1.59e435941788dp+5, 0x1.0f393c4c771f6p+5, 0x1.baeff05b9e3cap+4, ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/SELECT-16d120.R",3,66,"style","Trailing whitespace is superfluous.","0x1.1c90412a948cbp+5, 0x1.e78c809868c81p+4, 0x1.67eea7da1dc83p+5, ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/SELECT-16d120.R",4,66,"style","Trailing whitespace is superfluous.","0x1.c1cf68f8013cfp+5, 0x1.603062afefb64p+5, 0x1.a4022947a53a4p+5, ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/SELECT-16d120.R",5,66,"style","Trailing whitespace is superfluous.","0x1.4ee3566690b4fp+5, 0x1.544397c49e8f1p+5, 0x1.444be7f3df2b9p+5, ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/SELECT-16d120.R",6,66,"style","Trailing whitespace is superfluous.","0x1.13e1aaa03ab5cp+5, 0x1.c2b1018fed867p+4, 0x1.0024cd47277d8p+5, ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/SELECT-16d120.R",7,66,"style","Trailing whitespace is superfluous.","0x1.45ed38b2dce19p+5, 0x1.615182d6f26c8p+5, 0x1.4b4858bf824f1p+5, ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/SELECT-16d120.R",8,66,"style","Trailing whitespace is superfluous.","0x1.ef6ff9df0ef05p+4, 0x1.e34fb5df73593p+4, 0x1.7919380ff74a9p+5, ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/SELECT-16d120.R",9,66,"style","Trailing whitespace is superfluous.","0x1.63e23337f7ce1p+5, 0x1.56d7c319729fap+5, 0x1.593dde5542ad9p+5, ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/SELECT-16d120.R",10,66,"style","Trailing whitespace is superfluous.","0x1.1016cdd7d9ab7p+5, 0x1.5c258f74b99bdp+5, 0x1.90ab3046fb0abp+5, ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/SELECT-e53189.R",1,65,"style","Trailing whitespace is superfluous.","structure(list(month = 1:12, mean_delay = c(0x1.13d1e5a46fdcp+5, ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/SELECT-e53189.R",2,66,"style","Trailing whitespace is superfluous.","0x1.0d837f713f91bp+5, 0x1.4492c49ce57bcp+5, 0x1.55eaa80cc1cf3p+5, ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/SELECT-e53189.R",3,65,"style","Trailing whitespace is superfluous.","0x1.4f163c59bf3a3p+5, 0x1.ade7fa6ccb7dp+5, 0x1.af9cb5a5cabccp+5, ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/SELECT-e53189.R",4,65,"style","Trailing whitespace is superfluous.","0x1.3c1a8138c6202p+5, 0x1.3671c4fbc61bp+5, 0x1.d0961ced931dbp+4, ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/SELECT-e53189.R",5,86,"style","Trailing whitespace is superfluous.","0x1.b7c0e577c0e57p+4, 0x1.3dd1671e576e9p+5)), class = ""data.frame"", row.names = c(NA, ","trailing_whitespace_linter" -"vignettes/travelling-old/resultInfo-6f7e1a.R",1,69,"style","Trailing whitespace is superfluous.","list(statement = ""SELECT * FROM \""flights\"" AS \""zzz13\"" WHERE 0=1"", ","trailing_whitespace_linter" -"vignettes/travelling-old/resultInfo-6f7e1a.R",2,70,"style","Trailing whitespace is superfluous."," isSelect = 1L, rowsAffected = -1L, rowCount = 0L, completed = 0L, ","trailing_whitespace_linter" -"vignettes/travelling-old/resultInfo-6f7e1a.R",3,66,"style","Trailing whitespace is superfluous."," fieldDescription = list(list(name = c(""year"", ""month"", ""day"", ","trailing_whitespace_linter" -"vignettes/travelling-old/resultInfo-6f7e1a.R",4,77,"style","Trailing whitespace is superfluous."," ""dep_time"", ""sched_dep_time"", ""dep_delay"", ""arr_time"", ""sched_arr_time"", ","trailing_whitespace_linter" -"vignettes/travelling-old/resultInfo-6f7e1a.R",5,67,"style","Trailing whitespace is superfluous."," ""arr_delay"", ""carrier"", ""flight"", ""tailnum"", ""origin"", ""dest"", ","trailing_whitespace_linter" -"vignettes/travelling-old/resultInfo-6f7e1a.R",6,76,"style","Trailing whitespace is superfluous."," ""air_time"", ""distance"", ""hour"", ""minute"", ""time_hour""), Sclass = c(13L, ","trailing_whitespace_linter" -"vignettes/travelling-old/resultInfo-6f7e1a.R",7,64,"style","Trailing whitespace is superfluous."," 13L, 13L, 13L, 13L, 14L, 13L, 13L, 14L, 16L, 13L, 16L, 16L, ","trailing_whitespace_linter" -"vignettes/travelling-old/resultInfo-6f7e1a.R",8,64,"style","Trailing whitespace is superfluous."," 16L, 14L, 14L, 14L, 14L, 16L), type = c(23L, 23L, 23L, 23L, ","trailing_whitespace_linter" -"vignettes/travelling-old/resultInfo-6f7e1a.R",9,62,"style","Trailing whitespace is superfluous."," 23L, 701L, 23L, 23L, 701L, 25L, 23L, 25L, 25L, 25L, 701L, ","trailing_whitespace_linter" -"vignettes/travelling-old/resultInfo-6f7e1a.R",10,62,"style","Trailing whitespace is superfluous."," 701L, 701L, 701L, 1184L), len = c(4L, 4L, 4L, 4L, 4L, 8L, ","trailing_whitespace_linter" -"vignettes/travelling-old/resultInfo-6f7e1a.R",11,61,"style","Trailing whitespace is superfluous."," 4L, 4L, 8L, -1L, 4L, -1L, -1L, -1L, 8L, 8L, 8L, 8L, 8L), ","trailing_whitespace_linter" -"vignettes/travelling-old/resultInfo-6f7e1a.R",12,62,"style","Trailing whitespace is superfluous."," precision = c(-1L, -1L, -1L, -1L, -1L, -1L, -1L, -1L, ","trailing_whitespace_linter" -"vignettes/travelling-old/resultInfo-6f7e1a.R",14,61,"style","Trailing whitespace is superfluous."," ), scale = c(-1L, -1L, -1L, -1L, -1L, -1L, -1L, -1L, ","trailing_whitespace_linter" -"vignettes/travelling-old/resultInfo-6f7e1a.R",16,64,"style","Trailing whitespace is superfluous."," ), nullOK = c(TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, ","trailing_whitespace_linter" -"vignettes/travelling-old/resultInfo-6f7e1a.R",17,62,"style","Trailing whitespace is superfluous."," TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",1,67,"style","Trailing whitespace is superfluous.","structure(list(tailnum = c(""N912XJ"", ""N645JB"", ""N904WN"", ""N3BWAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",2,70,"style","Trailing whitespace is superfluous.","""N3CJAA"", ""N14972"", ""N667UA"", ""N998AT"", ""N521JB"", ""N16559"", ""N14186"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",3,70,"style","Trailing whitespace is superfluous.","""N16170"", ""N789JB"", ""N409WN"", ""N593JB"", ""N11535"", ""N505AA"", ""N8928A"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",4,70,"style","Trailing whitespace is superfluous.","""N3DPAA"", ""N34222"", ""N639VA"", ""N480AA"", ""N511MQ"", ""N77518"", ""N697DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",5,70,"style","Trailing whitespace is superfluous.","""N87527"", ""N652SW"", ""N651JB"", ""N640AA"", ""N304DQ"", ""N643JB"", ""N988DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",6,70,"style","Trailing whitespace is superfluous.","""N231JB"", ""N14542"", ""N531JB"", ""N14573"", ""N76519"", ""N13161"", ""N567UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",7,70,"style","Trailing whitespace is superfluous.","""N201LV"", ""N27962"", ""N198JB"", ""N520MQ"", ""N689MQ"", ""N369NW"", ""N8432A"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",8,70,"style","Trailing whitespace is superfluous.","""N14902"", ""N8EGMQ"", ""N336NB"", ""N3FJAA"", ""N905DL"", ""N628VA"", ""N12136"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",9,70,"style","Trailing whitespace is superfluous.","""N550WN"", ""N353SW"", ""N844VA"", ""N738US"", ""N371NB"", ""N431WN"", ""N11206"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",10,69,"style","Trailing whitespace is superfluous.","""N412WN"", ""N832UA"", ""N14993"", ""N495UA"", ""N3759"", ""N314US"", ""N14231"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",11,70,"style","Trailing whitespace is superfluous.","""N176DN"", ""N363NB"", ""N3AHAA"", ""N5DMAA"", ""N764US"", ""N802MQ"", ""N33209"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",12,70,"style","Trailing whitespace is superfluous.","""N38451"", ""N14219"", ""N320US"", ""N8903A"", ""N3FCAA"", ""N682MQ"", ""N672DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",13,70,"style","Trailing whitespace is superfluous.","""N173US"", ""N691CA"", ""N33103"", ""N210WN"", ""N8877A"", ""N638JB"", ""N558UW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",14,70,"style","Trailing whitespace is superfluous.","""N820AS"", ""N479UA"", ""N180US"", ""N334JB"", ""N33292"", ""N513UA"", ""N775JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",15,70,"style","Trailing whitespace is superfluous.","""N528MQ"", ""N955DL"", ""N405UA"", ""N377NW"", ""N611QX"", ""N7732A"", ""N320AA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",16,70,"style","Trailing whitespace is superfluous.","""N11192"", ""N3769L"", ""N622VA"", ""N338AA"", ""N504UA"", ""N7739A"", ""N841UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",17,70,"style","Trailing whitespace is superfluous.","""N987AT"", ""N11113"", ""N14106"", ""N903WN"", ""N3CGAA"", ""N621VA"", ""N477AA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",18,70,"style","Trailing whitespace is superfluous.","""N837UA"", ""N339NB"", ""N374DA"", ""N8869B"", ""N284JB"", ""N924DL"", ""N8775A"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",19,70,"style","Trailing whitespace is superfluous.","""N836UA"", ""N324JB"", ""N833UA"", ""N13553"", ""N999DN"", ""N3763D"", ""N12996"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",20,70,"style","Trailing whitespace is superfluous.","""N513MQ"", ""N722US"", ""N14904"", ""N591AA"", ""N539MQ"", ""N14977"", ""N12924"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",21,70,"style","Trailing whitespace is superfluous.","""N358NB"", ""N877AS"", ""N554UA"", ""N76514"", ""N203JB"", ""N12135"", ""N387SW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",22,70,"style","Trailing whitespace is superfluous.","""N27722"", ""N444UA"", ""N469UA"", ""N575UA"", ""N3AUAA"", ""N306JB"", ""N24128"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",23,70,"style","Trailing whitespace is superfluous.","""N617MQ"", ""N642DL"", ""N595UA"", ""N588JB"", ""N3HSAA"", ""N915DE"", ""N3HTAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",24,70,"style","Trailing whitespace is superfluous.","""N592UA"", ""N37253"", ""N629JB"", ""N585UA"", ""N265WN"", ""N4XRAA"", ""N941DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",25,70,"style","Trailing whitespace is superfluous.","""N838VA"", ""N267AT"", ""N3JXAA"", ""N523UA"", ""N912DL"", ""N707TW"", ""N3GRAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",26,70,"style","Trailing whitespace is superfluous.","""N934WN"", ""N370SW"", ""N17133"", ""N594JB"", ""N11119"", ""N8942A"", ""N524JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",27,70,"style","Trailing whitespace is superfluous.","""N608QX"", ""N534JB"", ""N21130"", ""N534MQ"", ""N14105"", ""N659DL"", ""N18102"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",28,70,"style","Trailing whitespace is superfluous.","""N470UA"", ""N7714B"", ""N535MQ"", ""N910DE"", ""N921WN"", ""N918DL"", ""N703TW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",29,70,"style","Trailing whitespace is superfluous.","""N998DL"", ""N8982A"", ""N735MQ"", ""N76065"", ""N354NW"", ""N13994"", ""N644JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",30,70,"style","Trailing whitespace is superfluous.","""N282WN"", ""N722MQ"", ""N502UA"", ""N13202"", ""N66057"", ""N26545"", ""N37474"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",31,70,"style","Trailing whitespace is superfluous.","""N527AA"", ""N544AA"", ""N24212"", ""N935XJ"", ""N352AA"", ""N920AT"", ""N630JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",32,70,"style","Trailing whitespace is superfluous.","""N79402"", ""N8305E"", ""N849VA"", ""N477WN"", ""N603JB"", ""N8907A"", ""N4UCAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",33,70,"style","Trailing whitespace is superfluous.","""N535UW"", ""N8560F"", ""N17984"", ""N11189"", ""N709EV"", ""N727SW"", ""N3GLAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",34,69,"style","Trailing whitespace is superfluous.","""N7726A"", ""N3765"", ""N14959"", ""N796SW"", ""N325US"", ""N11165"", ""N3KBAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",35,69,"style","Trailing whitespace is superfluous.","""N4WVAA"", ""N713EV"", ""N3ASAA"", ""N8541D"", ""N744P"", ""N444WN"", ""N33294"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",36,70,"style","Trailing whitespace is superfluous.","""N476UA"", ""N845VA"", ""N950DL"", ""N937XJ"", ""N741SA"", ""N562UW"", ""N417UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",37,70,"style","Trailing whitespace is superfluous.","""N3ERAA"", ""N14179"", ""N684MQ"", ""N8800G"", ""N37252"", ""N11187"", ""N547JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",38,70,"style","Trailing whitespace is superfluous.","""N510JB"", ""N592JB"", ""N12569"", ""N16149"", ""N585AA"", ""N714CB"", ""N517MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",39,70,"style","Trailing whitespace is superfluous.","""N3HUAA"", ""N366NW"", ""N5EMAA"", ""N723EV"", ""N66051"", ""N961AT"", ""N365NW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",40,70,"style","Trailing whitespace is superfluous.","""N248WN"", ""N269WN"", ""N18557"", ""N390AA"", ""N18120"", ""N344AA"", ""N805UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",41,70,"style","Trailing whitespace is superfluous.","""N76529"", ""N661MQ"", ""N16713"", ""N426UA"", ""N356NW"", ""N3736C"", ""N27733"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",42,70,"style","Trailing whitespace is superfluous.","""N328AA"", ""N466UA"", ""N547AA"", ""N3FKAA"", ""N345NW"", ""N983DL"", ""N410UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",43,70,"style","Trailing whitespace is superfluous.","""N794JB"", ""N181UW"", ""N76516"", ""N75426"", ""N232WN"", ""N5DNAA"", ""N675DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",44,70,"style","Trailing whitespace is superfluous.","""N23721"", ""N624VA"", ""N604LR"", ""N830MQ"", ""N914DL"", ""N361NB"", ""N458UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",45,70,"style","Trailing whitespace is superfluous.","""N379DA"", ""N633DL"", ""N947DL"", ""N401WN"", ""N261AT"", ""N3FHAA"", ""N591JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",46,70,"style","Trailing whitespace is superfluous.","""N77066"", ""N601AW"", ""N702TW"", ""N8554A"", ""N15912"", ""N37466"", ""N331NW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",47,70,"style","Trailing whitespace is superfluous.","""N605LR"", ""N706JB"", ""N518UA"", ""N721MQ"", ""N695DL"", ""N14116"", ""N840VA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",48,70,"style","Trailing whitespace is superfluous.","""N904XJ"", ""N526JB"", ""N285WN"", ""N633VA"", ""N519AA"", ""N364NW"", ""N719EV"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",49,70,"style","Trailing whitespace is superfluous.","""N942MQ"", ""N476WN"", ""N529VA"", ""N3CKAA"", ""N533UA"", ""N372NW"", ""N529JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",50,70,"style","Trailing whitespace is superfluous.","""N504JB"", ""N705TW"", ""N121UW"", ""N16178"", ""N733SA"", ""N515MQ"", ""N195UW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",51,70,"style","Trailing whitespace is superfluous.","""N663MQ"", ""N328NW"", ""N8964E"", ""N625VA"", ""N852VA"", ""N340NW"", ""N544MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",52,70,"style","Trailing whitespace is superfluous.","""N327NB"", ""N6EAMQ"", ""N163US"", ""N11176"", ""N13989"", ""N585JB"", ""N374JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",53,70,"style","Trailing whitespace is superfluous.","""N8736A"", ""N370NW"", ""N717TW"", ""N6704Z"", ""N760JB"", ""N14148"", ""N3CYAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",54,70,"style","Trailing whitespace is superfluous.","""N14543"", ""N5DYAA"", ""N8936A"", ""N599JB"", ""N329AA"", ""N749US"", ""N324AA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",55,70,"style","Trailing whitespace is superfluous.","""N600LR"", ""N951FR"", ""N611MQ"", ""N4UBAA"", ""N690DL"", ""N758SW"", ""N338NB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",56,70,"style","Trailing whitespace is superfluous.","""N534UA"", ""N920DL"", ""N550NW"", ""N455UA"", ""N907MQ"", ""N358NW"", ""N850MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",57,70,"style","Trailing whitespace is superfluous.","""N419UA"", ""N3DHAA"", ""N984DL"", ""N39728"", ""N8790A"", ""N337AT"", ""N979DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",58,70,"style","Trailing whitespace is superfluous.","""N3FVAA"", ""N3CTAA"", ""N324US"", ""N730EV"", ""N41104"", ""N765SW"", ""N76515"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",59,70,"style","Trailing whitespace is superfluous.","""N3GSAA"", ""N8698A"", ""N76528"", ""N173AT"", ""N509MQ"", ""N805MQ"", ""N724MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",60,70,"style","Trailing whitespace is superfluous.","""N938DL"", ""N201FR"", ""N433UA"", ""N712EV"", ""N853VA"", ""N564JB"", ""N438UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",61,70,"style","Trailing whitespace is superfluous.","""N747SA"", ""N561JB"", ""N29906"", ""N387DA"", ""N924XJ"", ""N913DL"", ""N11127"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",62,70,"style","Trailing whitespace is superfluous.","""N326US"", ""N8696C"", ""N722TW"", ""N481AA"", ""N543UW"", ""N675AW"", ""N302NB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",63,70,"style","Trailing whitespace is superfluous.","""N270WN"", ""N482AA"", ""N632SW"", ""N310NW"", ""N77530"", ""N4WNAA"", ""N950UW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",64,70,"style","Trailing whitespace is superfluous.","""N828AS"", ""N296PQ"", ""N19554"", ""N963DL"", ""N893AT"", ""N530VA"", ""N827UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",65,70,"style","Trailing whitespace is superfluous.","""N76502"", ""N68453"", ""N24729"", ""N641VA"", ""N553UA"", ""N510UW"", ""N627JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",66,70,"style","Trailing whitespace is superfluous.","""N821MQ"", ""N506JB"", ""N3BGAA"", ""N18101"", ""N3KEAA"", ""N16918"", ""N844MH"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",67,70,"style","Trailing whitespace is superfluous.","""N402UA"", ""N550UW"", ""N758US"", ""N391DA"", ""N662JB"", ""N908XJ"", ""N801UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",68,70,"style","Trailing whitespace is superfluous.","""N649MQ"", ""N466WN"", ""N8646A"", ""N241WN"", ""N18223"", ""N17245"", ""N14731"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",69,70,"style","Trailing whitespace is superfluous.","""N16147"", ""N990DL"", ""N993DL"", ""N639AA"", ""N29717"", ""N934XJ"", ""N996DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",70,70,"style","Trailing whitespace is superfluous.","""N913XJ"", ""N562JB"", ""N5EHAA"", ""N582AA"", ""N839UA"", ""N4XVAA"", ""N178JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",71,70,"style","Trailing whitespace is superfluous.","""N445WN"", ""N915AT"", ""N214FR"", ""N891AT"", ""N8532G"", ""N239JB"", ""N948DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",72,70,"style","Trailing whitespace is superfluous.","""N915WN"", ""N827AS"", ""N4XCAA"", ""N645MQ"", ""N834AS"", ""N5CAAA"", ""N11547"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",73,70,"style","Trailing whitespace is superfluous.","""N351NB"", ""N927AT"", ""N463WN"", ""N452UA"", ""N29129"", ""N14562"", ""N899AT"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",74,70,"style","Trailing whitespace is superfluous.","""N913DE"", ""N437UA"", ""N354JB"", ""N501AA"", ""N842UA"", ""N827MQ"", ""N408WN"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",75,70,"style","Trailing whitespace is superfluous.","""N803UA"", ""N355NW"", ""N283JB"", ""N507MQ"", ""N508AA"", ""N509JB"", ""N176AT"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",76,70,"style","Trailing whitespace is superfluous.","""N627VA"", ""N715JB"", ""N348NW"", ""N3BAAA"", ""N8683B"", ""N13716"", ""N646JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",77,70,"style","Trailing whitespace is superfluous.","""N936DL"", ""N78438"", ""N3BDAA"", ""N638VA"", ""N507JB"", ""N403UA"", ""N16234"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",78,70,"style","Trailing whitespace is superfluous.","""N932XJ"", ""N784JB"", ""N297WN"", ""N902MQ"", ""N959UW"", ""N228JB"", ""N521VA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",79,70,"style","Trailing whitespace is superfluous.","""N3HGAA"", ""N906AT"", ""N267JB"", ""N507UA"", ""N612JB"", ""N17730"", ""N564UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",80,70,"style","Trailing whitespace is superfluous.","""N399DA"", ""N351JB"", ""N349NW"", ""N555LV"", ""N504MQ"", ""N16561"", ""N25134"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",81,70,"style","Trailing whitespace is superfluous.","""N607LR"", ""N833AY"", ""N615AA"", ""N607JB"", ""N3EPAA"", ""N577UA"", ""N324NB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",82,70,"style","Trailing whitespace is superfluous.","""N8930E"", ""N519JB"", ""N458WN"", ""N754EV"", ""N911DA"", ""N21129"", ""N16709"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",83,70,"style","Trailing whitespace is superfluous.","""N339JB"", ""N997AT"", ""N927LR"", ""N4XXAA"", ""N946DL"", ""N3HEAA"", ""N36444"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",84,70,"style","Trailing whitespace is superfluous.","""N16541"", ""N776WN"", ""N574UA"", ""N75435"", ""N14570"", ""N323JB"", ""N8933B"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",85,70,"style","Trailing whitespace is superfluous.","""N34110"", ""N17126"", ""N771SA"", ""N820AY"", ""N715UW"", ""N710EV"", ""N940DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",86,70,"style","Trailing whitespace is superfluous.","""N8598B"", ""N705JB"", ""N8506C"", ""N807JB"", ""N394DA"", ""N634VA"", ""N348JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",87,70,"style","Trailing whitespace is superfluous.","""N3DSAA"", ""N355JB"", ""N8972E"", ""N293PQ"", ""N3DUAA"", ""N13133"", ""N14950"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",88,70,"style","Trailing whitespace is superfluous.","""N524MQ"", ""N904DL"", ""N27190"", ""N8960A"", ""N484UA"", ""N624JB"", ""N3AJAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",89,70,"style","Trailing whitespace is superfluous.","""N930XJ"", ""N77520"", ""N335AA"", ""N635VA"", ""N8940E"", ""N849MQ"", ""N713SW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",90,70,"style","Trailing whitespace is superfluous.","""N75433"", ""N316JB"", ""N12900"", ""N768SW"", ""N972DL"", ""N3FSAA"", ""N346NB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",91,70,"style","Trailing whitespace is superfluous.","""N908MQ"", ""N3JCAA"", ""N950WN"", ""N959AT"", ""N842MQ"", ""N3GDAA"", ""N8315C"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",92,70,"style","Trailing whitespace is superfluous.","""N624AG"", ""N14118"", ""N446UA"", ""N752EV"", ""N172DN"", ""N457UW"", ""N7735A"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",93,70,"style","Trailing whitespace is superfluous.","""N430UA"", ""N14905"", ""N805JB"", ""N580UA"", ""N545UA"", ""N709TW"", ""N601LR"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",94,70,"style","Trailing whitespace is superfluous.","""N218FR"", ""N404UA"", ""N23139"", ""N497UA"", ""N257WN"", ""N17138"", ""N959DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",95,70,"style","Trailing whitespace is superfluous.","""N652DL"", ""N351NW"", ""N603DL"", ""N569UA"", ""N855UA"", ""N329NW"", ""N735SA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",96,70,"style","Trailing whitespace is superfluous.","""N995DL"", ""N38467"", ""N563JB"", ""N3KPAA"", ""N472UA"", ""N75861"", ""N4WSAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",97,70,"style","Trailing whitespace is superfluous.","""N16963"", ""N583AA"", ""N13979"", ""N12567"", ""N539AA"", ""N927XJ"", ""N571JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",98,70,"style","Trailing whitespace is superfluous.","""N519UA"", ""N353AT"", ""N640JB"", ""N11536"", ""N597UA"", ""N79279"", ""N3EFAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",99,70,"style","Trailing whitespace is superfluous.","""N15574"", ""N636JB"", ""N528VA"", ""N3APAA"", ""N14953"", ""N486AA"", ""N991DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",100,70,"style","Trailing whitespace is superfluous.","""N514MQ"", ""N14203"", ""N928DN"", ""N11109"", ""N8839E"", ""N184US"", ""N76504"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",101,70,"style","Trailing whitespace is superfluous.","""N425UA"", ""N631VA"", ""N15980"", ""N3GJAA"", ""N764SW"", ""N353NB"", ""N982DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",102,70,"style","Trailing whitespace is superfluous.","""N825AS"", ""N508JB"", ""N598JB"", ""N3ANAA"", ""N342NW"", ""N746JB"", ""N9EAMQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",103,70,"style","Trailing whitespace is superfluous.","""N708EV"", ""N296JB"", ""N231WN"", ""N8580A"", ""N328JB"", ""N555UA"", ""N380DA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",104,70,"style","Trailing whitespace is superfluous.","""N423UA"", ""N522UA"", ""N222WN"", ""N336AA"", ""N332AA"", ""N292JB"", ""N588UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",105,70,"style","Trailing whitespace is superfluous.","""N8733G"", ""N767UW"", ""N809UA"", ""N244WN"", ""N933LR"", ""N525UA"", ""N929DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",106,70,"style","Trailing whitespace is superfluous.","""N608JB"", ""N14991"", ""N187JB"", ""N980AT"", ""N527VA"", ""N17169"", ""N978DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",107,70,"style","Trailing whitespace is superfluous.","""N625AA"", ""N316NB"", ""N492UA"", ""N944UW"", ""N3FPAA"", ""N3CHAA"", ""N922DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",108,70,"style","Trailing whitespace is superfluous.","""N656JB"", ""N4YTAA"", ""N41135"", ""N566JB"", ""N138EV"", ""N676CA"", ""N813UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",109,70,"style","Trailing whitespace is superfluous.","""N12122"", ""N14214"", ""N3CXAA"", ""N37471"", ""N375NC"", ""N527MQ"", ""N13964"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",110,70,"style","Trailing whitespace is superfluous.","""N11181"", ""N5FGAA"", ""N3GCAA"", ""N946UW"", ""N808UA"", ""N835AS"", ""N737MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",111,70,"style","Trailing whitespace is superfluous.","""N362NW"", ""N673UA"", ""N838MQ"", ""N687MQ"", ""N3BCAA"", ""N435WN"", ""N5CGAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",112,70,"style","Trailing whitespace is superfluous.","""N73276"", ""N667AW"", ""N3750D"", ""N15910"", ""N374NW"", ""N247JB"", ""N516AS"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",113,70,"style","Trailing whitespace is superfluous.","""N707EV"", ""N777QC"", ""N579JB"", ""N337JB"", ""N464UA"", ""N8604C"", ""N847UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",114,70,"style","Trailing whitespace is superfluous.","""N400WN"", ""N3741S"", ""N15973"", ""N13538"", ""N39416"", ""N3DCAA"", ""N416UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",115,70,"style","Trailing whitespace is superfluous.","""N779JB"", ""N16976"", ""N494WN"", ""N807UA"", ""N929XJ"", ""N12195"", ""N3JDAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",116,70,"style","Trailing whitespace is superfluous.","""N1EAMQ"", ""N937DL"", ""N16151"", ""N576UA"", ""N17244"", ""N639MQ"", ""N13958"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",117,70,"style","Trailing whitespace is superfluous.","""N7738A"", ""N6716C"", ""N754UW"", ""N73299"", ""N185UW"", ""N3BRAA"", ""N8797A"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",118,70,"style","Trailing whitespace is superfluous.","""N8409N"", ""N3764D"", ""N954DL"", ""N13718"", ""N15985"", ""N318JB"", ""N197UW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",119,70,"style","Trailing whitespace is superfluous.","""N34111"", ""N509AY"", ""N13913"", ""N553UW"", ""N917WN"", ""N930DL"", ""N3749D"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",120,70,"style","Trailing whitespace is superfluous.","""N3748Y"", ""N218WN"", ""N73251"", ""N13124"", ""N507MJ"", ""N11150"", ""N519MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",121,70,"style","Trailing whitespace is superfluous.","""N928DL"", ""N819UA"", ""N917XJ"", ""N18556"", ""N8674A"", ""N520JB"", ""N8908D"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",122,70,"style","Trailing whitespace is superfluous.","""N910XJ"", ""N811MQ"", ""N609SW"", ""N12167"", ""N12564"", ""N485UA"", ""N556UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",123,70,"style","Trailing whitespace is superfluous.","""N657JB"", ""N18220"", ""N7741C"", ""N431UA"", ""N963WN"", ""N73275"", ""N368JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",124,70,"style","Trailing whitespace is superfluous.","""N12540"", ""N925DL"", ""N8745B"", ""N302DQ"", ""N935WN"", ""N236JB"", ""N16571"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",125,70,"style","Trailing whitespace is superfluous.","""N762US"", ""N912DE"", ""N77431"", ""N308DE"", ""N343NB"", ""N823UA"", ""N331NB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",126,70,"style","Trailing whitespace is superfluous.","""N558JB"", ""N8317M"", ""N75436"", ""N446WN"", ""N465UA"", ""N167US"", ""N587NW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",127,69,"style","Trailing whitespace is superfluous.","""N658JB"", ""N212WN"", ""N3733Z"", ""N3JUAA"", ""N531MQ"", ""N3735D"", ""N1603"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",128,70,"style","Trailing whitespace is superfluous.","""N700GS"", ""N332NW"", ""N516JB"", ""N5ETAA"", ""N4WMAA"", ""N397DA"", ""N13969"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",129,70,"style","Trailing whitespace is superfluous.","""N919DL"", ""N835VA"", ""N706SW"", ""N339AA"", ""N523UW"", ""N16732"", ""N183DN"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",130,70,"style","Trailing whitespace is superfluous.","""N486UA"", ""N12160"", ""N14117"", ""N76505"", ""N623VA"", ""N11565"", ""N3761R"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",131,70,"style","Trailing whitespace is superfluous.","""N710TW"", ""N960DL"", ""N827JB"", ""N314NB"", ""N221WN"", ""N811UA"", ""N76265"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",132,70,"style","Trailing whitespace is superfluous.","""N523JB"", ""N4YDAA"", ""N345NB"", ""N942WN"", ""N848VA"", ""N632MQ"", ""N606JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",133,70,"style","Trailing whitespace is superfluous.","""N925AT"", ""N482WN"", ""N480UA"", ""N3FNAA"", ""N443UA"", ""N502MJ"", ""N950AT"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",134,70,"style","Trailing whitespace is superfluous.","""N13132"", ""N535JB"", ""N894AT"", ""N15572"", ""N761RR"", ""N919DE"", ""N930AT"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",135,70,"style","Trailing whitespace is superfluous.","""N804UA"", ""N360NB"", ""N919FJ"", ""N529UA"", ""N3754A"", ""N512MQ"", ""N928AT"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",136,70,"style","Trailing whitespace is superfluous.","""N78501"", ""N392DA"", ""N857MQ"", ""N8828D"", ""N14237"", ""N766JB"", ""N461UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",137,70,"style","Trailing whitespace is superfluous.","""N744EV"", ""N3JMAA"", ""N615JB"", ""N835UA"", ""N503MQ"", ""N11548"", ""N830UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",138,70,"style","Trailing whitespace is superfluous.","""N487WN"", ""N480WN"", ""N348NB"", ""N922WN"", ""N812UA"", ""N327NW"", ""N12921"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",139,70,"style","Trailing whitespace is superfluous.","""N39418"", ""N292WN"", ""N810MQ"", ""N626VA"", ""N274JB"", ""N815MQ"", ""N565JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",140,70,"style","Trailing whitespace is superfluous.","""N18114"", ""N294WN"", ""N14923"", ""N467UA"", ""N925XJ"", ""N5PBMQ"", ""N21144"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",141,70,"style","Trailing whitespace is superfluous.","""N965DL"", ""N3GWAA"", ""N565AA"", ""N671DN"", ""N820UA"", ""N3JTAA"", ""N14125"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",142,70,"style","Trailing whitespace is superfluous.","""N344AT"", ""N663DN"", ""N615QX"", ""N558UA"", ""N928XJ"", ""N73256"", ""N411UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",143,70,"style","Trailing whitespace is superfluous.","""N515AA"", ""N961DL"", ""N11164"", ""N329NB"", ""N852MQ"", ""N341NW"", ""N339NW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",144,70,"style","Trailing whitespace is superfluous.","""N739GB"", ""N435UA"", ""N319NB"", ""N344NB"", ""N511UA"", ""N3JAAA"", ""N973DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",145,70,"style","Trailing whitespace is superfluous.","""N294PQ"", ""N830AS"", ""N11544"", ""N951DL"", ""N636MQ"", ""N67171"", ""N5CEAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",146,70,"style","Trailing whitespace is superfluous.","""N989DL"", ""N37413"", ""N522AA"", ""N841AY"", ""N3758Y"", ""N14168"", ""N613JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",147,70,"style","Trailing whitespace is superfluous.","""N12175"", ""N563UA"", ""N36476"", ""N3EXAA"", ""N909EV"", ""N320NB"", ""N36272"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",148,70,"style","Trailing whitespace is superfluous.","""N378NW"", ""N12201"", ""N13975"", ""N396DA"", ""N75429"", ""N3757D"", ""N937AT"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",149,70,"style","Trailing whitespace is superfluous.","""N939DL"", ""N553AA"", ""N317NB"", ""N7734H"", ""N310DE"", ""N76523"", ""N442UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",150,70,"style","Trailing whitespace is superfluous.","""N57852"", ""N37409"", ""N964AT"", ""N13566"", ""N525MQ"", ""N718EV"", ""N279JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",151,70,"style","Trailing whitespace is superfluous.","""N510MQ"", ""N738MQ"", ""N17185"", ""N406UA"", ""N247WN"", ""N3JEAA"", ""N944DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",152,70,"style","Trailing whitespace is superfluous.","""N670DN"", ""N918XJ"", ""N605JB"", ""N38454"", ""N27724"", ""N945DL"", ""N477UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",153,70,"style","Trailing whitespace is superfluous.","""N3AEMQ"", ""N276AT"", ""N753EV"", ""N16703"", ""N19966"", ""N13955"", ""N8458A"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",154,70,"style","Trailing whitespace is superfluous.","""N674DL"", ""N750EV"", ""N29917"", ""N8923A"", ""N546MQ"", ""N761ND"", ""N921AT"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",155,70,"style","Trailing whitespace is superfluous.","""N905WN"", ""N711MQ"", ""N515MJ"", ""N290AT"", ""N391CA"", ""N748EV"", ""N13965"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",156,70,"style","Trailing whitespace is superfluous.","""N27200"", ""N566UA"", ""N4XEAA"", ""N708JB"", ""N249JB"", ""N546AA"", ""N836VA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",157,70,"style","Trailing whitespace is superfluous.","""N634JB"", ""N176PQ"", ""N258JB"", ""N27239"", ""N459WN"", ""N16954"", ""N388DA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",158,70,"style","Trailing whitespace is superfluous.","""N467WN"", ""N653JB"", ""N179UW"", ""N560UW"", ""N318US"", ""N508UA"", ""N906DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",159,70,"style","Trailing whitespace is superfluous.","""N329JB"", ""N476AA"", ""N24706"", ""N21537"", ""N836AS"", ""N13978"", ""N902DE"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",160,70,"style","Trailing whitespace is superfluous.","""N936XJ"", ""N821UA"", ""N512UA"", ""N586JB"", ""N679DA"", ""N330NB"", ""N57111"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",161,70,"style","Trailing whitespace is superfluous.","""N13903"", ""N14916"", ""N14188"", ""N8659B"", ""N918FJ"", ""N723SW"", ""N906WN"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",162,70,"style","Trailing whitespace is superfluous.","""N382DA"", ""N634AA"", ""N491WN"", ""N11155"", ""N635JB"", ""N817UA"", ""N901XJ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",163,70,"style","Trailing whitespace is superfluous.","""N11121"", ""N660DL"", ""N493AA"", ""N969DL"", ""N589UA"", ""N526AA"", ""N662DN"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",164,70,"style","Trailing whitespace is superfluous.","""N474AA"", ""N946AT"", ""N81449"", ""N932WN"", ""N436UA"", ""N990AT"", ""N955AT"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",165,70,"style","Trailing whitespace is superfluous.","""N513AA"", ""N384AA"", ""N565UW"", ""N590JB"", ""N934DL"", ""N8623A"", ""N793JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",166,70,"style","Trailing whitespace is superfluous.","""N365AA"", ""N317US"", ""N794SW"", ""N8970D"", ""N3JVAA"", ""N202FR"", ""N155DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",167,70,"style","Trailing whitespace is superfluous.","""N8444F"", ""N656AW"", ""N8971A"", ""N557UA"", ""N319AA"", ""N816MQ"", ""N722EV"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",168,70,"style","Trailing whitespace is superfluous.","""N932DL"", ""N725MQ"", ""N913WN"", ""N4YJAA"", ""N14180"", ""N563UW"", ""N699DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",169,70,"style","Trailing whitespace is superfluous.","""N37293"", ""N8894A"", ""N283AT"", ""N437AA"", ""N995AT"", ""N554NW"", ""N297PQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",170,70,"style","Trailing whitespace is superfluous.","""N75858"", ""N515UA"", ""N14174"", ""N16999"", ""N8943A"", ""N223WN"", ""N914XJ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",171,70,"style","Trailing whitespace is superfluous.","""N921DL"", ""N920XJ"", ""N490AA"", ""N810UA"", ""N452UW"", ""N34460"", ""N3EDAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",172,70,"style","Trailing whitespace is superfluous.","""N335NB"", ""N403WN"", ""N481WN"", ""N610DL"", ""N3755D"", ""N26549"", ""N832AS"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",173,70,"style","Trailing whitespace is superfluous.","""N966AT"", ""N821JB"", ""N3FWAA"", ""N907DL"", ""N721UW"", ""N566AA"", ""N787SA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",174,70,"style","Trailing whitespace is superfluous.","""N274WN"", ""N301NB"", ""N14974"", ""N692DL"", ""N804MQ"", ""N376NW"", ""N16217"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",175,70,"style","Trailing whitespace is superfluous.","""N11191"", ""N37465"", ""N326NB"", ""N526UA"", ""N388SW"", ""N558AA"", ""N524VA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",176,70,"style","Trailing whitespace is superfluous.","""N949AT"", ""N945AT"", ""N818UA"", ""N828UA"", ""N16911"", ""N197JB"", ""N417WN"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",177,70,"style","Trailing whitespace is superfluous.","""N698MQ"", ""N949UW"", ""N21154"", ""N523VA"", ""N13997"", ""N687DL"", ""N916DE"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",178,70,"style","Trailing whitespace is superfluous.","""N16987"", ""N546UA"", ""N736MQ"", ""N968AT"", ""N633JB"", ""N8968E"", ""N849UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",179,70,"style","Trailing whitespace is superfluous.","""N239WN"", ""N12142"", ""N370AA"", ""N12967"", ""N822UA"", ""N906DE"", ""N8709A"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",180,70,"style","Trailing whitespace is superfluous.","""N530MQ"", ""N717MQ"", ""N506MJ"", ""N32404"", ""N16961"", ""N825UA"", ""N14177"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",181,68,"style","Trailing whitespace is superfluous.","""N3753"", ""N855MQ"", ""N3767"", ""N494AA"", ""N508MQ"", ""N365NB"", ""N723MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",182,70,"style","Trailing whitespace is superfluous.","""N357NB"", ""N503JB"", ""N39423"", ""N374AA"", ""N319US"", ""N750UW"", ""N4YCAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",183,70,"style","Trailing whitespace is superfluous.","""N532MQ"", ""N383DN"", ""N3JSAA"", ""N463UA"", ""N763JB"", ""N420WN"", ""N327AA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",184,70,"style","Trailing whitespace is superfluous.","""N832AY"", ""N418UA"", ""N36207"", ""N14228"", ""N948UW"", ""N439UA"", ""N559JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",185,70,"style","Trailing whitespace is superfluous.","""N356AA"", ""N229JB"", ""N307DQ"", ""N54711"", ""N903XJ"", ""N263AV"", ""N312US"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",186,70,"style","Trailing whitespace is superfluous.","""N900DE"", ""N554JB"", ""N347NW"", ""N826UA"", ""N5EAAA"", ""N432UA"", ""N910FJ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",187,70,"style","Trailing whitespace is superfluous.","""N717EV"", ""N814UA"", ""N964WN"", ""N777NC"", ""N3762Y"", ""N514UA"", ""N26123"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",188,70,"style","Trailing whitespace is superfluous.","""N216JB"", ""N428UA"", ""N361VA"", ""N665JB"", ""N962DL"", ""N701GS"", ""N902XJ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",189,70,"style","Trailing whitespace is superfluous.","""N338NW"", ""N560UA"", ""N960AT"", ""N922XJ"", ""N689DL"", ""N7715E"", ""N16919"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",190,70,"style","Trailing whitespace is superfluous.","""N906MQ"", ""N473WN"", ""N623JB"", ""N353NW"", ""N835MQ"", ""N963DN"", ""N204FR"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",191,70,"style","Trailing whitespace is superfluous.","""N593UA"", ""N809JB"", ""N632VA"", ""N8794B"", ""N854VA"", ""N76503"", ""N37263"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",192,70,"style","Trailing whitespace is superfluous.","""N37281"", ""N323NB"", ""N605QX"", ""N3DGAA"", ""N542AA"", ""N3JRAA"", ""N3GNAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",193,70,"style","Trailing whitespace is superfluous.","""N571AA"", ""N595JB"", ""N232PQ"", ""N184DN"", ""N8673D"", ""N238JB"", ""N34137"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",194,70,"style","Trailing whitespace is superfluous.","""N14143"", ""N496AA"", ""N360NW"", ""N429UA"", ""N650MQ"", ""N569JB"", ""N650AW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",195,70,"style","Trailing whitespace is superfluous.","""N729JB"", ""N298JB"", ""N278AT"", ""N309DE"", ""N906XJ"", ""N3738B"", ""N387AA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",196,70,"style","Trailing whitespace is superfluous.","""N11199"", ""N407UA"", ""N17146"", ""N3GEAA"", ""N838UA"", ""N355NB"", ""N8525B"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",197,70,"style","Trailing whitespace is superfluous.","""N640VA"", ""N16701"", ""N503AA"", ""N975DL"", ""N8475B"", ""N401UA"", ""N11140"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",198,70,"style","Trailing whitespace is superfluous.","""N78285"", ""N13908"", ""N36247"", ""N12552"", ""N967DL"", ""N629VA"", ""N817MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",199,70,"style","Trailing whitespace is superfluous.","""N5DCAA"", ""N445UA"", ""N8884E"", ""N286WN"", ""N978AT"", ""N538UA"", ""N183JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",200,70,"style","Trailing whitespace is superfluous.","""N3CAAA"", ""N3BTAA"", ""N751EV"", ""N631MQ"", ""N393AA"", ""N573UA"", ""N14568"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",201,70,"style","Trailing whitespace is superfluous.","""N635AA"", ""N4XJAA"", ""N192DN"", ""N16951"", ""N518MQ"", ""N3CCAA"", ""N353JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",202,69,"style","Trailing whitespace is superfluous.","""N3766"", ""N13123"", ""N483UA"", ""N373JB"", ""N5CHAA"", ""N206JB"", ""N295PQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",203,70,"style","Trailing whitespace is superfluous.","""N10575"", ""N903DE"", ""N21197"", ""N0EGMQ"", ""N15710"", ""N334NB"", ""N26215"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",204,70,"style","Trailing whitespace is superfluous.","""N612QX"", ""N923FJ"", ""N5DBAA"", ""N273JB"", ""N284AT"", ""N505UA"", ""N3KCAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",205,70,"style","Trailing whitespace is superfluous.","""N505JB"", ""N540US"", ""N3CWAA"", ""N16981"", ""N13949"", ""N8938A"", ""N14153"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",206,70,"style","Trailing whitespace is superfluous.","""N510MJ"", ""N17560"", ""N3760C"", ""N456UA"", ""N968DL"", ""N35407"", ""N626MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",207,70,"style","Trailing whitespace is superfluous.","""N361NW"", ""N770UW"", ""N69059"", ""N366AA"", ""N536JB"", ""N8888D"", ""N304JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",208,70,"style","Trailing whitespace is superfluous.","""N669AW"", ""N716UW"", ""N36915"", ""N851UA"", ""N711HK"", ""N526MQ"", ""N989AT"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",209,70,"style","Trailing whitespace is superfluous.","""N31131"", ""N4YAAA"", ""N3772H"", ""N659JB"", ""N740UW"", ""N484WN"", ""N196DN"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",210,70,"style","Trailing whitespace is superfluous.","""N654UA"", ""N201AA"", ""N3AAAA"", ""N33284"", ""N15986"", ""N916DL"", ""N3BYAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",211,70,"style","Trailing whitespace is superfluous.","""N326AT"", ""N552JB"", ""N712JB"", ""N38443"", ""N527JB"", ""N195DN"", ""N756US"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",212,70,"style","Trailing whitespace is superfluous.","""N8913A"", ""N920DE"", ""N840AY"", ""N13970"", ""N724SW"", ""N25705"", ""N337NW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",213,70,"style","Trailing whitespace is superfluous.","""N911DE"", ""N970DL"", ""N527UA"", ""N818MQ"", ""N15983"", ""N709SW"", ""N578UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",214,70,"style","Trailing whitespace is superfluous.","""N376AA"", ""N13992"", ""N538CA"", ""N833AS"", ""N487UA"", ""N661JB"", ""N5FFAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",215,70,"style","Trailing whitespace is superfluous.","""N599AA"", ""N935AT"", ""N562UA"", ""N206FR"", ""N928MQ"", ""N4YGAA"", ""N3HRAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",216,70,"style","Trailing whitespace is superfluous.","""N587AS"", ""N37287"", ""N845UA"", ""N762SW"", ""N509UA"", ""N372DA"", ""N14171"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",217,70,"style","Trailing whitespace is superfluous.","""N4YUAA"", ""N17229"", ""N6711M"", ""N8672A"", ""N829UA"", ""N895AT"", ""N441WN"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",218,70,"style","Trailing whitespace is superfluous.","""N13914"", ""N738EV"", ""N552UW"", ""N415UA"", ""N482UA"", ""N767NC"", ""N328NB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",219,70,"style","Trailing whitespace is superfluous.","""N570UA"", ""N587JB"", ""N8577D"", ""N759EV"", ""N713TW"", ""N322US"", ""N422UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",220,70,"style","Trailing whitespace is superfluous.","""N8976E"", ""N441UA"", ""N665MQ"", ""N13118"", ""N363NW"", ""N915XJ"", ""N784SW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",221,70,"style","Trailing whitespace is superfluous.","""N976DL"", ""N8501F"", ""N8808H"", ""N910WN"", ""N942AT"", ""N947UW"", ""N48901"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",222,70,"style","Trailing whitespace is superfluous.","""N489UA"", ""N12114"", ""N12957"", ""N923XJ"", ""N507AY"", ""N169UW"", ""N3737C"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",223,70,"style","Trailing whitespace is superfluous.","""N819AY"", ""N38473"", ""N5CPAA"", ""N537JB"", ""N450WN"", ""N18243"", ""N17115"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",224,70,"style","Trailing whitespace is superfluous.","""N14998"", ""N22971"", ""N235WN"", ""N667DN"", ""N713MQ"", ""N716EV"", ""N648JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",225,70,"style","Trailing whitespace is superfluous.","""N24702"", ""N73283"", ""N956AT"", ""N12563"", ""N955WN"", ""N8310C"", ""N14920"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",226,70,"style","Trailing whitespace is superfluous.","""N945UW"", ""N528AA"", ""N741UW"", ""N5EGAA"", ""N12172"", ""N460WN"", ""N521US"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",227,70,"style","Trailing whitespace is superfluous.","""N33203"", ""N943DL"", ""N12109"", ""N649AW"", ""N333NW"", ""N216FR"", ""N179JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",228,70,"style","Trailing whitespace is superfluous.","""N931WN"", ""N3FLAA"", ""N11551"", ""N305AS"", ""N8886A"", ""N37290"", ""N523MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",229,70,"style","Trailing whitespace is superfluous.","""N907DE"", ""N13750"", ""N14558"", ""N758EV"", ""N933AT"", ""N685DA"", ""N265JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",230,70,"style","Trailing whitespace is superfluous.","""N12166"", ""N652JB"", ""N988AT"", ""N734MQ"", ""N994AT"", ""N457UA"", ""N951UW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",231,70,"style","Trailing whitespace is superfluous.","""N76288"", ""N8533D"", ""N740EV"", ""N395DN"", ""N843VA"", ""N133EV"", ""N657MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",232,70,"style","Trailing whitespace is superfluous.","""N371CA"", ""N8492C"", ""N843UA"", ""N594AA"", ""N425AA"", ""N641DL"", ""N741EV"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",233,70,"style","Trailing whitespace is superfluous.","""N537UA"", ""N909XJ"", ""N618JB"", ""N3746H"", ""N804JB"", ""N926XJ"", ""N405WN"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",234,70,"style","Trailing whitespace is superfluous.","""N131EV"", ""N568JB"", ""N983AT"", ""N658MQ"", ""N424AA"", ""N277WN"", ""N359NW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",235,70,"style","Trailing whitespace is superfluous.","""N398CA"", ""N298WN"", ""N3FDAA"", ""N695CA"", ""N3JHAA"", ""N8946A"", ""N506MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",236,70,"style","Trailing whitespace is superfluous.","""N606MQ"", ""N854UA"", ""N346JB"", ""N621JB"", ""N807MQ"", ""N655JB"", ""N307JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",237,70,"style","Trailing whitespace is superfluous.","""N342AA"", ""N322NB"", ""N713UW"", ""N206WN"", ""N37298"", ""N522MQ"", ""N3FYAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",238,70,"style","Trailing whitespace is superfluous.","""N7811F"", ""N587UA"", ""N556JB"", ""N971DL"", ""N3EMAA"", ""N760US"", ""N102UW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",239,70,"style","Trailing whitespace is superfluous.","""N208FR"", ""N716SW"", ""N918DE"", ""N755EV"", ""N517JB"", ""N14960"", ""N73259"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",240,70,"style","Trailing whitespace is superfluous.","""N452WN"", ""N16546"", ""N905XJ"", ""N6712B"", ""N77510"", ""N13995"", ""N3GHAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",241,70,"style","Trailing whitespace is superfluous.","""N3EVAA"", ""N824UA"", ""N30401"", ""N12221"", ""N12922"", ""N751UW"", ""N78448"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",242,70,"style","Trailing whitespace is superfluous.","""N969AT"", ""N349NB"", ""N15555"", ""N14198"", ""N337NB"", ""N472WN"", ""N386DA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",243,70,"style","Trailing whitespace is superfluous.","""N589JB"", ""N939WN"", ""N651AW"", ""N846UA"", ""N637JB"", ""N909DL"", ""N543AA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",244,70,"style","Trailing whitespace is superfluous.","""N281JB"", ""N628MQ"", ""N4XBAA"", ""N135EV"", ""N12116"", ""N317JB"", ""N583JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",245,70,"style","Trailing whitespace is superfluous.","""N3CFAA"", ""N447WN"", ""N846MQ"", ""N460UA"", ""N340NB"", ""N33714"", ""N717JL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",246,70,"style","Trailing whitespace is superfluous.","""N912WN"", ""N972AT"", ""N834UA"", ""N11137"", ""N35271"", ""N364NB"", ""N33262"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",247,70,"style","Trailing whitespace is superfluous.","""N604QX"", ""N422WN"", ""N190JB"", ""N916XJ"", ""N570JB"", ""N8423C"", ""N14952"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",248,70,"style","Trailing whitespace is superfluous.","""N851NW"", ""N333NB"", ""N352NB"", ""N561UA"", ""N104UW"", ""N542UW"", ""N544UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",249,70,"style","Trailing whitespace is superfluous.","""N910DL"", ""N500MQ"", ""N87507"", ""N815UA"", ""N308AT"", ""N717SA"", ""N907XJ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",250,70,"style","Trailing whitespace is superfluous.","""N12163"", ""N162UW"", ""N174DN"", ""N14907"", ""N371NW"", ""N33286"", ""N720MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",251,70,"style","Trailing whitespace is superfluous.","""N227WN"", ""N13968"", ""N323AA"", ""N668UA"", ""N923AT"", ""N731SA"", ""N727TW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",252,70,"style","Trailing whitespace is superfluous.","""N14162"", ""N565UA"", ""N483WN"", ""N786NC"", ""N3771K"", ""N200WN"", ""N800AY"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",253,70,"style","Trailing whitespace is superfluous.","""N11107"", ""N922EV"", ""N828AW"", ""N3GKAA"", ""N597JB"", ""N24211"", ""N791SW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",254,70,"style","Trailing whitespace is superfluous.","""N174US"", ""N623DL"", ""N757LV"", ""N935DL"", ""N16183"", ""N79521"", ""N812MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",255,70,"style","Trailing whitespace is superfluous.","""N852UA"", ""N737US"", ""N673MQ"", ""N796JB"", ""N769US"", ""N921XJ"", ""N943AT"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",256,70,"style","Trailing whitespace is superfluous.","""N8588D"", ""N823AY"", ""N795SW"", ""N38727"", ""N77430"", ""N960WN"", ""N844MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",257,70,"style","Trailing whitespace is superfluous.","""N751SW"", ""N522VA"", ""N5FJAA"", ""N724EV"", ""N943WN"", ""N750SA"", ""N323US"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",258,70,"style","Trailing whitespace is superfluous.","""N14704"", ""N13988"", ""N464WN"", ""N931DL"", ""N514AA"", ""N12157"", ""N309US"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",259,69,"style","Trailing whitespace is superfluous.","""N266JB"", ""N203FR"", ""N806JB"", ""N931XJ"", ""N501MQ"", ""N6702"", ""N37420"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",260,70,"style","Trailing whitespace is superfluous.","""N10156"", ""N505MQ"", ""N87513"", ""N8495B"", ""N233LV"", ""N720EV"", ""N812AY"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",261,70,"style","Trailing whitespace is superfluous.","""N933XJ"", ""N496WN"", ""N580JB"", ""N927DA"", ""N3730B"", ""N658AW"", ""N474UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",262,70,"style","Trailing whitespace is superfluous.","""N3BEAA"", ""N192JB"", ""N850UA"", ""N506AA"", ""N802UA"", ""N556UW"", ""N373AA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",263,70,"style","Trailing whitespace is superfluous.","""N584JB"", ""N806UA"", ""N600QX"", ""N426WN"", ""N23708"", ""N371DA"", ""N824MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",264,70,"style","Trailing whitespace is superfluous.","""N917DE"", ""N17128"", ""N415WN"", ""N22909"", ""N381DN"", ""N411WN"", ""N829AS"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",265,70,"style","Trailing whitespace is superfluous.","""N77296"", ""N607AT"", ""N384HA"", ""N840UA"", ""N684WN"", ""N8965E"", ""N541UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",266,70,"style","Trailing whitespace is superfluous.","""N184JB"", ""N205FR"", ""N672AW"", ""N839VA"", ""N389DA"", ""N956WN"", ""N17108"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",267,70,"style","Trailing whitespace is superfluous.","""N641JB"", ""N3GMAA"", ""N176UW"", ""N303DQ"", ""N5FNAA"", ""N826AS"", ""N451UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",268,70,"style","Trailing whitespace is superfluous.","""N642VA"", ""N380AA"", ""N373NW"", ""N649JB"", ""N543MQ"", ""N571UA"", ""N487AA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",269,70,"style","Trailing whitespace is superfluous.","""N676AW"", ""N630MQ"", ""N354AT"", ""N8325D"", ""N345AA"", ""N344NW"", ""N602LR"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",1,63,"style","Trailing whitespace is superfluous.","structure(list(oid = c(16L, 17L, 18L, 19L, 20L, 21L, 22L, 23L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",2,61,"style","Trailing whitespace is superfluous.","24L, 25L, 26L, 27L, 28L, 29L, 30L, 71L, 75L, 81L, 83L, 114L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",3,63,"style","Trailing whitespace is superfluous.","142L, 194L, 3361L, 3402L, 5017L, 32L, 5069L, 600L, 601L, 602L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",4,66,"style","Trailing whitespace is superfluous.","603L, 604L, 628L, 700L, 701L, 705L, 718L, 790L, 829L, 869L, 650L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",5,62,"style","Trailing whitespace is superfluous.","774L, 1033L, 1042L, 1043L, 1082L, 1083L, 1114L, 1184L, 1186L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",6,63,"style","Trailing whitespace is superfluous.","1266L, 1560L, 1562L, 1700L, 1790L, 2202L, 2203L, 2204L, 2205L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",7,63,"style","Trailing whitespace is superfluous.","4191L, 2206L, 4096L, 4089L, 2950L, 3220L, 3614L, 3642L, 3615L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",8,63,"style","Trailing whitespace is superfluous.","3734L, 3769L, 3802L, 4072L, 2970L, 5038L, 3904L, 3906L, 3908L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",9,63,"style","Trailing whitespace is superfluous.","3910L, 3912L, 3926L, 2249L, 2287L, 2275L, 2276L, 2277L, 2278L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",10,62,"style","Trailing whitespace is superfluous.","2279L, 3838L, 2280L, 2281L, 2283L, 2776L, 3500L, 3115L, 325L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",11,62,"style","Trailing whitespace is superfluous.","3310L, 269L, 3831L, 5077L, 5078L, 5079L, 5080L, 1000L, 1001L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",12,63,"style","Trailing whitespace is superfluous.","1002L, 1003L, 1016L, 1005L, 1006L, 1007L, 1008L, 1009L, 1028L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",13,67,"style","Trailing whitespace is superfluous.","1010L, 1011L, 1012L, 1013L, 199L, 143L, 271L, 1017L, 1018L, 1019L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",14,66,"style","Trailing whitespace is superfluous.","1020L, 1027L, 629L, 1021L, 1022L, 719L, 791L, 1040L, 1041L, 651L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",15,62,"style","Trailing whitespace is superfluous.","775L, 1034L, 1014L, 1015L, 1182L, 1183L, 1115L, 1185L, 1187L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",16,63,"style","Trailing whitespace is superfluous.","1270L, 1561L, 1563L, 1231L, 2201L, 2207L, 2208L, 2209L, 2210L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",17,63,"style","Trailing whitespace is superfluous.","4192L, 2211L, 4097L, 4090L, 2951L, 3221L, 3643L, 3644L, 3645L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",18,63,"style","Trailing whitespace is superfluous.","3735L, 3770L, 3807L, 4073L, 2949L, 5039L, 3905L, 3907L, 3909L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",19,68,"style","Trailing whitespace is superfluous.","3911L, 3913L, 3927L, 1263L, 12000L, 12001L, 12002L, 12003L, 12004L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",20,64,"style","Trailing whitespace is superfluous.","12005L, 12006L, 12007L, 12008L, 12009L, 12010L, 12011L, 12012L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",21,64,"style","Trailing whitespace is superfluous.","12013L, 12014L, 12015L, 12016L, 12017L, 12018L, 12019L, 12020L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",22,63,"style","Trailing whitespace is superfluous.","12021L, 12022L, 12023L, 12024L, 12025L, 1248L, 12026L, 12027L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",23,62,"style","Trailing whitespace is superfluous.","2842L, 2843L, 12028L, 12029L, 12030L, 12031L, 12032L, 12033L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",24,64,"style","Trailing whitespace is superfluous.","12034L, 12035L, 12036L, 12037L, 12038L, 12039L, 12040L, 12041L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",25,63,"style","Trailing whitespace is superfluous.","12042L, 12043L, 12044L, 4066L, 12045L, 12046L, 12047L, 12048L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",26,63,"style","Trailing whitespace is superfluous.","12049L, 12050L, 12051L, 6101L, 12052L, 12053L, 12054L, 12055L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",27,64,"style","Trailing whitespace is superfluous.","12056L, 12057L, 12058L, 12059L, 12060L, 12061L, 12062L, 12063L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",28,64,"style","Trailing whitespace is superfluous.","12064L, 12065L, 12066L, 12067L, 12068L, 12069L, 12070L, 12071L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",29,64,"style","Trailing whitespace is superfluous.","12072L, 12073L, 12074L, 12075L, 12076L, 12077L, 12078L, 12079L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",30,64,"style","Trailing whitespace is superfluous.","12080L, 12081L, 12082L, 12083L, 12084L, 12085L, 12086L, 12088L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",31,64,"style","Trailing whitespace is superfluous.","12092L, 12096L, 12099L, 12102L, 12106L, 12110L, 12114L, 12118L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",32,64,"style","Trailing whitespace is superfluous.","12122L, 12126L, 12130L, 12134L, 12138L, 12142L, 12145L, 12148L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",33,64,"style","Trailing whitespace is superfluous.","12151L, 12155L, 12159L, 12162L, 12166L, 12171L, 12174L, 12177L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",34,64,"style","Trailing whitespace is superfluous.","12180L, 12183L, 12186L, 12189L, 12193L, 12197L, 12201L, 12204L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",35,64,"style","Trailing whitespace is superfluous.","12208L, 12211L, 12215L, 12218L, 12221L, 12225L, 12228L, 12231L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",36,64,"style","Trailing whitespace is superfluous.","12235L, 12238L, 12241L, 12245L, 12248L, 12251L, 12255L, 12259L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",37,64,"style","Trailing whitespace is superfluous.","12262L, 12265L, 12268L, 12271L, 12274L, 12278L, 12282L, 12285L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",38,64,"style","Trailing whitespace is superfluous.","12289L, 12293L, 12296L, 12299L, 12303L, 12307L, 12311L, 12315L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",39,64,"style","Trailing whitespace is superfluous.","12319L, 12323L, 13124L, 13123L, 13127L, 13126L, 13129L, 13128L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",40,64,"style","Trailing whitespace is superfluous.","13131L, 13134L, 13133L, 13136L, 13135L, 13139L, 13143L, 13146L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",41,64,"style","Trailing whitespace is superfluous.","13150L, 13154L, 13158L, 13162L, 13166L, 13170L, 13174L, 13178L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",42,64,"style","Trailing whitespace is superfluous.","13182L, 13186L, 13190L, 13194L, 13198L, 13202L, 13206L, 13210L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",43,64,"style","Trailing whitespace is superfluous.","13213L, 13217L, 13221L, 13225L, 13228L, 13232L, 13235L, 13239L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",44,64,"style","Trailing whitespace is superfluous.","13242L, 13246L, 13248L, 13251L, 13253L, 13256L, 13258L, 13261L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",45,64,"style","Trailing whitespace is superfluous.","13263L, 13266L, 13270L, 13274L, 13277L, 13281L, 13285L, 13289L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",46,64,"style","Trailing whitespace is superfluous.","13293L, 13297L, 13300L, 13304L, 13307L, 13311L, 13315L, 13319L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",47,64,"style","Trailing whitespace is superfluous.","13323L, 13327L, 13331L, 13335L, 13339L, 13342L, 13345L, 13348L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",48,64,"style","Trailing whitespace is superfluous.","13351L, 13355L, 13358L, 13361L, 13365L, 13368L, 13371L, 13375L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",49,64,"style","Trailing whitespace is superfluous.","13379L, 16483L, 16482L, 16485L, 16489L, 16488L, 16491L, 16495L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",51,64,"style","Trailing whitespace is superfluous.","), typname = c(""bool"", ""bytea"", ""char"", ""name"", ""int8"", ""int2"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",52,62,"style","Trailing whitespace is superfluous.","""int2vector"", ""int4"", ""regproc"", ""text"", ""oid"", ""tid"", ""xid"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",53,70,"style","Trailing whitespace is superfluous.","""cid"", ""oidvector"", ""pg_type"", ""pg_attribute"", ""pg_proc"", ""pg_class"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",54,66,"style","Trailing whitespace is superfluous.","""json"", ""xml"", ""pg_node_tree"", ""pg_ndistinct"", ""pg_dependencies"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",55,66,"style","Trailing whitespace is superfluous.","""pg_mcv_list"", ""pg_ddl_command"", ""xid8"", ""point"", ""lseg"", ""path"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",56,67,"style","Trailing whitespace is superfluous.","""box"", ""polygon"", ""line"", ""float4"", ""float8"", ""unknown"", ""circle"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",57,69,"style","Trailing whitespace is superfluous.","""money"", ""macaddr"", ""inet"", ""cidr"", ""macaddr8"", ""aclitem"", ""bpchar"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",58,67,"style","Trailing whitespace is superfluous.","""varchar"", ""date"", ""time"", ""timestamp"", ""timestamptz"", ""interval"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",59,67,"style","Trailing whitespace is superfluous.","""timetz"", ""bit"", ""varbit"", ""numeric"", ""refcursor"", ""regprocedure"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",60,65,"style","Trailing whitespace is superfluous.","""regoper"", ""regoperator"", ""regclass"", ""regcollation"", ""regtype"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",61,70,"style","Trailing whitespace is superfluous.","""regrole"", ""regnamespace"", ""uuid"", ""pg_lsn"", ""tsvector"", ""gtsvector"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",62,62,"style","Trailing whitespace is superfluous.","""tsquery"", ""regconfig"", ""regdictionary"", ""jsonb"", ""jsonpath"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",63,68,"style","Trailing whitespace is superfluous.","""txid_snapshot"", ""pg_snapshot"", ""int4range"", ""numrange"", ""tsrange"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",64,71,"style","Trailing whitespace is superfluous.","""tstzrange"", ""daterange"", ""int8range"", ""record"", ""_record"", ""cstring"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",65,75,"style","Trailing whitespace is superfluous.","""any"", ""anyarray"", ""void"", ""trigger"", ""event_trigger"", ""language_handler"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",66,67,"style","Trailing whitespace is superfluous.","""internal"", ""anyelement"", ""anynonarray"", ""anyenum"", ""fdw_handler"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",67,67,"style","Trailing whitespace is superfluous.","""index_am_handler"", ""tsm_handler"", ""table_am_handler"", ""anyrange"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",68,64,"style","Trailing whitespace is superfluous.","""anycompatible"", ""anycompatiblearray"", ""anycompatiblenonarray"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",69,68,"style","Trailing whitespace is superfluous.","""anycompatiblerange"", ""_bool"", ""_bytea"", ""_char"", ""_name"", ""_int8"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",70,62,"style","Trailing whitespace is superfluous.","""_int2"", ""_int2vector"", ""_int4"", ""_regproc"", ""_text"", ""_oid"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",71,64,"style","Trailing whitespace is superfluous.","""_tid"", ""_xid"", ""_cid"", ""_oidvector"", ""_json"", ""_xml"", ""_xid8"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",72,68,"style","Trailing whitespace is superfluous.","""_point"", ""_lseg"", ""_path"", ""_box"", ""_polygon"", ""_line"", ""_float4"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",73,62,"style","Trailing whitespace is superfluous.","""_float8"", ""_circle"", ""_money"", ""_macaddr"", ""_inet"", ""_cidr"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",74,66,"style","Trailing whitespace is superfluous.","""_macaddr8"", ""_aclitem"", ""_bpchar"", ""_varchar"", ""_date"", ""_time"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",75,62,"style","Trailing whitespace is superfluous.","""_timestamp"", ""_timestamptz"", ""_interval"", ""_timetz"", ""_bit"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",76,66,"style","Trailing whitespace is superfluous.","""_varbit"", ""_numeric"", ""_refcursor"", ""_regprocedure"", ""_regoper"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",77,70,"style","Trailing whitespace is superfluous.","""_regoperator"", ""_regclass"", ""_regcollation"", ""_regtype"", ""_regrole"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",78,64,"style","Trailing whitespace is superfluous.","""_regnamespace"", ""_uuid"", ""_pg_lsn"", ""_tsvector"", ""_gtsvector"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",79,67,"style","Trailing whitespace is superfluous.","""_tsquery"", ""_regconfig"", ""_regdictionary"", ""_jsonb"", ""_jsonpath"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",80,61,"style","Trailing whitespace is superfluous.","""_txid_snapshot"", ""_pg_snapshot"", ""_int4range"", ""_numrange"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",81,66,"style","Trailing whitespace is superfluous.","""_tsrange"", ""_tstzrange"", ""_daterange"", ""_int8range"", ""_cstring"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",82,73,"style","Trailing whitespace is superfluous.","""pg_attrdef"", ""pg_constraint"", ""pg_inherits"", ""pg_index"", ""pg_operator"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",83,62,"style","Trailing whitespace is superfluous.","""pg_opfamily"", ""pg_opclass"", ""pg_am"", ""pg_amop"", ""pg_amproc"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",84,76,"style","Trailing whitespace is superfluous.","""pg_language"", ""pg_largeobject_metadata"", ""pg_largeobject"", ""pg_aggregate"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",85,61,"style","Trailing whitespace is superfluous.","""pg_statistic_ext"", ""pg_statistic_ext_data"", ""pg_statistic"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",86,66,"style","Trailing whitespace is superfluous.","""pg_rewrite"", ""pg_trigger"", ""pg_event_trigger"", ""pg_description"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",87,68,"style","Trailing whitespace is superfluous.","""pg_cast"", ""pg_enum"", ""pg_namespace"", ""pg_conversion"", ""pg_depend"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",88,67,"style","Trailing whitespace is superfluous.","""pg_database"", ""pg_db_role_setting"", ""pg_tablespace"", ""pg_authid"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",89,70,"style","Trailing whitespace is superfluous.","""pg_auth_members"", ""pg_shdepend"", ""pg_shdescription"", ""pg_ts_config"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",90,68,"style","Trailing whitespace is superfluous.","""pg_ts_config_map"", ""pg_ts_dict"", ""pg_ts_parser"", ""pg_ts_template"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",91,64,"style","Trailing whitespace is superfluous.","""pg_extension"", ""pg_foreign_data_wrapper"", ""pg_foreign_server"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",92,77,"style","Trailing whitespace is superfluous.","""pg_user_mapping"", ""pg_foreign_table"", ""pg_policy"", ""pg_replication_origin"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",93,67,"style","Trailing whitespace is superfluous.","""pg_default_acl"", ""pg_init_privs"", ""pg_seclabel"", ""pg_shseclabel"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",94,68,"style","Trailing whitespace is superfluous.","""pg_collation"", ""pg_partitioned_table"", ""pg_range"", ""pg_transform"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",95,74,"style","Trailing whitespace is superfluous.","""pg_sequence"", ""pg_publication"", ""pg_publication_rel"", ""pg_subscription"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",96,74,"style","Trailing whitespace is superfluous.","""pg_subscription_rel"", ""pg_toast_2600"", ""pg_toast_2604"", ""pg_toast_3456"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",97,67,"style","Trailing whitespace is superfluous.","""pg_toast_2606"", ""pg_toast_826"", ""pg_toast_2609"", ""pg_toast_3466"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",98,68,"style","Trailing whitespace is superfluous.","""pg_toast_3079"", ""pg_toast_2328"", ""pg_toast_1417"", ""pg_toast_3118"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",99,68,"style","Trailing whitespace is superfluous.","""pg_toast_3394"", ""pg_toast_2612"", ""pg_toast_2615"", ""pg_toast_3350"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",100,68,"style","Trailing whitespace is superfluous.","""pg_toast_3256"", ""pg_toast_1255"", ""pg_toast_2618"", ""pg_toast_3596"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",101,68,"style","Trailing whitespace is superfluous.","""pg_toast_2619"", ""pg_toast_3381"", ""pg_toast_3429"", ""pg_toast_2620"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",102,68,"style","Trailing whitespace is superfluous.","""pg_toast_3600"", ""pg_toast_1247"", ""pg_toast_1418"", ""pg_toast_1260"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",103,68,"style","Trailing whitespace is superfluous.","""pg_toast_1262"", ""pg_toast_2964"", ""pg_toast_6000"", ""pg_toast_2396"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",104,63,"style","Trailing whitespace is superfluous.","""pg_toast_3592"", ""pg_toast_6100"", ""pg_toast_1213"", ""pg_roles"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",105,63,"style","Trailing whitespace is superfluous.","""pg_shadow"", ""pg_group"", ""pg_user"", ""pg_policies"", ""pg_rules"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",106,70,"style","Trailing whitespace is superfluous.","""pg_views"", ""pg_tables"", ""pg_matviews"", ""pg_indexes"", ""pg_sequences"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",107,65,"style","Trailing whitespace is superfluous.","""pg_stats"", ""pg_stats_ext"", ""pg_publication_tables"", ""pg_locks"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",108,76,"style","Trailing whitespace is superfluous.","""pg_cursors"", ""pg_available_extensions"", ""pg_available_extension_versions"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",109,63,"style","Trailing whitespace is superfluous.","""pg_prepared_xacts"", ""pg_prepared_statements"", ""pg_seclabels"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",110,79,"style","Trailing whitespace is superfluous.","""pg_settings"", ""pg_file_settings"", ""pg_hba_file_rules"", ""pg_timezone_abbrevs"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",111,80,"style","Trailing whitespace is superfluous.","""pg_timezone_names"", ""pg_config"", ""pg_shmem_allocations"", ""pg_stat_all_tables"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",112,76,"style","Trailing whitespace is superfluous.","""pg_stat_xact_all_tables"", ""pg_stat_sys_tables"", ""pg_stat_xact_sys_tables"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",113,75,"style","Trailing whitespace is superfluous.","""pg_stat_user_tables"", ""pg_stat_xact_user_tables"", ""pg_statio_all_tables"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",114,72,"style","Trailing whitespace is superfluous.","""pg_statio_sys_tables"", ""pg_statio_user_tables"", ""pg_stat_all_indexes"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",115,72,"style","Trailing whitespace is superfluous.","""pg_stat_sys_indexes"", ""pg_stat_user_indexes"", ""pg_statio_all_indexes"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",116,78,"style","Trailing whitespace is superfluous.","""pg_statio_sys_indexes"", ""pg_statio_user_indexes"", ""pg_statio_all_sequences"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",117,75,"style","Trailing whitespace is superfluous.","""pg_statio_sys_sequences"", ""pg_statio_user_sequences"", ""pg_stat_activity"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",118,63,"style","Trailing whitespace is superfluous.","""pg_stat_replication"", ""pg_stat_slru"", ""pg_stat_wal_receiver"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",119,81,"style","Trailing whitespace is superfluous.","""pg_stat_subscription"", ""pg_stat_ssl"", ""pg_stat_gssapi"", ""pg_replication_slots"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",120,76,"style","Trailing whitespace is superfluous.","""pg_stat_database"", ""pg_stat_database_conflicts"", ""pg_stat_user_functions"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",121,71,"style","Trailing whitespace is superfluous.","""pg_stat_xact_user_functions"", ""pg_stat_archiver"", ""pg_stat_bgwriter"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",122,83,"style","Trailing whitespace is superfluous.","""pg_stat_progress_analyze"", ""pg_stat_progress_vacuum"", ""pg_stat_progress_cluster"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",123,64,"style","Trailing whitespace is superfluous.","""pg_stat_progress_create_index"", ""pg_stat_progress_basebackup"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",124,71,"style","Trailing whitespace is superfluous.","""pg_user_mappings"", ""pg_replication_origin_status"", ""cardinal_number"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",125,75,"style","Trailing whitespace is superfluous.","""_cardinal_number"", ""character_data"", ""_character_data"", ""sql_identifier"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",126,68,"style","Trailing whitespace is superfluous.","""_sql_identifier"", ""information_schema_catalog_name"", ""time_stamp"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",127,62,"style","Trailing whitespace is superfluous.","""_time_stamp"", ""yes_or_no"", ""_yes_or_no"", ""applicable_roles"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",128,69,"style","Trailing whitespace is superfluous.","""administrable_role_authorizations"", ""attributes"", ""character_sets"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",129,69,"style","Trailing whitespace is superfluous.","""check_constraint_routine_usage"", ""check_constraints"", ""collations"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",130,64,"style","Trailing whitespace is superfluous.","""collation_character_set_applicability"", ""column_column_usage"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",131,64,"style","Trailing whitespace is superfluous.","""column_domain_usage"", ""column_privileges"", ""column_udt_usage"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",132,64,"style","Trailing whitespace is superfluous.","""columns"", ""constraint_column_usage"", ""constraint_table_usage"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",133,70,"style","Trailing whitespace is superfluous.","""domain_constraints"", ""domain_udt_usage"", ""domains"", ""enabled_roles"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",134,61,"style","Trailing whitespace is superfluous.","""key_column_usage"", ""parameters"", ""referential_constraints"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",135,67,"style","Trailing whitespace is superfluous.","""role_column_grants"", ""routine_privileges"", ""role_routine_grants"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",136,71,"style","Trailing whitespace is superfluous.","""routines"", ""schemata"", ""sequences"", ""sql_features"", ""pg_toast_13245"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",137,76,"style","Trailing whitespace is superfluous.","""sql_implementation_info"", ""pg_toast_13250"", ""sql_parts"", ""pg_toast_13255"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",138,73,"style","Trailing whitespace is superfluous.","""sql_sizing"", ""pg_toast_13260"", ""table_constraints"", ""table_privileges"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",139,73,"style","Trailing whitespace is superfluous.","""role_table_grants"", ""tables"", ""transforms"", ""triggered_update_columns"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",140,69,"style","Trailing whitespace is superfluous.","""triggers"", ""udt_privileges"", ""role_udt_grants"", ""usage_privileges"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",141,64,"style","Trailing whitespace is superfluous.","""role_usage_grants"", ""user_defined_types"", ""view_column_usage"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",142,75,"style","Trailing whitespace is superfluous.","""view_routine_usage"", ""view_table_usage"", ""views"", ""data_type_privileges"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",143,64,"style","Trailing whitespace is superfluous.","""element_types"", ""_pg_foreign_table_columns"", ""column_options"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",144,61,"style","Trailing whitespace is superfluous.","""_pg_foreign_data_wrappers"", ""foreign_data_wrapper_options"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",145,74,"style","Trailing whitespace is superfluous.","""foreign_data_wrappers"", ""_pg_foreign_servers"", ""foreign_server_options"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",146,66,"style","Trailing whitespace is superfluous.","""foreign_servers"", ""_pg_foreign_tables"", ""foreign_table_options"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",147,63,"style","Trailing whitespace is superfluous.","""foreign_tables"", ""_pg_user_mappings"", ""user_mapping_options"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",148,72,"style","Trailing whitespace is superfluous.","""user_mappings"", ""airlines"", ""_airlines"", ""pg_toast_16481"", ""airports"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",149,72,"style","Trailing whitespace is superfluous.","""_airports"", ""pg_toast_16487"", ""flights"", ""_flights"", ""pg_toast_16493"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",150,62,"style","Trailing whitespace is superfluous.","""planes"", ""_planes"", ""pg_toast_16499"", ""weather"", ""_weather"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-90cd6a.R",1,72,"style","Trailing whitespace is superfluous.","structure(list(year = integer(0), month = integer(0), day = integer(0), ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-90cd6a.R",2,80,"style","Trailing whitespace is superfluous."," dep_time = integer(0), sched_dep_time = integer(0), dep_delay = numeric(0), ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-90cd6a.R",3,80,"style","Trailing whitespace is superfluous."," arr_time = integer(0), sched_arr_time = integer(0), arr_delay = numeric(0), ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-90cd6a.R",4,73,"style","Trailing whitespace is superfluous."," carrier = character(0), flight = integer(0), tailnum = character(0), ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-90cd6a.R",5,71,"style","Trailing whitespace is superfluous."," origin = character(0), dest = character(0), air_time = numeric(0), ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-90cd6a.R",6,67,"style","Trailing whitespace is superfluous."," distance = numeric(0), hour = numeric(0), minute = numeric(0), ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",1,67,"style","Trailing whitespace is superfluous.","structure(list(tailnum = c(""N912XJ"", ""N645JB"", ""N904WN"", ""N3BWAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",2,70,"style","Trailing whitespace is superfluous.","""N3CJAA"", ""N14972"", ""N667UA"", ""N521JB"", ""N998AT"", ""N16559"", ""N14186"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",3,70,"style","Trailing whitespace is superfluous.","""N16170"", ""N789JB"", ""N593JB"", ""N409WN"", ""N11535"", ""N505AA"", ""N8928A"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",4,70,"style","Trailing whitespace is superfluous.","""N3DPAA"", ""N34222"", ""N639VA"", ""N480AA"", ""N77518"", ""N511MQ"", ""N697DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",5,70,"style","Trailing whitespace is superfluous.","""N87527"", ""N652SW"", ""N651JB"", ""N640AA"", ""N304DQ"", ""N988DL"", ""N643JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",6,70,"style","Trailing whitespace is superfluous.","""N231JB"", ""N14542"", ""N531JB"", ""N14573"", ""N76519"", ""N13161"", ""N567UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",7,70,"style","Trailing whitespace is superfluous.","""N201LV"", ""N27962"", ""N198JB"", ""N520MQ"", ""N689MQ"", ""N369NW"", ""N8432A"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",8,70,"style","Trailing whitespace is superfluous.","""N14902"", ""N8EGMQ"", ""N3FJAA"", ""N336NB"", ""N905DL"", ""N12136"", ""N628VA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",9,70,"style","Trailing whitespace is superfluous.","""N550WN"", ""N844VA"", ""N353SW"", ""N738US"", ""N371NB"", ""N431WN"", ""N11206"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",10,69,"style","Trailing whitespace is superfluous.","""N412WN"", ""N832UA"", ""N14993"", ""N495UA"", ""N3759"", ""N314US"", ""N14231"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",11,70,"style","Trailing whitespace is superfluous.","""N176DN"", ""N363NB"", ""N3AHAA"", ""N5DMAA"", ""N764US"", ""N802MQ"", ""N33209"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",12,70,"style","Trailing whitespace is superfluous.","""N38451"", ""N14219"", ""N320US"", ""N8903A"", ""N682MQ"", ""N672DL"", ""N3FCAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",13,70,"style","Trailing whitespace is superfluous.","""N173US"", ""N691CA"", ""N33103"", ""N210WN"", ""N8877A"", ""N638JB"", ""N558UW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",14,70,"style","Trailing whitespace is superfluous.","""N820AS"", ""N479UA"", ""N180US"", ""N334JB"", ""N33292"", ""N513UA"", ""N775JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",15,70,"style","Trailing whitespace is superfluous.","""N528MQ"", ""N955DL"", ""N405UA"", ""N377NW"", ""N611QX"", ""N7732A"", ""N320AA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",16,70,"style","Trailing whitespace is superfluous.","""N11192"", ""N3769L"", ""N622VA"", ""N338AA"", ""N504UA"", ""N7739A"", ""N841UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",17,70,"style","Trailing whitespace is superfluous.","""N987AT"", ""N11113"", ""N14106"", ""N903WN"", ""N3CGAA"", ""N621VA"", ""N477AA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",18,70,"style","Trailing whitespace is superfluous.","""N837UA"", ""N339NB"", ""N374DA"", ""N8869B"", ""N284JB"", ""N924DL"", ""N8775A"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",19,70,"style","Trailing whitespace is superfluous.","""N836UA"", ""N324JB"", ""N833UA"", ""N13553"", ""N999DN"", ""N3763D"", ""N12996"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",20,70,"style","Trailing whitespace is superfluous.","""N513MQ"", ""N722US"", ""N14904"", ""N591AA"", ""N539MQ"", ""N14977"", ""N12924"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",21,70,"style","Trailing whitespace is superfluous.","""N358NB"", ""N877AS"", ""N554UA"", ""N203JB"", ""N76514"", ""N12135"", ""N387SW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",22,70,"style","Trailing whitespace is superfluous.","""N27722"", ""N444UA"", ""N469UA"", ""N575UA"", ""N3AUAA"", ""N306JB"", ""N24128"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",23,70,"style","Trailing whitespace is superfluous.","""N617MQ"", ""N595UA"", ""N642DL"", ""N588JB"", ""N3HSAA"", ""N915DE"", ""N3HTAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",24,70,"style","Trailing whitespace is superfluous.","""N592UA"", ""N37253"", ""N629JB"", ""N585UA"", ""N265WN"", ""N4XRAA"", ""N941DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",25,70,"style","Trailing whitespace is superfluous.","""N838VA"", ""N267AT"", ""N3JXAA"", ""N523UA"", ""N912DL"", ""N3GRAA"", ""N707TW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",26,70,"style","Trailing whitespace is superfluous.","""N934WN"", ""N370SW"", ""N17133"", ""N594JB"", ""N11119"", ""N8942A"", ""N524JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",27,70,"style","Trailing whitespace is superfluous.","""N608QX"", ""N534JB"", ""N21130"", ""N534MQ"", ""N659DL"", ""N18102"", ""N14105"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",28,70,"style","Trailing whitespace is superfluous.","""N470UA"", ""N7714B"", ""N535MQ"", ""N910DE"", ""N921WN"", ""N918DL"", ""N703TW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",29,70,"style","Trailing whitespace is superfluous.","""N998DL"", ""N8982A"", ""N735MQ"", ""N76065"", ""N354NW"", ""N13994"", ""N644JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",30,70,"style","Trailing whitespace is superfluous.","""N282WN"", ""N722MQ"", ""N502UA"", ""N13202"", ""N66057"", ""N26545"", ""N37474"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",31,70,"style","Trailing whitespace is superfluous.","""N527AA"", ""N544AA"", ""N24212"", ""N935XJ"", ""N352AA"", ""N920AT"", ""N630JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",32,70,"style","Trailing whitespace is superfluous.","""N79402"", ""N8305E"", ""N849VA"", ""N477WN"", ""N603JB"", ""N8907A"", ""N4UCAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",33,70,"style","Trailing whitespace is superfluous.","""N535UW"", ""N8560F"", ""N17984"", ""N11189"", ""N709EV"", ""N727SW"", ""N3GLAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",34,69,"style","Trailing whitespace is superfluous.","""N7726A"", ""N3765"", ""N14959"", ""N796SW"", ""N325US"", ""N11165"", ""N3KBAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",35,69,"style","Trailing whitespace is superfluous.","""N4WVAA"", ""N713EV"", ""N3ASAA"", ""N8541D"", ""N444WN"", ""N744P"", ""N33294"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",36,70,"style","Trailing whitespace is superfluous.","""N476UA"", ""N845VA"", ""N950DL"", ""N937XJ"", ""N741SA"", ""N562UW"", ""N417UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",37,70,"style","Trailing whitespace is superfluous.","""N3ERAA"", ""N14179"", ""N684MQ"", ""N8800G"", ""N37252"", ""N11187"", ""N547JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",38,70,"style","Trailing whitespace is superfluous.","""N510JB"", ""N12569"", ""N592JB"", ""N16149"", ""N585AA"", ""N714CB"", ""N517MQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",39,70,"style","Trailing whitespace is superfluous.","""N3HUAA"", ""N366NW"", ""N5EMAA"", ""N723EV"", ""N66051"", ""N961AT"", ""N365NW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",40,70,"style","Trailing whitespace is superfluous.","""N269WN"", ""N248WN"", ""N18557"", ""N390AA"", ""N18120"", ""N344AA"", ""N805UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",41,70,"style","Trailing whitespace is superfluous.","""N76529"", ""N16713"", ""N661MQ"", ""N426UA"", ""N3736C"", ""N356NW"", ""N27733"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",42,70,"style","Trailing whitespace is superfluous.","""N328AA"", ""N466UA"", ""N547AA"", ""N3FKAA"", ""N345NW"", ""N983DL"", ""N410UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",43,70,"style","Trailing whitespace is superfluous.","""N794JB"", ""N181UW"", ""N76516"", ""N75426"", ""N232WN"", ""N5DNAA"", ""N675DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",44,70,"style","Trailing whitespace is superfluous.","""N23721"", ""N624VA"", ""N830MQ"", ""N604LR"", ""N914DL"", ""N361NB"", ""N458UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",45,70,"style","Trailing whitespace is superfluous.","""N379DA"", ""N633DL"", ""N947DL"", ""N401WN"", ""N261AT"", ""N3FHAA"", ""N591JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",46,70,"style","Trailing whitespace is superfluous.","""N77066"", ""N702TW"", ""N601AW"", ""N8554A"", ""N15912"", ""N37466"", ""N331NW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",47,70,"style","Trailing whitespace is superfluous.","""N605LR"", ""N706JB"", ""N518UA"", ""N695DL"", ""N721MQ"", ""N14116"", ""N840VA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",48,70,"style","Trailing whitespace is superfluous.","""N904XJ"", ""N526JB"", ""N285WN"", ""N633VA"", ""N519AA"", ""N364NW"", ""N942MQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",49,70,"style","Trailing whitespace is superfluous.","""N719EV"", ""N476WN"", ""N529VA"", ""N3CKAA"", ""N533UA"", ""N372NW"", ""N529JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",50,70,"style","Trailing whitespace is superfluous.","""N504JB"", ""N705TW"", ""N121UW"", ""N16178"", ""N515MQ"", ""N733SA"", ""N195UW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",51,70,"style","Trailing whitespace is superfluous.","""N328NW"", ""N663MQ"", ""N8964E"", ""N625VA"", ""N852VA"", ""N544MQ"", ""N327NB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",52,70,"style","Trailing whitespace is superfluous.","""N6EAMQ"", ""N340NW"", ""N163US"", ""N11176"", ""N13989"", ""N585JB"", ""N374JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",53,70,"style","Trailing whitespace is superfluous.","""N8736A"", ""N370NW"", ""N717TW"", ""N6704Z"", ""N760JB"", ""N14148"", ""N3CYAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",54,70,"style","Trailing whitespace is superfluous.","""N14543"", ""N5DYAA"", ""N329AA"", ""N8936A"", ""N599JB"", ""N749US"", ""N324AA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",55,70,"style","Trailing whitespace is superfluous.","""N600LR"", ""N951FR"", ""N611MQ"", ""N690DL"", ""N758SW"", ""N4UBAA"", ""N338NB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",56,70,"style","Trailing whitespace is superfluous.","""N534UA"", ""N550NW"", ""N455UA"", ""N920DL"", ""N907MQ"", ""N358NW"", ""N850MQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",57,70,"style","Trailing whitespace is superfluous.","""N419UA"", ""N3DHAA"", ""N984DL"", ""N39728"", ""N8790A"", ""N337AT"", ""N979DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",58,70,"style","Trailing whitespace is superfluous.","""N3FVAA"", ""N3CTAA"", ""N324US"", ""N730EV"", ""N41104"", ""N765SW"", ""N76515"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",59,70,"style","Trailing whitespace is superfluous.","""N3GSAA"", ""N8698A"", ""N173AT"", ""N76528"", ""N509MQ"", ""N805MQ"", ""N938DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",60,70,"style","Trailing whitespace is superfluous.","""N724MQ"", ""N201FR"", ""N433UA"", ""N712EV"", ""N853VA"", ""N564JB"", ""N438UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",61,70,"style","Trailing whitespace is superfluous.","""N747SA"", ""N561JB"", ""N29906"", ""N387DA"", ""N924XJ"", ""N913DL"", ""N11127"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",62,70,"style","Trailing whitespace is superfluous.","""N326US"", ""N8696C"", ""N722TW"", ""N481AA"", ""N543UW"", ""N675AW"", ""N302NB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",63,70,"style","Trailing whitespace is superfluous.","""N270WN"", ""N482AA"", ""N632SW"", ""N310NW"", ""N77530"", ""N4WNAA"", ""N950UW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",64,70,"style","Trailing whitespace is superfluous.","""N828AS"", ""N296PQ"", ""N19554"", ""N963DL"", ""N530VA"", ""N827UA"", ""N893AT"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",65,70,"style","Trailing whitespace is superfluous.","""N76502"", ""N68453"", ""N641VA"", ""N24729"", ""N553UA"", ""N510UW"", ""N627JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",66,70,"style","Trailing whitespace is superfluous.","""N821MQ"", ""N3BGAA"", ""N506JB"", ""N18101"", ""N16918"", ""N3KEAA"", ""N402UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",67,70,"style","Trailing whitespace is superfluous.","""N844MH"", ""N550UW"", ""N758US"", ""N391DA"", ""N662JB"", ""N908XJ"", ""N801UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",68,70,"style","Trailing whitespace is superfluous.","""N649MQ"", ""N466WN"", ""N8646A"", ""N241WN"", ""N18223"", ""N17245"", ""N14731"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",69,70,"style","Trailing whitespace is superfluous.","""N16147"", ""N990DL"", ""N993DL"", ""N639AA"", ""N29717"", ""N934XJ"", ""N996DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",70,70,"style","Trailing whitespace is superfluous.","""N913XJ"", ""N562JB"", ""N5EHAA"", ""N582AA"", ""N839UA"", ""N4XVAA"", ""N445WN"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",71,70,"style","Trailing whitespace is superfluous.","""N178JB"", ""N915AT"", ""N214FR"", ""N891AT"", ""N8532G"", ""N239JB"", ""N948DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",72,70,"style","Trailing whitespace is superfluous.","""N915WN"", ""N827AS"", ""N4XCAA"", ""N5CAAA"", ""N834AS"", ""N645MQ"", ""N11547"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",73,70,"style","Trailing whitespace is superfluous.","""N351NB"", ""N927AT"", ""N463WN"", ""N452UA"", ""N29129"", ""N14562"", ""N899AT"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",74,70,"style","Trailing whitespace is superfluous.","""N437UA"", ""N913DE"", ""N354JB"", ""N842UA"", ""N501AA"", ""N827MQ"", ""N408WN"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",75,70,"style","Trailing whitespace is superfluous.","""N803UA"", ""N355NW"", ""N283JB"", ""N507MQ"", ""N508AA"", ""N509JB"", ""N627VA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",76,70,"style","Trailing whitespace is superfluous.","""N176AT"", ""N348NW"", ""N715JB"", ""N3BAAA"", ""N8683B"", ""N13716"", ""N646JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",77,70,"style","Trailing whitespace is superfluous.","""N936DL"", ""N78438"", ""N3BDAA"", ""N638VA"", ""N507JB"", ""N403UA"", ""N16234"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",78,70,"style","Trailing whitespace is superfluous.","""N932XJ"", ""N784JB"", ""N297WN"", ""N902MQ"", ""N959UW"", ""N228JB"", ""N521VA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",79,70,"style","Trailing whitespace is superfluous.","""N906AT"", ""N3HGAA"", ""N267JB"", ""N507UA"", ""N612JB"", ""N564UA"", ""N17730"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",80,70,"style","Trailing whitespace is superfluous.","""N399DA"", ""N351JB"", ""N349NW"", ""N555LV"", ""N16561"", ""N504MQ"", ""N25134"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",81,70,"style","Trailing whitespace is superfluous.","""N607LR"", ""N833AY"", ""N615AA"", ""N607JB"", ""N3EPAA"", ""N324NB"", ""N577UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",82,70,"style","Trailing whitespace is superfluous.","""N8930E"", ""N519JB"", ""N458WN"", ""N754EV"", ""N911DA"", ""N21129"", ""N16709"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",83,70,"style","Trailing whitespace is superfluous.","""N339JB"", ""N997AT"", ""N4XXAA"", ""N927LR"", ""N946DL"", ""N3HEAA"", ""N36444"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",84,70,"style","Trailing whitespace is superfluous.","""N16541"", ""N776WN"", ""N574UA"", ""N75435"", ""N14570"", ""N323JB"", ""N8933B"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",85,70,"style","Trailing whitespace is superfluous.","""N34110"", ""N17126"", ""N771SA"", ""N820AY"", ""N715UW"", ""N710EV"", ""N940DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",86,70,"style","Trailing whitespace is superfluous.","""N8598B"", ""N705JB"", ""N8506C"", ""N807JB"", ""N394DA"", ""N634VA"", ""N348JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",87,70,"style","Trailing whitespace is superfluous.","""N3DSAA"", ""N355JB"", ""N8972E"", ""N293PQ"", ""N3DUAA"", ""N13133"", ""N14950"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",88,70,"style","Trailing whitespace is superfluous.","""N524MQ"", ""N904DL"", ""N27190"", ""N8960A"", ""N484UA"", ""N624JB"", ""N3AJAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",89,70,"style","Trailing whitespace is superfluous.","""N930XJ"", ""N77520"", ""N335AA"", ""N635VA"", ""N8940E"", ""N849MQ"", ""N713SW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",90,70,"style","Trailing whitespace is superfluous.","""N75433"", ""N316JB"", ""N12900"", ""N768SW"", ""N972DL"", ""N3FSAA"", ""N346NB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",91,70,"style","Trailing whitespace is superfluous.","""N908MQ"", ""N3JCAA"", ""N950WN"", ""N959AT"", ""N842MQ"", ""N3GDAA"", ""N8315C"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",92,70,"style","Trailing whitespace is superfluous.","""N624AG"", ""N14118"", ""N446UA"", ""N752EV"", ""N172DN"", ""N457UW"", ""N7735A"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",93,70,"style","Trailing whitespace is superfluous.","""N430UA"", ""N14905"", ""N805JB"", ""N580UA"", ""N545UA"", ""N709TW"", ""N601LR"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",94,70,"style","Trailing whitespace is superfluous.","""N218FR"", ""N404UA"", ""N23139"", ""N497UA"", ""N257WN"", ""N17138"", ""N959DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",95,70,"style","Trailing whitespace is superfluous.","""N652DL"", ""N351NW"", ""N603DL"", ""N855UA"", ""N569UA"", ""N329NW"", ""N735SA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",96,70,"style","Trailing whitespace is superfluous.","""N995DL"", ""N38467"", ""N563JB"", ""N3KPAA"", ""N75861"", ""N472UA"", ""N4WSAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",97,70,"style","Trailing whitespace is superfluous.","""N16963"", ""N583AA"", ""N13979"", ""N12567"", ""N539AA"", ""N927XJ"", ""N571JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",98,70,"style","Trailing whitespace is superfluous.","""N519UA"", ""N353AT"", ""N640JB"", ""N11536"", ""N597UA"", ""N79279"", ""N3EFAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",99,70,"style","Trailing whitespace is superfluous.","""N15574"", ""N636JB"", ""N14953"", ""N3APAA"", ""N528VA"", ""N486AA"", ""N514MQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",100,70,"style","Trailing whitespace is superfluous.","""N991DL"", ""N14203"", ""N928DN"", ""N11109"", ""N8839E"", ""N184US"", ""N76504"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",101,70,"style","Trailing whitespace is superfluous.","""N425UA"", ""N631VA"", ""N15980"", ""N3GJAA"", ""N764SW"", ""N353NB"", ""N982DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",102,70,"style","Trailing whitespace is superfluous.","""N825AS"", ""N508JB"", ""N598JB"", ""N342NW"", ""N3ANAA"", ""N746JB"", ""N9EAMQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",103,70,"style","Trailing whitespace is superfluous.","""N296JB"", ""N708EV"", ""N231WN"", ""N8580A"", ""N328JB"", ""N555UA"", ""N380DA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",104,70,"style","Trailing whitespace is superfluous.","""N423UA"", ""N522UA"", ""N222WN"", ""N336AA"", ""N292JB"", ""N332AA"", ""N588UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",105,70,"style","Trailing whitespace is superfluous.","""N8733G"", ""N809UA"", ""N767UW"", ""N244WN"", ""N933LR"", ""N525UA"", ""N608JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",106,70,"style","Trailing whitespace is superfluous.","""N929DL"", ""N14991"", ""N187JB"", ""N980AT"", ""N527VA"", ""N17169"", ""N978DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",107,70,"style","Trailing whitespace is superfluous.","""N625AA"", ""N316NB"", ""N492UA"", ""N944UW"", ""N3FPAA"", ""N922DL"", ""N3CHAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",108,70,"style","Trailing whitespace is superfluous.","""N656JB"", ""N4YTAA"", ""N41135"", ""N566JB"", ""N138EV"", ""N676CA"", ""N813UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",109,70,"style","Trailing whitespace is superfluous.","""N12122"", ""N14214"", ""N3CXAA"", ""N37471"", ""N375NC"", ""N527MQ"", ""N13964"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",110,70,"style","Trailing whitespace is superfluous.","""N11181"", ""N5FGAA"", ""N3GCAA"", ""N946UW"", ""N808UA"", ""N835AS"", ""N737MQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",111,70,"style","Trailing whitespace is superfluous.","""N673UA"", ""N362NW"", ""N838MQ"", ""N687MQ"", ""N3BCAA"", ""N435WN"", ""N5CGAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",112,70,"style","Trailing whitespace is superfluous.","""N73276"", ""N667AW"", ""N3750D"", ""N15910"", ""N374NW"", ""N247JB"", ""N516AS"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",113,70,"style","Trailing whitespace is superfluous.","""N707EV"", ""N777QC"", ""N579JB"", ""N337JB"", ""N464UA"", ""N8604C"", ""N847UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",114,70,"style","Trailing whitespace is superfluous.","""N400WN"", ""N3741S"", ""N15973"", ""N13538"", ""N3DCAA"", ""N39416"", ""N779JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",115,70,"style","Trailing whitespace is superfluous.","""N16976"", ""N416UA"", ""N807UA"", ""N494WN"", ""N929XJ"", ""N12195"", ""N3JDAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",116,70,"style","Trailing whitespace is superfluous.","""N1EAMQ"", ""N937DL"", ""N16151"", ""N576UA"", ""N17244"", ""N639MQ"", ""N13958"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",117,70,"style","Trailing whitespace is superfluous.","""N7738A"", ""N754UW"", ""N6716C"", ""N73299"", ""N185UW"", ""N3BRAA"", ""N8797A"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",118,70,"style","Trailing whitespace is superfluous.","""N8409N"", ""N3764D"", ""N954DL"", ""N13718"", ""N15985"", ""N318JB"", ""N197UW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",119,70,"style","Trailing whitespace is superfluous.","""N34111"", ""N509AY"", ""N13913"", ""N553UW"", ""N917WN"", ""N930DL"", ""N3749D"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",120,70,"style","Trailing whitespace is superfluous.","""N218WN"", ""N73251"", ""N3748Y"", ""N13124"", ""N11150"", ""N507MJ"", ""N519MQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",121,70,"style","Trailing whitespace is superfluous.","""N819UA"", ""N928DL"", ""N917XJ"", ""N18556"", ""N8674A"", ""N520JB"", ""N8908D"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",122,70,"style","Trailing whitespace is superfluous.","""N910XJ"", ""N811MQ"", ""N609SW"", ""N12167"", ""N12564"", ""N485UA"", ""N556UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",123,70,"style","Trailing whitespace is superfluous.","""N657JB"", ""N18220"", ""N7741C"", ""N431UA"", ""N963WN"", ""N73275"", ""N368JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",124,70,"style","Trailing whitespace is superfluous.","""N12540"", ""N925DL"", ""N8745B"", ""N302DQ"", ""N935WN"", ""N236JB"", ""N16571"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",125,70,"style","Trailing whitespace is superfluous.","""N762US"", ""N912DE"", ""N77431"", ""N308DE"", ""N343NB"", ""N823UA"", ""N331NB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",126,70,"style","Trailing whitespace is superfluous.","""N558JB"", ""N8317M"", ""N75436"", ""N446WN"", ""N465UA"", ""N167US"", ""N587NW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",127,70,"style","Trailing whitespace is superfluous.","""N658JB"", ""N212WN"", ""N3733Z"", ""N531MQ"", ""N3JUAA"", ""N3735D"", ""N700GS"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",128,69,"style","Trailing whitespace is superfluous.","""N1603"", ""N332NW"", ""N5ETAA"", ""N516JB"", ""N4WMAA"", ""N397DA"", ""N13969"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",129,70,"style","Trailing whitespace is superfluous.","""N919DL"", ""N835VA"", ""N706SW"", ""N339AA"", ""N523UW"", ""N16732"", ""N486UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",130,70,"style","Trailing whitespace is superfluous.","""N183DN"", ""N12160"", ""N14117"", ""N76505"", ""N623VA"", ""N11565"", ""N3761R"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",131,70,"style","Trailing whitespace is superfluous.","""N710TW"", ""N960DL"", ""N827JB"", ""N314NB"", ""N221WN"", ""N811UA"", ""N76265"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",132,70,"style","Trailing whitespace is superfluous.","""N523JB"", ""N4YDAA"", ""N345NB"", ""N942WN"", ""N848VA"", ""N632MQ"", ""N606JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",133,70,"style","Trailing whitespace is superfluous.","""N925AT"", ""N482WN"", ""N480UA"", ""N3FNAA"", ""N443UA"", ""N502MJ"", ""N950AT"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",134,70,"style","Trailing whitespace is superfluous.","""N894AT"", ""N13132"", ""N535JB"", ""N15572"", ""N761RR"", ""N919DE"", ""N930AT"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",135,70,"style","Trailing whitespace is superfluous.","""N804UA"", ""N360NB"", ""N919FJ"", ""N529UA"", ""N3754A"", ""N512MQ"", ""N928AT"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",136,70,"style","Trailing whitespace is superfluous.","""N78501"", ""N392DA"", ""N857MQ"", ""N8828D"", ""N14237"", ""N766JB"", ""N461UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",137,70,"style","Trailing whitespace is superfluous.","""N744EV"", ""N3JMAA"", ""N615JB"", ""N835UA"", ""N503MQ"", ""N11548"", ""N830UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",138,70,"style","Trailing whitespace is superfluous.","""N487WN"", ""N480WN"", ""N348NB"", ""N922WN"", ""N812UA"", ""N327NW"", ""N12921"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",139,70,"style","Trailing whitespace is superfluous.","""N39418"", ""N292WN"", ""N810MQ"", ""N626VA"", ""N274JB"", ""N815MQ"", ""N565JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",140,70,"style","Trailing whitespace is superfluous.","""N18114"", ""N294WN"", ""N14923"", ""N467UA"", ""N925XJ"", ""N5PBMQ"", ""N21144"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",141,70,"style","Trailing whitespace is superfluous.","""N965DL"", ""N3GWAA"", ""N671DN"", ""N565AA"", ""N820UA"", ""N3JTAA"", ""N14125"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",142,70,"style","Trailing whitespace is superfluous.","""N344AT"", ""N663DN"", ""N615QX"", ""N558UA"", ""N928XJ"", ""N73256"", ""N411UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",143,70,"style","Trailing whitespace is superfluous.","""N515AA"", ""N961DL"", ""N11164"", ""N329NB"", ""N852MQ"", ""N341NW"", ""N339NW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",144,70,"style","Trailing whitespace is superfluous.","""N739GB"", ""N435UA"", ""N319NB"", ""N511UA"", ""N344NB"", ""N3JAAA"", ""N973DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",145,70,"style","Trailing whitespace is superfluous.","""N294PQ"", ""N830AS"", ""N11544"", ""N951DL"", ""N636MQ"", ""N67171"", ""N5CEAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",146,70,"style","Trailing whitespace is superfluous.","""N989DL"", ""N37413"", ""N522AA"", ""N841AY"", ""N3758Y"", ""N14168"", ""N613JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",147,70,"style","Trailing whitespace is superfluous.","""N12175"", ""N563UA"", ""N36476"", ""N3EXAA"", ""N320NB"", ""N909EV"", ""N36272"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",148,70,"style","Trailing whitespace is superfluous.","""N378NW"", ""N12201"", ""N396DA"", ""N13975"", ""N75429"", ""N937AT"", ""N3757D"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",149,70,"style","Trailing whitespace is superfluous.","""N939DL"", ""N553AA"", ""N317NB"", ""N7734H"", ""N310DE"", ""N76523"", ""N442UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",150,70,"style","Trailing whitespace is superfluous.","""N57852"", ""N37409"", ""N964AT"", ""N525MQ"", ""N13566"", ""N718EV"", ""N279JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",151,70,"style","Trailing whitespace is superfluous.","""N510MQ"", ""N738MQ"", ""N17185"", ""N406UA"", ""N247WN"", ""N3JEAA"", ""N944DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",152,70,"style","Trailing whitespace is superfluous.","""N670DN"", ""N918XJ"", ""N605JB"", ""N27724"", ""N38454"", ""N945DL"", ""N477UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",153,70,"style","Trailing whitespace is superfluous.","""N3AEMQ"", ""N276AT"", ""N753EV"", ""N16703"", ""N19966"", ""N8458A"", ""N13955"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",154,70,"style","Trailing whitespace is superfluous.","""N674DL"", ""N750EV"", ""N29917"", ""N8923A"", ""N546MQ"", ""N761ND"", ""N921AT"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",155,70,"style","Trailing whitespace is superfluous.","""N905WN"", ""N711MQ"", ""N515MJ"", ""N290AT"", ""N391CA"", ""N748EV"", ""N13965"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",156,70,"style","Trailing whitespace is superfluous.","""N566UA"", ""N27200"", ""N4XEAA"", ""N708JB"", ""N249JB"", ""N546AA"", ""N836VA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",157,70,"style","Trailing whitespace is superfluous.","""N634JB"", ""N176PQ"", ""N258JB"", ""N27239"", ""N459WN"", ""N16954"", ""N388DA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",158,70,"style","Trailing whitespace is superfluous.","""N467WN"", ""N653JB"", ""N179UW"", ""N560UW"", ""N318US"", ""N508UA"", ""N906DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",159,70,"style","Trailing whitespace is superfluous.","""N329JB"", ""N476AA"", ""N24706"", ""N21537"", ""N836AS"", ""N13978"", ""N902DE"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",160,70,"style","Trailing whitespace is superfluous.","""N936XJ"", ""N821UA"", ""N512UA"", ""N586JB"", ""N679DA"", ""N57111"", ""N330NB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",161,70,"style","Trailing whitespace is superfluous.","""N13903"", ""N14916"", ""N14188"", ""N8659B"", ""N918FJ"", ""N723SW"", ""N906WN"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",162,70,"style","Trailing whitespace is superfluous.","""N382DA"", ""N634AA"", ""N491WN"", ""N11155"", ""N817UA"", ""N635JB"", ""N901XJ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",163,70,"style","Trailing whitespace is superfluous.","""N11121"", ""N660DL"", ""N493AA"", ""N969DL"", ""N589UA"", ""N526AA"", ""N662DN"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",164,70,"style","Trailing whitespace is superfluous.","""N474AA"", ""N946AT"", ""N81449"", ""N932WN"", ""N436UA"", ""N990AT"", ""N955AT"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",165,70,"style","Trailing whitespace is superfluous.","""N513AA"", ""N384AA"", ""N565UW"", ""N934DL"", ""N8623A"", ""N590JB"", ""N793JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",166,70,"style","Trailing whitespace is superfluous.","""N365AA"", ""N317US"", ""N794SW"", ""N8970D"", ""N3JVAA"", ""N202FR"", ""N155DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",167,70,"style","Trailing whitespace is superfluous.","""N8444F"", ""N656AW"", ""N557UA"", ""N8971A"", ""N319AA"", ""N816MQ"", ""N722EV"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",168,70,"style","Trailing whitespace is superfluous.","""N932DL"", ""N725MQ"", ""N913WN"", ""N4YJAA"", ""N14180"", ""N563UW"", ""N699DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",169,70,"style","Trailing whitespace is superfluous.","""N37293"", ""N8894A"", ""N283AT"", ""N437AA"", ""N995AT"", ""N297PQ"", ""N554NW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",170,70,"style","Trailing whitespace is superfluous.","""N75858"", ""N515UA"", ""N14174"", ""N16999"", ""N8943A"", ""N223WN"", ""N914XJ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",171,70,"style","Trailing whitespace is superfluous.","""N921DL"", ""N920XJ"", ""N490AA"", ""N810UA"", ""N452UW"", ""N3EDAA"", ""N34460"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",172,70,"style","Trailing whitespace is superfluous.","""N335NB"", ""N403WN"", ""N481WN"", ""N610DL"", ""N3755D"", ""N26549"", ""N832AS"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",173,70,"style","Trailing whitespace is superfluous.","""N966AT"", ""N821JB"", ""N3FWAA"", ""N907DL"", ""N721UW"", ""N566AA"", ""N787SA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",174,70,"style","Trailing whitespace is superfluous.","""N274WN"", ""N301NB"", ""N14974"", ""N692DL"", ""N804MQ"", ""N376NW"", ""N16217"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",175,70,"style","Trailing whitespace is superfluous.","""N11191"", ""N37465"", ""N326NB"", ""N526UA"", ""N388SW"", ""N558AA"", ""N524VA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",176,70,"style","Trailing whitespace is superfluous.","""N949AT"", ""N945AT"", ""N818UA"", ""N828UA"", ""N16911"", ""N197JB"", ""N417WN"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",177,70,"style","Trailing whitespace is superfluous.","""N698MQ"", ""N949UW"", ""N21154"", ""N523VA"", ""N13997"", ""N687DL"", ""N916DE"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",178,70,"style","Trailing whitespace is superfluous.","""N16987"", ""N546UA"", ""N736MQ"", ""N968AT"", ""N633JB"", ""N8968E"", ""N849UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",179,70,"style","Trailing whitespace is superfluous.","""N239WN"", ""N12142"", ""N370AA"", ""N12967"", ""N822UA"", ""N906DE"", ""N8709A"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",180,70,"style","Trailing whitespace is superfluous.","""N530MQ"", ""N717MQ"", ""N506MJ"", ""N32404"", ""N16961"", ""N825UA"", ""N14177"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",181,68,"style","Trailing whitespace is superfluous.","""N3753"", ""N855MQ"", ""N3767"", ""N494AA"", ""N508MQ"", ""N365NB"", ""N723MQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",182,70,"style","Trailing whitespace is superfluous.","""N357NB"", ""N503JB"", ""N39423"", ""N374AA"", ""N750UW"", ""N319US"", ""N4YCAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",183,70,"style","Trailing whitespace is superfluous.","""N532MQ"", ""N3JSAA"", ""N383DN"", ""N463UA"", ""N763JB"", ""N420WN"", ""N327AA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",184,70,"style","Trailing whitespace is superfluous.","""N832AY"", ""N418UA"", ""N36207"", ""N14228"", ""N948UW"", ""N439UA"", ""N356AA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",185,70,"style","Trailing whitespace is superfluous.","""N229JB"", ""N559JB"", ""N307DQ"", ""N54711"", ""N903XJ"", ""N263AV"", ""N312US"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",186,70,"style","Trailing whitespace is superfluous.","""N900DE"", ""N554JB"", ""N347NW"", ""N826UA"", ""N5EAAA"", ""N432UA"", ""N910FJ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",187,70,"style","Trailing whitespace is superfluous.","""N814UA"", ""N717EV"", ""N964WN"", ""N777NC"", ""N3762Y"", ""N26123"", ""N514UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",188,70,"style","Trailing whitespace is superfluous.","""N216JB"", ""N428UA"", ""N361VA"", ""N962DL"", ""N665JB"", ""N701GS"", ""N902XJ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",189,70,"style","Trailing whitespace is superfluous.","""N338NW"", ""N560UA"", ""N960AT"", ""N922XJ"", ""N689DL"", ""N7715E"", ""N16919"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",190,70,"style","Trailing whitespace is superfluous.","""N473WN"", ""N906MQ"", ""N623JB"", ""N353NW"", ""N835MQ"", ""N963DN"", ""N204FR"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",191,70,"style","Trailing whitespace is superfluous.","""N593UA"", ""N632VA"", ""N8794B"", ""N809JB"", ""N854VA"", ""N76503"", ""N37263"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",192,70,"style","Trailing whitespace is superfluous.","""N37281"", ""N323NB"", ""N3DGAA"", ""N542AA"", ""N605QX"", ""N3JRAA"", ""N3GNAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",193,70,"style","Trailing whitespace is superfluous.","""N571AA"", ""N595JB"", ""N232PQ"", ""N8673D"", ""N184DN"", ""N238JB"", ""N34137"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",194,70,"style","Trailing whitespace is superfluous.","""N14143"", ""N496AA"", ""N360NW"", ""N429UA"", ""N650MQ"", ""N569JB"", ""N650AW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",195,70,"style","Trailing whitespace is superfluous.","""N729JB"", ""N298JB"", ""N278AT"", ""N309DE"", ""N906XJ"", ""N3738B"", ""N387AA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",196,70,"style","Trailing whitespace is superfluous.","""N11199"", ""N407UA"", ""N17146"", ""N3GEAA"", ""N838UA"", ""N355NB"", ""N8525B"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",197,70,"style","Trailing whitespace is superfluous.","""N640VA"", ""N16701"", ""N503AA"", ""N975DL"", ""N8475B"", ""N401UA"", ""N11140"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",198,70,"style","Trailing whitespace is superfluous.","""N78285"", ""N13908"", ""N36247"", ""N12552"", ""N629VA"", ""N967DL"", ""N817MQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",199,70,"style","Trailing whitespace is superfluous.","""N5DCAA"", ""N445UA"", ""N8884E"", ""N286WN"", ""N978AT"", ""N538UA"", ""N183JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",200,70,"style","Trailing whitespace is superfluous.","""N3BTAA"", ""N751EV"", ""N3CAAA"", ""N631MQ"", ""N393AA"", ""N573UA"", ""N14568"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",201,70,"style","Trailing whitespace is superfluous.","""N635AA"", ""N4XJAA"", ""N192DN"", ""N16951"", ""N518MQ"", ""N3CCAA"", ""N353JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",202,69,"style","Trailing whitespace is superfluous.","""N3766"", ""N13123"", ""N483UA"", ""N5CHAA"", ""N373JB"", ""N206JB"", ""N295PQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",203,70,"style","Trailing whitespace is superfluous.","""N10575"", ""N21197"", ""N903DE"", ""N0EGMQ"", ""N15710"", ""N334NB"", ""N26215"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",204,70,"style","Trailing whitespace is superfluous.","""N612QX"", ""N923FJ"", ""N5DBAA"", ""N273JB"", ""N284AT"", ""N505UA"", ""N3KCAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",205,70,"style","Trailing whitespace is superfluous.","""N505JB"", ""N540US"", ""N13949"", ""N3CWAA"", ""N16981"", ""N8938A"", ""N14153"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",206,70,"style","Trailing whitespace is superfluous.","""N510MJ"", ""N17560"", ""N3760C"", ""N456UA"", ""N968DL"", ""N626MQ"", ""N361NW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",207,70,"style","Trailing whitespace is superfluous.","""N35407"", ""N770UW"", ""N69059"", ""N366AA"", ""N536JB"", ""N8888D"", ""N304JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",208,70,"style","Trailing whitespace is superfluous.","""N669AW"", ""N716UW"", ""N36915"", ""N851UA"", ""N711HK"", ""N526MQ"", ""N989AT"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",209,70,"style","Trailing whitespace is superfluous.","""N31131"", ""N4YAAA"", ""N3772H"", ""N659JB"", ""N740UW"", ""N484WN"", ""N196DN"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",210,70,"style","Trailing whitespace is superfluous.","""N654UA"", ""N201AA"", ""N3AAAA"", ""N33284"", ""N15986"", ""N916DL"", ""N3BYAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",211,70,"style","Trailing whitespace is superfluous.","""N326AT"", ""N552JB"", ""N712JB"", ""N38443"", ""N527JB"", ""N195DN"", ""N756US"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",212,70,"style","Trailing whitespace is superfluous.","""N8913A"", ""N920DE"", ""N840AY"", ""N13970"", ""N724SW"", ""N25705"", ""N337NW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",213,70,"style","Trailing whitespace is superfluous.","""N911DE"", ""N970DL"", ""N527UA"", ""N818MQ"", ""N709SW"", ""N15983"", ""N578UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",214,70,"style","Trailing whitespace is superfluous.","""N376AA"", ""N13992"", ""N833AS"", ""N538CA"", ""N661JB"", ""N487UA"", ""N5FFAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",215,70,"style","Trailing whitespace is superfluous.","""N599AA"", ""N935AT"", ""N562UA"", ""N206FR"", ""N928MQ"", ""N4YGAA"", ""N3HRAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",216,70,"style","Trailing whitespace is superfluous.","""N587AS"", ""N37287"", ""N845UA"", ""N762SW"", ""N509UA"", ""N372DA"", ""N14171"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",217,70,"style","Trailing whitespace is superfluous.","""N4YUAA"", ""N6711M"", ""N17229"", ""N8672A"", ""N895AT"", ""N829UA"", ""N441WN"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",218,70,"style","Trailing whitespace is superfluous.","""N13914"", ""N738EV"", ""N552UW"", ""N482UA"", ""N415UA"", ""N767NC"", ""N328NB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",219,70,"style","Trailing whitespace is superfluous.","""N570UA"", ""N587JB"", ""N8577D"", ""N759EV"", ""N713TW"", ""N322US"", ""N422UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",220,70,"style","Trailing whitespace is superfluous.","""N8976E"", ""N441UA"", ""N665MQ"", ""N13118"", ""N363NW"", ""N915XJ"", ""N784SW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",221,70,"style","Trailing whitespace is superfluous.","""N976DL"", ""N8501F"", ""N910WN"", ""N8808H"", ""N942AT"", ""N947UW"", ""N48901"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",222,70,"style","Trailing whitespace is superfluous.","""N489UA"", ""N12114"", ""N12957"", ""N923XJ"", ""N507AY"", ""N169UW"", ""N3737C"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",223,70,"style","Trailing whitespace is superfluous.","""N819AY"", ""N38473"", ""N5CPAA"", ""N537JB"", ""N450WN"", ""N18243"", ""N17115"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",224,70,"style","Trailing whitespace is superfluous.","""N14998"", ""N22971"", ""N667DN"", ""N235WN"", ""N713MQ"", ""N716EV"", ""N648JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",225,70,"style","Trailing whitespace is superfluous.","""N24702"", ""N73283"", ""N956AT"", ""N12563"", ""N955WN"", ""N8310C"", ""N14920"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",226,70,"style","Trailing whitespace is superfluous.","""N945UW"", ""N528AA"", ""N741UW"", ""N5EGAA"", ""N12172"", ""N460WN"", ""N521US"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",227,70,"style","Trailing whitespace is superfluous.","""N33203"", ""N943DL"", ""N12109"", ""N649AW"", ""N333NW"", ""N216FR"", ""N179JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",228,70,"style","Trailing whitespace is superfluous.","""N931WN"", ""N3FLAA"", ""N11551"", ""N305AS"", ""N8886A"", ""N37290"", ""N523MQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",229,70,"style","Trailing whitespace is superfluous.","""N907DE"", ""N13750"", ""N14558"", ""N758EV"", ""N933AT"", ""N685DA"", ""N265JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",230,70,"style","Trailing whitespace is superfluous.","""N12166"", ""N652JB"", ""N734MQ"", ""N994AT"", ""N988AT"", ""N457UA"", ""N951UW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",231,70,"style","Trailing whitespace is superfluous.","""N76288"", ""N8533D"", ""N740EV"", ""N395DN"", ""N843VA"", ""N133EV"", ""N657MQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",232,70,"style","Trailing whitespace is superfluous.","""N371CA"", ""N8492C"", ""N843UA"", ""N594AA"", ""N425AA"", ""N641DL"", ""N741EV"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",233,70,"style","Trailing whitespace is superfluous.","""N537UA"", ""N909XJ"", ""N618JB"", ""N3746H"", ""N926XJ"", ""N804JB"", ""N405WN"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",234,70,"style","Trailing whitespace is superfluous.","""N131EV"", ""N568JB"", ""N983AT"", ""N658MQ"", ""N424AA"", ""N277WN"", ""N359NW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",235,70,"style","Trailing whitespace is superfluous.","""N398CA"", ""N298WN"", ""N3FDAA"", ""N695CA"", ""N3JHAA"", ""N8946A"", ""N506MQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",236,70,"style","Trailing whitespace is superfluous.","""N606MQ"", ""N346JB"", ""N854UA"", ""N621JB"", ""N807MQ"", ""N342AA"", ""N322NB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",237,70,"style","Trailing whitespace is superfluous.","""N655JB"", ""N307JB"", ""N713UW"", ""N206WN"", ""N37298"", ""N522MQ"", ""N3FYAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",238,70,"style","Trailing whitespace is superfluous.","""N7811F"", ""N556JB"", ""N587UA"", ""N971DL"", ""N760US"", ""N102UW"", ""N208FR"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",239,70,"style","Trailing whitespace is superfluous.","""N3EMAA"", ""N716SW"", ""N918DE"", ""N755EV"", ""N517JB"", ""N14960"", ""N73259"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",240,70,"style","Trailing whitespace is superfluous.","""N452WN"", ""N16546"", ""N905XJ"", ""N77510"", ""N6712B"", ""N13995"", ""N3GHAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",241,70,"style","Trailing whitespace is superfluous.","""N3EVAA"", ""N824UA"", ""N30401"", ""N12221"", ""N12922"", ""N751UW"", ""N78448"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",242,70,"style","Trailing whitespace is superfluous.","""N969AT"", ""N349NB"", ""N15555"", ""N337NB"", ""N14198"", ""N472WN"", ""N386DA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",243,70,"style","Trailing whitespace is superfluous.","""N589JB"", ""N939WN"", ""N651AW"", ""N846UA"", ""N637JB"", ""N909DL"", ""N543AA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",244,70,"style","Trailing whitespace is superfluous.","""N281JB"", ""N628MQ"", ""N4XBAA"", ""N12116"", ""N135EV"", ""N317JB"", ""N583JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",245,70,"style","Trailing whitespace is superfluous.","""N3CFAA"", ""N447WN"", ""N846MQ"", ""N460UA"", ""N340NB"", ""N33714"", ""N717JL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",246,70,"style","Trailing whitespace is superfluous.","""N912WN"", ""N972AT"", ""N834UA"", ""N11137"", ""N35271"", ""N364NB"", ""N33262"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",247,70,"style","Trailing whitespace is superfluous.","""N604QX"", ""N422WN"", ""N190JB"", ""N916XJ"", ""N570JB"", ""N8423C"", ""N14952"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",248,70,"style","Trailing whitespace is superfluous.","""N851NW"", ""N333NB"", ""N352NB"", ""N561UA"", ""N104UW"", ""N542UW"", ""N544UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",249,70,"style","Trailing whitespace is superfluous.","""N910DL"", ""N87507"", ""N500MQ"", ""N815UA"", ""N308AT"", ""N717SA"", ""N907XJ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",250,70,"style","Trailing whitespace is superfluous.","""N12163"", ""N162UW"", ""N174DN"", ""N14907"", ""N371NW"", ""N33286"", ""N720MQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",251,70,"style","Trailing whitespace is superfluous.","""N227WN"", ""N13968"", ""N323AA"", ""N668UA"", ""N731SA"", ""N923AT"", ""N727TW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",252,70,"style","Trailing whitespace is superfluous.","""N14162"", ""N565UA"", ""N483WN"", ""N786NC"", ""N3771K"", ""N200WN"", ""N800AY"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",253,70,"style","Trailing whitespace is superfluous.","""N11107"", ""N922EV"", ""N828AW"", ""N3GKAA"", ""N24211"", ""N597JB"", ""N791SW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",254,70,"style","Trailing whitespace is superfluous.","""N174US"", ""N623DL"", ""N757LV"", ""N935DL"", ""N16183"", ""N79521"", ""N812MQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",255,70,"style","Trailing whitespace is superfluous.","""N852UA"", ""N673MQ"", ""N737US"", ""N796JB"", ""N769US"", ""N921XJ"", ""N943AT"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",256,70,"style","Trailing whitespace is superfluous.","""N8588D"", ""N823AY"", ""N795SW"", ""N38727"", ""N77430"", ""N960WN"", ""N844MQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",257,70,"style","Trailing whitespace is superfluous.","""N751SW"", ""N522VA"", ""N5FJAA"", ""N724EV"", ""N943WN"", ""N750SA"", ""N323US"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",258,70,"style","Trailing whitespace is superfluous.","""N14704"", ""N13988"", ""N464WN"", ""N931DL"", ""N514AA"", ""N12157"", ""N309US"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",259,69,"style","Trailing whitespace is superfluous.","""N266JB"", ""N203FR"", ""N806JB"", ""N931XJ"", ""N501MQ"", ""N6702"", ""N37420"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",260,70,"style","Trailing whitespace is superfluous.","""N10156"", ""N505MQ"", ""N87513"", ""N8495B"", ""N233LV"", ""N720EV"", ""N812AY"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",261,70,"style","Trailing whitespace is superfluous.","""N933XJ"", ""N496WN"", ""N580JB"", ""N927DA"", ""N3730B"", ""N658AW"", ""N474UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",262,70,"style","Trailing whitespace is superfluous.","""N3BEAA"", ""N192JB"", ""N850UA"", ""N506AA"", ""N802UA"", ""N556UW"", ""N373AA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",263,70,"style","Trailing whitespace is superfluous.","""N584JB"", ""N806UA"", ""N426WN"", ""N23708"", ""N600QX"", ""N824MQ"", ""N371DA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",264,70,"style","Trailing whitespace is superfluous.","""N917DE"", ""N17128"", ""N415WN"", ""N22909"", ""N381DN"", ""N411WN"", ""N829AS"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",265,70,"style","Trailing whitespace is superfluous.","""N77296"", ""N607AT"", ""N384HA"", ""N840UA"", ""N684WN"", ""N8965E"", ""N541UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",266,70,"style","Trailing whitespace is superfluous.","""N184JB"", ""N205FR"", ""N672AW"", ""N839VA"", ""N389DA"", ""N17108"", ""N956WN"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",267,70,"style","Trailing whitespace is superfluous.","""N641JB"", ""N3GMAA"", ""N176UW"", ""N303DQ"", ""N826AS"", ""N5FNAA"", ""N451UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",268,70,"style","Trailing whitespace is superfluous.","""N642VA"", ""N380AA"", ""N373NW"", ""N649JB"", ""N543MQ"", ""N487AA"", ""N571UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",269,70,"style","Trailing whitespace is superfluous.","""N630MQ"", ""N676AW"", ""N8325D"", ""N354AT"", ""N345AA"", ""N344NW"", ""N602LR"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",270,72,"style","Trailing whitespace is superfluous.","""N952AT"", ""N637VA"", ""N663JB"")), class = ""data.frame"", row.names = c(NA, ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/dittodb/email-body b/.dev/revdep_emails/dittodb/email-body deleted file mode 100644 index 24fb633a9..000000000 --- a/.dev/revdep_emails/dittodb/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Jonathan Keane! Thank you for using {lintr} in your package {dittodb}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/ropensci/dittodb using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 24s on CRAN vs. 17s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/dupree/attachments/dupree.warnings b/.dev/revdep_emails/dupree/attachments/dupree.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/dupree/attachments/dupree.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/dupree/email-body b/.dev/revdep_emails/dupree/email-body deleted file mode 100644 index 91b3f6289..000000000 --- a/.dev/revdep_emails/dupree/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Russ Hyde! Thank you for using {lintr} in your package {dupree}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/russHyde/dupree using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 9s on CRAN vs. 6s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/edgarWebR/attachments/edgarWebR.warnings b/.dev/revdep_emails/edgarWebR/attachments/edgarWebR.warnings deleted file mode 100644 index 61d9875d5..000000000 --- a/.dev/revdep_emails/edgarWebR/attachments/edgarWebR.warnings +++ /dev/null @@ -1,2 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Trying to remove β€˜absolute_paths_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/edgarWebR/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/edgarWebR/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 1df85e4c8..000000000 --- a/.dev/revdep_emails/edgarWebR/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,19916 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"data-raw/sic_codes.R",43,58,"style","Use FALSE instead of the symbol F."," group = group_name, stringsAsFactors = F)","T_and_F_symbol_linter" -"data-raw/sic_codes.R",47,26,"style","Use FALSE instead of the symbol F.","})), stringsAsFactors = F)","T_and_F_symbol_linter" -"data-raw/sic_codes.R",58,42,"style","Use FALSE instead of the symbol F."," stringsAsFactors = F)","T_and_F_symbol_linter" -"data-raw/sic_codes.R",62,53,"style","Commas should always have a space after."," substr(majors$sic[startsWith(majors$sic, ""0"")], 2,4)","commas_linter" -"data-raw/sic_codes.R",69,42,"style","Use FALSE instead of the symbol F."," stringsAsFactors = F)","T_and_F_symbol_linter" -"data-raw/sic_codes.R",78,43,"style","Use FALSE instead of the symbol F."," stringsAsFactors = F)","T_and_F_symbol_linter" -"data-raw/sic_codes.R",79,36,"style","Commas should always have a space after.","sec_sic <- sec_sic[2:nrow(sec_sic),]","commas_linter" -"data-raw/sic_codes.R",85,62,"style","Use TRUE instead of the symbol T."," by.x = ""major_code"", by.y = ""sic"", all.x = T)","T_and_F_symbol_linter" -"data-raw/sic_codes.R",87,62,"style","Use TRUE instead of the symbol T."," by.x = ""group_code"", by.y = ""sic"", all.x = T)","T_and_F_symbol_linter" -"R/browse_edgar.R",20,32,"style","Put spaces around all infix operators."," before="""",","infix_spaces_linter" -"R/browse_edgar.R",33,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (res$status != ""200"" | res$headers[""content-type""] != ""application/atom+xml"") {","vector_logic_linter" -"R/browse_edgar.R",34,53,"style","Trailing semicolons are not needed."," stop(paste0(""Could not find company: "", ticker));","semicolon_linter" -"R/company_details.R",26,32,"style","Put spaces around all infix operators."," before="""",","infix_spaces_linter" -"R/company_filings.R",24,32,"style","Put spaces around all infix operators."," before="""",","infix_spaces_linter" -"R/effectiveness.R",47,57,"style","Use TRUE instead of the symbol T."," res$type <- sub("" Statements"", """", res$type, fixed = T)","T_and_F_symbol_linter" -"R/effectiveness.R",48,66,"style","Use TRUE instead of the symbol T."," res$division <- sub(""Division of "", """", res$division, fixed = T)","T_and_F_symbol_linter" -"R/parse_filing.R",39,30,"style","Use TRUE instead of the symbol T."," doc <- get_doc(x, clean = T)","T_and_F_symbol_linter" -"R/parse_filing.R",130,43,"style","Use FALSE instead of the symbol F."," stringsAsFactors = F)","T_and_F_symbol_linter" -"R/parse_filing.R",153,40,"style","Use FALSE instead of the symbol F."," include.raw = F,","T_and_F_symbol_linter" -"R/parse_filing.R",154,41,"style","Use FALSE instead of the symbol F."," include.path = F) {","T_and_F_symbol_linter" -"R/parse_filing.R",325,75,"style","Use FALSE instead of the symbol F."," result <- replicate(length(return_cols) + 2, character(), simplify = F)","T_and_F_symbol_linter" -"R/parse_filing.R",350,25,"style","Use TRUE instead of the symbol T."," ignore.case = T)","T_and_F_symbol_linter" -"R/parse_filing.R",366,42,"style","Use TRUE instead of the symbol T."," ignore.case = T)","T_and_F_symbol_linter" -"R/parse_submission.R",58,48,"style","Use TRUE instead of the symbol T."," include.binary = T,","T_and_F_symbol_linter" -"R/parse_submission.R",59,49,"style","Use TRUE instead of the symbol T."," include.content = T) {","T_and_F_symbol_linter" -"R/parse_submission.R",66,17,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.secdoc & (nchar(res) > 8e6)) {","vector_logic_linter" -"R/parse_submission.R",79,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (!is.secdoc & file.exists(res)) {","vector_logic_linter" -"R/parse_submission.R",130,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.binary & !include.binary) {","vector_logic_linter" -"R/parse_submission.R",148,59,"style","Use TRUE instead of the symbol T."," include.binary = T,","T_and_F_symbol_linter" -"R/parse_submission.R",149,60,"style","Use TRUE instead of the symbol T."," include.content = T) {","T_and_F_symbol_linter" -"R/parse_submission.R",153,44,"style","Use FALSE instead of the symbol F."," stringsAsFactors = F)","T_and_F_symbol_linter" -"R/parse_submission.R",156,15,"style","Use FALSE instead of the symbol F."," in.text <- F","T_and_F_symbol_linter" -"R/parse_submission.R",157,17,"style","Use FALSE instead of the symbol F."," is.binary <- F","T_and_F_symbol_linter" -"R/parse_submission.R",160,52,"style","Use FALSE instead of the symbol F."," while (length(l <- readLines(con, n = 1, warn = F)) > 0) {","T_and_F_symbol_linter" -"R/parse_submission.R",163,21,"style","Use FALSE instead of the symbol F."," in.text <- F","T_and_F_symbol_linter" -"R/parse_submission.R",166,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (text.line == 1 & startsWith(l, ""begin "")) {","vector_logic_linter" -"R/parse_submission.R",167,25,"style","Use TRUE instead of the symbol T."," is.binary <- T","T_and_F_symbol_linter" -"R/parse_submission.R",169,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (include.content & (!is.binary || include.binary)) {","vector_logic_linter" -"R/parse_submission.R",187,61,"style","Use FALSE instead of the symbol F."," result <- rbind(result, file.row, stringsAsFactors = F)","T_and_F_symbol_linter" -"R/parse_submission.R",192,19,"style","Use TRUE instead of the symbol T."," in.text <- T","T_and_F_symbol_linter" -"R/parse_submission.R",193,21,"style","Use FALSE instead of the symbol F."," is.binary <- F","T_and_F_symbol_linter" -"R/parse_submission.R",206,54,"style","Use TRUE instead of the symbol T."," txt.lines <- unlist(strsplit(txt, ""\n"", fixed = T))","T_and_F_symbol_linter" -"R/parse_submission.R",216,20,"style","Use FALSE instead of the symbol F."," prior.long <- c(F, (txt.length == 1023 | txt.length == 1025)[-length(txt.length)])","T_and_F_symbol_linter" -"R/utils.R",61,47,"style","Use TRUE instead of the symbol T."," grepl(""^(http|ftp)s?://"", x, ignore.case = T)","T_and_F_symbol_linter" -"R/utils.R",64,33,"style","Use FALSE instead of the symbol F.","get_doc <- function(x, clean = F) {","T_and_F_symbol_linter" -"R/utils.R",77,20,"style","Use TRUE instead of the symbol T."," }, silent = T)","T_and_F_symbol_linter" -"R/utils.R",89,20,"style","Use TRUE instead of the symbol T."," }, silent = T)","T_and_F_symbol_linter" -"R/utils.R",161,23,"style","Use TRUE instead of the symbol T.","), ncol = 2, byrow = T)","T_and_F_symbol_linter" -"R/utils.R",298,24,"style","Use TRUE instead of the symbol T."," fixed = T)","T_and_F_symbol_linter" -"R/utils.R",306,46,"style","Use TRUE instead of the symbol T."," x <- gsub(""
"", ""
"", x, fixed = T)","T_and_F_symbol_linter" -"R/utils.R",308,44,"style","Use TRUE instead of the symbol T."," x <- gsub(""
"", "" "", x, ignore.case = T)","T_and_F_symbol_linter" -"R/utils.R",309,45,"style","Use TRUE instead of the symbol T."," x <- gsub(""
"", "" "", x, ignore.case = T)","T_and_F_symbol_linter" -"R/utils.R",310,46,"style","Use TRUE instead of the symbol T."," x <- gsub("""", "" "", x, ignore.case = T)","T_and_F_symbol_linter" -"R/utils.R",323,28,"style","Use TRUE instead of the symbol T."," free = T)","T_and_F_symbol_linter" -"R/utils.R",327,88,"style","Use TRUE instead of the symbol T."," count(*)) and normalize-space() = '']""), free = T)","T_and_F_symbol_linter" -"R/utils.R",331,67,"style","Use TRUE instead of the symbol T."," xml2::xml_remove(xml2::xml_find_all(doc, ""//header""), free = T)","T_and_F_symbol_linter" -"tests/dev_tests/parse_to_html.R",3,34,"style","Use FALSE instead of the symbol F.","library(dplyr, warn.conflicts = F)","T_and_F_symbol_linter" -"tests/dev_tests/parse_to_html.R",56,55,"style","Use TRUE instead of the symbol T."," include.raw = T,","T_and_F_symbol_linter" -"tests/dev_tests/parse_to_html.R",57,56,"style","Use TRUE instead of the symbol T."," include.path = T)","T_and_F_symbol_linter" -"tests/dev_tests/parse_to_html.R",78,43,"style","Use TRUE instead of the symbol T.","doc <- edgarWebR:::get_doc(href, clean = T)","T_and_F_symbol_linter" -"tests/dev_tests/parse_to_html.R",82,55,"style","Use TRUE instead of the symbol T.","res <- build_parts(edgarWebR:::get_doc(href, clean = T), ""//text"")","T_and_F_symbol_linter" -"tests/testthat/helper_mock.R",36,38,"warning","Conditional expressions require scalar logical operators (&& and ||)","} else if (ewr_mock_bypass == ""true"" | !ewr_has_mocks) {","vector_logic_linter" -"tests/testthat/test_parse_filing.R",15,16,"style","Use TRUE instead of the symbol T."," }, silent = T)","T_and_F_symbol_linter" -"tests/testthat/test_parse_filing.R",20,85,"style","Use TRUE instead of the symbol T."," plain.words <- length(tokenizers::tokenize_words(xml2::xml_text(doc), simplify = T))","T_and_F_symbol_linter" -"tests/testthat/test_parse_filing.R",170,37,"style","Use FALSE instead of the symbol F."," ignore.case = F), ]","T_and_F_symbol_linter" -"vignettes/edgarWebR.Rmd",17,35,"style","Use TRUE instead of the symbol T.","knitr::opts_chunk$set(collapse = T, comment = ""#>"")","T_and_F_symbol_linter" -"vignettes/edgarWebR.Rmd",19,23,"style","Put spaces around all infix operators.","library(dplyr, quietly=TRUE)","infix_spaces_linter" -"vignettes/edgarWebR.Rmd",20,23,"style","Put spaces around all infix operators.","library(purrr, quietly=TRUE)","infix_spaces_linter" -"vignettes/edgarWebR.Rmd",102,29,"style","`%>%` should always have a space before it and a new line after it, unless the full pipeline fits on one line."," group_by(type) %>% summarize(","pipe_continuation_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1,121,"style","Lines should not be more than 120 characters.","structure(list(url = ""/browse-edgar?action=getcompany&CIK=EA&owner=exclude&type=10-&dateb=&start=0&count=100&output=atom"", ","line_length_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1,123,"style","Trailing whitespace is superfluous.","structure(list(url = ""/browse-edgar?action=getcompany&CIK=EA&owner=exclude&type=10-&dateb=&start=0&count=100&output=atom"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2,78,"style","Trailing whitespace is superfluous."," status_code = 200L, headers = structure(list(`content-encoding` = ""gzip"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3,68,"style","Trailing whitespace is superfluous."," `content-type` = ""application/atom+xml"", server = ""Apache"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4,80,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff"", `x-frame-options` = ""SAMEORIGIN"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5,73,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `content-length` = ""8015"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6,78,"style","Trailing whitespace is superfluous."," `cache-control` = ""no-cache"", date = ""Mon, 20 Jan 2020 17:54:21 GMT"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7,61,"style","Trailing whitespace is superfluous."," connection = ""keep-alive"", vary = ""Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8,88,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000 ; includeSubDomains ; preload"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10,69,"style","Trailing whitespace is superfluous."," )), all_headers = list(list(status = 200L, version = ""HTTP/1.1"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11,62,"style","Trailing whitespace is superfluous."," headers = structure(list(`content-encoding` = ""gzip"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12,72,"style","Trailing whitespace is superfluous."," `content-type` = ""application/atom+xml"", server = ""Apache"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13,84,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff"", `x-frame-options` = ""SAMEORIGIN"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",14,77,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `content-length` = ""8015"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",15,82,"style","Trailing whitespace is superfluous."," `cache-control` = ""no-cache"", date = ""Mon, 20 Jan 2020 17:54:21 GMT"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",16,65,"style","Trailing whitespace is superfluous."," connection = ""keep-alive"", vary = ""Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",17,118,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000 ; includeSubDomains ; preload""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",18,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",19,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",20,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",21,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",22,65,"style","Trailing whitespace is superfluous."," content = as.raw(c(0x3c, 0x3f, 0x78, 0x6d, 0x6c, 0x20, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",23,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x73, 0x69, 0x6f, 0x6e, 0x3d, 0x22, 0x31, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",24,64,"style","Trailing whitespace is superfluous."," 0x30, 0x22, 0x20, 0x65, 0x6e, 0x63, 0x6f, 0x64, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",25,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3d, 0x22, 0x49, 0x53, 0x4f, 0x2d, 0x38, 0x38, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",26,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x22, 0x20, 0x3f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",27,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x65, 0x65, 0x64, 0x20, 0x78, 0x6d, 0x6c, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",28,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",29,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x77, 0x33, 0x2e, 0x6f, 0x72, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",30,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x32, 0x30, 0x30, 0x35, 0x2f, 0x41, 0x74, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",31,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",32,64,"style","Trailing whitespace is superfluous."," 0x74, 0x68, 0x6f, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",33,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6d, 0x61, 0x69, 0x6c, 0x3e, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",34,64,"style","Trailing whitespace is superfluous."," 0x65, 0x62, 0x6d, 0x61, 0x73, 0x74, 0x65, 0x72, 0x40, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",35,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x3c, 0x2f, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",36,64,"style","Trailing whitespace is superfluous."," 0x61, 0x69, 0x6c, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",37,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x57, 0x65, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",38,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x73, 0x74, 0x65, 0x72, 0x3c, 0x2f, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",39,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",40,64,"style","Trailing whitespace is superfluous."," 0x61, 0x75, 0x74, 0x68, 0x6f, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",41,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",42,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x66, 0x6f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",43,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",44,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",45,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",46,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",47,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",48,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",49,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x79, 0x3e, 0x52, 0x45, 0x44, 0x57, 0x4f, 0x4f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",50,64,"style","Trailing whitespace is superfluous."," 0x44, 0x20, 0x43, 0x49, 0x54, 0x59, 0x3c, 0x2f, 0x63, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",51,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",52,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x74, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",53,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x43, 0x41, 0x3c, 0x2f, 0x73, 0x74, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",54,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",55,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x74, 0x72, 0x65, 0x65, 0x74, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",56,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x39, 0x20, 0x52, 0x45, 0x44, 0x57, 0x4f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",57,64,"style","Trailing whitespace is superfluous."," 0x4f, 0x44, 0x20, 0x53, 0x48, 0x4f, 0x52, 0x45, 0x53, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",58,64,"style","Trailing whitespace is superfluous."," 0x50, 0x41, 0x52, 0x4b, 0x57, 0x41, 0x59, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",59,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x65, 0x65, 0x74, 0x31, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",60,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",61,64,"style","Trailing whitespace is superfluous."," 0x69, 0x70, 0x3e, 0x39, 0x34, 0x30, 0x36, 0x35, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",62,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x69, 0x70, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",63,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x61, 0x64, 0x64, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",64,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",65,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",66,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x62, 0x75, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",67,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x65, 0x73, 0x73, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",68,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",69,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x79, 0x3e, 0x52, 0x45, 0x44, 0x57, 0x4f, 0x4f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",70,64,"style","Trailing whitespace is superfluous."," 0x44, 0x20, 0x43, 0x49, 0x54, 0x59, 0x3c, 0x2f, 0x63, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",71,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",72,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x70, 0x68, 0x6f, 0x6e, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",73,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x36, 0x35, 0x30, 0x2d, 0x36, 0x32, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",74,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x3c, 0x2f, 0x70, 0x68, 0x6f, 0x6e, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",75,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",76,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x74, 0x61, 0x74, 0x65, 0x3e, 0x43, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",77,64,"style","Trailing whitespace is superfluous."," 0x41, 0x3c, 0x2f, 0x73, 0x74, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",78,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",79,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x74, 0x72, 0x65, 0x65, 0x74, 0x31, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",80,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x20, 0x52, 0x45, 0x44, 0x57, 0x4f, 0x4f, 0x44, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",81,64,"style","Trailing whitespace is superfluous."," 0x20, 0x53, 0x48, 0x4f, 0x52, 0x45, 0x53, 0x20, 0x50, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",82,64,"style","Trailing whitespace is superfluous."," 0x52, 0x4b, 0x57, 0x41, 0x59, 0x3c, 0x2f, 0x73, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",83,64,"style","Trailing whitespace is superfluous."," 0x65, 0x65, 0x74, 0x31, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",84,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x7a, 0x69, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",85,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x39, 0x34, 0x30, 0x36, 0x35, 0x3c, 0x2f, 0x7a, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",86,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",87,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",88,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",89,64,"style","Trailing whitespace is superfluous."," 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, 0x73, 0x65, 0x73, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",90,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",91,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x67, 0x6e, 0x65, 0x64, 0x2d, 0x73, 0x69, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",92,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x37, 0x33, 0x37, 0x32, 0x3c, 0x2f, 0x61, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",93,64,"style","Trailing whitespace is superfluous."," 0x69, 0x67, 0x6e, 0x65, 0x64, 0x2d, 0x73, 0x69, 0x63, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",94,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",95,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x67, 0x6e, 0x65, 0x64, 0x2d, 0x73, 0x69, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",96,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x65, 0x73, 0x63, 0x3e, 0x53, 0x45, 0x52, 0x56, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",97,64,"style","Trailing whitespace is superfluous."," 0x49, 0x43, 0x45, 0x53, 0x2d, 0x50, 0x52, 0x45, 0x50, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",98,64,"style","Trailing whitespace is superfluous."," 0x43, 0x4b, 0x41, 0x47, 0x45, 0x44, 0x20, 0x53, 0x4f, 0x46, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",99,64,"style","Trailing whitespace is superfluous."," 0x54, 0x57, 0x41, 0x52, 0x45, 0x3c, 0x2f, 0x61, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",100,64,"style","Trailing whitespace is superfluous."," 0x69, 0x67, 0x6e, 0x65, 0x64, 0x2d, 0x73, 0x69, 0x63, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",101,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x73, 0x63, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",102,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x73, 0x73, 0x69, 0x67, 0x6e, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",103,64,"style","Trailing whitespace is superfluous."," 0x64, 0x2d, 0x73, 0x69, 0x63, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",104,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",105,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",106,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",107,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",108,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",109,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",110,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x53, 0x49, 0x43, 0x3d, 0x37, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",111,64,"style","Trailing whitespace is superfluous."," 0x37, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",112,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",113,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",114,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x61, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",115,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6e, 0x65, 0x64, 0x2d, 0x73, 0x69, 0x63, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",116,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",117,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x69, 0x6b, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",118,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x3c, 0x2f, 0x63, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",119,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",120,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",121,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",122,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",123,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",124,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",125,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",126,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",127,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x43, 0x49, 0x4b, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",128,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",129,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",130,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",131,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",132,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",133,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",134,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x65, 0x64, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",135,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x45, 0x4c, 0x45, 0x43, 0x54, 0x52, 0x4f, 0x4e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",136,64,"style","Trailing whitespace is superfluous."," 0x49, 0x43, 0x20, 0x41, 0x52, 0x54, 0x53, 0x20, 0x49, 0x4e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",137,64,"style","Trailing whitespace is superfluous."," 0x43, 0x2e, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",138,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x64, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",139,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",140,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x6c, 0x2d, 0x79, 0x65, 0x61, 0x72, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",141,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x3e, 0x30, 0x33, 0x33, 0x31, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",142,64,"style","Trailing whitespace is superfluous."," 0x69, 0x73, 0x63, 0x61, 0x6c, 0x2d, 0x79, 0x65, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",143,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x6e, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",144,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",145,64,"style","Trailing whitespace is superfluous."," 0x79, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x73, 0x20, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",146,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x22, 0x31, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",147,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",148,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",149,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",150,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x30, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",151,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3c, 0x2f, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",152,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",153,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x45, 0x4c, 0x45, 0x43, 0x54, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",154,64,"style","Trailing whitespace is superfluous."," 0x52, 0x4f, 0x4e, 0x49, 0x43, 0x20, 0x41, 0x52, 0x54, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",155,64,"style","Trailing whitespace is superfluous."," 0x20, 0x49, 0x4e, 0x43, 0x3c, 0x2f, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",156,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",157,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x6e, 0x61, 0x6d, 0x65, 0x73, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",158,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",159,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x72, 0x6c, 0x79, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",160,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",161,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x66, 0x66, 0x69, 0x63, 0x65, 0x3e, 0x4f, 0x66, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",162,64,"style","Trailing whitespace is superfluous."," 0x69, 0x63, 0x65, 0x20, 0x6f, 0x66, 0x20, 0x54, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",163,64,"style","Trailing whitespace is superfluous."," 0x68, 0x6e, 0x6f, 0x6c, 0x6f, 0x67, 0x79, 0x3c, 0x2f, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",164,64,"style","Trailing whitespace is superfluous."," 0x66, 0x66, 0x69, 0x63, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",165,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x74, 0x61, 0x74, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",166,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6f, 0x63, 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x3e, 0x43, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",167,64,"style","Trailing whitespace is superfluous."," 0x41, 0x3c, 0x2f, 0x73, 0x74, 0x61, 0x74, 0x65, 0x2d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",168,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x63, 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",169,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x74, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",170,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6c, 0x6f, 0x63, 0x61, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",171,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",172,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",173,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",174,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",175,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",176,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",177,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",178,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x74, 0x65, 0x3d, 0x43, 0x41, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",179,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",180,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",181,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",182,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x74, 0x61, 0x74, 0x65, 0x2d, 0x6c, 0x6f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",183,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",184,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",185,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x74, 0x65, 0x2d, 0x6f, 0x66, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",186,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x72, 0x70, 0x6f, 0x72, 0x61, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",187,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3e, 0x44, 0x45, 0x3c, 0x2f, 0x73, 0x74, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",188,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6f, 0x66, 0x2d, 0x69, 0x6e, 0x63, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",189,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",190,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",191,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x2d, 0x69, 0x6e, 0x66, 0x6f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",192,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",193,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",194,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",195,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",196,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",197,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",198,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",199,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",200,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",201,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",202,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",203,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",204,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",205,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",206,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",207,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",208,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x32, 0x39, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",209,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",210,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",211,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",212,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",213,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",214,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",215,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",216,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",217,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",218,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",219,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",220,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",221,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",222,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",223,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",224,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",225,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",226,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",227,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",228,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",229,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",230,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",231,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",232,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",233,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",234,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",235,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",236,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",237,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",238,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",239,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",240,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",241,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",242,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",243,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",244,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",245,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",246,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x32, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",247,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",248,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x31, 0x32, 0x39, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",249,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",250,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",251,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",252,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",253,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",254,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",255,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",256,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",257,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x39, 0x31, 0x31, 0x39, 0x34, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",258,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",259,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",260,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",261,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",262,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",263,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",264,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",265,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",266,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",267,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",268,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",269,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",270,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",271,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",272,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",273,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",274,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",275,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",276,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",277,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",278,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",279,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",280,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",281,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x31, 0x32, 0x39, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",282,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",283,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",284,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",285,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",286,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",287,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",288,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",289,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",290,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",291,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",292,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",293,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",294,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",295,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",296,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",297,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",298,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",299,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",300,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",301,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x31, 0x39, 0x30, 0x30, 0x30, 0x31, 0x32, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",302,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",303,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",304,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",305,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",306,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",307,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",308,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",309,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",310,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",311,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",312,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",313,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",314,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x39, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",315,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",316,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",317,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",318,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",319,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x32, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",320,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",321,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",322,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x33, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",323,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",324,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",325,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",326,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",327,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",328,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",329,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",330,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",331,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",332,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",333,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x35, 0x54, 0x31, 0x39, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",334,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x3a, 0x32, 0x33, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",335,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",336,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",337,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",338,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",339,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",340,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",341,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",342,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",343,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",344,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",345,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",346,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",347,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",348,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",349,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",350,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",351,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",352,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",353,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",354,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x34, 0x39, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",355,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",356,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",357,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",358,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",359,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",360,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",361,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",362,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",363,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",364,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",365,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",366,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",367,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",368,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",369,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",370,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",371,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",372,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",373,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",374,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",375,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",376,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",377,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",378,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",379,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",380,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",381,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",382,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",383,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",384,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",385,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",386,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",387,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",388,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",389,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",390,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",391,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x31, 0x39, 0x30, 0x30, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",392,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",393,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",394,64,"style","Trailing whitespace is superfluous."," 0x34, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",395,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",396,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",397,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",398,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",399,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",400,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",401,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",402,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",403,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x32, 0x33, 0x31, 0x35, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",404,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",405,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",406,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",407,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",409,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",410,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",411,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",412,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",413,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",414,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",415,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",416,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",417,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",418,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",419,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",420,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",421,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",422,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",423,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",424,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",425,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",426,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",427,64,"style","Trailing whitespace is superfluous."," 0x34, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",428,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",429,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",430,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",431,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",432,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",433,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",434,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",435,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",436,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",437,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",438,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",439,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",440,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",441,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",442,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",443,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",444,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",445,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",446,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x39, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",447,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x34, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",448,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",449,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",450,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",451,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",452,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",453,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",454,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",455,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",456,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",457,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",458,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",459,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",460,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x36, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",461,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",462,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",463,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",464,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",465,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x34, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",466,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",467,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",468,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",469,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",470,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",471,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",472,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",473,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",474,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",475,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",476,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",477,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",478,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",479,64,"style","Trailing whitespace is superfluous."," 0x36, 0x54, 0x31, 0x36, 0x3a, 0x31, 0x38, 0x3a, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",480,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",481,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",482,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",483,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",484,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",485,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",486,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",487,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",488,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",489,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",490,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",491,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",492,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",493,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",494,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",495,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",496,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",497,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",498,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",499,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x39, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",500,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",501,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",502,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",503,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",504,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",505,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",506,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",507,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",508,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",509,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",510,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",511,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",512,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",513,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",514,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",515,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",516,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",517,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",518,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",519,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",520,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",521,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",522,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",523,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",524,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",525,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",526,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",527,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",528,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",529,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",530,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",531,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",532,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",533,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",534,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",535,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",536,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",537,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x31, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",538,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",539,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x39, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",540,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",541,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",542,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",543,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",544,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",545,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",546,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",547,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",548,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x39, 0x38, 0x35, 0x31, 0x38, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",549,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",550,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",551,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",552,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",553,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",554,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",555,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",556,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",557,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",558,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",559,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",560,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x36, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",561,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",562,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",563,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",564,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",565,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",566,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",567,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",568,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",569,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",570,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",571,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",572,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",573,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",574,64,"style","Trailing whitespace is superfluous."," 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",575,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",576,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",577,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",578,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",579,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",580,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",581,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",582,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",583,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",584,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",585,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",586,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",587,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",588,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",589,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",590,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",591,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",592,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",593,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x39, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",594,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",595,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",596,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",597,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",598,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",599,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",600,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",601,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",602,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",603,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",604,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",605,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",606,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",607,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x34, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",608,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",609,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",610,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",611,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",612,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",613,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",614,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",615,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",616,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",617,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",618,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",619,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",620,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",621,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",622,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",623,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",624,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",625,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",626,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",627,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x33, 0x54, 0x32, 0x30, 0x3a, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",628,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x35, 0x34, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",629,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",630,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",631,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",632,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",633,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",634,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",635,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",636,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",637,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",638,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",639,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",640,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",641,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",642,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",643,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",644,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",645,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",646,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",647,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",648,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",649,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",650,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",651,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",652,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",653,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",654,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",655,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",656,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",657,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",658,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",659,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",660,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",661,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",662,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",663,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",664,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",665,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",666,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",667,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",668,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",669,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",670,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",671,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",672,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",673,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",674,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",675,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",676,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",677,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",678,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",679,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",680,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",681,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",682,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",683,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",684,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",685,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x31, 0x39, 0x30, 0x30, 0x30, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",686,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",687,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",688,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",689,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",690,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",691,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",692,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",693,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",694,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",695,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",696,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",697,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x38, 0x32, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",698,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",699,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",700,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",701,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",702,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",703,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",704,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",705,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",706,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",707,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",708,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",709,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",710,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",711,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",712,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",713,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",714,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",715,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",716,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",717,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",718,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",719,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",720,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",721,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",722,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",723,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",724,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",725,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",726,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",727,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",728,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",729,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",730,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",731,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",732,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x34, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",733,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",734,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",735,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",736,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",737,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",738,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",739,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",740,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x39, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",741,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",742,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",743,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",744,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",745,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",746,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",747,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",748,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",749,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",750,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",751,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",752,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",753,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",754,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",755,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",756,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",757,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",758,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",759,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",760,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",761,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",762,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",763,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",764,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",765,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",766,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",767,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",768,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",769,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",770,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",771,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",772,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x54, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",773,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x3a, 0x32, 0x30, 0x3a, 0x32, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",774,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",775,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",776,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",777,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",778,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",779,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",780,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",781,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",782,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",783,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",784,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",785,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",786,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",787,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",788,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",789,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",790,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",791,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",792,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",793,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, 0x39, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",794,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",795,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",796,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",797,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",798,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",799,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",800,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",801,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",802,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",803,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",804,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",805,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",806,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",807,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",808,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",809,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",810,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",811,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",812,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",813,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",814,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",815,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",816,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",817,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",818,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",819,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",820,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",821,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",822,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",823,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",824,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",825,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",826,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",827,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",828,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",829,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",830,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x38, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",831,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",832,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",833,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",834,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",835,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",836,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",837,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",838,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",839,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",840,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",841,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",842,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x38, 0x31, 0x31, 0x36, 0x33, 0x33, 0x33, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",843,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",844,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",845,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",846,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",847,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",848,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",849,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",850,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",851,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",852,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",853,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",854,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",855,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",856,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",857,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",858,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",859,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",860,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",861,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",862,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",863,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",864,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",865,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",866,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",867,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",868,64,"style","Trailing whitespace is superfluous."," 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",869,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",870,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",871,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",872,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",873,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",874,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",875,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",876,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",877,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, 0x39, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",878,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",879,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",880,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",881,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",882,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",883,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",884,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",885,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",886,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x30, 0x30, 0x30, 0x30, 0x35, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",887,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",888,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",889,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",890,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",891,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",892,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",893,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",894,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",895,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",896,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",897,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",898,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",899,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",900,64,"style","Trailing whitespace is superfluous."," 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",901,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",902,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",903,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",904,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, 0x39, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",905,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",906,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",907,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x31, 0x33, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",908,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",909,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",910,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",911,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",912,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",913,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",914,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",915,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",916,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",917,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",918,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x36, 0x54, 0x31, 0x36, 0x3a, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",919,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x32, 0x36, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",920,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",921,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",922,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",923,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",924,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",925,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",926,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",927,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",928,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",929,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",930,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",931,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",932,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",933,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",934,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",935,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",936,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",937,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",938,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",939,64,"style","Trailing whitespace is superfluous."," 0x34, 0x35, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",940,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",941,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",942,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",943,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",944,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",945,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",946,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",947,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",948,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",949,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",950,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",951,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",952,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",953,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",954,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",955,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",956,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",957,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",958,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",959,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",960,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",961,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",962,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",963,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",964,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",965,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",966,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",967,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",968,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",969,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",970,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",971,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",972,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",973,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",974,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",975,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",976,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x38, 0x30, 0x30, 0x30, 0x30, 0x34, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",977,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",978,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",979,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",980,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",981,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",982,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",983,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",984,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",985,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",986,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",987,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x38, 0x39, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",988,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",989,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",990,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",991,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",992,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",993,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",994,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",995,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",996,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",997,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",998,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x32, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",999,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1000,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1001,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1002,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1003,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1004,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1005,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1006,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1007,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1008,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1009,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1010,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1011,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x35, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1012,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1013,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1014,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1015,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1016,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1017,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1018,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1019,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1020,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1021,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1022,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1023,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1024,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1025,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1026,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1027,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1028,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1029,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1030,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1031,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x31, 0x38, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1032,64,"style","Trailing whitespace is superfluous."," 0x34, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1033,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1034,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1035,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1036,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1037,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1038,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1039,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1040,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1041,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1042,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1043,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1044,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1045,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x30, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1046,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1047,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1048,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1049,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1050,64,"style","Trailing whitespace is superfluous."," 0x34, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1051,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1052,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1053,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1054,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1055,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1056,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1057,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1058,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1059,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1060,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1061,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1062,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1063,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x37, 0x54, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1064,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3a, 0x30, 0x33, 0x3a, 0x33, 0x30, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1065,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1066,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1067,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1068,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1069,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1070,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1071,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1072,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1073,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1074,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1075,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1076,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1077,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1078,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1079,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1080,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1081,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1082,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1083,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1084,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x32, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1085,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1086,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1087,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1088,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1089,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1090,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1091,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1092,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1093,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1094,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1095,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1096,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1097,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1098,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1099,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1100,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1101,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1102,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1103,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1104,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1105,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1106,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1107,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1108,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1109,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1110,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1111,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1112,64,"style","Trailing whitespace is superfluous."," 0x32, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1113,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1114,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1115,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1116,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1117,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1118,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1119,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1120,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1121,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x38, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1122,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1123,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1124,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1125,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1126,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1127,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1128,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1129,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1130,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1131,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1132,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1133,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x38, 0x35, 0x35, 0x34, 0x37, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1134,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1135,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1136,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1137,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1138,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1139,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1140,64,"style","Trailing whitespace is superfluous."," 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1141,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1142,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1143,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1144,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1145,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x31, 0x35, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1146,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1147,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1148,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1149,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1150,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1151,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1152,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1153,64,"style","Trailing whitespace is superfluous."," 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1154,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1155,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1156,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1157,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1158,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, 0x34, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1159,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1160,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1161,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1162,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1163,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1164,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1165,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1166,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1167,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1168,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1169,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1170,64,"style","Trailing whitespace is superfluous."," 0x32, 0x34, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1171,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1172,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1173,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1174,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1175,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1176,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1177,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1178,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x31, 0x38, 0x30, 0x30, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1179,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1180,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1181,64,"style","Trailing whitespace is superfluous."," 0x32, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1182,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1183,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1184,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1185,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1186,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1187,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1188,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1189,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1190,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1191,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1192,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x32, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1193,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1194,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1195,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1196,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1197,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1198,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1199,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x35, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1200,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1201,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1202,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1203,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1204,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1205,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1206,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1207,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1208,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1209,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1210,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1211,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1212,64,"style","Trailing whitespace is superfluous."," 0x32, 0x33, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1213,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1214,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1215,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1216,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1217,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1218,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1219,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1220,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1221,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1222,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1223,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1224,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1225,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1226,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1227,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1228,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1229,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1230,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1231,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1232,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1233,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1234,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1235,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1236,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1237,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1238,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1239,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1240,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1241,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1242,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1243,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1244,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1245,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1246,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1247,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1248,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1249,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1250,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1251,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1252,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1253,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1254,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1255,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1256,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1257,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1258,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1259,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1260,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1261,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1262,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1263,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1264,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1265,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1266,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1267,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1268,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1269,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1270,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x30, 0x30, 0x30, 0x30, 0x38, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1271,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1272,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x38, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1273,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1274,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1275,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1276,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1277,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1278,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1279,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1280,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1281,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x31, 0x38, 0x35, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1282,64,"style","Trailing whitespace is superfluous."," 0x36, 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1283,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1284,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1285,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1286,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1287,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1288,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1289,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1290,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1291,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1292,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1293,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1294,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1295,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1296,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1297,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1298,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1299,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1300,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1301,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1302,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1303,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1304,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1305,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1306,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1307,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1308,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1309,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1310,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1311,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1312,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1313,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1314,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1315,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1316,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1317,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1318,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1319,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1320,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1321,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1322,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1323,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1324,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1325,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x31, 0x38, 0x30, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1326,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1327,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1328,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1329,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1330,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1331,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1332,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1333,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1334,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1335,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1336,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1337,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1338,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1339,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1340,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1341,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1342,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1343,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1344,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1345,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1346,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1347,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1348,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1349,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1350,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1351,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1352,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1353,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1354,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1355,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1356,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1357,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1358,64,"style","Trailing whitespace is superfluous."," 0x32, 0x32, 0x3a, 0x32, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1359,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1360,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1361,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1362,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1363,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1364,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1365,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1366,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1367,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1368,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1369,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1370,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1371,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1372,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1373,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1374,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1375,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1376,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1377,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1378,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x38, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1379,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1380,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1381,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1382,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1383,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1384,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1385,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1386,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1387,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1388,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1389,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1390,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1391,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1392,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1393,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1394,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1395,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1396,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1397,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1398,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1399,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1400,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1401,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1402,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1403,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1404,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1405,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x37, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1406,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1407,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1409,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1410,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1411,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1412,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1413,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1414,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1415,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x31, 0x37, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1416,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1417,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1418,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1419,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1420,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1421,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1422,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1423,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1424,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1425,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1426,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1427,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x38, 0x30, 0x35, 0x32, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1428,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1429,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1430,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1431,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1432,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1433,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1434,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1435,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1436,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1437,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x39, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1438,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1439,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1440,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1441,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1442,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1443,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1444,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1445,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1446,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1447,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1448,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1449,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1450,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1451,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1452,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1453,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1454,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1455,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1456,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1457,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1458,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1459,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1460,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1461,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1462,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1463,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1464,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1465,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1466,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1467,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1468,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1469,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1470,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x37, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1471,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1472,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1473,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1474,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1475,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1476,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1477,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1478,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1479,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1480,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1481,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1482,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1483,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1484,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x37, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1485,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1486,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1487,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1488,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1489,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1490,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1491,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1492,64,"style","Trailing whitespace is superfluous."," 0x39, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1493,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1494,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1495,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1496,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1497,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1498,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1499,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1500,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1501,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1502,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x37, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x36, 0x54, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1503,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x3a, 0x35, 0x36, 0x3a, 0x33, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1504,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1505,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1506,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1507,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1508,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1509,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1510,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1511,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1512,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1513,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1514,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1515,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1516,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1517,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1518,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1519,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1520,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1521,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1522,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1523,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1524,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1525,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1526,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1527,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1528,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1529,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1530,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1531,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1532,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1533,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1534,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1535,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1536,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1537,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1538,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1539,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1540,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1541,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1542,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1543,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1544,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1545,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1546,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1547,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1548,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1549,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1550,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1551,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1552,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1553,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1554,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1555,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1556,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1557,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1558,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1559,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1560,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x37, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1561,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x36, 0x33, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1562,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1563,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x36, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1564,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1565,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1566,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1567,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1568,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1569,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1570,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1571,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1572,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x37, 0x31, 0x30, 0x31, 0x35, 0x35, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1573,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1574,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1575,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1576,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1577,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1578,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1579,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1580,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1581,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1582,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1583,64,"style","Trailing whitespace is superfluous."," 0x38, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1584,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1585,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1586,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1587,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1588,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1589,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1590,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1591,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1592,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1593,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1594,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1595,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1596,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x36, 0x33, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1597,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1598,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1599,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1600,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1601,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1602,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1603,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1604,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1605,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1606,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1607,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1608,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1609,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1610,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1611,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1612,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1613,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1614,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1615,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1616,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1617,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1618,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1619,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1620,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1621,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1622,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1623,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1624,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1625,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1626,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1627,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1628,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1629,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1630,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1631,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1632,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1633,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1634,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1635,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1636,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1637,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x38, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1638,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1639,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1640,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1641,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1642,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1643,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1644,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1645,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1646,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1647,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1648,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x54, 0x31, 0x37, 0x3a, 0x30, 0x35, 0x3a, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1649,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1650,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1651,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1652,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1653,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1654,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1655,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1656,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1657,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1658,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1659,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1660,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1661,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1662,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1663,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1664,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1665,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1666,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1667,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1668,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1669,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1670,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1671,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1672,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1673,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1674,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1675,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1676,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1677,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1678,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1679,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1680,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1681,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1682,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1683,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1684,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1685,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1686,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1687,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1688,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1689,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1690,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1691,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1692,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1693,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1694,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1695,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1696,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x34, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1697,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1698,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1699,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1700,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1701,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1702,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1703,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1704,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1705,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1706,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x30, 0x30, 0x30, 0x33, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1707,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1708,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x35, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1709,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1710,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1711,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1712,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1713,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1714,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1715,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1716,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1717,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x31, 0x37, 0x38, 0x36, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1718,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1719,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1720,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1721,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1722,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1723,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1724,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1725,64,"style","Trailing whitespace is superfluous."," 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1726,64,"style","Trailing whitespace is superfluous."," 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1727,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1728,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1729,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1730,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1731,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1732,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1733,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1734,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1735,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1736,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1737,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1738,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1739,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1740,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1741,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1742,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1743,64,"style","Trailing whitespace is superfluous."," 0x33, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1744,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1745,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1746,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1747,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1748,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1749,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1750,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1751,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1752,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1753,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1754,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x33, 0x35, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1755,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1756,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1757,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1758,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1759,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1760,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1761,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1762,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x37, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1763,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x33, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1764,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1765,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x33, 0x35, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1766,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1767,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1768,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1769,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1770,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1771,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1772,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1773,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1774,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1775,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1776,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x34, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1777,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1778,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1779,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1780,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1781,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x33, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1782,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1783,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1784,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1785,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1786,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1787,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1788,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1789,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1790,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1791,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1792,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1793,64,"style","Trailing whitespace is superfluous."," 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1794,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1795,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1796,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x34, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1797,64,"style","Trailing whitespace is superfluous."," 0x34, 0x31, 0x3a, 0x31, 0x32, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1798,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1799,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1800,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1801,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1802,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1803,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1804,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1805,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1806,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1807,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1808,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1809,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1810,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1811,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1812,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1813,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1814,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1815,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1816,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1817,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1818,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1819,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1820,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1821,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1822,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1823,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1824,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1825,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1826,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1827,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1828,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1829,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1830,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1831,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1832,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1833,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1834,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1835,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1836,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1837,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1838,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1839,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1840,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1841,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1842,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1843,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1844,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1845,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1846,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1847,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1848,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1849,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1850,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1851,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1852,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1853,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1854,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x31, 0x37, 0x30, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1855,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1856,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1857,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1858,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1859,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1860,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1861,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1862,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1863,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1864,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1865,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1866,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x39, 0x32, 0x37, 0x36, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1867,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1868,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1869,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1870,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1871,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1872,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1873,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1874,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1875,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1876,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x30, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1877,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1878,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1879,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1880,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1881,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1882,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1883,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1884,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1885,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1886,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1887,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1888,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1889,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1890,64,"style","Trailing whitespace is superfluous."," 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1891,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1892,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1893,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1894,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1895,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1896,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1897,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1898,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1899,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1900,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1901,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1902,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1903,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1904,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1905,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1906,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1907,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1908,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1909,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x37, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1910,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1911,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1912,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1913,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1914,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1915,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1916,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1917,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1918,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1919,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1920,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1921,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1922,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1923,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x37, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1924,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1925,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1926,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1927,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1928,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1929,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1930,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1931,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1932,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1933,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1934,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1935,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1936,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1937,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1938,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1939,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1940,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1941,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1942,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x36, 0x3a, 0x31, 0x38, 0x3a, 0x35, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1943,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1944,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1945,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1946,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1947,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1948,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1949,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1950,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1951,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1952,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1953,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1954,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1955,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1956,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1957,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1958,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1959,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1960,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1961,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1962,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x34, 0x39, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1963,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1964,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1965,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1966,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1967,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1968,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1969,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1970,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1971,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1972,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1973,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1974,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1975,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1976,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1977,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1978,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1979,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1980,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1981,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1982,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1983,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1984,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1985,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1986,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1987,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1988,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1989,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1990,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1991,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1992,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1993,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1994,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1995,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1996,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1997,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1998,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1999,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x36, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2000,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x34, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2001,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2002,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x34, 0x39, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2003,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2004,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2005,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2006,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2007,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2008,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2009,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2010,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2011,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x31, 0x36, 0x31, 0x39, 0x38, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2012,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2013,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2014,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2015,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2016,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2017,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2018,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2019,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2020,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2021,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2022,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2023,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2024,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2025,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2026,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2027,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2028,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2029,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2030,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2031,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2032,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2033,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2034,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2035,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x34, 0x39, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2036,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2037,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2038,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2039,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2040,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2041,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2042,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2043,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2044,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2045,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2046,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x34, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2047,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2048,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2049,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2050,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2051,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2052,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2053,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2054,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2055,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x36, 0x30, 0x30, 0x30, 0x31, 0x34, 0x39, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2056,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2057,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x34, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2058,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2059,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2060,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2061,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2062,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2063,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2064,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2065,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2066,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2067,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2068,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2069,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2070,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2071,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2072,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2073,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x34, 0x39, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2074,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2075,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2076,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x30, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2077,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2078,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2079,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2080,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2081,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2082,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2083,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2084,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2085,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2086,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2087,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x38, 0x54, 0x31, 0x36, 0x3a, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2088,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3a, 0x34, 0x37, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2089,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2090,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2091,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2092,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2093,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2094,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2095,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2096,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2097,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2098,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2099,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2100,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2101,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2102,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2103,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2104,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2105,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2106,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2107,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2108,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x38, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2109,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2110,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2111,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2112,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2113,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2114,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2115,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2116,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2117,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2118,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2119,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2120,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2121,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2122,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2123,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2124,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2125,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2126,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2127,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2128,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2129,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2130,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2131,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2132,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2133,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2134,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2135,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2136,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2137,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2138,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2139,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2140,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2141,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2142,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2143,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2144,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2145,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x31, 0x36, 0x30, 0x30, 0x30, 0x31, 0x33, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2146,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2147,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2148,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2149,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2150,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2151,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2152,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2153,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2154,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2155,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2156,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2157,64,"style","Trailing whitespace is superfluous."," 0x38, 0x31, 0x38, 0x32, 0x37, 0x39, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2158,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2159,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2160,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2161,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2162,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2163,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2164,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2165,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2166,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2167,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x39, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2168,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2169,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2170,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2171,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2172,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2173,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2174,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2175,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2176,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2177,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2178,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2179,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2180,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x33, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2181,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2182,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2183,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2184,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2185,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2186,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2187,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2188,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2189,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2190,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2191,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2192,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2193,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2194,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2195,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2196,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2197,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2198,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2199,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2200,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x36, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2201,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2202,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2203,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2204,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2205,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2206,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2207,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2208,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2209,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2210,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2211,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2212,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2213,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2214,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2215,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2216,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2217,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2218,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2219,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2220,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2221,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2222,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2223,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2224,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2225,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2226,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2227,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2228,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2229,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2230,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2231,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2232,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, 0x54, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2233,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x32, 0x35, 0x3a, 0x34, 0x37, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2234,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2235,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2236,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2237,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2238,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2239,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2240,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2241,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2242,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2243,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2244,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2245,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2246,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2247,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2248,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2249,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2250,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2251,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2252,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2253,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x31, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2254,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2255,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2256,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2257,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2258,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2259,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2260,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2261,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2262,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2263,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2264,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2265,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2266,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2267,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2268,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2269,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2270,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2271,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2272,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2273,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2274,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2275,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2276,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2277,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2278,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2279,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2280,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2281,64,"style","Trailing whitespace is superfluous."," 0x32, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2282,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2283,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2284,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2285,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2286,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2287,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2288,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2289,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2290,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x36, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2291,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2292,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2293,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2294,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2295,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2296,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2297,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2298,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2299,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2300,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2301,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2302,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x36, 0x37, 0x39, 0x37, 0x33, 0x38, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2303,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2304,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2305,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2306,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2307,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2308,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2309,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2310,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2311,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2312,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2313,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2314,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x35, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2315,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2316,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2317,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2318,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2319,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2320,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2321,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2322,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2323,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2324,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2325,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2326,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2327,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x31, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2328,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2329,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2330,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2331,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2332,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2333,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2334,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2335,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2336,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2337,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2338,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2339,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2340,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2341,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2342,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2343,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2344,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2345,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2346,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2347,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x31, 0x36, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2348,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2349,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2350,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2351,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2352,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2353,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2354,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2355,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2356,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2357,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2358,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2359,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2360,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2361,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2362,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2363,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2364,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2365,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2366,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2367,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2368,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2369,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2370,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2371,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2372,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2373,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2374,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2375,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2376,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2377,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2378,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2379,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2380,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2381,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x36, 0x54, 0x31, 0x39, 0x3a, 0x34, 0x33, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2382,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2383,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2384,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2385,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2386,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2387,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2388,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2389,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2390,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2391,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2392,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2393,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2394,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2395,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2396,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2397,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2398,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2399,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2400,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2401,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2402,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2403,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2404,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2405,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2406,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2407,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2408,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2409,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2410,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2411,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2412,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2413,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2414,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2415,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2416,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2417,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2418,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2419,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2420,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2421,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2422,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2423,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2424,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2425,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2426,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2427,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2428,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2429,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2430,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2431,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2432,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2433,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2434,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2435,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2436,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2437,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2438,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2439,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x30, 0x30, 0x30, 0x30, 0x38, 0x36, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2440,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2441,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2442,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2443,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2444,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2445,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2446,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2447,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2448,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2449,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2450,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x36, 0x31, 0x33, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2451,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x32, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2452,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2453,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2454,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2455,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2456,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2457,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2458,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2459,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2460,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2461,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2462,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2463,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2464,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2465,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2466,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2467,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2468,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2469,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2470,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2471,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2472,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2473,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2474,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x36, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2475,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2476,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2477,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2478,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2479,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2480,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2481,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2482,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2483,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2484,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2485,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2486,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x36, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2487,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2488,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2489,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2490,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2491,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2492,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2493,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2494,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x31, 0x36, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2495,64,"style","Trailing whitespace is superfluous."," 0x38, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2496,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2497,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2498,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2499,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2500,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2501,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2502,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2503,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2504,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2505,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2506,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2507,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2508,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2509,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2510,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2511,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2512,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2513,64,"style","Trailing whitespace is superfluous."," 0x38, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2514,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2515,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2516,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2517,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2518,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2519,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2520,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2521,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2522,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2523,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2524,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2525,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2526,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x38, 0x54, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2527,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x33, 0x33, 0x3a, 0x34, 0x35, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2528,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2529,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2530,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2531,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2532,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2533,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2534,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2535,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2536,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2537,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2538,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2539,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2540,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2541,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2542,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2543,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2544,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2545,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2546,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2547,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x30, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2548,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2549,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2550,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2551,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2552,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2553,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2554,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2555,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2556,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2557,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2558,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2559,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2560,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2561,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2562,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2563,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2564,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2565,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2566,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2567,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2568,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2569,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2570,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2571,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2572,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2573,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2574,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2575,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2576,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2577,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2578,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2579,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2580,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2581,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2582,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2583,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2584,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2585,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x30, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2586,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2587,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2588,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2589,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2590,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2591,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2592,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2593,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2594,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2595,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2596,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x31, 0x32, 0x31, 0x39, 0x33, 0x39, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2597,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2598,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2599,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2600,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2601,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2602,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2603,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2604,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2605,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2606,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2607,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2608,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2609,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2610,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2611,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2612,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2613,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2614,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2615,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2616,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2617,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2618,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2619,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2620,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2621,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2622,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2623,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2624,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2625,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2626,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2627,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2628,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2629,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2630,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2631,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2632,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2633,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2634,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2635,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2636,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2637,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2638,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2639,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2640,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x30, 0x37, 0x30, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2641,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2642,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x30, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2643,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2644,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2645,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2646,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2647,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2648,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2649,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2650,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2651,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2652,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2653,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2654,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2655,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2656,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2657,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2658,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x30, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2659,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2660,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2661,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2662,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2663,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2664,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2665,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2666,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2667,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2668,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2669,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2670,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2671,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2672,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x36, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2673,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2674,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2675,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2676,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2677,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2678,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2679,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2680,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2681,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2682,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2683,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2684,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2685,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2686,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2687,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2688,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2689,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2690,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2691,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2692,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2693,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2694,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2695,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2696,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2697,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2698,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2699,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2700,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2701,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2702,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2703,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2704,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2705,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2706,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2707,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2708,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2709,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2710,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2711,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2712,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2713,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2714,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2715,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2716,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2717,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2718,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2719,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2720,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x31, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2721,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2722,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2723,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2724,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2725,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2726,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2727,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2728,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2729,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2730,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x30, 0x30, 0x30, 0x30, 0x35, 0x33, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2731,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2732,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, 0x33, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2733,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2734,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2735,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2736,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2737,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2738,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2739,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2740,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2741,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x35, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2742,64,"style","Trailing whitespace is superfluous."," 0x34, 0x34, 0x35, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2743,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2744,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2745,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2746,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2747,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2748,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2749,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2750,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2751,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2752,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x39, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2753,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2754,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2755,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2756,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2757,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2758,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2759,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2760,64,"style","Trailing whitespace is superfluous."," 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2761,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2762,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2763,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2764,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2765,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, 0x33, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2766,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2767,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2768,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2769,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2770,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2771,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2772,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2773,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2774,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2775,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2776,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2777,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2778,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2779,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2780,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2781,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2782,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2783,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2784,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2785,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x31, 0x35, 0x30, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2786,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2787,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2788,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2789,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2790,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2791,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2792,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2793,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2794,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2795,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2796,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2797,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2798,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2799,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x31, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2800,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2801,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2802,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2803,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2804,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2805,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2806,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x39, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2807,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2808,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2809,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2810,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2811,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2812,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2813,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2814,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2815,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2816,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2817,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x31, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2818,64,"style","Trailing whitespace is superfluous."," 0x34, 0x34, 0x3a, 0x30, 0x32, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2819,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2820,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2821,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2822,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2823,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2824,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2825,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2826,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2827,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2828,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2829,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2830,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2831,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2832,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2833,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2834,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2835,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2836,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2837,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2838,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x33, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2839,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2840,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2841,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2842,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2843,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2844,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2845,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2846,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2847,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2848,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2849,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2850,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2851,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2852,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2853,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2854,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2855,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2856,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2857,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2858,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2859,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2860,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2861,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2862,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2863,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2864,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2865,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2866,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2867,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2868,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2869,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2870,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2871,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2872,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2873,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2874,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2875,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x31, 0x35, 0x30, 0x30, 0x30, 0x30, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2876,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2877,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2878,64,"style","Trailing whitespace is superfluous."," 0x33, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2879,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2880,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2881,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2882,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2883,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2884,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2885,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2886,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2887,64,"style","Trailing whitespace is superfluous."," 0x38, 0x38, 0x33, 0x33, 0x32, 0x31, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2888,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2889,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2890,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2891,64,"style","Trailing whitespace is superfluous."," 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2892,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2893,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2894,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2895,64,"style","Trailing whitespace is superfluous."," 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2896,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2897,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2898,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2899,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2900,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2901,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2902,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2903,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2904,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2905,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2906,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2907,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2908,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2909,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2910,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2911,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2912,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x33, 0x33, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2913,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2914,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2915,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2916,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2917,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2918,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2919,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2920,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2921,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2922,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2923,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2924,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2925,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2926,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2927,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2928,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2929,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2930,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2931,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2932,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x30, 0x30, 0x30, 0x30, 0x33, 0x33, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2933,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2934,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2935,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2936,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2937,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2938,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2939,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2940,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2941,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2942,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2943,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2944,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2945,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2946,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2947,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2948,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2949,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2950,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2951,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2952,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2953,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x31, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2954,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2955,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2956,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2957,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2958,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2959,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2960,64,"style","Trailing whitespace is superfluous."," 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2961,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2962,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2963,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2964,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2965,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2966,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x36, 0x3a, 0x34, 0x36, 0x3a, 0x32, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2967,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2968,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2969,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2970,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2971,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2972,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2973,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2974,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2975,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2976,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2977,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2978,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2979,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2980,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2981,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2982,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2983,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2984,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2985,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2986,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2987,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2988,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2989,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2990,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2991,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2992,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2993,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2994,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2995,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2996,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2997,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2998,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2999,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3000,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3001,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3002,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3003,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3004,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3005,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3006,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3007,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3008,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3009,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3010,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3011,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3012,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3013,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3014,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3015,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3016,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3017,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3018,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3019,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3020,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3021,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3022,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3023,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3024,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x32, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3025,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3026,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x31, 0x32, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3027,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3028,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3029,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3030,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3031,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3032,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3033,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3034,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3035,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x31, 0x35, 0x35, 0x37, 0x35, 0x38, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3036,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3037,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3038,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3039,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3040,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3041,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3042,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3043,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3044,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3045,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3046,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3047,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3048,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3049,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3050,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3051,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3052,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3053,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3054,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3055,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3056,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3057,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3058,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3059,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3060,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3061,64,"style","Trailing whitespace is superfluous."," 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3062,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3063,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3064,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3065,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3066,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3067,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3068,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3069,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3070,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x32, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3071,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3072,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3073,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3074,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3075,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3076,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3077,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3078,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3079,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x30, 0x30, 0x30, 0x30, 0x31, 0x32, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3080,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3081,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3082,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3083,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3084,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3085,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3086,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3087,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3088,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3089,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3090,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3091,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3092,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3093,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3094,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3095,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3096,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3097,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x32, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3098,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3099,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3100,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x31, 0x36, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3101,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3102,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3103,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3104,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3105,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3106,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3107,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3108,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3109,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3110,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3111,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x34, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3112,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x35, 0x38, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3113,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3114,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3115,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3116,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3117,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3118,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3119,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3120,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3121,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3122,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3123,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3124,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3125,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3126,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3127,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3128,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3129,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3130,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3131,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3132,64,"style","Trailing whitespace is superfluous."," 0x36, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3133,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3134,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3135,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3136,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3137,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3138,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3139,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3140,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3141,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3142,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3143,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3144,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3145,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3146,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3147,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3148,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3149,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3150,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3151,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3152,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3153,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3154,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3155,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3156,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3157,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3158,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3159,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3160,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3161,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3162,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3163,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3164,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3165,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3166,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3167,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3168,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3169,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x34, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3170,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3171,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3172,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3173,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3174,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3175,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3176,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3177,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3178,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3179,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3180,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x34, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3181,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x37, 0x39, 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3182,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3183,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3184,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3185,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3186,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3187,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3188,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3189,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3190,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3191,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x35, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3192,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3193,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3194,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3195,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3196,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3197,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3198,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3199,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3200,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3201,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3202,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3203,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3204,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3205,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3206,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3207,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3208,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3209,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3210,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3211,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3212,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3213,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3214,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3215,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3216,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x36, 0x33, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3217,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3218,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3219,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3220,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3221,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3222,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3223,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3224,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x34, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3225,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x33, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3226,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3227,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x36, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3228,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3229,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3230,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3231,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3232,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3233,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3234,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3235,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3236,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3237,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3238,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x34, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3239,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3240,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3241,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3242,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3243,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3244,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3245,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3246,64,"style","Trailing whitespace is superfluous."," 0x35, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3247,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3248,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3249,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3250,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3251,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3252,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3253,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3254,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3255,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3256,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x34, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x34, 0x54, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3257,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x3a, 0x34, 0x34, 0x3a, 0x34, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3258,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3259,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3260,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3261,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3262,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3263,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3264,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3265,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3266,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3267,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3268,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3269,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x4b, 0x2f, 0x41, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3270,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3271,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3272,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3273,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3274,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3275,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3276,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3277,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3278,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3279,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3280,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3281,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3282,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3283,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x6e, 0x64, 0x3e, 0x5b, 0x41, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3284,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x5d, 0x3c, 0x2f, 0x61, 0x6d, 0x65, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3285,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3286,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3287,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3288,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3289,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3290,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3291,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3292,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3293,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3294,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3295,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3296,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3297,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3298,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3299,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3300,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3301,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3302,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3303,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3304,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3305,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3306,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3307,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3308,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3309,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3310,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3311,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3312,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3313,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3314,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3315,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3316,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3317,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3318,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3319,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3320,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3321,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3322,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3323,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3324,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3325,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3326,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3327,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3328,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3329,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x34, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3330,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x31, 0x39, 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3331,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3332,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3333,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3334,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3335,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3336,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3337,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3338,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3339,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3340,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3341,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3342,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x34, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3343,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3344,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3345,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3346,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3347,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3348,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3349,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3350,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3351,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3352,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3353,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3354,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3355,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3356,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3357,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3358,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3359,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3360,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3361,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3362,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3363,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3364,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3365,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3366,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3367,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3368,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3369,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3370,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3371,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3372,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3373,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x31, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3374,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3375,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3376,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3377,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3378,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3379,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3380,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3381,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x39, 0x33, 0x34, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3382,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3383,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3384,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3385,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x41, 0x6d, 0x65, 0x6e, 0x64, 0x5d, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3386,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3387,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3388,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3389,64,"style","Trailing whitespace is superfluous."," 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3390,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3391,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3392,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3393,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3394,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x34, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3395,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x36, 0x3a, 0x33, 0x36, 0x3a, 0x34, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3396,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3397,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3398,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3399,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3400,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3401,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3402,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3403,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3404,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3405,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3406,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3407,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3409,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3410,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3411,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3412,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3413,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3414,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3415,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x39, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3416,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3417,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3418,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3419,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3420,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3421,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3422,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3423,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3424,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3425,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3426,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3427,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3428,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3429,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3430,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3431,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3432,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3433,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3434,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3435,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3436,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3437,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3438,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3439,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3440,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3441,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3442,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3443,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3444,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3445,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3446,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3447,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3448,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3449,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3450,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3451,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3452,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3453,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x33, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3454,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3455,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x33, 0x39, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3456,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3457,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3458,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3459,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3460,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3461,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3462,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3463,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3464,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x31, 0x34, 0x31, 0x30, 0x31, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3465,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3466,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3467,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3468,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3469,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3470,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3471,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3472,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3473,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3474,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3475,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3476,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3477,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3478,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3479,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3480,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3481,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3482,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3483,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3484,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3485,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3486,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3487,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3488,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x33, 0x39, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3489,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3490,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3491,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3492,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3493,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3494,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3495,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3496,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3497,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3498,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3499,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3500,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3501,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3502,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3503,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3504,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3505,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3506,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3507,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3508,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x34, 0x30, 0x30, 0x30, 0x30, 0x33, 0x39, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3509,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3510,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3511,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3512,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3513,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3514,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3515,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3516,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3517,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3518,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3519,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3520,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3521,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3522,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3523,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3524,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3525,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3526,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x39, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3527,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3528,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3529,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x33, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3530,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3531,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3532,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3533,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3534,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3535,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3536,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3537,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3538,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3539,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3540,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x30, 0x35, 0x54, 0x31, 0x36, 0x3a, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3541,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3a, 0x32, 0x34, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3542,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3543,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3544,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3545,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3546,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3547,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3548,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3549,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3550,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3551,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3552,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3553,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3554,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3555,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3556,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3557,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3558,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3559,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3560,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3561,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3562,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3563,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3564,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3565,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3566,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3567,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3568,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3569,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3570,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3571,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3572,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3573,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3574,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3575,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3576,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3577,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3578,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3579,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3580,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3581,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3582,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3583,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3584,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3585,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3586,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3587,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3588,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x34, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x31, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3589,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3590,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3591,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3592,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3593,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3594,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3595,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3596,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3597,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3598,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x31, 0x34, 0x30, 0x30, 0x30, 0x30, 0x32, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3599,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3600,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3601,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3602,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3603,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3604,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3605,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3606,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3607,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3608,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3609,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3610,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x32, 0x31, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3611,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3612,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3613,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3614,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3615,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3616,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3617,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3618,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3619,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3620,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3621,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3622,64,"style","Trailing whitespace is superfluous."," 0x32, 0x36, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3623,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3624,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3625,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3626,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3627,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3628,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3629,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3630,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3631,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3632,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3633,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3634,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3635,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x32, 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3636,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3637,64,"style","Trailing whitespace is superfluous."," 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3638,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3639,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3640,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3641,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3642,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3643,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3644,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3645,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3646,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3647,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3648,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3649,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3650,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3651,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3652,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3653,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3654,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3655,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x30, 0x30, 0x30, 0x30, 0x32, 0x34, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3656,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3657,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3658,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3659,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3660,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3661,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3662,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3663,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3664,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3665,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3666,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3667,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3668,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, 0x35, 0x2d, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3669,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3670,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3671,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3672,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3673,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, 0x34, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3674,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3675,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3676,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x36, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3677,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3678,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3679,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3680,64,"style","Trailing whitespace is superfluous."," 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3681,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3682,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3683,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3684,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3685,64,"style","Trailing whitespace is superfluous."," 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3686,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3687,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3688,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x34, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x31, 0x54, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3689,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x3a, 0x33, 0x38, 0x3a, 0x34, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3690,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3691,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3692,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3693,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3694,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3695,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3696,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3697,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3698,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3699,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3700,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3701,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3702,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3703,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3704,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3705,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3706,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3707,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3708,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3709,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x39, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3710,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3711,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3712,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3713,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3714,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3715,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3716,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3717,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3718,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3719,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3720,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3721,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3722,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3723,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3724,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3725,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3726,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3727,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3728,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3729,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3730,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3731,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3732,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3733,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3734,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3735,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3736,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3737,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3738,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3739,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3740,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3741,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3742,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3743,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3744,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3745,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3746,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x34, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3747,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3748,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3749,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3750,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3751,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3752,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3753,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3754,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3755,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3756,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3757,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3758,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x34, 0x35, 0x37, 0x32, 0x39, 0x30, 0x35, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3759,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3760,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3761,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3762,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3763,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3764,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3765,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3766,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3767,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3768,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3769,64,"style","Trailing whitespace is superfluous."," 0x35, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3770,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3771,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3772,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3773,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3774,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3775,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3776,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3777,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3778,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3779,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3780,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3781,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3782,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3783,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3784,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3785,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3786,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3787,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3788,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3789,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3790,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3791,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3792,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3793,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x39, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3794,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3795,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3796,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3797,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3798,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3799,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3800,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3801,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3802,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x30, 0x30, 0x30, 0x30, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3803,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3804,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x39, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3805,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3806,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3807,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3808,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3809,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3810,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3811,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3812,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3813,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3814,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3815,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3816,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3817,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3818,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3819,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3820,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x39, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3821,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3822,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3823,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x35, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3824,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3825,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3826,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3827,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3828,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3829,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3830,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3831,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3832,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3833,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3834,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x54, 0x31, 0x36, 0x3a, 0x34, 0x38, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3835,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3836,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3837,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3838,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3839,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3840,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3841,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3842,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3843,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3844,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3845,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3846,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3847,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3848,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3849,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3850,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3851,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3852,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3853,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3854,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3855,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3856,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3857,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3858,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3859,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3860,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3861,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3862,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3863,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3864,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3865,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3866,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3867,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3868,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3869,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3870,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3871,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3872,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3873,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3874,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3875,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3876,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3877,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3878,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3879,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3880,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3881,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3882,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x35, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3883,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3884,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3885,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3886,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3887,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3888,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3889,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3890,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3891,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3892,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x30, 0x30, 0x30, 0x30, 0x34, 0x32, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3893,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3894,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3895,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3896,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3897,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3898,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3899,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3900,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3901,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3902,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3903,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x33, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3904,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x38, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3905,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3906,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3907,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3908,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3909,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3910,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3911,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3912,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3913,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3914,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x35, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3915,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3916,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3917,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3918,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3919,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3920,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3921,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3922,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3923,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3924,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3925,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3926,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3927,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x32, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3928,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3929,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3930,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3931,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3932,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3933,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3934,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3935,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3936,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3937,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3938,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3939,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x32, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3940,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3941,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3942,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3943,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3944,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3945,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3946,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3947,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x31, 0x33, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3948,64,"style","Trailing whitespace is superfluous."," 0x34, 0x32, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3949,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3950,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3951,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3952,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3953,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3954,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3955,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3956,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3957,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3958,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3959,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3960,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x33, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3961,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3962,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3963,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3964,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3965,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3966,64,"style","Trailing whitespace is superfluous."," 0x34, 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3967,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3968,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3969,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3970,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3971,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3972,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3973,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3974,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3975,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3976,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3977,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3978,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3979,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x35, 0x54, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3980,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x33, 0x36, 0x3a, 0x35, 0x38, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3981,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3982,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3983,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3984,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3985,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3986,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3987,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3988,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3989,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3990,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3991,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3992,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3993,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3994,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3995,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3996,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3997,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3998,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3999,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4000,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x33, 0x37, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4001,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4002,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4003,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4004,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4005,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4006,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4007,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4008,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4009,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4010,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4011,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4012,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4013,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4014,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4015,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4016,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4017,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4018,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4019,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4020,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4021,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4022,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4023,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4024,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4025,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4026,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4027,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4028,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4029,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4030,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4031,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4032,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4033,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4034,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4035,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4036,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4037,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x33, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4038,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x37, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4039,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4040,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x33, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4041,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4042,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4043,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4044,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4045,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4046,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4047,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4048,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4049,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x31, 0x30, 0x30, 0x36, 0x37, 0x39, 0x39, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4050,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4051,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4052,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4053,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4054,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4055,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4056,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4057,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4058,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4059,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4060,64,"style","Trailing whitespace is superfluous."," 0x39, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4061,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4062,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4063,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4064,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4065,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4066,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4067,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4068,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4069,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4070,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4071,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4072,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4073,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x33, 0x37, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4074,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4075,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4076,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4077,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4078,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4079,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4080,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4081,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4082,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4083,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4084,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x37, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4085,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4086,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4087,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4088,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4089,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4090,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4091,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4092,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4093,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x30, 0x30, 0x30, 0x33, 0x37, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4094,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4095,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x37, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4096,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4097,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4098,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4099,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4100,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4101,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4102,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4103,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4104,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4105,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4106,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4107,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4108,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4109,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4110,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4111,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x37, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4112,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4113,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4114,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x39, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4115,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4116,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4117,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4118,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4119,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4120,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4121,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4122,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4123,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4124,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4125,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x30, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4126,64,"style","Trailing whitespace is superfluous."," 0x34, 0x31, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4127,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4128,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4129,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4130,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4131,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4132,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4133,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4134,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4135,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4136,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4137,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4138,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4139,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4140,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4141,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4142,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4143,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4144,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4145,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4146,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4147,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4148,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4149,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4150,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4151,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4152,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4153,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4154,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4155,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4156,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4157,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4158,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4159,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4160,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4161,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4162,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4163,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4164,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4165,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4166,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4167,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4168,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4169,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4170,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4171,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4172,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4173,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x32, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4174,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4175,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4176,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4177,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4178,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4179,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4180,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4181,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4182,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4183,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x30, 0x30, 0x30, 0x30, 0x32, 0x32, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4184,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4185,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4186,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4187,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4188,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4189,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4190,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4191,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4192,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4193,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4194,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x33, 0x38, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4195,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4196,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4197,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4198,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4199,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4200,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4201,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4202,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4203,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4204,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4205,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4206,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x32, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4207,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4208,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4209,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4210,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4211,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4212,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4213,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4214,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4215,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4216,64,"style","Trailing whitespace is superfluous."," 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4217,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4218,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4219,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4220,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4221,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4222,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4223,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4224,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4225,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4226,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4227,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4228,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4229,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4230,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4231,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, 0x32, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4232,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4233,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4234,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4235,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4236,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4237,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4238,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4239,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4240,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x32, 0x32, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4241,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4242,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4243,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4244,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4245,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4246,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4247,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4248,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4249,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4250,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4251,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4252,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4253,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x32, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4254,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4255,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4256,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4257,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4258,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x32, 0x32, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4259,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4260,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4261,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4262,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4263,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4264,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4265,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4266,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4267,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4268,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4269,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4270,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4271,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4272,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4273,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x32, 0x54, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4274,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x32, 0x31, 0x3a, 0x35, 0x33, 0x2d, 0x30, 0x34, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4275,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4276,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4277,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4278,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4279,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4280,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4281,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4282,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4283,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4284,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4285,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4286,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4287,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4288,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4289,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4290,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4291,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4292,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4293,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4294,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4295,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4296,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4297,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4298,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4299,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4300,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4301,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4302,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4303,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4304,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4305,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4306,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4307,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4308,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4309,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4310,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4311,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4312,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4313,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4314,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4315,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4316,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4317,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4318,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4319,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4320,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4321,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4322,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4323,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4324,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4325,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4326,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4327,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4328,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4329,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4330,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4331,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x31, 0x33, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4332,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4333,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4334,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4335,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4336,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4337,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4338,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4339,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4340,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4341,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4342,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4343,64,"style","Trailing whitespace is superfluous."," 0x33, 0x35, 0x37, 0x34, 0x31, 0x34, 0x34, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4344,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4345,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4346,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4347,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4348,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4349,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4350,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4351,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4352,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4353,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4354,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4355,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4356,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4357,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4358,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4359,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4360,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4361,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4362,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4363,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4364,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4365,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4366,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4367,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4368,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4369,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4370,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4371,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4372,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4373,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4374,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4375,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4376,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4377,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4378,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x30, 0x37, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4379,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4380,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4381,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4382,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4383,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4384,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4385,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4386,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x33, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4387,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4388,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4389,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x30, 0x37, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4390,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4391,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4392,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4393,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4394,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4395,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4396,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4397,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4398,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4399,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4400,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x35, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4401,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4402,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4403,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4404,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4405,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4406,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4407,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4409,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4410,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4411,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4412,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4413,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4414,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4415,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4416,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4417,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4418,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4419,64,"style","Trailing whitespace is superfluous."," 0x35, 0x54, 0x31, 0x36, 0x3a, 0x31, 0x34, 0x3a, 0x33, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4420,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4421,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4422,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4423,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4424,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4425,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4426,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4427,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4428,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4429,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4430,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4431,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4432,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4433,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4434,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4435,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4436,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4437,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4438,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4439,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4440,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4441,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4442,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4443,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4444,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4445,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4446,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4447,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4448,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4449,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4450,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4451,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4452,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4453,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4454,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4455,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4456,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4457,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4458,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4459,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4460,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4461,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4462,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4463,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4464,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4465,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4466,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4467,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4468,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4469,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4470,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4471,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4472,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4473,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4474,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4475,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4476,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4477,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x31, 0x30, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4478,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4479,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x30, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4480,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4481,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4482,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4483,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4484,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4485,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4486,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4487,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4488,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x32, 0x31, 0x31, 0x38, 0x33, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4489,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4490,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4491,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4492,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4493,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4494,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4495,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4496,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4497,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4498,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4499,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4500,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4501,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4502,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4503,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4504,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4505,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4506,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4507,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4508,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4509,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4510,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4511,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4512,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4513,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4514,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4515,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4516,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4517,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4518,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4519,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4520,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4521,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4522,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4523,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4524,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4525,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4526,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4527,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4528,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4529,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4530,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4531,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4532,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x31, 0x32, 0x30, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4533,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4534,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4535,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4536,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4537,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4538,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4539,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4540,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4541,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4542,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4543,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4544,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4545,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x32, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4546,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4547,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4548,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4549,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4550,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4551,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4552,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4553,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x33, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4554,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4555,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4556,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4557,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4558,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4559,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4560,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4561,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4562,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4563,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4564,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x36, 0x54, 0x31, 0x37, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4565,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3a, 0x32, 0x33, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4566,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4567,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4568,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4569,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4570,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4571,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4572,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4573,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4574,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4575,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4576,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4577,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4578,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4579,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4580,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4581,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4582,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4583,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4584,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4585,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4586,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4587,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4588,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4589,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4590,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4591,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4592,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4593,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4594,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4595,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4596,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4597,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4598,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4599,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4600,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4601,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4602,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4603,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4604,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4605,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4606,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4607,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4608,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4609,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4610,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4611,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4612,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x32, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4613,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4614,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4615,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4616,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4617,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4618,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4619,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4620,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4621,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4622,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x31, 0x32, 0x30, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4623,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4624,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4625,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4626,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4627,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4628,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4629,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4630,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4631,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4632,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4633,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4634,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x37, 0x37, 0x38, 0x36, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4635,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4636,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4637,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4638,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4639,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4640,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4641,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4642,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4643,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4644,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4645,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4646,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4647,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4648,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4649,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4650,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4651,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4652,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4653,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4654,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4655,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4656,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4657,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4658,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4659,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4660,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4661,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4662,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4663,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4664,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4665,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4666,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4667,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4668,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4669,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x30, 0x34, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4670,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4671,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4672,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4673,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4674,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4675,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4676,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4677,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4678,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4679,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4680,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x30, 0x34, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4681,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4682,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4683,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4684,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4685,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4686,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4687,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4688,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4689,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4690,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4691,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x33, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4692,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4693,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4694,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4695,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4696,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4697,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4698,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4699,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4700,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4701,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4702,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4703,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4704,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4705,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4706,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4707,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4708,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4709,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x32, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4710,64,"style","Trailing whitespace is superfluous."," 0x33, 0x54, 0x31, 0x37, 0x3a, 0x32, 0x33, 0x3a, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4711,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4712,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4713,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4714,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4715,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4716,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4717,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4718,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4719,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4720,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4721,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4722,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4723,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4724,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4725,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4726,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4727,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4728,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4729,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4730,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x2d, 0x32, 0x34, 0x39, 0x33, 0x32, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4731,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4732,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4733,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4734,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4735,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4736,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4737,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4738,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4739,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4740,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4741,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4742,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4743,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4744,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4745,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4746,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4747,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4748,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4749,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4750,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4751,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4752,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4753,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4754,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4755,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4756,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4757,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4758,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4759,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4760,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4761,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4762,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4763,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4764,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4765,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4766,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4767,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4768,64,"style","Trailing whitespace is superfluous."," 0x32, 0x34, 0x39, 0x33, 0x32, 0x34, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4769,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4770,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x34, 0x39, 0x33, 0x32, 0x34, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4771,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4772,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4773,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4774,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4775,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4776,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4777,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4778,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4779,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x32, 0x38, 0x37, 0x31, 0x37, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4780,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4781,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4782,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4783,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4784,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4785,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4786,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4787,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4788,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4789,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4790,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4791,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4792,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4793,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4794,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4795,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4796,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4797,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4798,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4799,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4800,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4801,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4802,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4803,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4804,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x32, 0x34, 0x39, 0x33, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4805,64,"style","Trailing whitespace is superfluous."," 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4806,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4807,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4808,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4809,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4810,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4811,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4812,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4813,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4814,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4815,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4816,64,"style","Trailing whitespace is superfluous."," 0x34, 0x39, 0x33, 0x32, 0x34, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4817,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4818,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4819,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4820,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4821,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4822,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4823,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4824,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x32, 0x32, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4825,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x32, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4826,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4827,64,"style","Trailing whitespace is superfluous."," 0x34, 0x39, 0x33, 0x32, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4828,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4829,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4830,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4831,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4832,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4833,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4834,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4835,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4836,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4837,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4838,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x35, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4839,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4840,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4841,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4842,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x32, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4843,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x32, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4844,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4845,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4846,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4847,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4848,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4849,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4850,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4851,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4852,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4853,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4854,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4855,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4856,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4857,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4858,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x35, 0x54, 0x31, 0x36, 0x3a, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4859,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3a, 0x34, 0x35, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4860,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4861,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4862,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4863,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4864,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4865,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4866,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4867,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4868,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4869,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4870,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4871,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4872,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4873,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4874,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4875,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4876,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4877,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4878,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x34, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4879,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4880,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4881,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4882,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4883,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4884,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4885,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4886,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4887,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4888,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4889,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4890,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4891,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4892,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4893,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4894,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4895,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4896,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4897,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4898,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4899,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4900,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4901,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4902,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4903,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4904,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4905,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4906,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x32, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x37, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4907,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4908,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4909,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4910,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4911,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4912,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4913,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4914,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4915,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4916,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x32, 0x30, 0x34, 0x31, 0x36, 0x35, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4917,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4918,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x34, 0x31, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4919,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4920,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4921,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4922,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4923,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4924,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4925,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4926,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4927,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4928,64,"style","Trailing whitespace is superfluous."," 0x37, 0x34, 0x38, 0x38, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4929,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4930,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4931,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4932,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4933,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4934,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4935,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4936,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4937,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4938,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4939,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4940,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4941,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4942,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4943,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4944,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4945,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4946,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4947,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4948,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4949,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4950,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4951,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x2d, 0x30, 0x34, 0x31, 0x36, 0x35, 0x33, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4952,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4953,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4954,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4955,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4956,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4957,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4958,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4959,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4960,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4961,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4962,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x34, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4963,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x33, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4964,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4965,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4966,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4967,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4968,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4969,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4970,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4971,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x31, 0x32, 0x30, 0x34, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4972,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4973,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x34, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4974,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4975,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4976,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4977,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4978,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4979,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4980,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4981,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4982,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4983,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4984,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4985,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4986,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4987,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4988,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4989,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x34, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4990,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4991,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4992,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4993,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4994,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4995,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4996,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4997,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4998,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4999,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5000,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5001,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5002,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5003,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x54, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5004,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x33, 0x30, 0x3a, 0x32, 0x37, 0x2d, 0x30, 0x35, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5005,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5006,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5007,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5008,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5009,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5010,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5011,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5012,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5013,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5014,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5015,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5016,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5017,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5018,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5019,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5020,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5021,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5022,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5023,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5024,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x32, 0x37, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5025,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5026,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5027,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5028,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5029,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5030,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5031,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5032,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5033,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5034,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5035,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5036,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5037,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5038,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5039,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5040,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5041,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5042,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5043,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5044,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5045,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5046,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5047,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5048,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5049,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5050,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5051,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5052,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5053,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5054,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5055,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5056,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5057,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5058,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5059,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5060,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5061,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x31, 0x31, 0x33, 0x30, 0x32, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5062,64,"style","Trailing whitespace is superfluous."," 0x37, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5063,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x33, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5064,64,"style","Trailing whitespace is superfluous."," 0x32, 0x37, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5065,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5066,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5067,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5068,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5069,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5070,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5071,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5072,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5073,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x31, 0x38, 0x38, 0x32, 0x38, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5074,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5075,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5076,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5077,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5078,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5079,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5080,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5081,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5082,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5083,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5084,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5085,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5086,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5087,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5088,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5089,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5090,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5091,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5092,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5093,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5094,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5095,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5096,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x33, 0x30, 0x32, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5097,64,"style","Trailing whitespace is superfluous."," 0x37, 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5098,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5099,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5100,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5101,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5102,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5103,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5104,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5105,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5106,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5107,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5108,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x32, 0x32, 0x37, 0x34, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5109,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5110,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5111,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5112,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5113,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5114,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5115,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5116,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5117,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x32, 0x37, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5118,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5119,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x32, 0x32, 0x37, 0x34, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5120,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5121,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5122,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5123,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5124,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5125,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5126,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5127,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5128,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5129,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5130,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x38, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5131,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5132,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5133,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5134,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5135,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x32, 0x37, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5136,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5137,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5138,64,"style","Trailing whitespace is superfluous."," 0x20, 0x38, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5139,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5140,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5141,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5142,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5143,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5144,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5145,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5146,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5147,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5148,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x31, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5149,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x36, 0x3a, 0x34, 0x33, 0x3a, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5150,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5151,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5152,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5153,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5154,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5155,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5156,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5157,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5158,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5159,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5160,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5161,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5162,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5163,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5164,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5165,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5166,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5167,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5168,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5169,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x32, 0x31, 0x36, 0x35, 0x33, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5170,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5171,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5172,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5173,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5174,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5175,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5176,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5177,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5178,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5179,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5180,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5181,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5182,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5183,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5184,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5185,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5186,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5187,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5188,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5189,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5190,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5191,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5192,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5193,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5194,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5195,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5196,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5197,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5198,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5199,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5200,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5201,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5202,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5203,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5204,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5205,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5206,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5207,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x35, 0x33, 0x30, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5208,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5209,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x36, 0x35, 0x33, 0x30, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5210,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5211,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5212,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5213,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5214,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5215,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5216,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5217,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5218,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x31, 0x31, 0x31, 0x30, 0x32, 0x31, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5219,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5220,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5221,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5222,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5223,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5224,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5225,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5226,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5227,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5228,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5229,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5230,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5231,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5232,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5233,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5234,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5235,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5236,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5237,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5238,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5239,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5240,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5241,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5242,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x35, 0x33, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5243,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5244,64,"style","Trailing whitespace is superfluous."," 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5245,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5246,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5247,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5248,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5249,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5250,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5251,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5252,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5253,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x32, 0x31, 0x36, 0x35, 0x33, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5254,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5255,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5256,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5257,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5258,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5259,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5260,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5261,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5262,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x32, 0x31, 0x36, 0x35, 0x33, 0x30, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5263,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5264,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x32, 0x31, 0x36, 0x35, 0x33, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5265,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5266,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5267,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5268,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5269,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5270,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5271,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5272,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5273,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5274,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5275,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5276,64,"style","Trailing whitespace is superfluous."," 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5277,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5278,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5279,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5280,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x32, 0x31, 0x36, 0x35, 0x33, 0x30, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5281,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5282,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5283,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5284,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5285,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5286,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5287,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5288,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5289,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5290,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5291,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5292,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5293,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5294,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x39, 0x54, 0x31, 0x36, 0x3a, 0x32, 0x31, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5295,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5296,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5297,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5298,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5299,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5300,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5301,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5302,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5303,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5304,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5305,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5306,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5307,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5308,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5309,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5310,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5311,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5312,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5313,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5314,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x39, 0x32, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5315,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5316,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5317,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5318,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5319,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5320,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5321,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5322,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5323,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5324,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5325,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5326,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5327,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5328,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5329,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5330,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5331,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5332,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5333,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5334,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5335,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5336,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5337,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5338,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5339,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5340,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5341,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5342,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x34, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5343,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5344,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5345,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5346,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5347,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5348,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5349,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5350,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5351,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5352,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x31, 0x34, 0x39, 0x32, 0x36, 0x32, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5353,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5354,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x31, 0x34, 0x39, 0x32, 0x36, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5355,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5356,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5357,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5358,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5359,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5360,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5361,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5362,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5363,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x31, 0x38, 0x36, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5364,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5365,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5366,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5367,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5368,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5369,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5370,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5371,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5372,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5373,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5374,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5375,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5376,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5377,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5378,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5379,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5380,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5381,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5382,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5383,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5384,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5385,64,"style","Trailing whitespace is superfluous."," 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5386,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5387,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5388,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5389,64,"style","Trailing whitespace is superfluous."," 0x32, 0x36, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5390,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5391,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5392,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5393,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5394,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5395,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5396,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5397,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5398,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5399,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5400,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x39, 0x32, 0x36, 0x32, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5401,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5402,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5403,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5404,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5405,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5406,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5407,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5408,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5409,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x39, 0x32, 0x36, 0x32, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5410,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5411,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x39, 0x32, 0x36, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5412,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5413,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5414,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5415,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5416,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5417,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5418,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5419,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5420,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5421,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5422,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x34, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5423,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5424,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5425,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5426,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5427,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x39, 0x32, 0x36, 0x32, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5428,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5429,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5430,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5431,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5432,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5433,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5434,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5435,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5436,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5437,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5438,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5439,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5440,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5441,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5442,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x34, 0x54, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5443,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x35, 0x36, 0x3a, 0x30, 0x32, 0x2d, 0x30, 0x34, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5444,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5445,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5446,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5447,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5448,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5449,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5450,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5451,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5452,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5453,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5454,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5455,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5456,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5457,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5458,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5459,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5460,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5461,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5462,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5463,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x39, 0x35, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5464,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5465,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5466,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5467,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5468,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5469,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5470,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5471,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5472,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5473,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5474,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5475,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5476,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5477,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5478,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5479,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5480,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5481,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5482,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5483,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5484,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5485,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5486,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5487,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5488,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5489,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5490,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5491,64,"style","Trailing whitespace is superfluous."," 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5492,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5493,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5494,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5495,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5496,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5497,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5498,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5499,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5500,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x31, 0x31, 0x30, 0x32, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5501,64,"style","Trailing whitespace is superfluous."," 0x35, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5502,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5503,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5504,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5505,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5506,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5507,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5508,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5509,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5510,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5511,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5512,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x37, 0x39, 0x35, 0x39, 0x31, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5513,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5514,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5515,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5516,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5517,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5518,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5519,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5520,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5521,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5522,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x35, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5523,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5524,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5525,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5526,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5527,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5528,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5529,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5530,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5531,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5532,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5533,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5534,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5535,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5536,64,"style","Trailing whitespace is superfluous."," 0x35, 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5537,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5538,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5539,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5540,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5541,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5542,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5543,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5544,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5545,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5546,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5547,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x35, 0x39, 0x35, 0x34, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5548,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5549,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5550,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5551,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5552,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5553,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5554,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5555,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5556,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x39, 0x35, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5557,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5558,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x35, 0x39, 0x35, 0x34, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5559,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5560,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5561,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5562,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5563,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5564,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5565,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5566,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5567,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5568,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5569,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x37, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5570,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5571,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5572,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5573,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5574,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x39, 0x35, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5575,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5576,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5577,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5578,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5579,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5580,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5581,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5582,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5583,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5584,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5585,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5586,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5587,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5588,64,"style","Trailing whitespace is superfluous."," 0x37, 0x54, 0x31, 0x37, 0x3a, 0x32, 0x35, 0x3a, 0x34, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5589,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5590,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5591,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5592,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5593,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5594,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5595,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5596,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5597,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5598,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5599,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5600,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5601,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5602,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5603,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5604,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5605,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5606,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5607,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5608,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x32, 0x35, 0x32, 0x31, 0x37, 0x31, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5609,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5610,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5611,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5612,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5613,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5614,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5615,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5616,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5617,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5618,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5619,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5620,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5621,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5622,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5623,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5624,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5625,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5626,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5627,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5628,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5629,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5630,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5631,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5632,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5633,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5634,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5635,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5636,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5637,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5638,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5639,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5640,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5641,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5642,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5643,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5644,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5645,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5646,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x32, 0x31, 0x37, 0x31, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5647,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5648,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x35, 0x32, 0x31, 0x37, 0x31, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5649,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5650,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5651,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5652,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5653,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5654,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5655,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5656,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5657,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x30, 0x31, 0x31, 0x37, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5658,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5659,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5660,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5661,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5662,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5663,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5664,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5665,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5666,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5667,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5668,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5669,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5670,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5671,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5672,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5673,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5674,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5675,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5676,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5677,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5678,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5679,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5680,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5681,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x35, 0x32, 0x31, 0x37, 0x31, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5682,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5683,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5684,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5685,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5686,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5687,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5688,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5689,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5690,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5691,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5692,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x35, 0x32, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5693,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5694,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5695,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5696,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5697,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5698,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5699,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5700,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5701,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x30, 0x32, 0x35, 0x32, 0x31, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5702,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5703,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x35, 0x32, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5704,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5705,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5706,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5707,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5708,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5709,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5710,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5711,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5712,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5713,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5714,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5715,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5716,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5717,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5718,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5719,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x35, 0x32, 0x31, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5720,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5721,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5722,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x33, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5723,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5724,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5725,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5726,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5727,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5728,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5729,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5730,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5731,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5732,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5733,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x38, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5734,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x3a, 0x32, 0x36, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5735,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5736,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5737,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5738,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5739,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5740,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5741,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5742,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5743,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5744,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5745,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5746,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5747,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5748,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5749,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5750,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5751,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5752,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5753,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5754,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x34, 0x38, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5755,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5756,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5757,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5758,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5759,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5760,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5761,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5762,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5763,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5764,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5765,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5766,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5767,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5768,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5769,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5770,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5771,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5772,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5773,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5774,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5775,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5776,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5777,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5778,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5779,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5780,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5781,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5782,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5783,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5784,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5785,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5786,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5787,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5788,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5789,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5790,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5791,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x30, 0x31, 0x38, 0x33, 0x34, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5792,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5793,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x31, 0x38, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5794,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5795,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5796,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5797,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5798,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5799,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5800,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5801,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5802,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5803,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x32, 0x30, 0x37, 0x32, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5804,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5805,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5806,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5807,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5808,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5809,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5810,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5811,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5812,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5813,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5814,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5815,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5816,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5817,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5818,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5819,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5820,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5821,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5822,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5823,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5824,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5825,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5826,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x31, 0x38, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5827,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5828,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5829,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5830,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5831,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5832,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5833,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5834,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5835,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5836,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5837,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5838,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x33, 0x34, 0x34, 0x38, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5839,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5840,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5841,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5842,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5843,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5844,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5845,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5846,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5847,64,"style","Trailing whitespace is superfluous."," 0x38, 0x33, 0x34, 0x34, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5848,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5849,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x33, 0x34, 0x34, 0x38, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5850,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5851,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5852,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5853,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5854,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5855,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5856,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5857,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5858,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5859,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5860,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5861,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5862,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5863,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5864,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5865,64,"style","Trailing whitespace is superfluous."," 0x38, 0x33, 0x34, 0x34, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5866,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5867,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5868,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5869,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5870,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5871,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5872,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5873,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5874,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5875,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5876,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5877,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5878,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5879,64,"style","Trailing whitespace is superfluous."," 0x39, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x37, 0x3a, 0x32, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5880,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5881,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5882,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5883,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5884,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5885,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5886,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5887,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5888,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5889,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5890,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5891,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5892,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5893,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5894,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5895,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5896,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5897,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5898,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5899,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x30, 0x30, 0x31, 0x35, 0x37, 0x39, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5900,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5901,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5902,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5903,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5904,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5905,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5906,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5907,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5908,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5909,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5910,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5911,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5912,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5913,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5914,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5915,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5916,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5917,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5918,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5919,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5920,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5921,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5922,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5923,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5924,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5925,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5926,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5927,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5928,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5929,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5930,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5931,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5932,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5933,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5934,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5935,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5936,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5937,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x35, 0x37, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5938,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x30, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5939,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x31, 0x35, 0x37, 0x39, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5940,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5941,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5942,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5943,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5944,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5945,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5946,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5947,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5948,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x30, 0x38, 0x36, 0x37, 0x34, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5949,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5950,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5951,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5952,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5953,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5954,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5955,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5956,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5957,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5958,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5959,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5960,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x35, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5961,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5962,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5963,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5964,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5965,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5966,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5967,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5968,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5969,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5970,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5971,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5972,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5973,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, 0x31, 0x35, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5974,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5975,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5976,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5977,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5978,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5979,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5980,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5981,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5982,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5983,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5984,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x30, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5985,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x37, 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5986,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5987,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5988,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5989,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5990,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5991,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5992,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5993,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x33, 0x30, 0x31, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5994,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5995,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x30, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5996,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x37, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5997,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5998,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5999,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6000,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6001,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6002,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6003,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6004,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6005,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6006,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6007,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x38, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6008,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6009,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6010,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6011,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x30, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6012,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6013,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6014,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6015,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6016,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6017,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6018,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6019,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6020,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6021,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6022,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6023,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6024,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6025,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6026,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6027,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x38, 0x54, 0x31, 0x37, 0x3a, 0x31, 0x37, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6028,64,"style","Trailing whitespace is superfluous."," 0x33, 0x38, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6029,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6030,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6031,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6032,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6033,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6034,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6035,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6036,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6037,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6038,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6039,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6040,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6041,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6042,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6043,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6044,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6045,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6046,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6047,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x31, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6048,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6049,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6050,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6051,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6052,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6053,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x6d, 0x65, 0x6e, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6054,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x41, 0x6d, 0x65, 0x6e, 0x64, 0x5d, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6055,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x6e, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6056,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6057,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6058,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6059,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6060,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6061,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6062,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6063,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6064,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6065,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6066,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6067,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6068,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6069,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6070,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6071,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6072,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6073,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6074,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6075,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6076,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6077,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6078,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6079,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6080,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6081,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6082,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6083,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6084,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6085,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6086,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6087,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6088,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x30, 0x31, 0x30, 0x32, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6089,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6090,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x31, 0x30, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6091,64,"style","Trailing whitespace is superfluous."," 0x35, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6092,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6093,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6094,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6095,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6096,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x2f, 0x41, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6097,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6098,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6099,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6100,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x37, 0x38, 0x37, 0x39, 0x31, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6101,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6102,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6103,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6104,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6105,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6106,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6107,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6108,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6109,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6110,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6111,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6112,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6113,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6114,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6115,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6116,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6117,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6118,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6119,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6120,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x32, 0x30, 0x35, 0x32, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6121,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6122,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6123,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6124,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6125,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6126,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6127,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6128,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6129,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x32, 0x30, 0x35, 0x32, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6130,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6131,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x32, 0x30, 0x35, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6132,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6133,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6134,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6135,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6136,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6137,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6138,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6139,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6140,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6141,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6142,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6143,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6144,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6145,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6146,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6147,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x32, 0x30, 0x35, 0x32, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6148,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6149,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6150,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x37, 0x32, 0x33, 0x20, 0x4b, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6151,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6152,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6153,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x2f, 0x41, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6154,64,"style","Trailing whitespace is superfluous."," 0x41, 0x6d, 0x65, 0x6e, 0x64, 0x5d, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6155,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6156,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6157,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6158,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6159,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6160,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6161,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6162,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x30, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x31, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6163,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6164,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6165,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6166,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6167,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6168,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6169,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6170,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6171,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6172,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6173,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6174,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6175,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6176,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6177,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6178,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6179,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6180,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6181,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6182,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6183,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6184,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6185,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6186,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6187,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6188,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6189,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6190,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6191,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6192,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6193,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6194,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6195,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6196,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6197,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6198,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6199,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6200,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6201,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6202,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6203,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6204,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6205,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6206,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6207,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6208,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6209,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6210,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x39, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6211,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6212,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6213,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6214,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6215,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6216,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6217,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6218,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6219,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6220,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x32, 0x35, 0x38, 0x35, 0x36, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6221,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6222,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x35, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6223,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6224,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6225,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6226,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6227,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6228,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6229,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6230,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6231,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x30, 0x35, 0x38, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6232,64,"style","Trailing whitespace is superfluous."," 0x36, 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6233,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6234,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6235,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6236,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6237,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6238,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6239,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6240,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6241,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6242,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6243,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6244,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6245,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6246,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6247,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6248,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6249,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6250,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6251,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6252,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6253,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6254,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6255,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x35, 0x38, 0x35, 0x36, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6256,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6257,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6258,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6259,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6260,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6261,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6262,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6263,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6264,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6265,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6266,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6267,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6268,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6269,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6270,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6271,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6272,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6273,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6274,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6275,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x30, 0x30, 0x32, 0x35, 0x38, 0x35, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6276,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6277,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6278,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6279,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6280,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6281,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6282,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6283,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6284,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6285,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6286,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6287,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6288,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6289,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6290,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6291,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6292,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6293,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x35, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6294,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6295,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6296,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x33, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6297,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6298,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6299,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6300,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6301,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6302,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6303,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6304,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6305,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6306,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6307,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x39, 0x54, 0x31, 0x36, 0x3a, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6308,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x35, 0x32, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6309,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6310,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6311,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6312,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6313,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6314,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6315,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6316,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6317,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6318,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6319,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6320,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6321,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6322,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6323,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6324,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6325,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6326,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6327,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x32, 0x33, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6328,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6329,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6330,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6331,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6332,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6333,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6334,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6335,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6336,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6337,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6338,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6339,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6340,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6341,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6342,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6343,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6344,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6345,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6346,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6347,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6348,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6349,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6350,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6351,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6352,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6353,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6354,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6355,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6356,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6357,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6358,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6359,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6360,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6361,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6362,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6363,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6364,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6365,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x30, 0x39, 0x32, 0x33, 0x30, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6366,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6367,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x32, 0x33, 0x30, 0x37, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6368,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6369,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6370,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6371,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6372,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6373,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6374,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6375,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6376,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6377,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x32, 0x35, 0x38, 0x37, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6378,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6379,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6380,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6381,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6382,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6383,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6384,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6385,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6386,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6387,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x33, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6388,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6389,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6390,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6391,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6392,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6393,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6394,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6395,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6396,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6397,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6398,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6399,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6400,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x39, 0x2d, 0x32, 0x33, 0x30, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6401,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6402,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6403,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6404,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6405,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6406,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6407,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6408,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6409,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6410,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6411,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x32, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6412,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x38, 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6413,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6414,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6415,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6416,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6417,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6418,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6419,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6420,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, 0x32, 0x33, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6421,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6422,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x32, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6423,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x38, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6424,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6425,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6426,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6427,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6428,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6429,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6430,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6431,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6432,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6433,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6434,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x30, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6435,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6436,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6437,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6438,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x32, 0x33, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6439,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6440,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6441,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6442,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6443,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6444,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6445,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6446,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6447,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6448,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6449,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6450,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6451,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6452,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x30, 0x54, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6453,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x34, 0x39, 0x3a, 0x33, 0x36, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6454,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6455,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6456,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6457,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6458,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6459,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6460,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6461,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6462,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6463,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6464,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6465,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6466,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6467,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6468,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6469,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6470,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6471,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6472,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6473,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x30, 0x37, 0x35, 0x39, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6474,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6475,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6476,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6477,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6478,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6479,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6480,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6481,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6482,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6483,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6484,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6485,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6486,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6487,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6488,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6489,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6490,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6491,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6492,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6493,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6494,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6495,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6496,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6497,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6498,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6499,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6500,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6501,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6502,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6503,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6504,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6505,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6506,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6507,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6508,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6509,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6510,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, 0x31, 0x37, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6511,64,"style","Trailing whitespace is superfluous."," 0x37, 0x35, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6512,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6513,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x35, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6514,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6515,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6516,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6517,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6518,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6519,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6520,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6521,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6522,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x31, 0x30, 0x30, 0x30, 0x35, 0x35, 0x37, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6523,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6524,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6525,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6526,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6527,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6528,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6529,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6530,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6531,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6532,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6533,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6534,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6535,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6536,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6537,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6538,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6539,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6540,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6541,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6542,64,"style","Trailing whitespace is superfluous."," 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6543,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6544,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6545,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x31, 0x37, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6546,64,"style","Trailing whitespace is superfluous."," 0x37, 0x35, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6547,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6548,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6549,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6550,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6551,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6552,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6553,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6554,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6555,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6556,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6557,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x30, 0x37, 0x35, 0x39, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6558,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6559,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6560,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6561,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6562,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6563,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6564,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6565,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6566,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x30, 0x37, 0x35, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6567,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6568,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x30, 0x37, 0x35, 0x39, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6569,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6570,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6571,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6572,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6573,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6574,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6575,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6576,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6577,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6578,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6579,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x30, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6580,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6581,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6582,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6583,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6584,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x30, 0x37, 0x35, 0x39, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6585,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6586,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6587,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6588,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6589,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6590,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6591,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6592,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6593,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6594,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6595,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6596,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6597,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6598,64,"style","Trailing whitespace is superfluous."," 0x30, 0x54, 0x31, 0x36, 0x3a, 0x35, 0x31, 0x3a, 0x33, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6599,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6600,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6601,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6602,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6603,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6604,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6605,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6606,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6607,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6608,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6609,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6610,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6611,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6612,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6613,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6614,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6615,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6616,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6617,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6618,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x2d, 0x31, 0x31, 0x36, 0x38, 0x39, 0x35, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6619,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6620,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6621,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6622,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6623,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6624,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6625,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6626,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6627,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6628,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6629,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6630,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6631,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6632,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6633,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6634,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6635,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6636,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6637,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6638,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6639,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6640,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6641,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6642,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6643,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6644,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6645,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6646,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6647,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6648,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6649,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6650,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6651,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6652,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6653,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6654,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6655,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6656,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x36, 0x38, 0x39, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6657,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6658,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x36, 0x38, 0x39, 0x35, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6659,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6660,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6661,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6662,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6663,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6664,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6665,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6666,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6667,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x39, 0x38, 0x34, 0x36, 0x36, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6668,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6669,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6670,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6671,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6672,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6673,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6674,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6675,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6676,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6677,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6678,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6679,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x32, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6680,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6681,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6682,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6683,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6684,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6685,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6686,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6687,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6688,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x31, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6689,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6690,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6691,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6692,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6693,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6694,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6695,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6696,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6697,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, 0x31, 0x31, 0x36, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6698,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6699,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x31, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6700,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6701,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6702,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6703,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6704,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6705,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6706,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6707,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6708,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6709,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6710,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6711,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6712,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6713,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6714,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6715,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x31, 0x31, 0x36, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6716,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6717,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6718,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6719,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6720,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6721,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6722,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6723,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6724,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6725,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6726,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6727,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6728,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6729,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6730,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6731,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x54, 0x32, 0x30, 0x3a, 0x35, 0x38, 0x3a, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6732,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6733,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6734,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6735,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6736,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6737,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6738,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6739,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6740,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6741,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6742,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6743,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6744,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6745,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6746,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6747,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6748,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6749,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6750,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6751,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x39, 0x2d, 0x30, 0x31, 0x38, 0x39, 0x32, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6752,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6753,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6754,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6755,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6756,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6757,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6758,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6759,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6760,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6761,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6762,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6763,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6764,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6765,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6766,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6767,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6768,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6769,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6770,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6771,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6772,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6773,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6774,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6775,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6776,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6777,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6778,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6779,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x34, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6780,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6781,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6782,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6783,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6784,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6785,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6786,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6787,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6788,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6789,64,"style","Trailing whitespace is superfluous."," 0x39, 0x30, 0x31, 0x38, 0x39, 0x32, 0x31, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6790,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6791,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x31, 0x38, 0x39, 0x32, 0x31, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6792,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6793,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6794,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6795,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6796,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6797,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6798,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6799,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6800,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x39, 0x35, 0x36, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6801,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6802,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6803,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6804,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6805,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6806,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6807,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6808,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6809,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6810,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6811,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6812,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6813,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6814,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6815,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6816,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6817,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6818,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6819,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6820,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x2d, 0x30, 0x31, 0x38, 0x39, 0x32, 0x31, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6821,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6822,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6823,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6824,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6825,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6826,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6827,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6828,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6829,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x30, 0x31, 0x38, 0x39, 0x32, 0x31, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6830,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6831,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x2d, 0x30, 0x31, 0x38, 0x39, 0x32, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6832,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6833,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6834,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6835,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6836,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6837,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6838,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6839,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6840,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6841,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6842,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6843,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6844,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6845,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6846,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6847,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x31, 0x38, 0x39, 0x32, 0x31, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6848,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6849,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6850,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6851,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6852,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6853,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6854,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6855,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6856,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6857,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6858,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6859,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6860,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6861,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x54, 0x31, 0x37, 0x3a, 0x31, 0x33, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6862,64,"style","Trailing whitespace is superfluous."," 0x32, 0x36, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6863,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6864,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6865,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6866,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6867,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6868,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6869,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6870,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6871,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6872,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6873,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6874,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6875,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6876,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6877,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6878,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6879,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6880,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6881,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x31, 0x39, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6882,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6883,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6884,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6885,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6886,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6887,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6888,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6889,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6890,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6891,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6892,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6893,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6894,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6895,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6896,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6897,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6898,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6899,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6900,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6901,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6902,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6903,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6904,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6905,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6906,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6907,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6908,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6909,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x36, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6910,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6911,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6912,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6913,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6914,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6915,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6916,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6917,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6918,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6919,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x30, 0x31, 0x39, 0x36, 0x35, 0x31, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6920,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6921,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x30, 0x31, 0x39, 0x36, 0x35, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6922,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6923,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6924,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6925,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6926,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6927,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6928,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6929,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6930,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x38, 0x31, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6931,64,"style","Trailing whitespace is superfluous."," 0x36, 0x36, 0x33, 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6932,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6933,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6934,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6935,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6936,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6937,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6938,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6939,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6940,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6941,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x36, 0x30, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6942,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6943,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6944,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6945,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6946,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6947,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6948,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6949,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6950,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6951,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6952,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6953,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6954,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6955,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6956,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6957,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6958,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6959,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x30, 0x38, 0x30, 0x31, 0x39, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6960,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6961,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6962,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6963,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6964,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6965,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6966,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6967,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6968,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6969,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6970,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6971,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6972,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6973,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6974,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6975,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6976,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6977,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x31, 0x39, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6978,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6979,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6980,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6981,64,"style","Trailing whitespace is superfluous."," 0x30, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6982,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6983,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6984,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6985,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6986,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6987,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6988,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6989,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6990,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6991,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x36, 0x54, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6992,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x3a, 0x33, 0x35, 0x3a, 0x30, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6993,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6994,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6995,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6996,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6997,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6998,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6999,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7000,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7001,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7002,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7003,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7004,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7005,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7006,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7007,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7008,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7009,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7010,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7011,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7012,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x33, 0x39, 0x39, 0x31, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7013,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7014,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7015,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7016,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7017,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7018,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7019,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7020,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7021,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7022,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7023,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7024,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7025,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7026,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7027,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7028,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7029,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7030,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7031,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7032,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7033,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7034,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7035,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7036,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7037,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7038,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7039,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x38, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7040,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7041,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7042,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7043,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7044,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7045,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7046,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7047,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7048,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7049,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x38, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7050,64,"style","Trailing whitespace is superfluous."," 0x33, 0x39, 0x39, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7051,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7052,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x39, 0x39, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7053,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7054,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7055,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7056,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7057,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7058,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7059,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7060,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7061,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x38, 0x39, 0x38, 0x38, 0x38, 0x36, 0x38, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7062,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7063,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7064,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7065,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7066,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7067,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7068,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7069,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7070,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7071,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7072,64,"style","Trailing whitespace is superfluous."," 0x35, 0x35, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7073,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7074,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7075,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7076,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7077,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7078,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7079,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7080,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7081,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x31, 0x33, 0x39, 0x39, 0x31, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7082,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7083,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7084,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7085,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7086,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7087,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7088,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7089,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7090,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x31, 0x33, 0x39, 0x39, 0x31, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7091,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7092,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x31, 0x33, 0x39, 0x39, 0x31, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7093,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7094,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7095,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7096,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7097,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7098,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7099,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7100,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7101,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7102,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7103,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7104,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7105,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7106,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7107,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7108,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x33, 0x39, 0x39, 0x31, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7109,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7110,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7111,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x36, 0x35, 0x35, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7112,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7113,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7114,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7115,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7116,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7117,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7118,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7119,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7120,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7121,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7122,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x34, 0x54, 0x31, 0x37, 0x3a, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7123,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x31, 0x39, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7124,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7125,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7126,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7127,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7128,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7129,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7130,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7131,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7132,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7133,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7134,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7135,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7136,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7137,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7138,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7139,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7140,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7141,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7142,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7143,64,"style","Trailing whitespace is superfluous."," 0x39, 0x30, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7144,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7145,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7146,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7147,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7148,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7149,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7150,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7151,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7152,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7153,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7154,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7155,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7156,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7157,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7158,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7159,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7160,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7161,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7162,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7163,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7164,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7165,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7166,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7167,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7168,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7169,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7170,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7171,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7172,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7173,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7174,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7175,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7176,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7177,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7178,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7179,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7180,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x38, 0x30, 0x30, 0x30, 0x32, 0x39, 0x30, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7181,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7182,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x32, 0x39, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7183,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7184,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7185,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7186,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7187,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7188,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7189,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7190,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7191,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x38, 0x38, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7192,64,"style","Trailing whitespace is superfluous."," 0x39, 0x30, 0x34, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7193,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7194,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7195,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7196,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7197,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7198,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7199,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7200,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7201,64,"style","Trailing whitespace is superfluous."," 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7202,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7203,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7204,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7205,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7206,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7207,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7208,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7209,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7210,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7211,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7212,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7213,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x32, 0x39, 0x30, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7214,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7215,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7216,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7217,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7218,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7219,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7220,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7221,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, 0x38, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7222,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x39, 0x30, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7223,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7224,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x32, 0x39, 0x30, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7225,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7226,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7227,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7228,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7229,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7230,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7231,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7232,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7233,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7234,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7235,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x33, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7236,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7237,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7238,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7239,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7240,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x39, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7241,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7242,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7243,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7244,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7245,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7246,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7247,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7248,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7249,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7250,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7251,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7252,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7253,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7254,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7255,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x33, 0x54, 0x31, 0x37, 0x3a, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7256,64,"style","Trailing whitespace is superfluous."," 0x37, 0x3a, 0x32, 0x34, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7257,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7258,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7259,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7260,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7261,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7262,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7263,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7264,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7265,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7266,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7267,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7268,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7269,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7270,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7271,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7272,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7273,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7274,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7275,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7276,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7277,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7278,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7279,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7280,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7281,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7282,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7283,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7284,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7285,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7286,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7287,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7288,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7289,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7290,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7291,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7292,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7293,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7294,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7295,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7296,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7297,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7298,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7299,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7300,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7301,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7302,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7303,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x35, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7304,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7305,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7306,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7307,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7308,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7309,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7310,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7311,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7312,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7313,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x30, 0x38, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7314,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7315,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7316,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7317,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7318,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7319,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7320,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7321,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7322,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7323,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7324,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x38, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7325,64,"style","Trailing whitespace is superfluous."," 0x37, 0x33, 0x36, 0x39, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7326,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7327,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7328,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7329,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7330,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7331,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7332,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7333,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7334,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7335,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x36, 0x32, 0x35, 0x20, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7336,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7337,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7338,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7339,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7340,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7341,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7342,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7343,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7344,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7345,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7346,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7347,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7348,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7349,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7350,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7351,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7352,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7353,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, 0x38, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7354,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7355,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7356,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7357,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7358,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7359,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7360,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7361,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7362,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7363,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7364,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7365,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7366,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7367,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x35, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7368,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7369,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7370,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7371,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7372,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7373,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7374,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7375,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7376,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7377,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7378,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7379,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7380,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7381,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7382,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7383,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7384,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7385,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7386,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x38, 0x3a, 0x33, 0x38, 0x3a, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7387,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7388,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7389,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7390,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7391,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7392,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7393,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7394,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7395,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7396,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7397,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7398,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7399,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7400,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7401,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7402,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7403,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7404,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7405,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7406,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x32, 0x33, 0x30, 0x30, 0x35, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7407,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7408,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7409,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7410,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7411,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7412,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7413,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7414,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7415,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7416,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7417,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7418,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7419,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7420,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7421,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7422,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7423,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7424,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7425,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7426,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7427,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7428,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7429,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7430,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7431,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7432,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7433,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7434,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7435,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7436,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7437,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7438,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7439,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7440,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7441,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7442,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7443,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x37, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7444,64,"style","Trailing whitespace is superfluous."," 0x32, 0x33, 0x30, 0x30, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7445,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7446,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x33, 0x30, 0x30, 0x35, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7447,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7448,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7449,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7450,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7451,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7452,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7453,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7454,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7455,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x37, 0x31, 0x32, 0x31, 0x38, 0x34, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7456,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7457,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7458,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7459,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7460,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7461,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7462,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7463,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7464,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7465,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7466,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x36, 0x37, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7467,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7468,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7469,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7470,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7471,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7472,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7473,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7474,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7475,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x32, 0x33, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7476,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7477,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7478,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7479,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7480,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7481,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7482,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7483,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7484,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x37, 0x30, 0x32, 0x33, 0x30, 0x30, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7485,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7486,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x32, 0x33, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7487,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7488,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7489,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7490,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7491,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7492,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7493,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7494,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7495,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7496,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7497,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7498,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7499,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7500,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7501,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7502,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x30, 0x32, 0x33, 0x30, 0x30, 0x35, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7503,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7504,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7505,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x36, 0x37, 0x36, 0x20, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7506,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7507,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7508,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7509,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7510,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7511,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7512,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7513,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7514,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7515,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7516,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x36, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7517,64,"style","Trailing whitespace is superfluous."," 0x34, 0x31, 0x3a, 0x30, 0x38, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7518,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7519,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7520,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7521,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7522,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7523,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7524,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7525,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7526,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7527,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7528,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7529,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7530,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7531,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7532,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7533,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7534,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7535,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7536,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7537,64,"style","Trailing whitespace is superfluous."," 0x36, 0x39, 0x39, 0x35, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7538,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7539,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7540,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7541,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7542,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7543,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7544,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7545,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7546,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7547,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7548,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7549,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7550,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7551,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7552,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7553,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7554,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7555,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7556,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7557,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7558,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7559,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7560,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7561,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7562,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7563,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7564,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x37, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7565,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7566,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7567,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7568,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7569,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7570,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7571,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7572,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7573,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7574,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x30, 0x37, 0x30, 0x31, 0x36, 0x39, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7575,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7576,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x36, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7577,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7578,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7579,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7580,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7581,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7582,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7583,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7584,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7585,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7586,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x32, 0x38, 0x33, 0x39, 0x31, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7587,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7588,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7589,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7590,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7591,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7592,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7593,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7594,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7595,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7596,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x37, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7597,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7598,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7599,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7600,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7601,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7602,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7603,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7604,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7605,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7606,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x39, 0x39, 0x35, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7607,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7608,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7609,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7610,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7611,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7612,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7613,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7614,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x37, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7615,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x39, 0x39, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7616,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7617,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x39, 0x39, 0x35, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7618,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7619,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7620,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7621,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7622,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7623,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7624,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7625,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7626,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7627,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7628,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x36, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7629,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7630,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7631,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7632,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7633,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x39, 0x39, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7634,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7635,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7636,64,"style","Trailing whitespace is superfluous."," 0x20, 0x38, 0x37, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7637,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7638,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7639,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7640,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7641,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7642,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7643,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7644,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7645,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7646,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7647,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x54, 0x31, 0x36, 0x3a, 0x34, 0x37, 0x3a, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7648,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7649,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7650,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7651,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7652,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7653,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7654,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7655,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7656,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7657,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7658,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7659,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7660,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7661,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7662,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7663,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7664,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7665,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7666,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7667,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x32, 0x35, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7668,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7669,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7670,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7671,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7672,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7673,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7674,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7675,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7676,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7677,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7678,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7679,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7680,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7681,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7682,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7683,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7684,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7685,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7686,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7687,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7688,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7689,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7690,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7691,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7692,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7693,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7694,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7695,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x33, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7696,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7697,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7698,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7699,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7700,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7701,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7702,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7703,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7704,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7705,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x31, 0x32, 0x35, 0x32, 0x38, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7706,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7707,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x31, 0x32, 0x35, 0x32, 0x38, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7708,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7709,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7710,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7711,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7712,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7713,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7714,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7715,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7716,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x37, 0x38, 0x38, 0x35, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7717,64,"style","Trailing whitespace is superfluous."," 0x38, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7718,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7719,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7720,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7721,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7722,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7723,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7724,64,"style","Trailing whitespace is superfluous."," 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7725,64,"style","Trailing whitespace is superfluous."," 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7726,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7727,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7728,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7729,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7730,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7731,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7732,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7733,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7734,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7735,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7736,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7737,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7738,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x32, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7739,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7740,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7741,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7742,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7743,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7744,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7745,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7746,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x37, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7747,64,"style","Trailing whitespace is superfluous."," 0x35, 0x32, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7748,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7749,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x32, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7750,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7751,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7752,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7753,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7754,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7755,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7756,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7757,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7758,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7759,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7760,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x33, 0x30, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7761,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7762,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7763,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7764,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7765,64,"style","Trailing whitespace is superfluous."," 0x35, 0x32, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7766,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7767,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7768,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7769,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7770,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7771,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7772,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7773,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7774,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7775,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7776,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7777,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7778,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7779,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7780,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x39, 0x54, 0x32, 0x31, 0x3a, 0x32, 0x36, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7781,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7782,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7783,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7784,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7785,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7786,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7787,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7788,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7789,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7790,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7791,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7792,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7793,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7794,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7795,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7796,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7797,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7798,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7799,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7800,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x30, 0x32, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7801,64,"style","Trailing whitespace is superfluous."," 0x37, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7802,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7803,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7804,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7805,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7806,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7807,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7808,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7809,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7810,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7811,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7812,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7813,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7814,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7815,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7816,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7817,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7818,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7819,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7820,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7821,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7822,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7823,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7824,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7825,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7826,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7827,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7828,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7829,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7830,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7831,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7832,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7833,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7834,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7835,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7836,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7837,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7838,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x30, 0x30, 0x32, 0x31, 0x33, 0x37, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7839,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7840,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x30, 0x30, 0x32, 0x31, 0x33, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7841,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7842,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7843,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7844,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7845,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7846,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7847,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7848,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7849,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x37, 0x35, 0x38, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7850,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7851,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7852,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7853,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7854,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7855,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7856,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7857,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7858,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7859,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7860,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x37, 0x35, 0x34, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7861,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7862,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7863,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7864,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7865,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7866,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7867,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7868,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7869,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x30, 0x32, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7870,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7871,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7872,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7873,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7874,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7875,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7876,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7877,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7878,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x30, 0x37, 0x30, 0x30, 0x32, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7879,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7880,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x30, 0x32, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7881,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7882,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7883,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7884,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7885,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7886,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7887,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7888,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7889,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7890,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7891,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7892,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7893,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7894,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7895,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7896,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x30, 0x32, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7897,64,"style","Trailing whitespace is superfluous."," 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7898,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7899,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, 0x35, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7900,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7901,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7902,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7903,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7904,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7905,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7906,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7907,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7908,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7909,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7910,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x54, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7911,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3a, 0x34, 0x38, 0x3a, 0x32, 0x33, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7912,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7913,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7914,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7915,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7916,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7917,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7918,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7919,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7920,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7921,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7922,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7923,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7924,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7925,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7926,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7927,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7928,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7929,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7930,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7931,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x30, 0x36, 0x32, 0x36, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7932,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7933,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7934,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7935,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7936,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7937,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7938,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7939,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7940,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7941,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7942,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7943,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7944,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7945,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7946,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7947,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7948,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7949,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7950,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7951,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7952,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7953,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7954,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7955,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7956,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7957,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7958,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x30, 0x36, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7959,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7960,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7961,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7962,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7963,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7964,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7965,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7966,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7967,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7968,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x36, 0x30, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7969,64,"style","Trailing whitespace is superfluous."," 0x36, 0x32, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7970,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7971,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x32, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7972,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7973,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7974,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7975,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7976,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7977,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7978,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7979,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7980,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x31, 0x31, 0x39, 0x31, 0x38, 0x39, 0x31, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7981,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7982,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7983,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7984,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7985,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7986,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7987,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7988,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7989,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7990,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7991,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7992,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7993,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7994,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7995,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7996,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7997,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7998,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7999,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8000,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x32, 0x30, 0x36, 0x32, 0x36, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8001,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8002,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8003,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8004,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8005,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8006,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8007,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8008,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8009,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x32, 0x30, 0x36, 0x32, 0x36, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8010,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8011,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x32, 0x30, 0x36, 0x32, 0x36, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8012,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8013,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8014,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8015,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8016,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8017,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8018,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8019,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8020,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8021,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8022,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x36, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8023,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8024,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8025,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8026,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8027,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x30, 0x36, 0x32, 0x36, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8028,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8029,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8030,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x37, 0x34, 0x36, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8031,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8032,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8033,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8034,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8035,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8036,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8037,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8038,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8039,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8040,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x36, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8041,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x36, 0x54, 0x32, 0x31, 0x3a, 0x34, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8042,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8043,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8044,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8045,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8046,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8047,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8048,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8049,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8050,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8051,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8052,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8053,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8054,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8055,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8056,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8057,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8058,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8059,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8060,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8061,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, 0x35, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8062,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8063,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8064,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8065,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8066,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8067,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8068,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8069,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8070,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8071,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8072,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8073,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8074,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8075,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8076,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8077,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8078,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8079,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8080,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8081,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8082,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8083,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8084,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8085,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8086,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8087,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8088,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8089,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8090,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8091,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8092,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8093,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8094,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8095,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8096,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8097,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8098,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8099,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x36, 0x30, 0x31, 0x35, 0x32, 0x39, 0x31, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8100,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8101,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, 0x35, 0x32, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8102,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8103,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8104,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8105,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8106,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8107,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8108,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8109,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8110,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x36, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8111,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x36, 0x39, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8112,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8113,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8114,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8115,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8116,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8117,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8118,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8119,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8120,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8121,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x35, 0x36, 0x20, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8122,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8123,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8124,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8125,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8126,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8127,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8128,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8129,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8130,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8131,64,"style","Trailing whitespace is superfluous."," 0x35, 0x32, 0x39, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8132,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8133,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8134,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8135,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8136,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8137,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8138,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8139,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x36, 0x30, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8140,64,"style","Trailing whitespace is superfluous."," 0x32, 0x39, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8141,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8142,64,"style","Trailing whitespace is superfluous."," 0x35, 0x32, 0x39, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8143,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8144,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8145,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8146,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8147,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8148,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8149,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8150,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8151,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8152,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8153,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8154,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8155,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8156,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8157,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8158,64,"style","Trailing whitespace is superfluous."," 0x32, 0x39, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8159,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8160,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8161,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8162,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8163,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8164,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8165,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8166,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8167,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8168,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8169,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8170,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8171,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x36, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8172,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x36, 0x3a, 0x34, 0x34, 0x3a, 0x30, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8173,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8174,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8175,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8176,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8177,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8178,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8179,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8180,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8181,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8182,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8183,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8184,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8185,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8186,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8187,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8188,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8189,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8190,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8191,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8192,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x31, 0x31, 0x34, 0x30, 0x31, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8193,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8194,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8195,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8196,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8197,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8198,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8199,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8200,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8201,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8202,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8203,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8204,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8205,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8206,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8207,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8208,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8209,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8210,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8211,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8212,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8213,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8214,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8215,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8216,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8217,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8218,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8219,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x36, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8220,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x31, 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8221,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8222,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8223,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8224,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8225,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8226,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8227,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8228,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8229,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x36, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8230,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x34, 0x30, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8231,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8232,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x34, 0x30, 0x31, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8233,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8234,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8235,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8236,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8237,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8238,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8239,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8240,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8241,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x36, 0x38, 0x39, 0x38, 0x32, 0x38, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8242,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8243,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8244,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8245,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8246,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8247,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8248,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8249,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8250,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8251,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8252,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8253,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8254,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8255,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8256,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8257,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8258,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8259,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8260,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8261,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8262,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8263,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8264,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8265,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8266,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8267,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8268,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8269,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8270,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8271,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x30, 0x36, 0x30, 0x31, 0x31, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8272,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8273,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8274,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8275,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8276,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8277,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8278,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8279,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8280,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8281,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8282,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8283,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8284,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x36, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8285,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x31, 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8286,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8287,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8288,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8289,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, 0x31, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8290,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8291,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8292,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8293,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8294,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8295,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8296,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8297,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8298,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8299,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8300,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8301,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8302,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8303,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8304,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x36, 0x2d, 0x30, 0x36, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8305,64,"style","Trailing whitespace is superfluous."," 0x39, 0x54, 0x32, 0x31, 0x3a, 0x34, 0x34, 0x3a, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8306,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8307,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8308,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8309,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8310,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8311,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8312,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8313,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8314,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8315,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8316,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8317,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8318,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8319,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8320,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8321,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8322,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8323,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8324,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8325,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x2d, 0x30, 0x30, 0x32, 0x30, 0x37, 0x39, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8326,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8327,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8328,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8329,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8330,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8331,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8332,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8333,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8334,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8335,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8336,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8337,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8338,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8339,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8340,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8341,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8342,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8343,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8344,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8345,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8346,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8347,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8348,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8349,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8350,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8351,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8352,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8353,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8354,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8355,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8356,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8357,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8358,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8359,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8360,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8361,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8362,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8363,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x30, 0x37, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8364,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8365,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x32, 0x30, 0x37, 0x39, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8366,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8367,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8368,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8369,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8370,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8371,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8372,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8373,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8374,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x36, 0x35, 0x38, 0x36, 0x37, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8375,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8376,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8377,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8378,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8379,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8380,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8381,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8382,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8383,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8384,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8385,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8386,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8387,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8388,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8389,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8390,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8391,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8392,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8393,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8394,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x30, 0x32, 0x30, 0x37, 0x39, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8395,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8396,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8397,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8398,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8399,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8400,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8401,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8402,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8403,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x30, 0x32, 0x30, 0x37, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8404,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8405,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x30, 0x32, 0x30, 0x37, 0x39, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8406,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8407,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8408,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8409,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8410,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8411,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8412,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8413,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8414,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8415,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8416,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x36, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8417,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8418,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8419,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8420,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8421,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x32, 0x30, 0x37, 0x39, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8422,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8423,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8424,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8425,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8426,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8427,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8428,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8429,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8430,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8431,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8432,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8433,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8434,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x30, 0x36, 0x2d, 0x30, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8435,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x54, 0x31, 0x39, 0x3a, 0x30, 0x37, 0x3a, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8436,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8437,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8438,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8439,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8440,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8441,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8442,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8443,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8444,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8445,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8446,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8447,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8448,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8449,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8450,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8451,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8452,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8453,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8454,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8455,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x38, 0x35, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8456,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8457,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8458,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8459,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8460,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8461,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8462,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8463,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8464,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8465,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8466,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8467,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8468,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8469,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8470,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8471,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8472,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8473,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8474,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8475,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8476,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8477,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8478,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8479,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8480,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8481,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8482,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8483,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8484,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8485,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8486,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8487,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8488,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8489,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8490,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8491,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8492,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8493,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x38, 0x35, 0x33, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8494,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8495,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x30, 0x38, 0x35, 0x33, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8496,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8497,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8498,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8499,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8500,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8501,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8502,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8503,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8504,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x35, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8505,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8506,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8507,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8508,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8509,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8510,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8511,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8512,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8513,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8514,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8515,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x36, 0x36, 0x38, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8516,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8517,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8518,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8519,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8520,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8521,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8522,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8523,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8524,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8525,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8526,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8527,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8528,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8529,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8530,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8531,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8532,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8533,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x30, 0x35, 0x30, 0x30, 0x30, 0x38, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8534,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8535,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8536,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8537,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8538,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8539,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8540,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8541,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8542,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8543,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8544,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8545,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8546,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8547,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x31, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8548,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8549,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8550,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8551,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x38, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8552,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8553,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8554,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x36, 0x36, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8555,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8556,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8557,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8558,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8559,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8560,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8561,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8562,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8563,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8564,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8565,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x30, 0x54, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8566,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x34, 0x39, 0x3a, 0x32, 0x30, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8567,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8568,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8569,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8570,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8571,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8572,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8573,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8574,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8575,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8576,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8577,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8578,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8579,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8580,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8581,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8582,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8583,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8584,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8585,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8586,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x34, 0x36, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8587,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8588,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8589,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8590,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8591,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8592,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8593,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8594,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8595,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8596,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8597,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8598,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8599,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8600,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8601,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8602,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8603,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8604,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8605,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8606,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8607,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8608,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8609,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8610,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8611,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8612,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8613,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8614,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8615,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8616,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8617,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8618,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8619,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8620,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8621,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8622,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8623,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8624,64,"style","Trailing whitespace is superfluous."," 0x35, 0x34, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8625,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8626,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x34, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8627,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8628,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8629,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8630,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8631,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8632,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8633,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8634,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8635,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x39, 0x39, 0x36, 0x30, 0x33, 0x36, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8636,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8637,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8638,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8639,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8640,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8641,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8642,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8643,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8644,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8645,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8646,64,"style","Trailing whitespace is superfluous."," 0x38, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8647,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8648,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8649,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8650,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8651,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8652,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8653,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8654,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8655,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x35, 0x34, 0x36, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8656,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8657,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8658,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8659,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8660,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8661,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8662,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8663,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8664,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x34, 0x36, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8665,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8666,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x35, 0x34, 0x36, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8667,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8668,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8669,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8670,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8671,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8672,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8673,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8674,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8675,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8676,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8677,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8678,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8679,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8680,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8681,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8682,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x34, 0x36, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8683,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8684,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8685,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x38, 0x38, 0x38, 0x20, 0x4b, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8686,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8687,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8688,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8689,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8690,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8691,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8692,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8693,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8694,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8695,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8696,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x33, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x31, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8697,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8698,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8699,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8700,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8701,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8702,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8703,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8704,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8705,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8706,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8707,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8708,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8709,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8710,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8711,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8712,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8713,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8714,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8715,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8716,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8717,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8718,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8719,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8720,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8721,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8722,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8723,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8724,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8725,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8726,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8727,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8728,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8729,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8730,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8731,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8732,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8733,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8734,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8735,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8736,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8737,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8738,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8739,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8740,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8741,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8742,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8743,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8744,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x37, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8745,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8746,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8747,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8748,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8749,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8750,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8751,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8752,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8753,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8754,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x30, 0x30, 0x30, 0x34, 0x30, 0x36, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8755,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8756,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x34, 0x30, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8757,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8758,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8759,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8760,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8761,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8762,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8763,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8764,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8765,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x35, 0x38, 0x38, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8766,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8767,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8768,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8769,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8770,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8771,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8772,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8773,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8774,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8775,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8776,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8777,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8778,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8779,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8780,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8781,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8782,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8783,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8784,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8785,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8786,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8787,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x34, 0x30, 0x36, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8788,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8789,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8790,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8791,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8792,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8793,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8794,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8795,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8796,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x30, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8797,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8798,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x34, 0x30, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8799,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8800,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8801,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8802,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8803,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8804,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8805,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8806,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8807,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8808,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8809,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x37, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8810,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8811,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8812,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8813,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8814,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8815,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8816,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8817,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8818,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8819,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8820,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8821,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8822,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8823,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8824,64,"style","Trailing whitespace is superfluous."," 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8825,64,"style","Trailing whitespace is superfluous."," 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8826,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8827,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8828,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8829,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x37, 0x54, 0x31, 0x35, 0x3a, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8830,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x32, 0x38, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8831,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8832,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8833,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8834,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8835,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8836,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8837,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8838,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8839,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8840,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8841,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8842,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8843,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8844,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8845,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8846,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8847,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8848,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8849,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8850,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8851,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8852,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8853,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8854,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8855,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8856,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8857,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8858,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8859,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8860,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8861,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8862,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8863,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8864,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8865,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8866,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8867,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8868,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8869,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8870,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8871,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8872,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8873,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8874,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8875,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8876,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8877,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8878,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8879,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8880,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8881,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8882,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8883,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8884,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8885,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8886,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8887,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x35, 0x30, 0x30, 0x31, 0x39, 0x31, 0x33, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8888,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8889,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x31, 0x39, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8890,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8891,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8892,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8893,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8894,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8895,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8896,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8897,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8898,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x35, 0x35, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8899,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x37, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8900,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8901,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8902,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8903,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8904,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8905,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8906,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8907,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8908,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8909,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x35, 0x33, 0x34, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8910,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8911,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8912,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8913,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8914,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8915,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8916,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8917,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8918,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8919,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x33, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8920,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8921,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8922,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8923,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8924,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8925,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8926,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8927,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x30, 0x35, 0x30, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8928,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8929,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8930,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8931,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8932,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8933,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8934,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8935,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8936,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8937,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8938,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8939,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8940,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8941,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8942,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8943,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8944,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8945,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8946,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8947,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8948,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x35, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8949,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8950,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8951,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8952,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8953,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8954,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8955,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8956,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8957,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8958,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8959,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x32, 0x54, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8960,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x3a, 0x35, 0x31, 0x3a, 0x31, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8961,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8962,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8963,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8964,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8965,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8966,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8967,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8968,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8969,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8970,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8971,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8972,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8973,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8974,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8975,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8976,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8977,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8978,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8979,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8980,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x36, 0x32, 0x37, 0x30, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8981,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8982,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8983,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8984,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8985,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8986,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8987,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8988,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8989,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8990,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8991,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8992,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8993,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8994,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8995,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8996,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8997,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8998,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8999,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9000,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9001,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9002,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9003,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9004,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9005,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9006,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9007,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x34, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9008,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9009,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9010,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9011,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9012,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9013,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9014,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9015,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9016,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9017,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x34, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9018,64,"style","Trailing whitespace is superfluous."," 0x36, 0x32, 0x37, 0x30, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9019,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9020,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x32, 0x37, 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9021,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9022,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9023,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9024,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9025,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9026,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9027,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9028,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9029,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x34, 0x31, 0x31, 0x31, 0x36, 0x38, 0x33, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9030,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9031,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9032,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9033,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9034,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9035,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9036,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9037,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9038,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9039,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9040,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x39, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9041,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9042,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9043,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9044,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9045,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9046,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9047,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9048,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9049,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x2d, 0x30, 0x31, 0x36, 0x32, 0x37, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9050,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9051,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9052,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9053,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9054,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9055,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9056,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9057,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9058,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x30, 0x31, 0x36, 0x32, 0x37, 0x30, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9059,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9060,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x2d, 0x30, 0x31, 0x36, 0x32, 0x37, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9061,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9062,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9063,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9064,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9065,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9066,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9067,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9068,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9069,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9070,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9071,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x30, 0x34, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9072,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9073,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9074,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9075,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9076,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x31, 0x36, 0x32, 0x37, 0x30, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9077,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9078,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9079,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x35, 0x31, 0x39, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9080,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9081,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9082,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9083,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9084,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9085,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9086,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9087,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9088,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9089,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9090,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x33, 0x54, 0x31, 0x36, 0x3a, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9091,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x31, 0x32, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9092,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9093,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9094,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9095,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9096,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9097,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9098,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9099,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9100,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9101,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9102,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9103,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9104,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9105,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9106,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9107,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9108,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9109,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9110,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9111,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9112,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9113,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9114,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9115,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9116,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9117,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9118,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9119,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9120,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9121,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9122,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9123,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9124,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9125,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9126,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9127,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9128,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9129,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9130,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9131,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9132,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9133,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9134,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9135,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9136,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x33, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9137,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9138,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9139,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9140,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9141,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9142,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9143,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9144,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9145,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9146,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x30, 0x31, 0x31, 0x31, 0x32, 0x34, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9147,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9148,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x2d, 0x30, 0x31, 0x31, 0x31, 0x32, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9149,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9150,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9151,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9152,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9153,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9154,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9155,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9156,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9157,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x34, 0x39, 0x34, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9158,64,"style","Trailing whitespace is superfluous."," 0x36, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9159,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9160,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9161,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9162,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9163,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9164,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9165,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9166,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9167,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9168,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9169,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9170,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9171,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9172,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9173,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9174,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9175,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9176,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9177,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x31, 0x31, 0x31, 0x32, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9178,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9179,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9180,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9181,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9182,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9183,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9184,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9185,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9186,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x34, 0x30, 0x31, 0x31, 0x31, 0x32, 0x34, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9187,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9188,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x31, 0x31, 0x31, 0x32, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9189,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9190,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9191,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9192,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9193,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9194,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9195,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9196,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9197,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9198,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9199,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x30, 0x34, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9200,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9201,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9202,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9203,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9204,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x2d, 0x30, 0x31, 0x31, 0x31, 0x32, 0x34, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9205,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9206,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9207,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9208,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9209,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9210,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9211,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9212,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9213,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9214,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9215,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9216,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9217,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9218,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x33, 0x54, 0x31, 0x33, 0x3a, 0x33, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9219,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x31, 0x35, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9220,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9221,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9222,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9223,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9224,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9225,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9226,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9227,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9228,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9229,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9230,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9231,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9232,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9233,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9234,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9235,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9236,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9237,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9238,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9239,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9240,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9241,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9242,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9243,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9244,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9245,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9246,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9247,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9248,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9249,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9250,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9251,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9252,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9253,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9254,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9255,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9256,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9257,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9258,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9259,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9260,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9261,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9262,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9263,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9264,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x34, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9265,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9266,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9267,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9268,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9269,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9270,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9271,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9272,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9273,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9274,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x30, 0x31, 0x30, 0x34, 0x36, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9275,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9276,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x30, 0x31, 0x30, 0x34, 0x36, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9277,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9278,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9279,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9280,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9281,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9282,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9283,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9284,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9285,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x34, 0x38, 0x35, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9286,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9287,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9288,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9289,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9290,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9291,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9292,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9293,64,"style","Trailing whitespace is superfluous."," 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9294,64,"style","Trailing whitespace is superfluous."," 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9295,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9296,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9297,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9298,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9299,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9300,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9301,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9302,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9303,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9304,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9305,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9306,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9307,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9308,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9309,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9310,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9311,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9312,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9313,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9314,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9315,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, 0x34, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9316,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9317,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9318,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9319,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9320,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9321,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9322,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9323,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9324,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9325,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9326,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9327,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9328,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9329,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x34, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9330,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9331,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9332,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9333,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9334,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9335,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9336,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9337,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9338,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9339,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9340,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9341,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9342,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9343,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9344,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9345,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9346,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9347,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9348,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x34, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9349,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x54, 0x31, 0x37, 0x3a, 0x32, 0x31, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9350,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9351,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9352,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9353,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9354,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9355,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9356,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9357,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9358,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9359,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9360,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9361,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9362,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9363,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9364,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9365,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9366,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9367,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9368,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9369,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9370,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9371,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9372,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9373,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9374,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9375,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9376,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9377,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9378,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9379,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9380,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9381,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9382,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9383,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9384,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9385,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9386,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9387,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9388,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9389,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9390,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9391,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9392,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9393,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9394,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9395,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x31, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9396,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9397,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9398,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9399,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9400,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9401,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9402,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9403,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9404,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9405,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x32, 0x33, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9406,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9407,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x35, 0x32, 0x33, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9408,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9409,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9410,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9411,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9412,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9413,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9414,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9415,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9416,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x34, 0x35, 0x38, 0x31, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9417,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9418,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9419,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9420,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9421,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9422,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9423,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9424,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9425,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9426,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9427,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x39, 0x34, 0x38, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9428,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9429,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9430,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9431,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9432,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9433,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9434,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9435,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9436,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x32, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9437,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9438,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9439,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9440,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9441,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9442,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9443,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9444,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9445,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x34, 0x30, 0x30, 0x30, 0x35, 0x32, 0x33, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9446,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9447,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x32, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9448,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9449,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9450,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9451,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9452,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9453,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9454,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9455,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9456,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9457,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9458,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x30, 0x34, 0x2d, 0x30, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9459,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9460,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9461,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9462,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9463,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x32, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9464,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9465,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9466,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x39, 0x34, 0x38, 0x20, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9467,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9468,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9469,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9470,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9471,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9472,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9473,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9474,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9475,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9476,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9477,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x30, 0x54, 0x31, 0x33, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9478,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x3a, 0x32, 0x38, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9479,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9480,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9481,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9482,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9483,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9484,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9485,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9486,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9487,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9488,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9489,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9490,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9491,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9492,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9493,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9494,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9495,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9496,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9497,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9498,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x34, 0x35, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9499,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9500,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9501,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9502,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9503,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9504,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9505,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9506,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9507,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9508,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9509,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9510,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9511,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9512,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9513,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9514,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9515,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9516,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9517,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9518,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9519,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9520,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9521,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9522,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9523,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x37, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9524,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9525,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9526,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9527,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9528,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9529,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9530,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9531,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9532,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9533,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x33, 0x30, 0x30, 0x35, 0x37, 0x34, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9534,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9535,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x37, 0x34, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9536,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9537,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9538,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9539,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9540,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9541,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9542,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9543,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9544,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x33, 0x39, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9545,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9546,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9547,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9548,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9549,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9550,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9551,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9552,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9553,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9554,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9555,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9556,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9557,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9558,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9559,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9560,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9561,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9562,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9563,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9564,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x37, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9565,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9566,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9567,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9568,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9569,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9570,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9571,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9572,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9573,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x30, 0x33, 0x30, 0x30, 0x35, 0x37, 0x34, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9574,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9575,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x37, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9576,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9577,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9578,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9579,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9580,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9581,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9582,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9583,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9584,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9585,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9586,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x33, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9587,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9588,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9589,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9590,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9591,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x37, 0x34, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9592,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9593,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9594,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x33, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9595,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9596,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9597,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9598,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9599,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9600,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9601,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9602,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9603,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9604,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x33, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9605,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x37, 0x54, 0x31, 0x35, 0x3a, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9606,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3a, 0x30, 0x35, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9607,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9608,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9609,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9610,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9611,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9612,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9613,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9614,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9615,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9616,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9617,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9618,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9619,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9620,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9621,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9622,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9623,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9624,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9625,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9626,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x37, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9627,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9628,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9629,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9630,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9631,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9632,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9633,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9634,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9635,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9636,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9637,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9638,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9639,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9640,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9641,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9642,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9643,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9644,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9645,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9646,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9647,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9648,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9649,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9650,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9651,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x31, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9652,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9653,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9654,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9655,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9656,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9657,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9658,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9659,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9660,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9661,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x30, 0x30, 0x34, 0x32, 0x35, 0x37, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9662,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9663,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x2d, 0x30, 0x30, 0x34, 0x32, 0x35, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9664,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9665,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9666,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9667,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9668,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9669,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9670,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9671,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9672,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x33, 0x38, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9673,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9674,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9675,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9676,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9677,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9678,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9679,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9680,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9681,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9682,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9683,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x34, 0x39, 0x38, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9684,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9685,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9686,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9687,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9688,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9689,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9690,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9691,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9692,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9693,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9694,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9695,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9696,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9697,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9698,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9699,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9700,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9701,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x30, 0x33, 0x30, 0x30, 0x34, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9702,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9703,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9704,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9705,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9706,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9707,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9708,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9709,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9710,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9711,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9712,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9713,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9714,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9715,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x31, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9716,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9717,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9718,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9719,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x34, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9720,64,"style","Trailing whitespace is superfluous."," 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9721,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9722,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x34, 0x39, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9723,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9724,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9725,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9726,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9727,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9728,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9729,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9730,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9731,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9732,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9733,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x31, 0x54, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9734,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3a, 0x30, 0x36, 0x3a, 0x34, 0x37, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9735,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9736,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9737,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9738,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9739,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9740,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9741,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9742,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9743,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9744,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9745,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9746,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9747,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9748,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9749,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9750,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9751,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9752,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9753,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9754,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x39, 0x33, 0x39, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9755,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9756,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9757,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9758,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9759,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9760,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9761,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9762,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9763,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9764,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9765,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9766,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9767,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9768,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9769,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9770,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9771,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9772,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9773,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9774,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9775,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9776,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9777,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9778,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9779,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x33, 0x2d, 0x30, 0x36, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9780,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9781,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9782,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9783,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9784,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9785,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9786,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9787,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9788,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9789,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x30, 0x33, 0x30, 0x30, 0x32, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9790,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9791,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x32, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9792,64,"style","Trailing whitespace is superfluous."," 0x33, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9793,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9794,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9795,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9796,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9797,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9798,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9799,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9800,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9801,64,"style","Trailing whitespace is superfluous."," 0x37, 0x33, 0x39, 0x35, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9802,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9803,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9804,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9805,64,"style","Trailing whitespace is superfluous."," 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9806,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9807,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9808,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9809,64,"style","Trailing whitespace is superfluous."," 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9810,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9811,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9812,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9813,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9814,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9815,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9816,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9817,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9818,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9819,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9820,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9821,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9822,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x30, 0x32, 0x39, 0x33, 0x39, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9823,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9824,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9825,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9826,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9827,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9828,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9829,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9830,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9831,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x30, 0x32, 0x39, 0x33, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9832,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9833,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x30, 0x32, 0x39, 0x33, 0x39, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9834,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9835,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9836,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9837,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9838,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9839,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9840,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9841,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9842,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9843,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9844,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x33, 0x2d, 0x30, 0x36, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9845,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9846,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9847,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9848,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9849,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x32, 0x39, 0x33, 0x39, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9850,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9851,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9852,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9853,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9854,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9855,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9856,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9857,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9858,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9859,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9860,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9861,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9862,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9863,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9864,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x36, 0x2d, 0x31, 0x30, 0x54, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9865,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x31, 0x35, 0x3a, 0x35, 0x38, 0x2d, 0x30, 0x34, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9866,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9867,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9868,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9869,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9870,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9871,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9872,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9873,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9874,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9875,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9876,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9877,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9878,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9879,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9880,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9881,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9882,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9883,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9884,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9885,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x36, 0x39, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9886,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9887,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9888,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9889,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9890,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9891,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9892,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9893,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9894,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9895,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9896,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9897,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9898,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9899,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9900,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9901,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9902,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9903,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9904,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9905,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9906,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9907,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9908,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9909,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9910,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x33, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x31, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9911,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9912,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9913,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9914,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9915,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9916,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9917,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9918,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9919,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9920,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x30, 0x33, 0x30, 0x30, 0x30, 0x36, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9921,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9922,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9923,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9924,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9925,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9926,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9927,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9928,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9929,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9930,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9931,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x33, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9932,64,"style","Trailing whitespace is superfluous."," 0x34, 0x39, 0x35, 0x39, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9933,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9934,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9935,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9936,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9937,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9938,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9939,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9940,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9941,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9942,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9943,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9944,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9945,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9946,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9947,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9948,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9949,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9950,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9951,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9952,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9953,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9954,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9955,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9956,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9957,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9958,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9959,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9960,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x30, 0x33, 0x30, 0x30, 0x30, 0x36, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9961,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9962,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9963,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9964,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9965,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9966,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9967,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9968,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9969,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9970,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9971,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9972,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9973,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9974,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x31, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9975,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9976,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9977,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9978,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9979,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9980,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9981,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9982,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9983,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9984,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9985,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9986,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9987,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9988,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9989,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9990,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9991,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9992,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x31, 0x54, 0x31, 0x33, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9993,64,"style","Trailing whitespace is superfluous."," 0x34, 0x33, 0x3a, 0x32, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9994,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9995,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9996,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9997,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9998,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9999,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10000,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10001,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10002,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10003,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10004,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10005,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10006,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10007,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10008,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10009,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10010,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10011,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10012,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10013,64,"style","Trailing whitespace is superfluous."," 0x34, 0x39, 0x36, 0x30, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10014,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10015,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10016,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10017,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10018,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10019,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10020,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10021,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10022,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10023,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10024,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10025,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10026,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10027,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10028,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10029,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10030,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10031,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10032,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10033,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10034,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10035,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10036,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10037,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10038,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10039,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10040,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10041,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10042,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10043,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10044,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10045,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10046,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10047,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10048,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x32, 0x30, 0x30, 0x34, 0x39, 0x36, 0x30, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10049,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10050,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, 0x34, 0x39, 0x36, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10051,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10052,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10053,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10054,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10055,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10056,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10057,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10058,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10059,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x32, 0x38, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10060,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x34, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10061,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10062,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10063,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10064,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10065,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10066,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10067,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10068,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10069,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10070,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x39, 0x30, 0x32, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10071,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10072,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10073,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10074,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10075,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10076,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10077,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10078,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10079,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10080,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x30, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10081,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10082,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10083,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10084,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10085,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10086,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10087,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10088,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x30, 0x32, 0x30, 0x30, 0x34, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10089,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10090,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10091,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10092,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10093,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10094,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10095,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10096,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10097,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10098,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10099,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10100,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10101,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10102,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10103,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10104,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10105,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10106,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, 0x34, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10107,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10108,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10109,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x39, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10110,64,"style","Trailing whitespace is superfluous."," 0x32, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10111,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10112,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10113,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10114,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10115,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10116,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10117,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10118,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10119,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10120,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x38, 0x54, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10121,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x3a, 0x35, 0x31, 0x3a, 0x34, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10122,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10123,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10124,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10125,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10126,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10127,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10128,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10129,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10130,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10131,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10132,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10133,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10134,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10135,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10136,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10137,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10138,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10139,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10140,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x32, 0x31, 0x34, 0x30, 0x38, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10141,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x30, 0x37, 0x32, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10142,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10143,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10144,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10145,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10146,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10147,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10148,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10149,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10150,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10151,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10152,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10153,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10154,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10155,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10156,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10157,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10158,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10159,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10160,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10161,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10162,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10163,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10164,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10165,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10166,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x32, 0x2d, 0x30, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10167,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10168,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10169,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10170,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10171,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10172,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10173,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10174,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10175,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10176,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x30, 0x38, 0x30, 0x32, 0x30, 0x31, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10177,64,"style","Trailing whitespace is superfluous."," 0x32, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x32, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10178,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10179,64,"style","Trailing whitespace is superfluous."," 0x37, 0x32, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10180,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10181,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10182,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10183,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10184,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10185,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10186,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10187,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10188,64,"style","Trailing whitespace is superfluous."," 0x32, 0x37, 0x33, 0x31, 0x32, 0x38, 0x33, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10189,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10190,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10191,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10192,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10193,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10194,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10195,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10196,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10197,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10198,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10199,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10200,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10201,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10202,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10203,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10204,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10205,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10206,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10207,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x30, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10208,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x32, 0x34, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10209,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10210,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10211,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10212,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10213,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10214,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10215,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10216,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x34, 0x30, 0x38, 0x30, 0x32, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10217,64,"style","Trailing whitespace is superfluous."," 0x37, 0x32, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10218,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x30, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10219,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x32, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10220,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10221,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10222,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10223,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10224,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10225,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10226,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10227,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10228,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10229,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10230,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x33, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10231,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10232,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10233,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x30, 0x32, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10234,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10235,64,"style","Trailing whitespace is superfluous."," 0x37, 0x32, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10236,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10237,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10238,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10239,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10240,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10241,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10242,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10243,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10244,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10245,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10246,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10247,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10248,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x33, 0x54, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10249,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3a, 0x32, 0x35, 0x3a, 0x30, 0x38, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10250,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10251,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10252,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10253,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10254,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10255,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10256,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10257,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10258,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10259,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10260,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10261,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10262,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10263,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10264,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10265,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10266,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10267,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10268,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x30, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10269,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x38, 0x37, 0x37, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10270,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10271,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10272,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10273,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10274,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10275,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10276,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10277,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10278,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10279,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10280,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10281,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10282,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10283,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10284,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10285,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10286,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10287,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10288,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10289,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10290,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10291,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10292,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10293,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10294,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10295,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10296,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10297,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10298,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10299,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10300,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10301,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10302,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10303,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10304,64,"style","Trailing whitespace is superfluous."," 0x38, 0x37, 0x30, 0x30, 0x32, 0x30, 0x30, 0x32, 0x38, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10305,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10306,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10307,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10308,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10309,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10310,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10311,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10312,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10313,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10314,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10315,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10316,64,"style","Trailing whitespace is superfluous."," 0x36, 0x39, 0x31, 0x38, 0x32, 0x33, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10317,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10318,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10319,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10320,64,"style","Trailing whitespace is superfluous."," 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10321,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10322,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10323,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10324,64,"style","Trailing whitespace is superfluous."," 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10325,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10326,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10327,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10328,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x39, 0x30, 0x30, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10329,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10330,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10331,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10332,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10333,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10334,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10335,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10336,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10337,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, 0x32, 0x38, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10338,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10339,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10340,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10341,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10342,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10343,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10344,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10345,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10346,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x30, 0x30, 0x32, 0x38, 0x37, 0x37, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10347,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10348,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, 0x32, 0x38, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10349,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10350,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10351,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10352,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10353,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10354,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10355,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10356,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10357,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10358,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10359,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10360,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10361,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10362,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10363,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10364,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x30, 0x32, 0x38, 0x37, 0x37, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10365,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10366,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10367,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x39, 0x30, 0x30, 0x20, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10368,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10369,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10370,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10371,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10372,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10373,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10374,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10375,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10376,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10377,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10378,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10379,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x2d, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10380,64,"style","Trailing whitespace is superfluous."," 0x38, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x36, 0x3a, 0x32, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10381,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10382,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10383,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10384,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10385,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10386,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10387,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10388,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10389,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10390,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10391,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10392,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10393,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10394,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10395,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10396,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10397,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10398,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10399,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10400,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x38, 0x39, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10401,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10402,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10403,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10404,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10405,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10406,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10407,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10409,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10410,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10411,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10412,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10413,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10414,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10415,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10416,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10417,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10418,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10419,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10420,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10421,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10422,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10423,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10424,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10425,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x32, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10426,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10427,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10428,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10429,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10430,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10431,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10432,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10433,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10434,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10435,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x30, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10436,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10437,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10438,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x36, 0x38, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10439,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10440,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10441,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10442,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10443,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10444,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10445,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10446,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10447,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x32, 0x35, 0x34, 0x38, 0x38, 0x31, 0x36, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10448,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10449,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10450,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10451,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10452,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10453,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10454,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10455,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10456,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10457,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10458,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10459,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10460,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10461,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10462,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10463,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10464,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10465,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10466,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10467,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x38, 0x39, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10468,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10469,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10470,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10471,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10472,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10473,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10474,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10475,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10476,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x30, 0x36, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10477,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10478,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x38, 0x39, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10479,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10480,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10481,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10482,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10483,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10484,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10485,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10486,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10487,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10488,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10489,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x32, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10490,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10491,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10492,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10493,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10494,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x36, 0x38, 0x39, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10495,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10496,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10497,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x31, 0x35, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10498,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10499,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10500,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10501,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10502,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10503,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10504,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10505,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10506,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10507,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10508,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x31, 0x34, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10509,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10510,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10511,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10512,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10513,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10514,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10515,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10516,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10517,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10518,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10519,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10520,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10521,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10522,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10523,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10524,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10525,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10526,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10527,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10528,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10529,64,"style","Trailing whitespace is superfluous."," 0x32, 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10530,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10531,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10532,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10533,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10534,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10535,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10536,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10537,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10538,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10539,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10540,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10541,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10542,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10543,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10544,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10545,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10546,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10547,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10548,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10549,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10550,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10551,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10552,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10553,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10554,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10555,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10556,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10557,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10558,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10559,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10560,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10561,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10562,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10563,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10564,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x30, 0x32, 0x38, 0x32, 0x32, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10565,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10566,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x35, 0x30, 0x32, 0x38, 0x32, 0x32, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10567,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10568,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10569,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10570,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10571,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10572,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10573,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10574,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10575,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x31, 0x37, 0x38, 0x38, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10576,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10577,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10578,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10579,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10580,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10581,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10582,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10583,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10584,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10585,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10586,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x39, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10587,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10588,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10589,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10590,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10591,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10592,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10593,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10594,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10595,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x32, 0x38, 0x32, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10596,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10597,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10598,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10599,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10600,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10601,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10602,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10603,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10604,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x35, 0x30, 0x32, 0x38, 0x32, 0x32, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10605,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10606,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x32, 0x38, 0x32, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10607,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10608,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10609,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10610,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10611,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10612,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10613,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10614,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10615,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10616,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10617,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x30, 0x31, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10618,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10619,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10620,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10621,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10622,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x35, 0x30, 0x32, 0x38, 0x32, 0x32, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10623,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10624,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10625,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x36, 0x20, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10626,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10627,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10628,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10629,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10630,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10631,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10632,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10633,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10634,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10635,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10636,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x54, 0x30, 0x30, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10637,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10638,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10639,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10640,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10641,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10642,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10643,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10644,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10645,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10646,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10647,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10648,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10649,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10650,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10651,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10652,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10653,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10654,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10655,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10656,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x37, 0x30, 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10657,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10658,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10659,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10660,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10661,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10662,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10663,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10664,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10665,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10666,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10667,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10668,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10669,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10670,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10671,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10672,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10673,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10674,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10675,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10676,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10677,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10678,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10679,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10680,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10681,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10682,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10683,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10684,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10685,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10686,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10687,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10688,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10689,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10690,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10691,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10692,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x35, 0x30, 0x31, 0x36, 0x31, 0x31, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10693,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10694,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x31, 0x36, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10695,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10696,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10697,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10698,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10699,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10700,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10701,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10702,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10703,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x37, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10704,64,"style","Trailing whitespace is superfluous."," 0x34, 0x32, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10705,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10706,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10707,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10708,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10709,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10710,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10711,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10712,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10713,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10714,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x38, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10715,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10716,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10717,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10718,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10719,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10720,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10721,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10722,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10723,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10724,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10725,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10726,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10727,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10728,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10729,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10730,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10731,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10732,64,"style","Trailing whitespace is superfluous."," 0x38, 0x37, 0x30, 0x30, 0x31, 0x35, 0x30, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10733,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10734,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10735,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10736,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10737,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10738,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10739,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10740,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10741,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10742,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10743,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10744,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10745,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10746,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10747,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10748,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10749,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10750,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10751,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10752,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10753,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10754,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10755,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10756,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10757,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10758,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10759,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10760,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10761,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10762,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10763,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10764,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x34, 0x54, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10765,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10766,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10767,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10768,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10769,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10770,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10771,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10772,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10773,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10774,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10775,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10776,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10777,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10778,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10779,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10780,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10781,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10782,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10783,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10784,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10785,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x32, 0x35, 0x35, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10786,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10787,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10788,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10789,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10790,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10791,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10792,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10793,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10794,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10795,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10796,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10797,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10798,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10799,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10800,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10801,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10802,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10803,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10804,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10805,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10806,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10807,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10808,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10809,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10810,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x31, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10811,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10812,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10813,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10814,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10815,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10816,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10817,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10818,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10819,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10820,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x30, 0x31, 0x35, 0x30, 0x30, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10821,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10822,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10823,64,"style","Trailing whitespace is superfluous."," 0x35, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10824,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10825,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10826,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10827,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10828,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10829,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10830,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10831,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10832,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x36, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10833,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10834,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10835,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10836,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10837,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10838,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10839,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10840,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10841,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10842,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10843,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10844,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10845,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10846,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10847,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10848,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10849,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10850,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10851,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10852,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10853,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x35, 0x30, 0x30, 0x32, 0x35, 0x35, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10854,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10855,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10856,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10857,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10858,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10859,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10860,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10861,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10862,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x32, 0x35, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10863,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10864,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x35, 0x30, 0x30, 0x32, 0x35, 0x35, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10865,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10866,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10867,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10868,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10869,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10870,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10871,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10872,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10873,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10874,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10875,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x39, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10876,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10877,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10878,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10879,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10880,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x32, 0x35, 0x35, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10881,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10882,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10883,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10884,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10885,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10886,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10887,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10888,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10889,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10890,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10891,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10892,64,"style","Trailing whitespace is superfluous."," 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10893,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10894,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10895,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x39, 0x54, 0x30, 0x30, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10896,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10897,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10898,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10899,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10900,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10901,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10902,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10903,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10904,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10905,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10906,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10907,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10908,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10909,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10910,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10911,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10912,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10913,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10914,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10915,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x31, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10916,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x34, 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10917,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10918,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10919,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10920,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10921,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10922,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10923,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10924,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10925,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10926,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10927,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10928,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10929,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10930,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10931,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10932,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10933,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10934,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10935,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10936,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10937,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10938,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10939,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10940,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10941,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10942,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10943,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10944,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10945,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10946,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10947,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10948,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10949,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10950,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10951,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x30, 0x30, 0x30, 0x31, 0x34, 0x31, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10952,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10953,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x34, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10954,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10955,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10956,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10957,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10958,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10959,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10960,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10961,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10962,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x35, 0x33, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10963,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10964,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10965,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10966,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10967,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10968,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10969,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10970,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10971,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10972,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10973,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x33, 0x37, 0x35, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10974,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10975,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10976,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10977,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10978,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10979,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10980,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10981,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10982,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x31, 0x2d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10983,64,"style","Trailing whitespace is superfluous."," 0x34, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10984,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10985,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10986,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10987,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10988,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10989,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10990,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10991,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x30, 0x31, 0x30, 0x30, 0x30, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10992,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10993,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x31, 0x2d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10994,64,"style","Trailing whitespace is superfluous."," 0x34, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10995,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10996,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10997,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10998,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10999,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11000,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11001,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11002,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11003,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11004,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11005,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x31, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11006,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11007,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11008,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11009,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x31, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11010,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11011,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11012,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x33, 0x37, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11013,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11014,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11015,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11016,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11017,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11018,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11019,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11020,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11021,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11022,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11023,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x33, 0x54, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11024,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11025,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11026,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11027,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11028,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11029,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11030,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11031,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11032,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11033,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11034,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11035,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11036,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11037,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11038,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11039,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11040,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11041,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11042,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11043,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11044,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x33, 0x38, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11045,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11046,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11047,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11048,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11049,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11050,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11051,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11052,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11053,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11054,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11055,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11056,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11057,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11058,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11059,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11060,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11061,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11062,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11063,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11064,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11065,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11066,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11067,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11068,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11069,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11070,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11071,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11072,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11073,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11074,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11075,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11076,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11077,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11078,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11079,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x30, 0x30, 0x30, 0x30, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11080,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11081,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11082,64,"style","Trailing whitespace is superfluous."," 0x33, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11083,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11084,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11085,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11086,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11087,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11088,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11089,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11090,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x37, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11091,64,"style","Trailing whitespace is superfluous."," 0x36, 0x33, 0x35, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11092,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11093,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11094,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11095,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11096,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11097,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11098,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11099,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11100,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11101,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x39, 0x33, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11102,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11103,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11104,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11105,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11106,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11107,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11108,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11109,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11110,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11111,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11112,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11113,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11114,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11115,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11116,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11117,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11118,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11119,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x30, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11120,64,"style","Trailing whitespace is superfluous."," 0x33, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11121,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11122,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11123,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11124,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11125,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11126,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11127,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11128,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11129,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11130,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11131,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11132,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11133,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11134,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11135,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11136,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11137,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11138,64,"style","Trailing whitespace is superfluous."," 0x33, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11139,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11140,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11141,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11142,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11143,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11144,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11145,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11146,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11147,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11148,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11149,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11150,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11151,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x54, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11152,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11153,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11154,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11155,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11156,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11157,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11158,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11159,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11160,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11161,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11162,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11163,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11164,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11165,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11166,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11167,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11168,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11169,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11170,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11171,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11172,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x39, 0x31, 0x36, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11173,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11174,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11175,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11176,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11177,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11178,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11179,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11180,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11181,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11182,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11183,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11184,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11185,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11186,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11187,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11188,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11189,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11190,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11191,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11192,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11193,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11194,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11195,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11196,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11197,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x30, 0x2d, 0x30, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11198,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11199,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11200,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11201,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11202,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11203,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11204,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11205,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11206,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11207,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x30, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11208,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11209,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11210,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11211,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11212,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11213,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11214,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11215,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11216,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11217,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11218,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11219,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x32, 0x37, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11220,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11221,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11222,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11223,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11224,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11225,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11226,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11227,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11228,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11229,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x39, 0x20, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11230,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11231,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11232,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11233,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11234,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11235,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11236,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11237,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11238,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11239,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x31, 0x36, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11240,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11241,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11242,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11243,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11244,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11245,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11246,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11247,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x35, 0x30, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11248,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11249,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11250,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x31, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11251,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11252,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11253,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11254,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11255,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11256,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11257,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11258,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11259,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11260,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11261,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11262,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11263,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11264,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11265,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11266,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11267,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11268,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11269,64,"style","Trailing whitespace is superfluous."," 0x34, 0x39, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11270,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11271,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11272,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11273,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11274,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11275,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11276,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11277,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11278,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11279,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x30, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11280,64,"style","Trailing whitespace is superfluous."," 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11281,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11282,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11283,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11284,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11285,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11286,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11287,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11288,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11289,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11290,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11291,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11292,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x2f, 0x41, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11293,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11294,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11295,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11296,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11297,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11298,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11299,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11300,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x38, 0x37, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11301,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11302,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11303,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11304,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x6e, 0x64, 0x3e, 0x5b, 0x41, 0x6d, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11305,64,"style","Trailing whitespace is superfluous."," 0x64, 0x5d, 0x3c, 0x2f, 0x61, 0x6d, 0x65, 0x6e, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11306,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11307,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11308,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11309,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11310,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11311,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11312,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11313,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11314,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11315,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11316,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11317,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11318,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11319,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11320,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11321,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11322,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11323,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11324,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11325,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11326,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11327,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11328,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11329,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x31, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11330,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11331,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11332,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11333,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11334,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11335,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11336,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11337,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11338,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11339,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x38, 0x37, 0x36, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11340,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11341,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x38, 0x37, 0x36, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11342,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11343,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11344,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11345,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11346,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x2f, 0x41, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11347,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11348,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11349,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11350,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x36, 0x39, 0x34, 0x33, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11351,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11352,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11353,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11354,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11355,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11356,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11357,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11358,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11359,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11360,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11361,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11362,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11363,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11364,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11365,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11366,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11367,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11368,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11369,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11370,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11371,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11372,64,"style","Trailing whitespace is superfluous."," 0x38, 0x37, 0x36, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11373,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11374,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11375,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11376,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11377,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11378,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11379,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11380,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x30, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11381,64,"style","Trailing whitespace is superfluous."," 0x37, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11382,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11383,64,"style","Trailing whitespace is superfluous."," 0x38, 0x37, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11384,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11385,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11386,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11387,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11388,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11389,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11390,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11391,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11392,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11393,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11394,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x31, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11395,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11396,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11397,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11398,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11399,64,"style","Trailing whitespace is superfluous."," 0x37, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11400,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11401,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11402,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11403,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11404,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11405,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x20, 0x5b, 0x41, 0x6d, 0x65, 0x6e, 0x64, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11406,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11407,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11408,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11409,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11410,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11411,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11412,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11413,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11414,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x30, 0x30, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11415,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11416,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11417,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11418,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11419,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11420,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11421,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11422,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11423,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11424,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11425,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11426,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11427,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11428,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11429,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11430,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11431,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11432,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11433,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11434,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11435,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x37, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11436,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11437,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11438,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11439,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11440,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11441,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11442,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11443,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11444,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11445,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11446,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11447,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11448,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11449,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11450,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11451,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11452,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11453,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11454,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11455,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11456,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11457,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11458,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11459,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11460,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11461,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11462,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11463,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11464,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11465,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11466,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11467,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11468,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11469,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11470,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11471,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x37, 0x37, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11472,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11473,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x37, 0x37, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11474,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11475,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11476,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11477,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11478,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11479,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11480,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11481,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11482,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x36, 0x36, 0x33, 0x39, 0x32, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11483,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11484,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11485,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11486,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11487,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11488,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11489,64,"style","Trailing whitespace is superfluous."," 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11490,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11491,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11492,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11493,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11494,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x34, 0x31, 0x32, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11495,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11496,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11497,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11498,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11499,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11500,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11501,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11502,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11503,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11504,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11505,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11506,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11507,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11508,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11509,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11510,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11511,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11512,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x30, 0x30, 0x30, 0x30, 0x30, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11513,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11514,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11515,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11516,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11517,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11518,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11519,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11520,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11521,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11522,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11523,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11524,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11525,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11526,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x32, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11527,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11528,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11529,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11530,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11531,64,"style","Trailing whitespace is superfluous."," 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11532,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11533,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x34, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11534,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11535,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11536,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11537,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11538,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11539,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11540,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11541,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11542,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11543,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11544,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11545,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x30, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11546,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x39, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11547,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11548,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11549,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11550,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11551,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11552,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11553,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11554,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11555,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11556,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11557,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11558,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11559,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11560,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11561,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11562,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11563,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11564,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11565,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11566,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11567,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11568,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11569,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11570,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11571,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11572,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11573,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11574,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11575,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11576,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11577,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11578,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11579,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11580,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11581,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11582,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11583,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11584,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11585,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11586,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11587,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11588,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11589,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11590,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11591,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11592,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x31, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11593,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11594,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11595,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11596,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11597,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11598,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11599,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11600,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11601,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11602,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x30, 0x30, 0x33, 0x34, 0x32, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11603,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11604,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11605,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11606,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11607,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11608,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11609,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11610,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11611,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x35, 0x34, 0x31, 0x38, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11612,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11613,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11614,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11615,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11616,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11617,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11618,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11619,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11620,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11621,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11622,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x35, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11623,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11624,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11625,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11626,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11627,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11628,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11629,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11630,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11631,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x33, 0x34, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11632,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11633,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11634,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11635,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11636,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11637,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11638,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11639,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11640,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11641,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11642,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11643,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11644,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11645,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11646,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11647,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11648,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11649,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11650,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11651,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11652,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11653,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11654,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11655,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11656,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11657,64,"style","Trailing whitespace is superfluous."," 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11658,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11659,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11660,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11661,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11662,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11663,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11664,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11665,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11666,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11667,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11668,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11669,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11670,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x34, 0x54, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11671,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11672,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11673,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11674,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11675,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11676,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11677,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11678,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11679,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11680,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11681,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11682,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11683,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11684,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11685,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11686,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11687,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11688,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11689,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11690,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11691,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x30, 0x31, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11692,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11693,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11694,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11695,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11696,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11697,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11698,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11699,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11700,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11701,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11702,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11703,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11704,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11705,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11706,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11707,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11708,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11709,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11710,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11711,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11712,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11713,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11714,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11715,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11716,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x39, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11717,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11718,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11719,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11720,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11721,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11722,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11723,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11724,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11725,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11726,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11727,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11728,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11729,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11730,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11731,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11732,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11733,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11734,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11735,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11736,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x37, 0x35, 0x34, 0x31, 0x38, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11737,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11738,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11739,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11740,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11741,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11742,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11743,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11744,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11745,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11746,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x32, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11747,64,"style","Trailing whitespace is superfluous."," 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11748,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11749,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11750,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11751,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11752,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11753,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11754,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11755,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11756,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x31, 0x30, 0x30, 0x31, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11757,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11758,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11759,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11760,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11761,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11762,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11763,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11764,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11765,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x30, 0x31, 0x30, 0x30, 0x31, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11766,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11767,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11768,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11769,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11770,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11771,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11772,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11773,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11774,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11775,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11776,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x39, 0x39, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11777,64,"style","Trailing whitespace is superfluous."," 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11778,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11779,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11780,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11781,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x30, 0x31, 0x30, 0x30, 0x31, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11782,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11783,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11784,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x34, 0x36, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11785,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11786,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11787,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11788,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11789,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11790,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11791,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11792,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11793,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11794,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11795,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x31, 0x35, 0x54, 0x30, 0x30, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11796,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11797,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11798,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11799,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11800,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11801,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11802,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11803,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11804,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11805,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11806,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11807,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11808,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11809,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11810,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11811,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11812,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11813,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11814,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11815,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11816,64,"style","Trailing whitespace is superfluous."," 0x37, 0x34, 0x35, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11817,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11818,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11819,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11820,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11821,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11822,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11823,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11824,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11825,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11826,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11827,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11828,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11829,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11830,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11831,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11832,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11833,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11834,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11835,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11836,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11837,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11838,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11839,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11840,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11841,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x32, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11842,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11843,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11844,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11845,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11846,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11847,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11848,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11849,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11850,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11851,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x37, 0x34, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11852,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11853,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11854,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11855,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11856,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11857,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11858,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11859,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11860,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x39, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11861,64,"style","Trailing whitespace is superfluous."," 0x38, 0x36, 0x33, 0x34, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11862,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11863,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11864,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11865,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11866,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11867,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11868,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11869,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11870,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11871,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x39, 0x31, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11872,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11873,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11874,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11875,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11876,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11877,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11878,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11879,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11880,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11881,64,"style","Trailing whitespace is superfluous."," 0x37, 0x34, 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11882,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11883,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11884,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11885,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11886,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11887,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11888,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11889,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11890,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x34, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11891,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11892,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11893,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11894,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11895,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11896,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11897,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11898,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11899,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11900,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11901,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x32, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11902,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11903,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11904,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11905,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11906,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x34, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11907,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11908,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11909,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11910,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11911,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11912,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11913,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11914,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11915,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11916,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11917,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11918,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11919,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x39, 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11920,64,"style","Trailing whitespace is superfluous."," 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11921,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11922,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11923,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11924,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11925,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11926,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11927,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11928,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11929,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11930,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11931,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11932,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11933,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11934,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11935,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11936,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11937,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11938,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11939,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11940,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x39, 0x39, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11941,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11942,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11943,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11944,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11945,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11946,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11947,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11948,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11949,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11950,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11951,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11952,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11953,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11954,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11955,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11956,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11957,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11958,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11959,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11960,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11961,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11962,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11963,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11964,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11965,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x39, 0x39, 0x39, 0x2d, 0x30, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11966,64,"style","Trailing whitespace is superfluous."," 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11967,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11968,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11969,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11970,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11971,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11972,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11973,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11974,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11975,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11976,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x39, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11977,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11978,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11979,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11980,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11981,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11982,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11983,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11984,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11985,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x39, 0x39, 0x36, 0x35, 0x35, 0x30, 0x36, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11986,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11987,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11988,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11989,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11990,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11991,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11992,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11993,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11994,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11995,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11996,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11997,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x31, 0x36, 0x20, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11998,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11999,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12000,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12001,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12002,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12003,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12004,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12005,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12006,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12007,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x39, 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12008,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12009,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12010,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12011,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12012,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12013,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12014,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12015,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12016,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x39, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12017,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12018,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12019,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12020,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12021,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12022,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12023,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12024,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12025,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12026,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12027,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x39, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12028,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12029,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12030,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12031,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12032,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x39, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12033,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12034,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12035,64,"style","Trailing whitespace is superfluous."," 0x20, 0x37, 0x31, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12036,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12037,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12038,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12039,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12040,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12041,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12042,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12043,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12044,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12045,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12046,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12047,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x39, 0x54, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12048,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x34, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12049,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12050,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12051,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12052,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12053,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12054,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12055,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12056,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12057,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12058,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12059,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12060,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12061,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12062,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12063,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12064,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12065,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12066,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12067,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12068,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x30, 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12069,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12070,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12071,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12072,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12073,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12074,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12075,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12076,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12077,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12078,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12079,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12080,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12081,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12082,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12083,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12084,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12085,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12086,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12087,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12088,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12089,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12090,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12091,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12092,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12093,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x36, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12094,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12095,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12096,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12097,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12098,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12099,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12100,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12101,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12102,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12103,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12104,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12105,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12106,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12107,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12108,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12109,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12110,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12111,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12112,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12113,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x34, 0x32, 0x38, 0x31, 0x32, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12114,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12115,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12116,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12117,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12118,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12119,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12120,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12121,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12122,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12123,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12124,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12125,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12126,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12127,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12128,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12129,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12130,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12131,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12132,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12133,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x32, 0x30, 0x32, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12134,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12135,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12136,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12137,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12138,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12139,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12140,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12141,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12142,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x32, 0x30, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12143,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12144,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12145,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12146,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12147,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12148,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12149,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12150,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12151,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12152,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12153,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x39, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12154,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12155,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12156,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12157,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12158,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x32, 0x30, 0x32, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12159,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12160,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12161,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x31, 0x31, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12162,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12163,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12164,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12165,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12166,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12167,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12168,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12169,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12170,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12171,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12172,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x31, 0x36, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12173,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12174,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12175,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12176,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12177,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12178,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12179,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12180,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12181,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12182,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12183,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12184,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12185,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12186,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12187,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12188,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12189,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12190,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12191,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12192,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12193,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12194,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12195,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12196,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12197,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12198,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12199,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12200,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12201,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12202,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12203,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12204,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12205,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12206,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12207,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12208,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12209,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12210,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12211,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12212,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12213,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12214,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12215,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12216,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12217,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12218,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x33, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12219,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12220,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12221,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12222,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12223,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12224,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12225,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12226,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12227,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12228,64,"style","Trailing whitespace is superfluous."," 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x38, 0x39, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12229,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12230,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12231,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12232,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12233,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12234,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12235,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12236,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12237,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x38, 0x37, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12238,64,"style","Trailing whitespace is superfluous."," 0x38, 0x37, 0x39, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12239,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12240,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12241,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12242,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12243,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12244,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12245,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12246,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12247,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12248,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x30, 0x32, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12249,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12250,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12251,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12252,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12253,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12254,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12255,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12256,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12257,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12258,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12259,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12260,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12261,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12262,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12263,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12264,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12265,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12266,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12267,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12268,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12269,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12270,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12271,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12272,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12273,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12274,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12275,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12276,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12277,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12278,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x33, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12279,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12280,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12281,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12282,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12283,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12284,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12285,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12286,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x32, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12287,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12288,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12289,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12290,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12291,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12292,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12293,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12294,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12295,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12296,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x39, 0x39, 0x38, 0x2d, 0x31, 0x31, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12297,64,"style","Trailing whitespace is superfluous."," 0x33, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12298,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12299,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12300,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12301,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12302,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12303,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12304,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12305,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12306,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12307,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12308,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12309,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12310,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12311,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12312,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12313,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12314,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12315,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12316,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12317,64,"style","Trailing whitespace is superfluous."," 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x36, 0x37, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12318,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12319,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12320,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12321,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12322,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12323,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12324,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12325,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12326,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12327,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12328,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12329,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12330,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12331,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12332,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12333,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12334,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12335,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12336,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12337,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12338,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12339,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12340,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12341,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12342,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, 0x38, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12343,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12344,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12345,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12346,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12347,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12348,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12349,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12350,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12351,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12352,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12353,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x36, 0x36, 0x37, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12354,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12355,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12356,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12357,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12358,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12359,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12360,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12361,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12362,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x39, 0x38, 0x36, 0x38, 0x32, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12363,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12364,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12365,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12366,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12367,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12368,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12369,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12370,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12371,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12372,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12373,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x38, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12374,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12375,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12376,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12377,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12378,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12379,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12380,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12381,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12382,64,"style","Trailing whitespace is superfluous."," 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x36, 0x37, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12383,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12384,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12385,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12386,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12387,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12388,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12389,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12390,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12391,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x36, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12392,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12393,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12394,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12395,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12396,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12397,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12398,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12399,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12400,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12401,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12402,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, 0x38, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12403,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12404,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12405,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12406,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12407,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x36, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12409,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12410,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x38, 0x36, 0x20, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12411,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12412,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12413,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12414,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12415,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12416,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12417,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12418,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12419,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12420,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12421,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x31, 0x54, 0x30, 0x30, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12422,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12423,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12424,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12425,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12426,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12427,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12428,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12429,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12430,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12431,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12432,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12433,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12434,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12435,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12436,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12437,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12438,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12439,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12440,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12441,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12442,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x37, 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12443,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12444,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12445,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12446,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12447,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12448,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12449,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12450,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12451,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12452,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12453,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12454,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12455,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12456,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12457,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12458,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12459,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12460,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12461,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12462,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12463,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12464,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12465,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12466,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12467,64,"style","Trailing whitespace is superfluous."," 0x39, 0x38, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x36, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12468,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12469,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12470,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12471,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12472,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12473,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12474,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12475,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12476,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12477,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12478,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12479,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12480,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12481,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12482,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12483,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12484,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12485,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12486,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12487,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x35, 0x35, 0x31, 0x35, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12488,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12489,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12490,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12491,64,"style","Trailing whitespace is superfluous."," 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12492,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12493,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12494,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12495,64,"style","Trailing whitespace is superfluous."," 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12496,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12497,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12498,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12499,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x32, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12500,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12501,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12502,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12503,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12504,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12505,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12506,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12507,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12508,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12509,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12510,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12511,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12512,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12513,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12514,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12515,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12516,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12517,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12518,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12519,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12520,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12521,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12522,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12523,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12524,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12525,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12526,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12527,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12528,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12529,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x32, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12530,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12531,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12532,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12533,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12534,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12535,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12536,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x32, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12537,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12538,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12539,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12540,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12541,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12542,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12543,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12544,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12545,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12546,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12547,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12548,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x38, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12549,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x36, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12550,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12551,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12552,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12553,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12554,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12555,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12556,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12557,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12558,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12559,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12560,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12561,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12562,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12563,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12564,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12565,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12566,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12567,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12568,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x38, 0x34, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12569,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12570,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12571,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12572,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12573,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12574,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12575,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12576,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12577,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12578,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12579,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12580,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12581,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12582,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12583,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12584,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12585,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12586,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12587,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12588,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12589,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12590,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12591,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12592,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12593,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12594,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12595,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x31, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12596,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12597,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12598,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12599,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12600,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12601,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12602,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12603,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12604,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x39, 0x38, 0x34, 0x33, 0x30, 0x2d, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12605,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x31, 0x38, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12606,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12607,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12608,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12609,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12610,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12611,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12612,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12613,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12614,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x38, 0x35, 0x34, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12615,64,"style","Trailing whitespace is superfluous."," 0x38, 0x32, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12616,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12617,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12618,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12619,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12620,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12621,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12622,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12623,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12624,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12625,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x31, 0x33, 0x30, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12626,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12627,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12628,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12629,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12630,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12631,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12632,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12633,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x38, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12634,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12635,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12636,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12637,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12638,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12639,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12640,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12641,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12642,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12643,64,"style","Trailing whitespace is superfluous."," 0x34, 0x33, 0x30, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12644,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12645,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12646,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12647,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12648,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12649,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12650,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12651,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12652,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12653,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12654,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12655,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x37, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12656,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12657,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12658,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12659,64,"style","Trailing whitespace is superfluous."," 0x34, 0x33, 0x30, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12660,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12661,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12662,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12663,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12664,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12665,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12666,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12667,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12668,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12669,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12670,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12671,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12672,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12673,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x39, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12674,64,"style","Trailing whitespace is superfluous."," 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12675,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12676,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12677,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12678,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12679,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12680,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12681,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12682,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12683,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12684,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12685,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12686,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12687,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12688,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12689,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12690,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12691,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12692,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12693,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12694,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x30, 0x32, 0x32, 0x37, 0x36, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12695,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12696,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12697,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12698,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12699,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12700,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12701,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12702,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12703,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12704,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12705,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12706,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12707,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12708,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12709,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12710,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12711,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12712,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12713,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12714,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12715,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12716,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12717,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12718,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12719,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x39, 0x39, 0x37, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12720,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12721,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12722,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12723,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12724,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12725,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12726,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12727,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12728,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12729,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12730,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x32, 0x37, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12731,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12732,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12733,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12734,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12735,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12736,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12737,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12738,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12739,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x39, 0x37, 0x37, 0x32, 0x30, 0x32, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12740,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12741,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12742,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12743,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12744,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12745,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12746,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12747,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12748,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12749,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12750,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12751,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12752,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12753,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12754,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12755,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12756,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12757,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12758,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12759,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x30, 0x32, 0x32, 0x37, 0x36, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12760,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12761,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12762,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12763,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12764,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12765,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12766,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12767,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12768,64,"style","Trailing whitespace is superfluous."," 0x39, 0x37, 0x2d, 0x30, 0x30, 0x32, 0x32, 0x37, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12769,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12770,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12771,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12772,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12773,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12774,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12775,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12776,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12777,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12778,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12779,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x39, 0x39, 0x37, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12780,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12781,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12782,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12783,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12784,64,"style","Trailing whitespace is superfluous."," 0x39, 0x37, 0x2d, 0x30, 0x30, 0x32, 0x32, 0x37, 0x36, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12785,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12786,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12787,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x39, 0x35, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12788,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12789,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12790,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12791,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12792,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12793,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12794,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12795,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12796,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12797,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12798,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x31, 0x34, 0x54, 0x30, 0x30, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12799,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12800,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12801,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12802,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12803,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12804,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12805,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12806,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12807,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12808,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12809,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12810,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12811,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12812,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12813,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12814,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12815,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12816,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12817,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12818,64,"style","Trailing whitespace is superfluous."," 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12819,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x38, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12820,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12821,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12822,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12823,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12824,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12825,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12826,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12827,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12828,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12829,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12830,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12831,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12832,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12833,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12834,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12835,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12836,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12837,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12838,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12839,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12840,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12841,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12842,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12843,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12844,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12845,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12846,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12847,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12848,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12849,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12850,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12851,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12852,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12853,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12854,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x39, 0x37, 0x2d, 0x30, 0x30, 0x31, 0x34, 0x38, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12855,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12856,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12857,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12858,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12859,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12860,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12861,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12862,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12863,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x37, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12864,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x35, 0x35, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12865,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12866,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12867,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12868,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12869,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12870,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12871,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12872,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12873,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12874,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x33, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12875,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12876,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12877,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12878,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12879,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12880,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12881,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12882,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12883,64,"style","Trailing whitespace is superfluous."," 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12884,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12885,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12886,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12887,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12888,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12889,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12890,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12891,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12892,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12893,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x38, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12894,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12895,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12896,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12897,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12898,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12899,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12900,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12901,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12902,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12903,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12904,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12905,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12906,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12907,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12908,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12909,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x38, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12910,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12911,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12912,64,"style","Trailing whitespace is superfluous."," 0x38, 0x33, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12913,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12914,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12915,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12916,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12917,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12918,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12919,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12920,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12921,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12922,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x39, 0x37, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12923,64,"style","Trailing whitespace is superfluous."," 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12924,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12925,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12926,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12927,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12928,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12929,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12930,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12931,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12932,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12933,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12934,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12935,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12936,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12937,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12938,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12939,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12940,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12941,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12942,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12943,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x30, 0x31, 0x31, 0x39, 0x35, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12944,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12945,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12946,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12947,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12948,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12949,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12950,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12951,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12952,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12953,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12954,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12955,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12956,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12957,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12958,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12959,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12960,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12961,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12962,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12963,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12964,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12965,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12966,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12967,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12968,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x39, 0x39, 0x37, 0x2d, 0x30, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12969,64,"style","Trailing whitespace is superfluous."," 0x32, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12970,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12971,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12972,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12973,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12974,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12975,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12976,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12977,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12978,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12979,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12980,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12981,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12982,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12983,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12984,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12985,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12986,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12987,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12988,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x39, 0x37, 0x36, 0x32, 0x37, 0x38, 0x33, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12989,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12990,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12991,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12992,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12993,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12994,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12995,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12996,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12997,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12998,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12999,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13000,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x35, 0x36, 0x38, 0x20, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13001,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13002,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13003,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13004,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13005,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13006,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13007,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13008,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13009,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13010,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13011,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13012,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13013,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13014,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13015,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13016,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13017,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13018,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13019,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13020,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13021,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13022,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13023,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13024,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13025,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13026,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13027,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13028,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13029,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13030,64,"style","Trailing whitespace is superfluous."," 0x39, 0x37, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x33, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13031,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13032,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13033,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13034,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13035,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13036,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13037,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13038,64,"style","Trailing whitespace is superfluous."," 0x20, 0x35, 0x36, 0x38, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13039,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13040,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13041,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13042,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13043,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13044,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13045,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13046,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13047,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13048,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13049,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13050,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x33, 0x54, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13051,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x34, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13052,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13053,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13054,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13055,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13056,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13057,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13058,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13059,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13060,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13061,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13062,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13063,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13064,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13065,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13066,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13067,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13068,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13069,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13070,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13071,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x37, 0x37, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13072,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13073,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13074,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13075,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13076,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13077,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13078,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13079,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13080,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13081,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13082,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13083,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13084,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13085,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13086,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13087,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13088,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13089,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13090,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13091,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13092,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13093,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13094,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13095,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13096,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13097,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13098,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13099,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13100,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13101,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13102,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13103,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13104,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13105,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13106,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x39, 0x37, 0x2d, 0x30, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13107,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13108,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13109,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13110,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13111,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13112,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13113,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13114,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13115,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13116,64,"style","Trailing whitespace is superfluous."," 0x37, 0x35, 0x33, 0x34, 0x37, 0x37, 0x36, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13117,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13118,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13119,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13120,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13121,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13122,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13123,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13124,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13125,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13126,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13127,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13128,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13129,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13130,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13131,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13132,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13133,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13134,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13135,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13136,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x32, 0x37, 0x37, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13137,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13138,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13139,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13140,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13141,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13142,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13143,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13144,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13145,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x32, 0x37, 0x37, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13146,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13147,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13148,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13149,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13150,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13151,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13152,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13153,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13154,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13155,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13156,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x39, 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13157,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13158,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13159,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13160,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13161,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x32, 0x37, 0x37, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13162,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13163,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13164,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x31, 0x38, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13165,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13166,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13167,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13168,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13169,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13170,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13171,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13172,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13173,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13174,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13175,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x31, 0x34, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13176,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13177,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13178,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13179,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13180,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13181,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13182,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13183,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13184,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13185,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13186,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13187,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13188,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13189,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13190,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13191,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13192,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13193,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13194,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13195,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13196,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13197,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13198,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13199,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13200,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13201,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13202,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13203,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13204,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13205,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13206,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13207,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13208,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13209,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13210,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13211,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13212,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13213,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13214,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13215,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13216,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13217,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13218,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13219,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13220,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13221,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13222,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13223,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13224,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13225,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13226,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13227,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13228,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13229,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13230,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13231,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x39, 0x32, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13232,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13233,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13234,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13235,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13236,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13237,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13238,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13239,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13240,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x36, 0x36, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13241,64,"style","Trailing whitespace is superfluous."," 0x34, 0x34, 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13242,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13243,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13244,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13245,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13246,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13247,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13248,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13249,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13250,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13251,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x37, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13252,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13253,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13254,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13255,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13256,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13257,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13258,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13259,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13260,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13261,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13262,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13263,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13264,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13265,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13266,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13267,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13268,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13269,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13270,64,"style","Trailing whitespace is superfluous."," 0x39, 0x32, 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13271,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13272,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13273,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13274,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13275,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13276,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13277,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13278,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13279,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13280,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13281,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13282,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13283,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13284,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13285,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13286,64,"style","Trailing whitespace is superfluous."," 0x39, 0x32, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13287,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13288,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13289,64,"style","Trailing whitespace is superfluous."," 0x37, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13290,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13291,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13292,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13293,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13294,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13295,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13296,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13297,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13298,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13299,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x36, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x54, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13300,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13301,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13302,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13303,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13304,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13305,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13306,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13307,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13308,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13309,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13310,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13311,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13312,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13313,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13314,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13315,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13316,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13317,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13318,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13319,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13320,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x36, 0x31, 0x35, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13321,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13322,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13323,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13324,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13325,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13326,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13327,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13328,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13329,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13330,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13331,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13332,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13333,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13334,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13335,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13336,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13337,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13338,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13339,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13340,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13341,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13342,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13343,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13344,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13345,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x39, 0x39, 0x36, 0x2d, 0x30, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13346,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13347,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13348,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13349,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13350,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13351,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13352,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13353,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13354,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13355,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13356,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x31, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13357,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13358,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13359,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13360,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13361,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13362,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13363,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13364,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13365,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x39, 0x36, 0x36, 0x31, 0x31, 0x39, 0x36, 0x36, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13366,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13367,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13368,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13369,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13370,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13371,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13372,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13373,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13374,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13375,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13376,64,"style","Trailing whitespace is superfluous."," 0x32, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13377,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13378,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13379,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13380,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13381,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13382,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13383,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13384,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13385,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x36, 0x31, 0x35, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13386,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13387,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13388,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13389,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13390,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13391,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13392,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13393,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13394,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x31, 0x35, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13395,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13396,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13397,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13398,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13399,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13400,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13401,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13402,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13403,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13404,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13405,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x39, 0x39, 0x36, 0x2d, 0x30, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13406,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13407,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13408,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13409,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13410,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x31, 0x35, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13411,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13412,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13413,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x37, 0x32, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13414,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13415,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13416,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13417,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13418,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13419,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13420,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13421,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13422,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13423,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x36, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13424,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x31, 0x34, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13425,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13426,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13427,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13428,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13429,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13430,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13431,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13432,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13433,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13434,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13435,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13436,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13437,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13438,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13439,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13440,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13441,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13442,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13443,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13444,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x31, 0x33, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13445,64,"style","Trailing whitespace is superfluous."," 0x36, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13446,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13447,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13448,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13449,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13450,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13451,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13452,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13453,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13454,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13455,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13456,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13457,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13458,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13459,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13460,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13461,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13462,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13463,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13464,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13465,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13466,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13467,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13468,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13469,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13470,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13471,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13472,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13473,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13474,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13475,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13476,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13477,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13478,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13479,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13480,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x2d, 0x30, 0x31, 0x33, 0x35, 0x36, 0x33, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13481,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13482,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13483,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13484,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13485,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13486,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13487,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13488,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13489,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x36, 0x35, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13490,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x37, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13491,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13492,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13493,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13494,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13495,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13496,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13497,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13498,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13499,64,"style","Trailing whitespace is superfluous."," 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13500,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13501,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13502,64,"style","Trailing whitespace is superfluous."," 0x39, 0x37, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13503,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13504,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13505,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13506,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13507,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13508,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13509,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13510,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13511,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x31, 0x33, 0x35, 0x36, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13512,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13513,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13514,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13515,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13516,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13517,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13518,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13519,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13520,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x2d, 0x30, 0x31, 0x33, 0x35, 0x36, 0x33, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13521,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13522,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13523,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13524,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13525,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13526,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13527,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13528,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13529,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13530,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13531,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x39, 0x39, 0x36, 0x2d, 0x30, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13532,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13533,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13534,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13535,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13536,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x2d, 0x30, 0x31, 0x33, 0x35, 0x36, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13537,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13538,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13539,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x37, 0x20, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13540,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13541,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13542,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13543,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13544,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13545,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13546,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13547,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13548,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13549,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13550,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13551,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x39, 0x39, 0x36, 0x2d, 0x30, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13552,64,"style","Trailing whitespace is superfluous."," 0x31, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13553,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13554,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13555,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13556,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13557,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13558,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13559,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13560,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13561,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13562,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13563,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13564,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13565,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13566,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13567,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13568,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13569,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13570,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13571,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13572,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x2d, 0x30, 0x30, 0x32, 0x35, 0x35, 0x31, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13573,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13574,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13575,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13576,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13577,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13578,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13579,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13580,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13581,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13582,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13583,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13584,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13585,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13586,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13587,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13588,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13589,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13590,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13591,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13592,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13593,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13594,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13595,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13596,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13597,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, 0x36, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13598,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13599,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13600,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13601,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13602,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13603,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13604,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13605,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13606,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13607,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, 0x39, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13608,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x35, 0x35, 0x31, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13609,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13610,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13611,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13612,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13613,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13614,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13615,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13616,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13617,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x39, 0x36, 0x35, 0x31, 0x39, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13618,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13619,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13620,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13621,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13622,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13623,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13624,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13625,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13626,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13627,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13628,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x38, 0x35, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13629,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13630,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13631,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13632,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13633,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13634,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13635,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13636,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13637,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x2d, 0x30, 0x30, 0x32, 0x35, 0x35, 0x31, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13638,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13639,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13640,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13641,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13642,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13643,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13644,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13645,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13646,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x30, 0x32, 0x35, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13647,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13648,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13649,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13650,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13651,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13652,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13653,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13654,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13655,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13656,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13657,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, 0x36, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13658,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13659,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13660,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13661,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13662,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x30, 0x32, 0x35, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13663,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13664,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13665,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x38, 0x35, 0x20, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13666,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13667,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13668,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13669,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13670,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13671,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13672,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13673,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13674,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13675,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13676,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x34, 0x54, 0x30, 0x30, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13677,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13678,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13679,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13680,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13681,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13682,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13683,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13684,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13685,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13686,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13687,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13688,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13689,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13690,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13691,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13692,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13693,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13694,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13695,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13696,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x35, 0x37, 0x2d, 0x39, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13697,64,"style","Trailing whitespace is superfluous."," 0x39, 0x38, 0x34, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13698,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13699,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13700,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13701,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13702,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13703,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13704,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13705,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13706,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13707,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13708,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13709,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13710,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13711,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13712,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13713,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13714,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13715,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13716,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13717,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13718,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13719,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13720,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13721,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13722,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13723,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13724,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13725,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13726,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13727,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13728,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13729,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13730,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13731,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13732,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x39, 0x35, 0x2d, 0x30, 0x30, 0x39, 0x38, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13733,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13734,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13735,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13736,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13737,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13738,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13739,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13740,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13741,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13742,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x31, 0x32, 0x30, 0x32, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13743,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13744,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13745,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13746,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13747,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13748,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13749,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13750,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13751,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13752,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x33, 0x20, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13753,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13754,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13755,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13756,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13757,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13758,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13759,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13760,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13761,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x35, 0x37, 0x2d, 0x39, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13762,64,"style","Trailing whitespace is superfluous."," 0x39, 0x38, 0x34, 0x33, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13763,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13764,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13765,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13766,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13767,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13768,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13769,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13770,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, 0x39, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13771,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x38, 0x34, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13772,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13773,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13774,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13775,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13776,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13777,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13778,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13779,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13780,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13781,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13782,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13783,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13784,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13785,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13786,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, 0x39, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13787,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x38, 0x34, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13788,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13789,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13790,64,"style","Trailing whitespace is superfluous."," 0x20, 0x38, 0x33, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13791,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13792,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13793,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13794,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13795,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13796,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13797,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13798,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13799,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13800,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x39, 0x39, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13801,64,"style","Trailing whitespace is superfluous."," 0x34, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13802,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13803,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13804,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13805,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13806,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13807,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13808,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13809,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13810,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13811,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13812,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x43, 0x49, 0x4b, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13813,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13814,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13815,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13816,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13817,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13818,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13819,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13820,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13821,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13822,64,"style","Trailing whitespace is superfluous."," 0x43, 0x49, 0x4b, 0x3d, 0x45, 0x41, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13823,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13824,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13825,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x31, 0x30, 0x2d, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13826,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x73, 0x74, 0x61, 0x72, 0x74, 0x3d, 0x30, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13827,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13828,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13829,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13830,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13831,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13832,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13833,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13834,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13835,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13836,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13837,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13838,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13839,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13840,64,"style","Trailing whitespace is superfluous."," 0x43, 0x49, 0x4b, 0x3d, 0x45, 0x41, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13841,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13842,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13843,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x31, 0x30, 0x2d, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13844,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x73, 0x74, 0x61, 0x72, 0x74, 0x3d, 0x30, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13845,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13846,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13847,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x75, 0x74, 0x3d, 0x61, 0x74, 0x6f, 0x6d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13848,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x73, 0x65, 0x6c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13849,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x61, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13850,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6c, 0x69, 0x63, 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13851,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x6f, 0x6d, 0x2b, 0x78, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13852,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13853,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13854,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13855,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13856,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13857,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13858,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13859,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13860,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x43, 0x49, 0x4b, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13861,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13862,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x31, 0x30, 0x2d, 0x25, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13863,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13864,64,"style","Trailing whitespace is superfluous."," 0x65, 0x61, 0x3d, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13865,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x62, 0x3d, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13866,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13867,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13868,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13869,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x75, 0x74, 0x70, 0x75, 0x74, 0x3d, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13870,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x73, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13871,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13872,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x6e, 0x65, 0x78, 0x74, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13873,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x61, 0x70, 0x70, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13874,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x2f, 0x61, 0x74, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13875,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2b, 0x78, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13876,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13877,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x45, 0x4c, 0x45, 0x43, 0x54, 0x52, 0x4f, 0x4e, 0x49, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13878,64,"style","Trailing whitespace is superfluous."," 0x43, 0x20, 0x41, 0x52, 0x54, 0x53, 0x20, 0x49, 0x4e, 0x43, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13879,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x20, 0x20, 0x28, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13880,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x29, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13881,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13882,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13883,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x31, 0x2d, 0x32, 0x30, 0x54, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13884,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x35, 0x34, 0x3a, 0x32, 0x31, 0x2d, 0x30, 0x35, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13885,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13886,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x3c, 0x2f, 0x66, 0x65, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13887,74,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a)), date = structure(1579542861, class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13888,77,"style","Trailing whitespace is superfluous."," ""POSIXt""), tzone = ""GMT""), times = c(redirect = 0, namelookup = 0.08977, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13889,73,"style","Trailing whitespace is superfluous."," connect = 0.198839, pretransfer = 0.31077, starttransfer = 0.622565, ","trailing_whitespace_linter" -"vignettes/parsing.Rmd",16,35,"style","Use TRUE instead of the symbol T.","knitr::opts_chunk$set(collapse = T, comment = ""#>"")","T_and_F_symbol_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1,121,"style","Lines should not be more than 120 characters.","structure(list(url = ""/browse-edgar?action=getcompany&CIK=STX&owner=exclude&type=10-Q&dateb=&start=0&count=40&output=atom"", ","line_length_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1,124,"style","Trailing whitespace is superfluous.","structure(list(url = ""/browse-edgar?action=getcompany&CIK=STX&owner=exclude&type=10-Q&dateb=&start=0&count=40&output=atom"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2,78,"style","Trailing whitespace is superfluous."," status_code = 200L, headers = structure(list(`content-encoding` = ""gzip"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3,68,"style","Trailing whitespace is superfluous."," `content-type` = ""application/atom+xml"", server = ""Apache"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4,80,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff"", `x-frame-options` = ""SAMEORIGIN"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5,73,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `content-length` = ""4033"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",6,78,"style","Trailing whitespace is superfluous."," `cache-control` = ""no-cache"", date = ""Mon, 20 Jan 2020 17:54:51 GMT"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",7,61,"style","Trailing whitespace is superfluous."," connection = ""keep-alive"", vary = ""Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",8,88,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000 ; includeSubDomains ; preload"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",10,69,"style","Trailing whitespace is superfluous."," )), all_headers = list(list(status = 200L, version = ""HTTP/1.1"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",11,62,"style","Trailing whitespace is superfluous."," headers = structure(list(`content-encoding` = ""gzip"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",12,72,"style","Trailing whitespace is superfluous."," `content-type` = ""application/atom+xml"", server = ""Apache"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",13,84,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff"", `x-frame-options` = ""SAMEORIGIN"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",14,77,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `content-length` = ""4033"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",15,82,"style","Trailing whitespace is superfluous."," `cache-control` = ""no-cache"", date = ""Mon, 20 Jan 2020 17:54:51 GMT"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",16,65,"style","Trailing whitespace is superfluous."," connection = ""keep-alive"", vary = ""Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",17,118,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000 ; includeSubDomains ; preload""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",18,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",19,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",20,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",21,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",22,65,"style","Trailing whitespace is superfluous."," content = as.raw(c(0x3c, 0x3f, 0x78, 0x6d, 0x6c, 0x20, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",23,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x73, 0x69, 0x6f, 0x6e, 0x3d, 0x22, 0x31, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",24,64,"style","Trailing whitespace is superfluous."," 0x30, 0x22, 0x20, 0x65, 0x6e, 0x63, 0x6f, 0x64, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",25,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3d, 0x22, 0x49, 0x53, 0x4f, 0x2d, 0x38, 0x38, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",26,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x22, 0x20, 0x3f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",27,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x65, 0x65, 0x64, 0x20, 0x78, 0x6d, 0x6c, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",28,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",29,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x77, 0x33, 0x2e, 0x6f, 0x72, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",30,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x32, 0x30, 0x30, 0x35, 0x2f, 0x41, 0x74, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",31,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",32,64,"style","Trailing whitespace is superfluous."," 0x74, 0x68, 0x6f, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",33,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6d, 0x61, 0x69, 0x6c, 0x3e, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",34,64,"style","Trailing whitespace is superfluous."," 0x65, 0x62, 0x6d, 0x61, 0x73, 0x74, 0x65, 0x72, 0x40, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",35,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x3c, 0x2f, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",36,64,"style","Trailing whitespace is superfluous."," 0x61, 0x69, 0x6c, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",37,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x57, 0x65, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",38,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x73, 0x74, 0x65, 0x72, 0x3c, 0x2f, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",39,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",40,64,"style","Trailing whitespace is superfluous."," 0x61, 0x75, 0x74, 0x68, 0x6f, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",41,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",42,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x66, 0x6f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",43,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",44,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",45,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",46,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",47,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",48,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",49,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x79, 0x3e, 0x44, 0x55, 0x42, 0x4c, 0x49, 0x4e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",50,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x3c, 0x2f, 0x63, 0x69, 0x74, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",51,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",52,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x74, 0x61, 0x74, 0x65, 0x3e, 0x4c, 0x32, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",53,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x74, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",54,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",55,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x65, 0x65, 0x74, 0x31, 0x3e, 0x33, 0x38, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",56,64,"style","Trailing whitespace is superfluous."," 0x33, 0x39, 0x20, 0x46, 0x49, 0x54, 0x5a, 0x57, 0x49, 0x4c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",57,64,"style","Trailing whitespace is superfluous."," 0x4c, 0x49, 0x41, 0x4d, 0x20, 0x53, 0x51, 0x55, 0x41, 0x52, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",58,64,"style","Trailing whitespace is superfluous."," 0x45, 0x3c, 0x2f, 0x73, 0x74, 0x72, 0x65, 0x65, 0x74, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",59,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",60,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x7a, 0x69, 0x70, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",61,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x7a, 0x69, 0x70, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",62,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",63,64,"style","Trailing whitespace is superfluous."," 0x64, 0x64, 0x72, 0x65, 0x73, 0x73, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",64,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x64, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",65,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x73, 0x73, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",66,64,"style","Trailing whitespace is superfluous."," 0x22, 0x62, 0x75, 0x73, 0x69, 0x6e, 0x65, 0x73, 0x73, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",67,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",68,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x69, 0x74, 0x79, 0x3e, 0x44, 0x55, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",69,64,"style","Trailing whitespace is superfluous."," 0x42, 0x4c, 0x49, 0x4e, 0x20, 0x32, 0x3c, 0x2f, 0x63, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",70,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",71,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x70, 0x68, 0x6f, 0x6e, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",72,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x28, 0x33, 0x35, 0x33, 0x29, 0x20, 0x28, 0x31, 0x29, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",73,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x33, 0x34, 0x2d, 0x33, 0x31, 0x33, 0x36, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",74,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x70, 0x68, 0x6f, 0x6e, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",75,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",76,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x74, 0x65, 0x3e, 0x4c, 0x32, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",77,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",78,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",79,64,"style","Trailing whitespace is superfluous."," 0x65, 0x65, 0x74, 0x31, 0x3e, 0x33, 0x38, 0x2f, 0x33, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",80,64,"style","Trailing whitespace is superfluous."," 0x20, 0x46, 0x49, 0x54, 0x5a, 0x57, 0x49, 0x4c, 0x4c, 0x49, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",81,64,"style","Trailing whitespace is superfluous."," 0x41, 0x4d, 0x20, 0x53, 0x51, 0x55, 0x41, 0x52, 0x45, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",82,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x74, 0x72, 0x65, 0x65, 0x74, 0x31, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",83,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",84,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x7a, 0x69, 0x70, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",85,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x7a, 0x69, 0x70, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",86,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x61, 0x64, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",87,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x73, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",88,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",89,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",90,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x73, 0x73, 0x69, 0x67, 0x6e, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",91,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x73, 0x69, 0x63, 0x3e, 0x33, 0x35, 0x37, 0x32, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",92,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x73, 0x73, 0x69, 0x67, 0x6e, 0x65, 0x64, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",93,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x63, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",94,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x73, 0x73, 0x69, 0x67, 0x6e, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",95,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x73, 0x69, 0x63, 0x2d, 0x64, 0x65, 0x73, 0x63, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",96,64,"style","Trailing whitespace is superfluous."," 0x43, 0x4f, 0x4d, 0x50, 0x55, 0x54, 0x45, 0x52, 0x20, 0x53, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",97,64,"style","Trailing whitespace is superfluous."," 0x54, 0x4f, 0x52, 0x41, 0x47, 0x45, 0x20, 0x44, 0x45, 0x56, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",98,64,"style","Trailing whitespace is superfluous."," 0x49, 0x43, 0x45, 0x53, 0x3c, 0x2f, 0x61, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",99,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6e, 0x65, 0x64, 0x2d, 0x73, 0x69, 0x63, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",100,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x63, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",101,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x73, 0x73, 0x69, 0x67, 0x6e, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",102,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x73, 0x69, 0x63, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",103,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",104,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",105,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",106,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",107,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",108,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",109,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x53, 0x49, 0x43, 0x3d, 0x33, 0x35, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",110,64,"style","Trailing whitespace is superfluous."," 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",111,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",112,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",113,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x3c, 0x2f, 0x61, 0x73, 0x73, 0x69, 0x67, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",114,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x2d, 0x73, 0x69, 0x63, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",115,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",116,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",117,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x3c, 0x2f, 0x63, 0x69, 0x6b, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",118,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",119,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",120,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",121,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",122,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",123,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",124,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",125,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",126,64,"style","Trailing whitespace is superfluous."," 0x43, 0x49, 0x4b, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",127,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",128,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",129,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",130,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",131,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",132,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",133,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x64, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x53, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",134,64,"style","Trailing whitespace is superfluous."," 0x65, 0x61, 0x67, 0x61, 0x74, 0x65, 0x20, 0x54, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",135,64,"style","Trailing whitespace is superfluous."," 0x68, 0x6e, 0x6f, 0x6c, 0x6f, 0x67, 0x79, 0x20, 0x70, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",136,64,"style","Trailing whitespace is superfluous."," 0x63, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",137,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",138,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",139,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x2d, 0x79, 0x65, 0x61, 0x72, 0x2d, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",140,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x30, 0x37, 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",141,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x61, 0x6c, 0x2d, 0x79, 0x65, 0x61, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",142,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",143,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",144,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x73, 0x20, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",145,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x22, 0x33, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",146,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",147,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",148,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",149,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",150,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",151,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",152,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x53, 0x45, 0x41, 0x47, 0x41, 0x54, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",153,64,"style","Trailing whitespace is superfluous."," 0x45, 0x20, 0x54, 0x45, 0x43, 0x48, 0x4e, 0x4f, 0x4c, 0x4f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",154,64,"style","Trailing whitespace is superfluous."," 0x47, 0x59, 0x3c, 0x2f, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",155,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",156,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",157,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",158,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",159,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",160,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x36, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",161,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",162,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",163,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x53, 0x65, 0x61, 0x67, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",164,64,"style","Trailing whitespace is superfluous."," 0x20, 0x54, 0x65, 0x63, 0x68, 0x6e, 0x6f, 0x6c, 0x6f, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",165,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3c, 0x2f, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",166,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",167,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",168,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6e, 0x61, 0x6d, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",169,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",170,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",171,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x31, 0x32, 0x2d, 0x31, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",172,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",173,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",174,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x53, 0x45, 0x41, 0x47, 0x41, 0x54, 0x45, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",175,64,"style","Trailing whitespace is superfluous."," 0x54, 0x45, 0x43, 0x48, 0x4e, 0x4f, 0x4c, 0x4f, 0x47, 0x59, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",176,64,"style","Trailing whitespace is superfluous."," 0x20, 0x48, 0x4f, 0x4c, 0x44, 0x49, 0x4e, 0x47, 0x53, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",177,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",178,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",179,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",180,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",181,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",182,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6f, 0x66, 0x66, 0x69, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",183,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x4f, 0x66, 0x66, 0x69, 0x63, 0x65, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",184,64,"style","Trailing whitespace is superfluous."," 0x66, 0x20, 0x54, 0x65, 0x63, 0x68, 0x6e, 0x6f, 0x6c, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",185,64,"style","Trailing whitespace is superfluous."," 0x67, 0x79, 0x3c, 0x2f, 0x6f, 0x66, 0x66, 0x69, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",186,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",187,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x74, 0x65, 0x2d, 0x6c, 0x6f, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",188,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3e, 0x4c, 0x32, 0x3c, 0x2f, 0x73, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",189,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x2d, 0x6c, 0x6f, 0x63, 0x61, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",190,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",191,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x74, 0x61, 0x74, 0x65, 0x2d, 0x6c, 0x6f, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",192,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",193,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",194,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",195,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",196,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",197,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",198,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",199,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x53, 0x74, 0x61, 0x74, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",200,64,"style","Trailing whitespace is superfluous."," 0x4c, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",201,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",202,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",203,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x73, 0x74, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",204,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6c, 0x6f, 0x63, 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",205,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",206,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x74, 0x61, 0x74, 0x65, 0x2d, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",207,64,"style","Trailing whitespace is superfluous."," 0x66, 0x2d, 0x69, 0x6e, 0x63, 0x6f, 0x72, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",208,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x3e, 0x4c, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",209,64,"style","Trailing whitespace is superfluous."," 0x73, 0x74, 0x61, 0x74, 0x65, 0x2d, 0x6f, 0x66, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",210,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x63, 0x6f, 0x72, 0x70, 0x6f, 0x72, 0x61, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",211,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",212,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",213,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",214,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",215,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",216,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",217,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",218,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",219,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",220,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",221,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",222,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",223,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",224,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",225,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",226,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",227,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",228,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x36, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",229,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x30, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",230,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",231,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",232,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",233,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",234,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",235,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",236,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",237,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",238,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",239,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",240,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",241,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",242,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",243,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",244,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",245,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",246,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",247,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",248,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",249,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",250,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",251,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",252,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",253,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",254,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",255,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",256,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",257,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x31, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",258,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",259,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",260,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",261,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",262,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",263,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",264,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",265,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",266,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x36, 0x32, 0x38, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",267,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x31, 0x39, 0x30, 0x31, 0x33, 0x30, 0x39, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",268,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x36, 0x32, 0x38, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",269,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x31, 0x33, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",270,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",271,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",272,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",273,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",274,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",275,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",276,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",277,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",278,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",279,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x37, 0x36, 0x38, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",280,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",281,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",282,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",283,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",284,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",285,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",286,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",287,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",288,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",289,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x30, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",290,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",291,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",292,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",293,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",294,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",295,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",296,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",297,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",298,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",299,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",300,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",301,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x36, 0x32, 0x38, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",302,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x31, 0x33, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",303,64,"style","Trailing whitespace is superfluous."," 0x39, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",304,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",305,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",306,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",307,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",308,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",309,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",310,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",311,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",312,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",313,64,"style","Trailing whitespace is superfluous."," 0x36, 0x32, 0x38, 0x32, 0x38, 0x30, 0x2d, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",314,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x30, 0x39, 0x32, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",315,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",316,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",317,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",318,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",319,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",320,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",321,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",322,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x32, 0x38, 0x32, 0x38, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",323,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x30, 0x39, 0x32, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",324,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x32, 0x38, 0x32, 0x38, 0x30, 0x2d, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",325,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x33, 0x30, 0x39, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",326,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",327,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",328,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",329,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",330,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",331,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",332,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",333,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",334,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",335,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",336,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x31, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",337,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",338,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",339,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",340,64,"style","Trailing whitespace is superfluous."," 0x36, 0x32, 0x38, 0x32, 0x38, 0x30, 0x2d, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",341,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x30, 0x39, 0x32, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",342,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",343,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",344,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x30, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",345,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",346,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",347,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",348,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",349,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",350,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",351,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",352,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",353,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",354,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x31, 0x39, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",355,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x54, 0x31, 0x37, 0x3a, 0x32, 0x33, 0x3a, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",356,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",357,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",358,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",359,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",360,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",361,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",362,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",363,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",364,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",365,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",366,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",367,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",368,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",369,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",370,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",371,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",372,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",373,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",374,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",375,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x39, 0x2d, 0x31, 0x32, 0x39, 0x32, 0x38, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",376,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",377,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",378,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",379,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",380,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",381,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",382,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",383,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",384,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",385,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",386,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",387,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",388,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",389,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",390,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",391,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",392,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",393,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",394,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",395,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",396,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",397,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",398,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",399,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",400,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",401,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",402,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",403,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x2d, 0x33, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",404,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",405,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",406,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",407,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",408,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",409,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",410,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",411,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",412,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",413,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x32, 0x39, 0x32, 0x38, 0x34, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",414,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",415,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x32, 0x39, 0x32, 0x38, 0x34, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",416,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",417,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",418,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",419,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",420,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",421,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",422,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",423,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",424,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x31, 0x39, 0x37, 0x38, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",425,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",426,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",427,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",428,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",429,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",430,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",431,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",432,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",433,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",434,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",435,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x39, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",436,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",437,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",438,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",439,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",440,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",441,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",442,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",443,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",444,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",445,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",446,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",447,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",448,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x32, 0x39, 0x32, 0x38, 0x34, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",449,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",450,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",451,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",452,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",453,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",454,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",455,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",456,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",457,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",458,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",459,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x31, 0x32, 0x39, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",460,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",461,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",462,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",463,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",464,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",465,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",466,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",467,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",468,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x39, 0x31, 0x32, 0x39, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",469,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",470,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x31, 0x32, 0x39, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",471,64,"style","Trailing whitespace is superfluous."," 0x38, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",472,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",473,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",474,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",475,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",476,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",477,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",478,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",479,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",480,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",481,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",482,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x33, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",483,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",484,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",485,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",486,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x31, 0x32, 0x39, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",487,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",488,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",489,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x39, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",490,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",491,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",492,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",493,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",494,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",495,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",496,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",497,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",498,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",499,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",500,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",501,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x3a, 0x32, 0x38, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",502,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",503,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",504,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",505,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",506,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",507,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",508,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",509,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",510,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",511,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",512,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",513,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",514,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",515,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",516,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",517,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",518,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",519,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",520,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",521,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x30, 0x37, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",522,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",523,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",524,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",525,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",526,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",527,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",528,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",529,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",530,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",531,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",532,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",533,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",534,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",535,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",536,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",537,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",538,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",539,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",540,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",541,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",542,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",543,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",544,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",545,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",546,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",547,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",548,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",549,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",550,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",551,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",552,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",553,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",554,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",555,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",556,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",557,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",558,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x39, 0x30, 0x32, 0x37, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",559,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",560,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x32, 0x37, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",561,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",562,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",563,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",564,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",565,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",566,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",567,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",568,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",569,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",570,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x33, 0x37, 0x38, 0x33, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",571,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",572,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",573,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",574,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",575,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",576,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",577,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",578,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",579,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",580,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",581,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",582,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",583,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",584,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",585,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",586,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",587,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",588,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",589,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",590,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",591,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",592,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",593,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x32, 0x37, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",594,64,"style","Trailing whitespace is superfluous."," 0x37, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",595,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",596,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",597,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",598,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",599,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",600,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",601,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",602,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",603,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",604,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",605,64,"style","Trailing whitespace is superfluous."," 0x32, 0x37, 0x30, 0x30, 0x37, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",606,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",607,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",608,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",609,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",610,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",611,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",612,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",613,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x39, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",614,64,"style","Trailing whitespace is superfluous."," 0x32, 0x37, 0x30, 0x30, 0x37, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",615,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",616,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x37, 0x30, 0x30, 0x37, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",617,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",618,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",619,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",620,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",621,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",622,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",623,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",624,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",625,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",626,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",627,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x34, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",628,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",629,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",630,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",631,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",632,64,"style","Trailing whitespace is superfluous."," 0x32, 0x37, 0x30, 0x30, 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",633,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",634,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",635,64,"style","Trailing whitespace is superfluous."," 0x20, 0x38, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",636,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",637,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",638,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",639,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",640,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",641,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",642,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",643,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",644,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",645,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",646,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x36, 0x3a, 0x31, 0x30, 0x3a, 0x34, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",647,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",648,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",649,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",650,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",651,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",652,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",653,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",654,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",655,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",656,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",657,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",658,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",659,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",660,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",661,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",662,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",663,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",664,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",665,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",666,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x33, 0x31, 0x37, 0x31, 0x34, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",667,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",668,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",669,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",670,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",671,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",672,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",673,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",674,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",675,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",676,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",677,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",678,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",679,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",680,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",681,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",682,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",683,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",684,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",685,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",686,64,"style","Trailing whitespace is superfluous."," 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",687,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",688,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",689,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",690,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",691,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",692,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",693,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",694,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",695,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",696,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",697,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",698,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",699,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",700,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",701,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",702,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",703,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x38, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",704,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x31, 0x34, 0x33, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",705,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",706,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x37, 0x31, 0x34, 0x33, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",707,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",708,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",709,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",710,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",711,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",712,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",713,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",714,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",715,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x31, 0x38, 0x31, 0x31, 0x35, 0x37, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",716,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",717,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",718,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",719,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",720,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",721,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",722,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",723,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",724,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",725,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",726,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",727,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",728,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",729,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",730,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",731,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",732,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",733,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",734,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",735,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",736,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",737,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",738,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",739,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x37, 0x31, 0x34, 0x33, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",740,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",741,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",742,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",743,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",744,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",745,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",746,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",747,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",748,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",749,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",750,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x38, 0x2d, 0x33, 0x31, 0x37, 0x31, 0x34, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",751,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",752,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",753,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",754,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",755,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",756,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",757,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",758,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",759,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x38, 0x33, 0x31, 0x37, 0x31, 0x34, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",760,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",761,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x33, 0x31, 0x37, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",762,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",763,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",764,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",765,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",766,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",767,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",768,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",769,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",770,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",771,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",772,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",773,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",774,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",775,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",776,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",777,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x38, 0x2d, 0x33, 0x31, 0x37, 0x31, 0x34, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",778,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",779,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",780,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",781,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",782,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",783,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",784,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",785,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",786,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",787,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",788,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",789,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",790,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",791,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x32, 0x54, 0x31, 0x36, 0x3a, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",792,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3a, 0x32, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",793,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",794,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",795,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",796,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",797,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",798,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",799,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",800,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",801,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",802,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",803,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",804,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",805,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",806,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",807,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",808,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",809,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",810,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",811,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x31, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",812,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x38, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",813,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",814,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",815,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",816,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",817,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",818,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",819,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",820,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",821,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",822,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",823,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",824,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",825,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",826,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",827,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",828,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",829,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",830,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",831,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",832,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",833,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",834,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",835,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",836,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",837,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",838,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",839,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x31, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",840,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",841,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",842,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",843,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",844,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",845,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",846,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",847,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",848,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",849,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x38, 0x31, 0x34, 0x36, 0x35, 0x39, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",850,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",851,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x31, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",852,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",853,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",854,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",855,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",856,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",857,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",858,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",859,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",860,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x38, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",861,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x37, 0x30, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",862,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",863,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",864,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",865,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",866,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",867,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",868,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",869,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",870,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",871,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",872,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",873,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",874,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",875,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",876,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",877,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",878,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",879,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",880,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",881,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",882,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",883,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",884,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x38, 0x2d, 0x31, 0x34, 0x36, 0x35, 0x39, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",885,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",886,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",887,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",888,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",889,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",890,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",891,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",892,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",893,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",894,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",895,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",896,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",897,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",898,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",899,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",900,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",901,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",902,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",903,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",904,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x38, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",905,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",906,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",907,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",908,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",909,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",910,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",911,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",912,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",913,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",914,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",915,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",916,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",917,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",918,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x31, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",919,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",920,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",921,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",922,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",923,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",924,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",925,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",926,64,"style","Trailing whitespace is superfluous."," 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",927,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",928,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",929,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",930,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",931,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",932,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",933,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",934,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",935,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",936,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x31, 0x54, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",937,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x3a, 0x31, 0x36, 0x3a, 0x30, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",938,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",939,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",940,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",941,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",942,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",943,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",944,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",945,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",946,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",947,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",948,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",949,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",950,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",951,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",952,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",953,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",954,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",955,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",956,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",957,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x33, 0x35, 0x39, 0x32, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",958,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",959,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",960,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",961,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",962,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",963,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",964,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",965,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",966,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",967,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",968,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",969,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",970,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",971,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",972,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",973,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",974,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",975,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",976,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",977,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",978,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",979,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",980,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",981,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",982,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",983,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",984,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",985,64,"style","Trailing whitespace is superfluous."," 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",986,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",987,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",988,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",989,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",990,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",991,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",992,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",993,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",994,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x38, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",995,64,"style","Trailing whitespace is superfluous."," 0x33, 0x35, 0x39, 0x32, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",996,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",997,64,"style","Trailing whitespace is superfluous."," 0x32, 0x33, 0x35, 0x39, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",998,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",999,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1000,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1001,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1002,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1003,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1004,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1005,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1006,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x38, 0x35, 0x35, 0x35, 0x35, 0x38, 0x35, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1007,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1008,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1009,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1010,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1011,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1012,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1013,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1014,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1015,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1016,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1017,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1018,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1019,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1020,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1021,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1022,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1023,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1024,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1025,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1026,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1027,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1028,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1029,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1030,64,"style","Trailing whitespace is superfluous."," 0x33, 0x35, 0x39, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1031,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1032,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1033,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1034,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1035,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1036,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1037,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1038,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1039,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1040,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1041,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x32, 0x33, 0x35, 0x39, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1042,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1043,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1044,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1045,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1046,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1047,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1048,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1049,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1050,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x30, 0x32, 0x33, 0x35, 0x39, 0x32, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1051,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1052,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x32, 0x33, 0x35, 0x39, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1053,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1054,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1055,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1056,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1057,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1058,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1059,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1060,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1061,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1062,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1063,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x30, 0x31, 0x2d, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1064,64,"style","Trailing whitespace is superfluous."," 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1065,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1066,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1067,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1068,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x32, 0x33, 0x35, 0x39, 0x32, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1069,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1070,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1071,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1072,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1073,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1074,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1075,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1076,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1077,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1078,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1079,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1080,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1081,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1082,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x39, 0x54, 0x31, 0x36, 0x3a, 0x30, 0x37, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1083,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1084,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1085,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1086,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1087,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1088,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1089,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1090,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1091,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1092,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1093,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1094,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1095,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1096,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1097,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1098,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1099,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1100,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1101,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1102,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x33, 0x32, 0x33, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1103,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1104,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1105,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1106,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1107,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1108,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1109,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1110,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1111,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1112,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1113,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1114,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1115,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1116,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1117,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1118,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1119,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1120,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1121,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1122,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1123,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1124,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1125,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1126,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1127,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1128,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1129,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1130,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x37, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1131,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1132,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1133,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1134,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1135,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1136,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1137,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1138,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1139,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1140,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x33, 0x32, 0x33, 0x30, 0x34, 0x32, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1141,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1142,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x2d, 0x33, 0x32, 0x33, 0x30, 0x34, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1143,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1144,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1145,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1146,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1147,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1148,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1149,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1150,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1151,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x37, 0x31, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1152,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1153,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1154,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1155,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1156,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1157,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1158,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1159,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1160,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1161,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1162,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x36, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1163,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1164,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1165,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1166,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1167,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1168,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1169,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1170,64,"style","Trailing whitespace is superfluous."," 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1171,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1172,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1173,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1174,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1175,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x2d, 0x33, 0x32, 0x33, 0x30, 0x34, 0x32, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1176,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1177,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1178,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1179,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1180,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1181,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1182,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1183,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1184,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1185,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1186,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x33, 0x32, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1187,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x32, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1188,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1189,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1190,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1191,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1192,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1193,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1194,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1195,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x37, 0x33, 0x32, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1196,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x32, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1197,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x33, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1198,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x34, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1199,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1200,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1201,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1202,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1203,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1204,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1205,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1206,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1207,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1208,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1209,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x37, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1210,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1211,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1212,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1213,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x33, 0x32, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1214,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1215,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1216,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1217,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1218,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1219,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1220,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1221,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1222,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1223,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1224,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1225,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1226,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1227,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x37, 0x54, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1228,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x30, 0x37, 0x3a, 0x30, 0x38, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1229,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1230,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1231,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1232,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1233,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1234,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1235,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1236,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1237,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1238,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1239,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1240,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1241,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1242,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1243,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1244,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1245,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1246,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1247,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1248,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x38, 0x38, 0x35, 0x35, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1249,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1250,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1251,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1252,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1253,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1254,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1255,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1256,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1257,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1258,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1259,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1260,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1261,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1262,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1263,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1264,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1265,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1266,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1267,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1268,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1269,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1270,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1271,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1272,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1273,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1274,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1275,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x34, 0x2d, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1276,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1277,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1278,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1279,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1280,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1281,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1282,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1283,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1284,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1285,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x37, 0x31, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1286,64,"style","Trailing whitespace is superfluous."," 0x38, 0x35, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1287,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1288,64,"style","Trailing whitespace is superfluous."," 0x38, 0x38, 0x35, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1289,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1290,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1291,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1292,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1293,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1294,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1295,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1296,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1297,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x37, 0x39, 0x37, 0x31, 0x36, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1298,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1299,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1300,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1301,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1302,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1303,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1304,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1305,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1306,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1307,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1308,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1309,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1310,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1311,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1312,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1313,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1314,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1315,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1316,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1317,64,"style","Trailing whitespace is superfluous."," 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1318,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1319,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1320,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x31, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1321,64,"style","Trailing whitespace is superfluous."," 0x38, 0x35, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1322,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1323,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1324,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1325,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1326,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1327,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1328,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1329,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1330,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1331,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1332,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x38, 0x38, 0x35, 0x35, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1333,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1334,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1335,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1336,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1337,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1338,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1339,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1340,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1341,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x34, 0x38, 0x38, 0x35, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1342,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1343,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x31, 0x34, 0x38, 0x38, 0x35, 0x35, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1344,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1345,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1346,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1347,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1348,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1349,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1350,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1351,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1352,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1353,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1354,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x34, 0x2d, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1355,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1356,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1357,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1358,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1359,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x38, 0x38, 0x35, 0x35, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1360,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1361,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1362,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x38, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1363,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1364,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1365,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1366,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1367,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1368,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1369,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1370,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1371,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1372,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1373,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x54, 0x31, 0x37, 0x3a, 0x31, 0x39, 0x3a, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1374,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1375,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1376,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1377,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1378,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1379,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1380,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1381,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1382,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1383,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1384,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1385,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1386,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1387,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1388,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1389,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1390,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1391,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1392,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1393,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x31, 0x39, 0x37, 0x33, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1394,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1395,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1396,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1397,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1398,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1399,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1400,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1401,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1402,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1403,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1404,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1405,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1406,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1407,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1408,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1409,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1410,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1411,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1412,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1413,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1414,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1415,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1416,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1417,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1418,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1419,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1420,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1421,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x32, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1422,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1423,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1424,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1425,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1426,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1427,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1428,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1429,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1430,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1431,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x31, 0x39, 0x37, 0x33, 0x32, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1432,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1433,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x31, 0x39, 0x37, 0x33, 0x32, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1434,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1435,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1436,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1437,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1438,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1439,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1440,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1441,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1442,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x31, 0x37, 0x35, 0x34, 0x39, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1443,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1444,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1445,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1446,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1447,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1448,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1449,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1450,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1451,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1452,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1453,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1454,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1455,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1456,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1457,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1458,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1459,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1460,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1461,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1462,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1463,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1464,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1465,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1466,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x39, 0x37, 0x33, 0x32, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1467,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1468,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1469,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1470,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1471,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1472,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1473,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1474,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1475,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1476,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1477,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x31, 0x39, 0x37, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1478,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1479,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1480,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1481,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1482,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1483,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1484,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1485,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1486,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x37, 0x30, 0x31, 0x39, 0x37, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1487,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1488,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x31, 0x39, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1489,64,"style","Trailing whitespace is superfluous."," 0x33, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1490,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1491,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1492,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1493,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1494,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1495,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1496,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1497,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1498,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1499,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1500,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x32, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1501,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1502,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1503,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1504,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x31, 0x39, 0x37, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1505,64,"style","Trailing whitespace is superfluous."," 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1506,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1507,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1508,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1509,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1510,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1511,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1512,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1513,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1514,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1515,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1516,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1517,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1518,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x2d, 0x32, 0x36, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1519,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x3a, 0x31, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1520,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1521,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1522,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1523,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1524,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1525,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1526,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1527,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1528,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1529,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1530,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1531,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1532,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1533,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1534,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1535,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1536,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1537,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1538,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x37, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1539,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x39, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1540,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1541,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1542,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1543,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1544,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1545,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1546,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1547,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1548,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1549,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1550,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1551,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1552,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1553,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1554,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1555,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1556,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1557,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1558,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1559,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1560,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1561,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1562,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1563,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1564,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1565,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1566,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x38, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1567,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1568,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1569,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1570,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1571,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1572,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1573,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1574,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1575,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1576,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x36, 0x37, 0x35, 0x31, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1577,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1578,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x37, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1579,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1580,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1581,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1582,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1583,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1584,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1585,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1586,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1587,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1588,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x35, 0x38, 0x37, 0x31, 0x31, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1589,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1590,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1591,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1592,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1593,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1594,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1595,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1596,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1597,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1598,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1599,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1600,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1601,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1602,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1603,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1604,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1605,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1606,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1607,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1608,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1609,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1610,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1611,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x37, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1612,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1613,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1614,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1615,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1616,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1617,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1618,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1619,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1620,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1621,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1622,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1623,64,"style","Trailing whitespace is superfluous."," 0x37, 0x35, 0x31, 0x35, 0x39, 0x33, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1624,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1625,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1626,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1627,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1628,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1629,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1630,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1631,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1632,64,"style","Trailing whitespace is superfluous."," 0x37, 0x35, 0x31, 0x35, 0x39, 0x33, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1633,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1634,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x37, 0x35, 0x31, 0x35, 0x39, 0x33, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1635,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1636,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1637,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1638,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1639,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1640,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1641,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1642,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1643,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1644,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1645,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x38, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1646,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1647,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1648,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1649,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1650,64,"style","Trailing whitespace is superfluous."," 0x37, 0x35, 0x31, 0x35, 0x39, 0x33, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1651,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1652,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1653,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1654,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1655,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1656,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1657,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1658,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1659,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1660,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1661,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1662,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1663,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x31, 0x30, 0x2d, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1664,64,"style","Trailing whitespace is superfluous."," 0x38, 0x54, 0x31, 0x36, 0x3a, 0x31, 0x31, 0x3a, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1665,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1666,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1667,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1668,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1669,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1670,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1671,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1672,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1673,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1674,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1675,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1676,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1677,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1678,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1679,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1680,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1681,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1682,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1683,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1684,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x31, 0x31, 0x36, 0x32, 0x30, 0x31, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1685,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1686,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1687,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1688,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1689,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1690,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1691,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1692,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1693,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1694,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1695,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1696,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1697,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1698,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1699,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1700,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1701,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1702,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1703,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1704,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1705,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1706,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1707,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1708,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1709,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1710,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1711,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1712,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1713,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1714,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1715,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1716,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1717,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1718,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1719,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1720,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1721,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1722,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x36, 0x32, 0x30, 0x31, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1723,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1724,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x36, 0x32, 0x30, 0x31, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1725,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1726,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1727,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1728,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1729,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1730,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1731,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1732,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1733,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x36, 0x31, 0x36, 0x30, 0x36, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1734,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1735,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1736,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1737,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1738,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1739,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1740,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1741,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1742,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1743,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1744,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x38, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1745,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1746,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1747,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1748,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1749,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1750,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1751,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1752,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1753,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1754,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1755,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1756,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1757,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x36, 0x32, 0x30, 0x31, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1758,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1759,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1760,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1761,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1762,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1763,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1764,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1765,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1766,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1767,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1768,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x36, 0x2d, 0x31, 0x31, 0x36, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1769,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1770,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1771,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1772,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1773,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1774,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1775,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1776,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1777,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x36, 0x31, 0x31, 0x36, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1778,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1779,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x36, 0x2d, 0x31, 0x31, 0x36, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1780,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1781,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1782,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1783,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1784,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1785,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1786,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1787,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1788,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1789,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1790,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1791,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x32, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1792,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1793,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1794,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1795,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x36, 0x2d, 0x31, 0x31, 0x36, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1796,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1797,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1798,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x38, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1799,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1800,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1801,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1802,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1803,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1804,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1805,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1806,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1807,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1808,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1809,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x2d, 0x32, 0x39, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1810,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x3a, 0x35, 0x31, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1811,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1812,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1813,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1814,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1815,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1816,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1817,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1818,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1819,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1820,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1821,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1822,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1823,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1824,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1825,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1826,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1827,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1828,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1829,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1830,64,"style","Trailing whitespace is superfluous."," 0x32, 0x34, 0x36, 0x37, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1831,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1832,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1833,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1834,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1835,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1836,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1837,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1838,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1839,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1840,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1841,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1842,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1843,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1844,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1845,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1846,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1847,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1848,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1849,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1850,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1851,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1852,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1853,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1854,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1855,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1856,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1857,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x2d, 0x30, 0x31, 0x2d, 0x32, 0x39, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1858,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1859,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1860,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1861,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1862,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1863,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1864,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1865,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1866,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1867,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x36, 0x30, 0x39, 0x32, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1868,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1869,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x39, 0x32, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1870,64,"style","Trailing whitespace is superfluous."," 0x36, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1871,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1872,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1873,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1874,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1875,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1876,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1877,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1878,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1879,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x33, 0x34, 0x39, 0x32, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1880,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1881,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1882,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1883,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1884,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1885,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1886,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1887,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1888,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1889,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1890,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1891,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1892,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1893,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1894,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1895,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1896,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1897,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1898,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1899,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1900,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1901,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1902,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x39, 0x32, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1903,64,"style","Trailing whitespace is superfluous."," 0x36, 0x37, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1904,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1905,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1906,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1907,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1908,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1909,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1910,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1911,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1912,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1913,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1914,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x32, 0x34, 0x36, 0x37, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1915,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1916,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1917,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1918,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1919,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1920,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1921,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1922,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1923,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x32, 0x34, 0x36, 0x37, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1924,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1925,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x39, 0x32, 0x34, 0x36, 0x37, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1926,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1927,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1928,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1929,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1930,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1931,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1932,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1933,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1934,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1935,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1936,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x2d, 0x30, 0x31, 0x2d, 0x32, 0x39, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1937,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1938,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1939,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1940,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1941,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x32, 0x34, 0x36, 0x37, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1942,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1943,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1944,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x38, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1945,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1946,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1947,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1948,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1949,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1950,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1951,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1952,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1953,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1954,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x30, 0x31, 0x2d, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1955,64,"style","Trailing whitespace is superfluous."," 0x39, 0x54, 0x31, 0x36, 0x3a, 0x31, 0x30, 0x3a, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1956,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1957,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1958,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1959,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1960,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1961,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1962,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1963,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1964,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1965,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1966,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1967,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1968,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1969,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1970,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1971,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1972,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1973,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1974,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1975,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x30, 0x37, 0x34, 0x35, 0x33, 0x39, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1976,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1977,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1978,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1979,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1980,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1981,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1982,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1983,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1984,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1985,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1986,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1987,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1988,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1989,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1990,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1991,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1992,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1993,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1994,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1995,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1996,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1997,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1998,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1999,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2000,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2001,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2002,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2003,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x33, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2004,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2005,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2006,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2007,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2008,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2009,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2010,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2011,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2012,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2013,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x34, 0x35, 0x33, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2014,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2015,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x34, 0x35, 0x33, 0x39, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2016,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2017,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2018,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2019,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2020,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2021,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2022,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2023,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2024,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x35, 0x31, 0x31, 0x38, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2025,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2026,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2027,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2028,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2029,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2030,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2031,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2032,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2033,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2034,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2035,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2036,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2037,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2038,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2039,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2040,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2041,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2042,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2043,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2044,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2045,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2046,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2047,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2048,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x34, 0x35, 0x33, 0x39, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2049,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2050,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2051,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2052,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2053,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2054,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2055,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2056,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2057,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2058,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2059,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x37, 0x34, 0x35, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2060,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2061,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2062,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2063,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2064,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2065,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2066,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2067,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2068,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x35, 0x30, 0x37, 0x34, 0x35, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2069,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2070,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x37, 0x34, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2071,64,"style","Trailing whitespace is superfluous."," 0x33, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2072,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2073,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2074,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2075,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2076,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2077,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2078,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2079,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2080,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2081,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2082,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x33, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2083,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2084,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2085,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2086,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x37, 0x34, 0x35, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2087,64,"style","Trailing whitespace is superfluous."," 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2088,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2089,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2090,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2091,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2092,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2093,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2094,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2095,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2096,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2097,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2098,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2099,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2100,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x33, 0x30, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2101,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x3a, 0x34, 0x34, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2102,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2103,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2104,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2105,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2106,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2107,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2108,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2109,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2110,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2111,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2112,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2113,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2114,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2115,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2116,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2117,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2118,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2119,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2120,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2121,64,"style","Trailing whitespace is superfluous."," 0x32, 0x36, 0x34, 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2122,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2123,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2124,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2125,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2126,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2127,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2128,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2129,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2130,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2131,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2132,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2133,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2134,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2135,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2136,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2137,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2138,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2139,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2140,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2141,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2142,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2143,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2144,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2145,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2146,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2147,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2148,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x35, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2149,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2150,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2151,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2152,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2153,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2154,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2155,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2156,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2157,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2158,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x35, 0x30, 0x33, 0x32, 0x36, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2159,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2160,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x33, 0x32, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2161,64,"style","Trailing whitespace is superfluous."," 0x34, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2162,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2163,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2164,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2165,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2166,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2167,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2168,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2169,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2170,64,"style","Trailing whitespace is superfluous."," 0x38, 0x31, 0x39, 0x38, 0x32, 0x31, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2171,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2172,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2173,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2174,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2175,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2176,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2177,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2178,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2179,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2180,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2181,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2182,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2183,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2184,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2185,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2186,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2187,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2188,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2189,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2190,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2191,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2192,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2193,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x33, 0x32, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2194,64,"style","Trailing whitespace is superfluous."," 0x34, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2195,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2196,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2197,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2198,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2199,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2200,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2201,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2202,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2203,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2204,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2205,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x32, 0x36, 0x34, 0x32, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2206,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2207,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2208,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2209,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2210,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2211,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2212,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2213,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2214,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x32, 0x36, 0x34, 0x32, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2215,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2216,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x33, 0x32, 0x36, 0x34, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2217,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2218,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2219,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2220,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2221,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2222,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2223,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2224,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2225,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2226,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2227,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x35, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2228,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2229,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2230,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2231,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2232,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x32, 0x36, 0x34, 0x32, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2233,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2234,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2235,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2236,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2237,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2238,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2239,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2240,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2241,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2242,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2243,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2244,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2245,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2246,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x54, 0x31, 0x36, 0x3a, 0x35, 0x37, 0x3a, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2247,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2248,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2249,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2250,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2251,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2252,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2253,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2254,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2255,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2256,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2257,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2258,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2259,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2260,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2261,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2262,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2263,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2264,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2265,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2266,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x35, 0x37, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2267,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2268,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2269,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2270,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2271,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2272,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2273,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2274,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2275,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2276,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2277,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2278,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2279,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2280,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2281,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2282,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2283,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2284,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2285,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2286,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2287,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2288,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2289,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2290,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2291,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2292,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2293,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2294,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x33, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2295,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2296,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2297,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2298,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2299,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2300,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2301,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2302,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2303,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2304,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x35, 0x37, 0x31, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2305,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2306,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x35, 0x37, 0x31, 0x39, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2307,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2308,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2309,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2310,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2311,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2312,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2313,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2314,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2315,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x31, 0x35, 0x35, 0x36, 0x33, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2316,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2317,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2318,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2319,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2320,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2321,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2322,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2323,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2324,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2325,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2326,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2327,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2328,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2329,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2330,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2331,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2332,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2333,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2334,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2335,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2336,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2337,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2338,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2339,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x35, 0x37, 0x31, 0x39, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2340,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2341,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2342,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2343,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2344,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2345,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2346,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2347,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2348,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2349,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2350,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2351,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2352,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2353,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2354,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2355,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2356,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2357,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2358,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2359,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x31, 0x35, 0x30, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2360,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2361,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2362,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2363,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2364,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2365,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2366,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2367,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2368,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2369,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2370,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2371,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2372,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2373,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x33, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2374,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2375,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2376,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2377,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2378,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2379,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2380,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2381,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2382,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2383,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2384,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2385,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2386,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2387,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2388,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2389,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2390,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2391,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x30, 0x31, 0x2d, 0x33, 0x30, 0x54, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2392,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x34, 0x30, 0x3a, 0x33, 0x39, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2393,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2394,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2395,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2396,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2397,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2398,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2399,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2400,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2401,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2402,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2403,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2404,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2405,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2406,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2407,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2409,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2410,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2411,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2412,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x35, 0x36, 0x36, 0x36, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2413,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2414,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2415,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2416,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2417,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2418,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2419,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2420,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2421,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2422,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2423,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2424,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2425,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2426,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2427,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2428,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2429,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2430,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2431,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2432,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2433,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2434,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2435,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2436,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2437,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2438,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2439,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2440,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2441,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2442,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2443,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2444,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2445,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2446,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2447,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2448,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2449,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x34, 0x30, 0x37, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2450,64,"style","Trailing whitespace is superfluous."," 0x36, 0x36, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2451,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2452,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x36, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2453,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2454,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2455,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2456,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2457,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2458,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2459,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2460,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2461,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x31, 0x31, 0x38, 0x37, 0x36, 0x33, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2462,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2463,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2464,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2465,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2466,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2467,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2468,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2469,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2470,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2471,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2472,64,"style","Trailing whitespace is superfluous."," 0x30, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2473,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2474,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2475,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2476,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2477,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2478,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2479,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2480,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2481,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2482,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2483,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2484,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2485,64,"style","Trailing whitespace is superfluous."," 0x37, 0x35, 0x36, 0x36, 0x36, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2486,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2487,64,"style","Trailing whitespace is superfluous."," 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2488,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2489,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2490,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2491,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2492,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2493,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2494,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2495,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2496,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x37, 0x35, 0x36, 0x36, 0x36, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2497,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2498,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2499,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2500,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2501,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2502,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2503,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2504,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2505,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x34, 0x30, 0x37, 0x35, 0x36, 0x36, 0x36, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2506,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2507,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x37, 0x35, 0x36, 0x36, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2508,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2509,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2510,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2511,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2512,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2513,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2514,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2515,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2516,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2517,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2518,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2519,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2520,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2521,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2522,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2523,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x37, 0x35, 0x36, 0x36, 0x36, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2524,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2525,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2526,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x30, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2527,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2528,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2529,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2530,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2531,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2532,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2533,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2534,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2535,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2536,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2537,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x33, 0x31, 0x54, 0x31, 0x39, 0x3a, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2538,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3a, 0x33, 0x39, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2539,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2540,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2541,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2542,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2543,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2544,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2545,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2546,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2547,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2548,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2549,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2550,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2551,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2552,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2553,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2554,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2555,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2556,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2557,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x33, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2558,64,"style","Trailing whitespace is superfluous."," 0x36, 0x37, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2559,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2560,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2561,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2562,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2563,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2564,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2565,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2566,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2567,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2568,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2569,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2570,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2571,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2572,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2573,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2574,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2575,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2576,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2577,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2578,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2579,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2580,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2581,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2582,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2583,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2584,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2585,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2586,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2587,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2588,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2589,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2590,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2591,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2592,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2593,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2594,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2595,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x31, 0x34, 0x30, 0x33, 0x32, 0x36, 0x37, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2596,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2597,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x33, 0x32, 0x36, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2598,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2599,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2600,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2601,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2602,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2603,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2604,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2605,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2606,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x34, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2607,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x31, 0x34, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2608,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2609,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2610,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2611,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2612,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2613,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2614,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2615,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2616,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2617,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2618,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2619,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2620,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2621,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2622,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2623,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2624,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2625,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2626,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2627,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2628,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2629,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2630,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x33, 0x32, 0x36, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2631,64,"style","Trailing whitespace is superfluous."," 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2632,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2633,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2634,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2635,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2636,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2637,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2638,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2639,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2640,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2641,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2642,64,"style","Trailing whitespace is superfluous."," 0x33, 0x32, 0x36, 0x37, 0x34, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2643,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2644,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2645,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2646,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2647,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2648,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2649,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2650,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2651,64,"style","Trailing whitespace is superfluous."," 0x33, 0x32, 0x36, 0x37, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2652,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2653,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x32, 0x36, 0x37, 0x34, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2654,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2655,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2656,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2657,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2658,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2659,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2660,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2661,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2662,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2663,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2664,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2665,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2666,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2667,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2668,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2669,64,"style","Trailing whitespace is superfluous."," 0x33, 0x32, 0x36, 0x37, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2670,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2671,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2672,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2673,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2674,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2675,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2676,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2677,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2678,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2679,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2680,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2681,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2682,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, 0x34, 0x2d, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2683,64,"style","Trailing whitespace is superfluous."," 0x30, 0x54, 0x31, 0x36, 0x3a, 0x32, 0x35, 0x3a, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2684,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2685,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2686,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2687,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2688,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2689,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2690,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2691,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2692,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2693,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2694,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2695,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2696,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2697,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2698,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2699,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2700,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2701,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2702,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2703,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x30, 0x34, 0x36, 0x31, 0x32, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2704,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2705,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2706,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2707,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2708,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2709,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2710,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2711,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2712,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2713,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2714,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2715,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2716,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2717,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2718,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2719,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2720,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2721,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2722,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2723,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2724,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2725,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2726,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2727,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2728,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2729,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2730,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2731,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x32, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2732,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2733,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2734,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2735,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2736,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2737,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2738,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2739,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2740,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2741,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x34, 0x36, 0x31, 0x32, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2742,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2743,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x34, 0x36, 0x31, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2744,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2745,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2746,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2747,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2748,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2749,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2750,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2751,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2752,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x34, 0x35, 0x35, 0x33, 0x38, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2753,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2754,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2755,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2756,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2757,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2758,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2759,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2760,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2761,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2762,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2763,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x32, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2764,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2765,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2766,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2767,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2768,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2769,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2770,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2771,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2772,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2773,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2774,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2775,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2776,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x34, 0x36, 0x31, 0x32, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2777,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2778,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2779,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2780,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2781,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2782,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2783,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2784,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2785,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2786,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2787,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x34, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2788,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2789,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2790,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2791,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2792,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2793,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2794,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2795,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2796,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x34, 0x30, 0x30, 0x34, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2797,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2798,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2799,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2800,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2801,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2802,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2803,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2804,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2805,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2806,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2807,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2808,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2809,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2810,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x32, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2811,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2812,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2813,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2814,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x34, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2815,64,"style","Trailing whitespace is superfluous."," 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2816,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2817,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x32, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2818,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2819,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2820,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2821,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2822,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2823,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2824,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2825,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2826,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2827,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2828,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x31, 0x2d, 0x32, 0x38, 0x54, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2829,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x31, 0x36, 0x3a, 0x32, 0x37, 0x2d, 0x30, 0x35, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2830,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2831,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2832,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2833,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2834,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2835,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2836,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2837,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2838,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2839,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2840,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2841,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2842,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2843,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2844,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2845,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2846,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2847,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2848,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2849,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x38, 0x32, 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2850,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2851,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2852,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2853,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2854,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2855,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2856,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2857,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2858,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2859,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2860,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2861,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2862,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2863,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2864,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2865,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2866,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2867,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2868,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2869,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2870,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2871,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2872,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2873,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2874,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2875,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2876,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x33, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2877,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2878,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2879,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2880,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2881,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2882,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2883,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2884,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2885,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2886,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x31, 0x33, 0x30, 0x37, 0x38, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2887,64,"style","Trailing whitespace is superfluous."," 0x32, 0x32, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2888,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x37, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2889,64,"style","Trailing whitespace is superfluous."," 0x38, 0x32, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2890,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2891,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2892,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2893,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2894,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2895,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2896,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2897,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2898,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x31, 0x37, 0x37, 0x32, 0x34, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2899,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2900,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2901,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2902,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2903,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2904,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2905,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2906,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2907,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2908,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2909,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2910,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2911,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2912,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2913,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2914,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2915,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2916,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2917,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2918,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2919,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2920,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2921,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2922,64,"style","Trailing whitespace is superfluous."," 0x38, 0x38, 0x32, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2923,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2924,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2925,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2926,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2927,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2928,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2929,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2930,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2931,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2932,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2933,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x37, 0x38, 0x38, 0x32, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2934,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2935,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2936,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2937,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2938,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2939,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2940,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2941,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2942,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x30, 0x37, 0x38, 0x38, 0x32, 0x32, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2943,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2944,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x37, 0x38, 0x38, 0x32, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2945,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2946,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2947,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2948,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2949,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2950,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2951,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2952,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2953,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2954,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2955,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x31, 0x30, 0x2d, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2956,64,"style","Trailing whitespace is superfluous."," 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2957,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2958,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2959,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2960,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x37, 0x38, 0x38, 0x32, 0x32, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2961,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2962,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2963,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2964,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2965,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2966,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2967,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2968,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2969,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2970,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2971,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2972,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2973,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2974,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x32, 0x39, 0x54, 0x31, 0x37, 0x3a, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2975,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x35, 0x39, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2976,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2977,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2978,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2979,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2980,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2981,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2982,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2983,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2984,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2985,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2986,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2987,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2988,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2989,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2990,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2991,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2992,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2993,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2994,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x33, 0x36, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2995,64,"style","Trailing whitespace is superfluous."," 0x38, 0x36, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2996,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2997,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2998,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2999,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3000,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3001,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3002,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3003,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3004,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3005,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3006,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3007,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3008,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3009,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3010,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3011,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3012,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3013,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3014,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3015,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3016,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3017,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3018,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3019,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3020,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3021,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3022,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x32, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3023,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3024,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3025,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3026,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3027,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3028,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3029,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3030,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3031,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3032,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x33, 0x30, 0x33, 0x36, 0x30, 0x38, 0x36, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3033,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3034,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x33, 0x36, 0x30, 0x38, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3035,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3036,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3037,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3038,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3039,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3040,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3041,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3042,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3043,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x33, 0x38, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3044,64,"style","Trailing whitespace is superfluous."," 0x34, 0x37, 0x36, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3045,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3046,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3047,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3048,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3049,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3050,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3051,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3052,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3053,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3054,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x32, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3055,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3056,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3057,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3058,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3059,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3060,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3061,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3062,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3063,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3064,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3065,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3066,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3067,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x33, 0x36, 0x30, 0x38, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3068,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3069,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3070,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3071,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3072,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3073,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3074,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3075,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3076,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3077,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3078,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3079,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x38, 0x36, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3080,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3081,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3082,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3083,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3084,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3085,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3086,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3087,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x33, 0x30, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3088,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x38, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3089,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3090,64,"style","Trailing whitespace is superfluous."," 0x33, 0x36, 0x30, 0x38, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3091,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3092,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3093,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3094,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3095,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3096,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3097,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3098,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3099,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3100,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3101,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x32, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3102,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3103,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3104,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3105,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3106,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x38, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3107,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3108,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3109,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3110,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3111,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3112,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3113,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3114,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3115,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3116,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3117,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3118,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3119,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3120,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x38, 0x3a, 0x31, 0x36, 0x3a, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3121,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3122,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3123,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3124,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3125,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3126,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3127,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3128,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3129,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3130,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3131,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3132,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x2f, 0x41, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3133,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3134,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3135,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3136,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3137,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3138,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3139,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3140,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x36, 0x35, 0x34, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3141,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3142,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3143,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3144,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3145,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3146,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x6d, 0x65, 0x6e, 0x64, 0x3e, 0x5b, 0x41, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3147,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x64, 0x5d, 0x3c, 0x2f, 0x61, 0x6d, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3148,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3149,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3150,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3151,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3152,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3153,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3154,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3155,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3156,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3157,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3158,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3159,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3160,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3161,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3162,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3163,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3164,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3165,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3166,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3167,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3168,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3169,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3170,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3171,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3172,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3173,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3174,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3175,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3176,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3177,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3178,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3179,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3180,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3181,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x30, 0x30, 0x36, 0x35, 0x34, 0x31, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3182,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3183,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x30, 0x36, 0x35, 0x34, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3184,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3185,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3186,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3187,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3188,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3189,64,"style","Trailing whitespace is superfluous."," 0x41, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3190,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3191,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3192,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x33, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3193,64,"style","Trailing whitespace is superfluous."," 0x36, 0x33, 0x36, 0x32, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3194,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3195,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3196,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3197,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3198,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3199,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3200,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3201,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3202,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3203,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x30, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3204,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3205,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3206,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3207,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3208,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3209,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3210,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3211,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3212,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3213,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3214,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3215,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3216,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x36, 0x35, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3217,64,"style","Trailing whitespace is superfluous."," 0x31, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3218,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3219,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3220,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3221,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3222,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3223,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3224,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3225,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3226,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3227,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3228,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x35, 0x34, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3229,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3230,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3231,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3232,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3233,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3234,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3235,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3236,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x33, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3237,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x35, 0x34, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3238,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3239,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x36, 0x35, 0x34, 0x31, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3240,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3241,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3242,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3243,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3244,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3245,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3246,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3247,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3248,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3249,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3250,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3251,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3252,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3253,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3254,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3255,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x35, 0x34, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3256,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3257,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3258,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x30, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3259,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3260,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3261,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x2f, 0x41, 0x20, 0x5b, 0x41, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3262,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x64, 0x5d, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3263,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3264,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3265,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3266,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3267,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3268,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3269,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3270,64,"style","Trailing whitespace is superfluous."," 0x31, 0x54, 0x31, 0x37, 0x3a, 0x31, 0x36, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3271,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3272,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3273,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3274,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3275,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3276,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3277,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3278,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3279,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3280,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3281,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3282,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3283,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3284,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3285,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3286,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3287,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3288,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3289,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3290,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x34, 0x39, 0x37, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3291,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3292,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3293,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3294,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3295,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3296,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3297,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3298,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3299,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3300,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3301,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3302,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3303,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3304,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3305,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3306,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3307,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3308,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3309,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3310,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3311,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3312,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3313,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3314,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3315,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3316,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3317,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3318,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3319,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3320,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3321,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3322,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3323,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3324,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3325,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3326,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3327,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3328,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x34, 0x39, 0x37, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3329,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3330,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x35, 0x34, 0x39, 0x37, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3331,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3332,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3333,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3334,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3335,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3336,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3337,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3338,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3339,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x33, 0x35, 0x35, 0x34, 0x38, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3340,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3341,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3342,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3343,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3344,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3345,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3346,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3347,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3348,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3349,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3350,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x32, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3351,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3352,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3353,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3354,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3355,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3356,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3357,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3358,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3359,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3360,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3361,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3362,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3363,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x35, 0x34, 0x39, 0x37, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3364,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3365,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3366,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3367,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3368,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3369,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3370,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3371,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3372,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3373,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3374,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x34, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3375,64,"style","Trailing whitespace is superfluous."," 0x37, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3376,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3377,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3378,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3379,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3380,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3381,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3382,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3383,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x33, 0x30, 0x30, 0x35, 0x34, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3384,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3385,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3386,64,"style","Trailing whitespace is superfluous."," 0x39, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3387,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3388,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3389,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3390,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3391,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3392,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3393,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3394,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3395,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3396,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3397,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x32, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3398,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3399,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3400,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3401,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x34, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3402,64,"style","Trailing whitespace is superfluous."," 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3403,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3404,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x32, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3405,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3406,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3407,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3409,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3410,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3411,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3412,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3413,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3414,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3415,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x31, 0x2d, 0x32, 0x39, 0x54, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3416,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x34, 0x36, 0x3a, 0x30, 0x35, 0x2d, 0x30, 0x35, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3417,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3418,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3419,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3420,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3421,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3422,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3423,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3424,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3425,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3426,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3427,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3428,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3429,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3430,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3431,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3432,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3433,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3434,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3435,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3436,64,"style","Trailing whitespace is superfluous."," 0x37, 0x32, 0x37, 0x34, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3437,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3438,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3439,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3440,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3441,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3442,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3443,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3444,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3445,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3446,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3447,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3448,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3449,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3450,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3451,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3452,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3453,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3454,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3455,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3456,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3457,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3458,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3459,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3460,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3461,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3462,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3463,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x32, 0x2d, 0x31, 0x30, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3464,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3465,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3466,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3467,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3468,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3469,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3470,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3471,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3472,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3473,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x31, 0x32, 0x30, 0x37, 0x32, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3474,64,"style","Trailing whitespace is superfluous."," 0x34, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3475,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x37, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3476,64,"style","Trailing whitespace is superfluous."," 0x37, 0x34, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3477,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3478,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3479,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3480,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3481,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3482,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3483,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3484,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3485,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x31, 0x37, 0x31, 0x33, 0x39, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3486,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3487,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3488,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3489,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3490,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3491,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3492,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3493,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3494,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3495,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3496,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3497,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3498,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3499,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3500,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3501,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3502,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3503,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3504,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3505,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3506,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3507,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3508,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3509,64,"style","Trailing whitespace is superfluous."," 0x32, 0x37, 0x34, 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3510,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3511,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3512,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3513,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3514,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3515,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3516,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3517,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3518,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3519,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3520,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x37, 0x32, 0x37, 0x34, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3521,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3522,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3523,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3524,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3525,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3526,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3527,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3528,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3529,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x30, 0x37, 0x32, 0x37, 0x34, 0x34, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3530,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3531,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x2d, 0x30, 0x37, 0x32, 0x37, 0x34, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3532,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3533,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3534,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3535,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3536,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3537,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3538,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3539,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3540,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3541,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3542,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x32, 0x2d, 0x31, 0x30, 0x2d, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3543,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3544,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3545,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3546,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3547,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x37, 0x32, 0x37, 0x34, 0x34, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3548,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3549,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3550,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x31, 0x30, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3551,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3552,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3553,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3554,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3555,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3556,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3557,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3558,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3559,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3560,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x32, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3561,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x33, 0x31, 0x54, 0x31, 0x37, 0x3a, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3562,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x37, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3563,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3564,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3565,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3566,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3567,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3568,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3569,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3570,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3571,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3572,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3573,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3574,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3575,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3576,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3577,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3578,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3579,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3580,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3581,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x33, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3582,64,"style","Trailing whitespace is superfluous."," 0x34, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3583,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3584,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3585,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3586,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3587,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3588,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3589,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3590,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3591,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3592,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3593,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3594,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3595,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3596,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3597,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3598,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3599,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3600,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3601,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3602,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3603,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3604,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3605,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3606,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3607,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3608,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3609,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3610,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3611,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3612,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3613,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3614,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3615,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3616,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3617,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3618,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3619,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x32, 0x30, 0x33, 0x30, 0x37, 0x34, 0x34, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3620,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3621,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x33, 0x30, 0x37, 0x34, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3622,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3623,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3624,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3625,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3626,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3627,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3628,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3629,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3630,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x32, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3631,64,"style","Trailing whitespace is superfluous."," 0x36, 0x37, 0x30, 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3632,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3633,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3634,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3635,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3636,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3637,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3638,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3639,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3640,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3641,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3642,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3643,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3644,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3645,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3646,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3647,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3648,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3649,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3650,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3651,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3652,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3653,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3654,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x33, 0x30, 0x37, 0x34, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3655,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3656,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3657,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3658,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3659,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3660,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3661,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3662,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3663,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3664,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3665,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3666,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x34, 0x34, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3667,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3668,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3669,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3670,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3671,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3672,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3673,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3674,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x32, 0x30, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3675,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x34, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3676,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3677,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x37, 0x34, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3678,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3679,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3680,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3681,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3682,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3683,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3684,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3685,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3686,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3687,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3688,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3689,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3690,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3691,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3692,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3693,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x34, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3694,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3695,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3696,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3697,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3698,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3699,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3700,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3701,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3702,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3703,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3704,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3705,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3706,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x32, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3707,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x37, 0x3a, 0x32, 0x38, 0x3a, 0x30, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3708,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3709,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3710,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3711,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3712,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3713,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3714,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3715,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3716,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3717,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3718,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3719,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3720,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3721,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3722,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3723,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3724,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3725,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3726,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3727,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x30, 0x35, 0x38, 0x36, 0x31, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3728,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3729,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3730,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3731,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3732,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3733,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3734,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3735,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3736,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3737,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3738,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3739,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3740,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3741,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3742,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3743,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3744,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3745,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3746,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3747,64,"style","Trailing whitespace is superfluous."," 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3748,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3749,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3750,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3751,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3752,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3753,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3754,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x32, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3755,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3756,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3757,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3758,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3759,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3760,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3761,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3762,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3763,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3764,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3765,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x38, 0x36, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3766,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3767,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x38, 0x36, 0x31, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3768,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3769,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3770,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3771,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3772,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3773,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3774,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3775,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3776,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x31, 0x32, 0x35, 0x36, 0x32, 0x37, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3777,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3778,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3779,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3780,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3781,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3782,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3783,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3784,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3785,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3786,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3787,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3788,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3789,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3790,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3791,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3792,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3793,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3794,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3795,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3796,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3797,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3798,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3799,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3800,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x38, 0x36, 0x31, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3801,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3802,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3803,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3804,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3805,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3806,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3807,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3808,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3809,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3810,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3811,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x35, 0x38, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3812,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3813,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3814,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3815,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3816,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3817,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3818,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3819,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3820,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x31, 0x32, 0x30, 0x30, 0x35, 0x38, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3821,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3822,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x35, 0x38, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3823,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3824,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3825,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3826,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3827,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3828,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3829,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3830,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3831,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3832,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3833,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x32, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3834,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3835,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3836,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3837,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3838,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x35, 0x38, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3839,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3840,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3841,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x34, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3842,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3843,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3844,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3845,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3846,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3847,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3848,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3849,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3850,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3851,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3852,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x31, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3853,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x3a, 0x34, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3854,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3855,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3856,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3857,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3858,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3859,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3860,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3861,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3862,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3863,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3864,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3865,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3866,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3867,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3868,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3869,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3870,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3871,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3872,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3873,64,"style","Trailing whitespace is superfluous."," 0x38, 0x34, 0x38, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3874,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3875,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3876,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3877,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3878,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3879,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3880,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3881,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3882,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3883,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3884,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3885,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3886,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3887,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3888,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3889,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3890,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3891,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3892,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3893,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3894,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3895,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3896,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3897,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3898,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3899,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3900,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x37, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3901,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3902,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3903,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3904,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3905,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3906,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3907,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3908,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3909,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3910,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x31, 0x30, 0x35, 0x38, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3911,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3912,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x35, 0x38, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3913,64,"style","Trailing whitespace is superfluous."," 0x38, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3914,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3915,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3916,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3917,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3918,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3919,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3920,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3921,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3922,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x36, 0x32, 0x34, 0x32, 0x36, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3923,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3924,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3925,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3926,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3927,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3928,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3929,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3930,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3931,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3932,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3933,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3934,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3935,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3936,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3937,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3938,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3939,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3940,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3941,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3942,64,"style","Trailing whitespace is superfluous."," 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3943,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3944,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3945,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x35, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3946,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3947,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3948,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3949,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3950,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3951,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3952,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3953,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3954,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3955,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3956,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3957,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x38, 0x34, 0x38, 0x34, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3958,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3959,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3960,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3961,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3962,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3963,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3964,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3965,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3966,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x35, 0x38, 0x34, 0x38, 0x34, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3967,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3968,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x35, 0x38, 0x34, 0x38, 0x34, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3969,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3970,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3971,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3972,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3973,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3974,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3975,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3976,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3977,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3978,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3979,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x31, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3980,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3981,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3982,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3983,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3984,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x38, 0x34, 0x38, 0x34, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3985,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3986,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3987,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3988,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3989,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3990,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3991,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3992,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3993,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3994,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3995,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3996,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3997,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3998,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x37, 0x54, 0x31, 0x36, 0x3a, 0x34, 0x33, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3999,64,"style","Trailing whitespace is superfluous."," 0x34, 0x32, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4000,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4001,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4002,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4003,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4004,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4005,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4006,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4007,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4008,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4009,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4010,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4011,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4012,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4013,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4014,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4015,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4016,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4017,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4018,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x35, 0x33, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4019,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4020,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4021,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4022,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4023,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4024,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4025,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4026,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4027,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4028,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4029,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4030,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4031,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4032,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4033,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4034,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4035,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4036,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4037,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4038,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4039,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4040,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4041,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4042,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4043,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4044,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4045,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4046,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4047,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4048,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4049,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4050,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4051,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4052,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4053,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4054,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4055,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4056,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x32, 0x35, 0x33, 0x33, 0x30, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4057,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4058,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x32, 0x35, 0x33, 0x33, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4059,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4060,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4061,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4062,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4063,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4064,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4065,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4066,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4067,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x31, 0x38, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4068,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4069,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4070,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4071,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4072,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4073,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4074,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4075,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4076,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4077,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4078,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4079,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4080,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4081,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4082,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4083,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4084,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4085,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4086,64,"style","Trailing whitespace is superfluous."," 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4087,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4088,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4089,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4090,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4091,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x32, 0x35, 0x33, 0x33, 0x30, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4092,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4093,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4094,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4095,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4096,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4097,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4098,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4099,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4100,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4101,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4102,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4103,64,"style","Trailing whitespace is superfluous."," 0x33, 0x33, 0x30, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4104,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4105,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4106,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4107,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4108,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4109,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4110,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4111,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x31, 0x30, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4112,64,"style","Trailing whitespace is superfluous."," 0x33, 0x33, 0x30, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4113,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4114,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x33, 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4115,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4116,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4117,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4118,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4119,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4120,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4121,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4122,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4123,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4124,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4125,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x33, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4126,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4127,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4128,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4129,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4130,64,"style","Trailing whitespace is superfluous."," 0x33, 0x33, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4131,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4132,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4133,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4134,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4135,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4136,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4137,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4138,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4139,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4140,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4141,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4142,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4143,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x33, 0x54, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4144,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x3a, 0x35, 0x35, 0x3a, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4145,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4146,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4147,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4148,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4149,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4150,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4151,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4152,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4153,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4154,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4155,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4156,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4157,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4158,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4159,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4160,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4161,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4162,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4163,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4164,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x34, 0x38, 0x34, 0x31, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4165,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4166,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4167,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4168,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4169,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4170,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4171,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4172,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4173,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4174,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4175,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4176,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4177,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4178,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4179,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4180,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4181,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4182,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4183,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4184,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4185,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4186,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4187,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4188,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4189,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4190,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4191,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4192,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4193,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4194,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4195,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4196,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4197,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4198,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4199,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4200,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4201,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x31, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4202,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x34, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4203,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4204,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x38, 0x34, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4205,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4206,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4207,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4208,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4209,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4210,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4211,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4212,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4213,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x31, 0x35, 0x37, 0x31, 0x35, 0x31, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4214,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4215,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4216,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4217,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4218,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4219,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4220,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4221,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4222,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4223,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4224,64,"style","Trailing whitespace is superfluous."," 0x35, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4225,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4226,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4227,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4228,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4229,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4230,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4231,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4232,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4233,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4234,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4235,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4236,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4237,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x38, 0x34, 0x31, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4238,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4239,64,"style","Trailing whitespace is superfluous."," 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4240,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4241,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4242,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4243,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4244,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4245,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4246,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4247,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4248,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x30, 0x34, 0x38, 0x34, 0x31, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4249,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4250,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4251,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4252,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4253,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4254,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4255,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4256,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4257,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x31, 0x30, 0x30, 0x34, 0x38, 0x34, 0x31, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4258,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4259,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x30, 0x34, 0x38, 0x34, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4260,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4261,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4262,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4263,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4264,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4265,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4266,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4267,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4268,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4269,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4270,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4271,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4272,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4273,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4274,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4275,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x30, 0x34, 0x38, 0x34, 0x31, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4276,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4277,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4278,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x35, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4279,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4280,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4281,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4282,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4283,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4284,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4285,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4286,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4287,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4288,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4289,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x33, 0x54, 0x31, 0x37, 0x3a, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4290,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3a, 0x33, 0x31, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4291,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4292,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4293,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4294,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4295,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4296,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4297,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4298,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4299,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4300,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4301,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4302,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4303,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4304,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4305,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4306,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4307,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4308,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4309,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x35, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4310,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4311,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4312,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4313,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4314,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4315,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4316,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4317,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4318,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4319,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4320,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4321,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4322,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4323,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4324,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4325,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4326,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4327,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4328,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4329,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4330,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4331,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4332,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4333,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4334,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4335,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4336,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4337,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4338,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4339,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4340,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4341,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4342,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4343,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4344,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4345,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4346,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4347,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x31, 0x30, 0x30, 0x35, 0x35, 0x36, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4348,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4349,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x35, 0x35, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4350,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4351,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4352,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4353,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4354,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4355,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4356,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4357,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4358,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4359,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x37, 0x37, 0x39, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4360,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4361,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4362,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4363,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4364,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4365,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4366,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4367,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4368,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4369,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x32, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4370,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4371,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4372,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4373,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4374,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4375,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4376,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4377,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4378,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4379,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4380,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4381,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4382,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x35, 0x35, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4383,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4384,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4385,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4386,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4387,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4388,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4389,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4390,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4391,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4392,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4393,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4394,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x35, 0x36, 0x31, 0x32, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4395,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4396,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4397,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4398,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4399,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4400,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4401,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4402,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4403,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x35, 0x36, 0x31, 0x32, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4404,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4405,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x35, 0x36, 0x31, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4406,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4407,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4408,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4409,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4410,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4411,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4412,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4413,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4414,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4415,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4416,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4417,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4418,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4419,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4420,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4421,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x35, 0x36, 0x31, 0x32, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4422,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4423,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4424,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x32, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4425,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4426,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4427,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4428,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4429,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4430,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4431,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4432,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4433,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4434,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4435,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x54, 0x31, 0x36, 0x3a, 0x32, 0x38, 0x3a, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4436,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4437,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4438,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4439,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4440,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4441,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4442,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4443,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4444,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4445,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4446,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4447,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4448,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4449,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4450,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4451,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4452,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4453,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4454,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4455,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x32, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4456,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4457,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4458,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4459,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4460,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4461,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4462,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4463,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4464,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4465,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4466,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4467,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4468,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4469,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4470,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4471,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4472,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4473,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4474,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4475,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4476,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4477,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4478,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4479,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4480,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4481,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4482,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4483,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4484,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4485,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4486,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4487,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4488,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4489,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4490,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4491,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4492,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4493,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x35, 0x38, 0x32, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4494,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4495,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x32, 0x39, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4496,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4497,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4498,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4499,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4500,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4501,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4502,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4503,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4504,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x31, 0x30, 0x38, 0x30, 0x32, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4505,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4506,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4507,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4508,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4509,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4510,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4511,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4512,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4513,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4514,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4515,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4516,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4517,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4518,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4519,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4520,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4521,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4522,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4523,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4524,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x32, 0x39, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4525,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4526,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4527,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4528,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4529,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4530,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4531,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4532,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4533,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x30, 0x30, 0x32, 0x35, 0x38, 0x32, 0x39, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4534,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4535,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x32, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4536,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4537,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4538,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4539,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4540,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4541,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4542,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4543,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4544,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4545,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4546,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4547,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4548,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4549,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4550,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4551,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x32, 0x39, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4552,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4553,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4554,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x33, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4555,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4556,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4557,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4558,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4559,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4560,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4561,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4562,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4563,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4564,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4565,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x35, 0x54, 0x31, 0x37, 0x3a, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4566,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x32, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4567,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4568,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4569,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4570,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4571,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4572,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4573,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4574,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4575,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4576,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4577,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4578,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4579,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4580,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4581,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4582,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4583,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4584,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4585,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4586,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4587,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4588,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4589,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4590,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4591,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4592,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4593,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4594,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4595,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4596,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4597,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4598,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4599,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4600,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4601,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4602,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4603,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4604,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4605,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4606,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4607,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4608,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4609,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4610,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4611,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4612,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4613,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x31, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4614,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4615,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4616,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4617,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4618,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4619,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4620,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4621,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4622,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4623,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x30, 0x30, 0x30, 0x34, 0x32, 0x30, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4624,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4625,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, 0x34, 0x32, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4626,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4627,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4628,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4629,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4630,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4631,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4632,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4633,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4634,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x30, 0x35, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4635,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x36, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4636,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4637,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4638,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4639,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4640,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4641,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4642,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4643,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4644,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4645,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4646,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4647,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4648,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4649,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4650,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4651,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4652,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4653,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4654,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, 0x34, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4655,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4656,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4657,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4658,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4659,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4660,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4661,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4662,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4663,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x30, 0x30, 0x30, 0x34, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4664,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4665,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4666,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4667,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4668,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4669,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4670,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4671,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4672,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4673,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4674,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4675,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4676,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4677,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4678,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4679,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4680,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4681,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, 0x34, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4682,64,"style","Trailing whitespace is superfluous."," 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4683,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4684,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x33, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4685,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4686,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4687,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4688,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4689,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4690,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4691,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4692,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4693,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4694,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4695,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x31, 0x54, 0x31, 0x37, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4696,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x3a, 0x33, 0x33, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4697,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4698,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4699,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4700,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4701,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4702,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4703,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4704,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4705,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4706,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4707,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4708,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4709,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4710,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4711,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4712,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4713,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4714,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4715,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x30, 0x39, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4716,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x30, 0x38, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4717,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4718,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4719,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4720,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4721,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4722,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4723,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4724,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4725,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4726,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4727,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4728,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4729,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4730,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4731,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4732,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4733,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4734,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4735,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4736,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4737,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4738,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4739,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4740,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4741,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4742,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4743,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4744,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4745,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4746,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4747,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4748,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4749,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4750,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4751,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4752,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4753,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x30, 0x39, 0x30, 0x36, 0x32, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4754,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4755,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x30, 0x39, 0x2d, 0x30, 0x36, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4756,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4757,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4758,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4759,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4760,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4761,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4762,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4763,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4764,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4765,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x35, 0x37, 0x37, 0x38, 0x32, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4766,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4767,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4768,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4769,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4770,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4771,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4772,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4773,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4774,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4775,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x33, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4776,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4777,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4778,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4779,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4780,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4781,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4782,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4783,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4784,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x30, 0x39, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4785,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x30, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4786,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4787,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4788,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4789,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4790,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4791,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4792,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4793,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x30, 0x39, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4794,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x30, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4795,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x30, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4796,64,"style","Trailing whitespace is superfluous."," 0x36, 0x32, 0x35, 0x30, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4797,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4798,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4799,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4800,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4801,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4802,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4803,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4804,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4805,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4806,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4807,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x34, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4808,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4809,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4810,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4811,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x30, 0x39, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4812,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x30, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4813,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4814,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4815,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4816,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4817,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4818,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4819,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4820,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4821,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4822,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4823,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4824,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4825,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x34, 0x54, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4826,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x3a, 0x35, 0x39, 0x3a, 0x30, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4827,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4828,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4829,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4830,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4831,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4832,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4833,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4834,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4835,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4836,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4837,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4838,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4839,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4840,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4841,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4842,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4843,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4844,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4845,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4846,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x30, 0x33, 0x35, 0x33, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4847,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4848,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4849,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4850,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4851,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4852,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4853,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4854,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4855,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4856,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4857,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4858,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4859,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4860,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4861,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4862,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4863,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4864,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4865,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4866,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4867,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4868,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4869,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4870,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4871,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4872,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4873,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4874,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4875,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4876,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4877,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4878,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4879,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4880,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4881,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4882,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4883,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4884,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x35, 0x33, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4885,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4886,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x33, 0x35, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4887,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4888,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4889,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4890,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4891,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4892,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4893,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4894,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4895,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x39, 0x37, 0x39, 0x39, 0x33, 0x37, 0x31, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4896,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4897,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4898,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4899,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4900,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4901,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4902,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4903,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4904,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4905,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4906,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4907,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4908,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4909,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4910,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4911,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4912,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4913,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4914,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4915,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x33, 0x35, 0x33, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4916,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4917,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4918,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4919,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4920,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4921,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4922,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4923,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4924,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x33, 0x35, 0x33, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4925,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4926,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x30, 0x33, 0x35, 0x33, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4927,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4928,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4929,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4930,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4931,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4932,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4933,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4934,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4935,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4936,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4937,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x36, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4938,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4939,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4940,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4941,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4942,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x33, 0x35, 0x33, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4943,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4944,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4945,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4946,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4947,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4948,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4949,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4950,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4951,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4952,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4953,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4954,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4955,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4956,64,"style","Trailing whitespace is superfluous."," 0x35, 0x54, 0x32, 0x31, 0x3a, 0x34, 0x39, 0x3a, 0x33, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4957,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4958,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4959,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4960,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4961,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4962,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4963,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4964,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4965,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4966,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4967,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4968,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4969,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4970,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4971,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4972,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4973,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4974,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4975,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4976,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x2d, 0x30, 0x32, 0x34, 0x31, 0x35, 0x33, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4977,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4978,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4979,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4980,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4981,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4982,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4983,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4984,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4985,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4986,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4987,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4988,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4989,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4990,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4991,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4992,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4993,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4994,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4995,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4996,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4997,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4998,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4999,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5000,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5001,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5002,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5003,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5004,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x31, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5005,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5006,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5007,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5008,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5009,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5010,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5011,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5012,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5013,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5014,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x34, 0x31, 0x35, 0x33, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5015,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5016,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x34, 0x31, 0x35, 0x33, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5017,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5018,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5019,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5020,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5021,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5022,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5023,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5024,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5025,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x39, 0x35, 0x38, 0x36, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5026,64,"style","Trailing whitespace is superfluous."," 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5027,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5028,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5029,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5030,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5031,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5032,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5033,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5034,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5035,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5036,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5037,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5038,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5039,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5040,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5041,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5042,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5043,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5044,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5045,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x32, 0x34, 0x31, 0x35, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5046,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5047,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5048,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5049,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5050,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5051,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5052,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5053,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5054,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x30, 0x32, 0x34, 0x31, 0x35, 0x33, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5055,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5056,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x2d, 0x30, 0x32, 0x34, 0x31, 0x35, 0x33, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5057,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5058,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5059,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5060,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5061,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5062,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5063,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5064,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5065,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5066,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5067,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5068,64,"style","Trailing whitespace is superfluous."," 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5069,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5070,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5071,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5072,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x32, 0x34, 0x31, 0x35, 0x33, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5073,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5074,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5075,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5076,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5077,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5078,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5079,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5080,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5081,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5082,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5083,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5084,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5085,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5086,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x54, 0x31, 0x37, 0x3a, 0x30, 0x37, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5087,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5088,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5089,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5090,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5091,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5092,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5093,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5094,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5095,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5096,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5097,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5098,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5099,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5100,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5101,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5102,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5103,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5104,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5105,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5106,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x32, 0x32, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5107,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5108,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5109,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5110,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5111,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5112,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5113,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5114,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5115,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5116,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5117,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5118,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5119,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5120,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5121,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5122,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5123,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5124,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5125,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5126,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5127,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5128,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5129,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5130,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5131,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5132,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5133,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5134,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x33, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5135,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5136,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5137,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5138,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5139,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5140,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5141,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5142,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5143,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5144,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x32, 0x32, 0x30, 0x34, 0x32, 0x31, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5145,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5146,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x32, 0x32, 0x30, 0x34, 0x32, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5147,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5148,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5149,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5150,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5151,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5152,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5153,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5154,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5155,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x38, 0x31, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5156,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5157,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5158,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5159,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5160,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5161,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5162,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5163,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5164,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5165,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5166,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5167,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5168,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5169,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5170,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5171,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5172,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5173,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5174,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5175,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x32, 0x32, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5176,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5177,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5178,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5179,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5180,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5181,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5182,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5183,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5184,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x30, 0x38, 0x32, 0x32, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5185,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5186,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x32, 0x32, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5187,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5188,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5189,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5190,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5191,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5192,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5193,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5194,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5195,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5196,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5197,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5198,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x33, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5199,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5200,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5201,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5202,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x32, 0x32, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5203,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5204,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5205,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5206,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5207,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5208,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5209,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5210,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5211,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5212,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5213,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5214,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5215,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5216,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x33, 0x30, 0x54, 0x31, 0x37, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5217,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x3a, 0x33, 0x33, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5218,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5219,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5220,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5221,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5222,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5223,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5224,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5225,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5226,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5227,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5228,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5229,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5230,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5231,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5232,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5233,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5234,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5235,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5236,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5237,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x39, 0x37, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5238,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5239,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5240,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5241,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5242,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5243,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5244,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5245,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5246,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5247,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5248,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5249,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5250,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5251,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5252,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5253,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5254,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5255,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5256,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5257,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5258,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5259,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5260,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5261,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5262,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5263,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5264,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x2d, 0x30, 0x34, 0x2d, 0x32, 0x39, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5265,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5266,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5267,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5268,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5269,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5270,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5271,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5272,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5273,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5274,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x30, 0x38, 0x30, 0x39, 0x35, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5275,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5276,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5277,64,"style","Trailing whitespace is superfluous."," 0x39, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5278,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5279,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5280,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5281,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5282,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5283,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5284,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5285,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5286,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x36, 0x30, 0x39, 0x37, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5287,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5288,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5289,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5290,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5291,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5292,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5293,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5294,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5295,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5296,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5297,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5298,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5299,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5300,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5301,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5302,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5303,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5304,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5305,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5306,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x37, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5307,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5308,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5309,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5310,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5311,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5312,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5313,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5314,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x38, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5315,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x37, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5316,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5317,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x39, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5318,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5319,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5320,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5321,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5322,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5323,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5324,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5325,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5326,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5327,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5328,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x2d, 0x32, 0x39, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5329,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5330,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5331,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5332,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5333,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5334,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5335,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5336,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5337,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5338,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5339,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5340,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5341,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5342,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5343,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5344,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5345,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5346,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x30, 0x34, 0x2d, 0x32, 0x39, 0x54, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5347,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x33, 0x39, 0x3a, 0x33, 0x37, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5348,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5349,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5350,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5351,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5352,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5353,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5354,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5355,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5356,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5357,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5358,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5359,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5360,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5361,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5362,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5363,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5364,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5365,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5366,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5367,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x35, 0x35, 0x34, 0x38, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5368,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5369,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5370,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5371,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5372,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5373,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5374,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5375,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5376,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5377,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5378,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5379,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5380,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5381,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5382,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5383,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5384,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5385,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5386,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5387,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5388,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5389,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5390,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5391,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5392,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5393,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5394,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x38, 0x2d, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5395,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5396,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5397,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5398,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5399,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5400,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5401,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5402,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5403,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5404,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x38, 0x30, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5405,64,"style","Trailing whitespace is superfluous."," 0x35, 0x34, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5406,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5407,64,"style","Trailing whitespace is superfluous."," 0x35, 0x35, 0x34, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5408,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5409,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5410,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5411,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5412,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5413,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5414,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5415,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5416,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x35, 0x36, 0x31, 0x37, 0x32, 0x35, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5417,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5418,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5419,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5420,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5421,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5422,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5423,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5424,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5425,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5426,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5427,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5428,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5429,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5430,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5431,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5432,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5433,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5434,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5435,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5436,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x35, 0x34, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5437,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5438,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5439,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5440,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5441,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5442,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5443,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5444,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x38, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5445,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x35, 0x34, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5446,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5447,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x35, 0x35, 0x34, 0x38, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5448,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5449,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5450,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5451,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5452,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5453,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5454,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5455,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5456,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5457,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5458,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x30, 0x31, 0x2d, 0x33, 0x30, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5459,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5460,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5461,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5462,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5463,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x35, 0x34, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5464,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5465,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5466,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5467,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5468,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5469,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5470,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5471,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5472,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5473,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5474,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5475,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5476,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x2d, 0x30, 0x31, 0x2d, 0x33, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5477,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x36, 0x3a, 0x35, 0x38, 0x3a, 0x35, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5478,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5479,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5480,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5481,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5482,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5483,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5484,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5485,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5486,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5487,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5488,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5489,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5490,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5491,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5492,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5493,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5494,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5495,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5496,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5497,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x32, 0x32, 0x38, 0x30, 0x35, 0x36, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5498,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5499,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5500,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5501,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5502,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5503,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5504,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5505,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5506,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5507,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5508,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5509,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5510,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5511,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5512,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5513,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5514,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5515,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5516,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5517,64,"style","Trailing whitespace is superfluous."," 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5518,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5519,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5520,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5521,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5522,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5523,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5524,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5525,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5526,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5527,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5528,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5529,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5530,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5531,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5532,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5533,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5534,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x37, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5535,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x30, 0x35, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5536,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5537,64,"style","Trailing whitespace is superfluous."," 0x32, 0x32, 0x38, 0x30, 0x35, 0x36, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5538,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5539,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5540,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5541,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5542,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5543,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5544,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5545,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5546,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x37, 0x31, 0x31, 0x39, 0x36, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5547,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5548,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5549,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5550,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5551,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5552,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5553,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5554,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5555,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5556,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5557,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5558,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5559,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5560,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5561,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5562,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5563,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5564,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5565,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5566,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x32, 0x32, 0x38, 0x30, 0x35, 0x36, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5567,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5568,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5569,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5570,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5571,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5572,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5573,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5574,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5575,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x32, 0x32, 0x38, 0x30, 0x35, 0x36, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5576,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5577,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x32, 0x32, 0x38, 0x30, 0x35, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5578,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5579,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5580,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5581,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5582,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5583,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5584,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5585,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5586,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5587,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5588,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x31, 0x30, 0x2d, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5589,64,"style","Trailing whitespace is superfluous."," 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5590,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5591,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5592,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5593,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x32, 0x32, 0x38, 0x30, 0x35, 0x36, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5594,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5595,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5596,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5597,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5598,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5599,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5600,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5601,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5602,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5603,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5604,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5605,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5606,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5607,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x39, 0x54, 0x31, 0x34, 0x3a, 0x32, 0x37, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5608,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5609,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5610,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5611,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5612,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5613,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5614,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5615,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5616,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5617,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5618,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5619,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5620,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5621,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5622,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5623,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5624,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5625,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5626,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5627,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x37, 0x2d, 0x31, 0x30, 0x31, 0x35, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5628,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5629,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5630,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5631,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5632,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5633,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5634,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5635,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5636,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5637,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5638,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5639,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5640,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5641,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5642,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5643,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5644,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5645,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5646,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5647,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5648,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5649,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5650,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5651,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5652,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5653,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5654,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5655,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5656,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5657,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5658,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5659,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5660,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5661,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5662,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5663,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5664,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5665,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x30, 0x31, 0x35, 0x34, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5666,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5667,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x31, 0x30, 0x31, 0x35, 0x34, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5668,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5669,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5670,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5671,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5672,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5673,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5674,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5675,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5676,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x37, 0x38, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5677,64,"style","Trailing whitespace is superfluous."," 0x37, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5678,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5679,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5680,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5681,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5682,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5683,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5684,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5685,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5686,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5687,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5688,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5689,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5690,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5691,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5692,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5693,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5694,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5695,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5696,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x2d, 0x31, 0x30, 0x31, 0x35, 0x34, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5697,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5698,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5699,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5700,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5701,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5702,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5703,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5704,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5705,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x30, 0x37, 0x31, 0x30, 0x31, 0x35, 0x34, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5706,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5707,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x37, 0x2d, 0x31, 0x30, 0x31, 0x35, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5708,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5709,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5710,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5711,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5712,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5713,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5714,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5715,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5716,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5717,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5718,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5719,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5720,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5721,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5722,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5723,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x2d, 0x31, 0x30, 0x31, 0x35, 0x34, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5724,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5725,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5726,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5727,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5728,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5729,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5730,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5731,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5732,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5733,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5734,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5735,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5736,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5737,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x33, 0x54, 0x31, 0x37, 0x3a, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5738,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x33, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5739,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5740,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5741,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5742,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5743,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5744,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5745,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5746,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5747,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5748,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5749,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5750,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5751,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5752,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5753,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5754,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5755,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5756,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5757,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5758,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5759,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5760,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5761,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5762,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5763,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5764,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5765,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5766,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5767,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5768,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5769,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5770,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5771,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5772,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5773,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5774,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5775,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5776,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5777,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5778,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5779,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5780,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5781,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5782,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5783,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5784,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5785,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5786,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5787,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5788,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5789,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5790,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5791,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5792,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5793,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5794,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5795,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x30, 0x37, 0x30, 0x31, 0x39, 0x34, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5796,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5797,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x39, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5798,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5799,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5800,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5801,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5802,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5803,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5804,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5805,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5806,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x37, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5807,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x36, 0x36, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5808,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5809,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5810,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5811,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5812,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5813,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5814,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5815,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5816,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5817,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5818,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5819,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5820,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5821,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5822,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5823,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5824,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5825,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5826,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5827,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5828,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5829,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5830,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5831,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5832,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5833,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5834,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5835,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x30, 0x37, 0x30, 0x31, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5836,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5837,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5838,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5839,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5840,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5841,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5842,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5843,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5844,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5845,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5846,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5847,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5848,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5849,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5850,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5851,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5852,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5853,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5854,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5855,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5856,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5857,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5858,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5859,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5860,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5861,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5862,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5863,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5864,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5865,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5866,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5867,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x32, 0x54, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5868,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x33, 0x30, 0x3a, 0x30, 0x33, 0x2d, 0x30, 0x35, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5869,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5870,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5871,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5872,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5873,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5874,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5875,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5876,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5877,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5878,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x43, 0x49, 0x4b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5879,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5880,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5881,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5882,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5883,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5884,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5885,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5886,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5887,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5888,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x43, 0x49, 0x4b, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5889,64,"style","Trailing whitespace is superfluous."," 0x53, 0x54, 0x58, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5890,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5891,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5892,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x2d, 0x51, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5893,64,"style","Trailing whitespace is superfluous."," 0x73, 0x74, 0x61, 0x72, 0x74, 0x3d, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5894,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5895,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5896,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5897,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5898,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5899,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5900,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5901,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5902,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5903,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5904,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5905,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5906,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x43, 0x49, 0x4b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5907,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x53, 0x54, 0x58, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5908,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5909,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5910,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x31, 0x30, 0x2d, 0x51, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5911,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x73, 0x74, 0x61, 0x72, 0x74, 0x3d, 0x30, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5912,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5913,64,"style","Trailing whitespace is superfluous."," 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x75, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5914,64,"style","Trailing whitespace is superfluous."," 0x75, 0x74, 0x3d, 0x61, 0x74, 0x6f, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5915,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x73, 0x65, 0x6c, 0x66, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5916,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x61, 0x70, 0x70, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5917,64,"style","Trailing whitespace is superfluous."," 0x69, 0x63, 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x2f, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5918,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x2b, 0x78, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5919,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5920,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5921,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5922,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5923,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5924,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5925,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5926,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5927,64,"style","Trailing whitespace is superfluous."," 0x43, 0x49, 0x4b, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5928,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5929,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x31, 0x30, 0x2d, 0x51, 0x25, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5930,64,"style","Trailing whitespace is superfluous."," 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5931,64,"style","Trailing whitespace is superfluous."," 0x61, 0x3d, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5932,64,"style","Trailing whitespace is superfluous."," 0x65, 0x62, 0x3d, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5933,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5934,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5935,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x34, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5936,64,"style","Trailing whitespace is superfluous."," 0x75, 0x74, 0x70, 0x75, 0x74, 0x3d, 0x61, 0x74, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5937,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x73, 0x74, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5938,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x34, 0x30, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5939,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x78, 0x74, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5940,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x70, 0x70, 0x6c, 0x69, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5941,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2f, 0x61, 0x74, 0x6f, 0x6d, 0x2b, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5942,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5943,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5944,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x61, 0x74, 0x65, 0x20, 0x54, 0x65, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5945,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6f, 0x6c, 0x6f, 0x67, 0x79, 0x20, 0x70, 0x6c, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5946,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x28, 0x30, 0x30, 0x30, 0x31, 0x31, 0x33, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5947,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x29, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5948,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5949,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5950,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x2d, 0x32, 0x30, 0x54, 0x31, 0x32, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5951,64,"style","Trailing whitespace is superfluous."," 0x35, 0x34, 0x3a, 0x35, 0x31, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5952,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5953,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x3c, 0x2f, 0x66, 0x65, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5954,68,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a)), date = structure(1579542891, class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5955,77,"style","Trailing whitespace is superfluous."," ""POSIXt""), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.7e-05, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5956,72,"style","Trailing whitespace is superfluous."," connect = 2.8e-05, pretransfer = 8.2e-05, starttransfer = 0.473137, ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/edgarWebR/email-body b/.dev/revdep_emails/edgarWebR/email-body deleted file mode 100644 index f93a59432..000000000 --- a/.dev/revdep_emails/edgarWebR/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Micah J Waldstein! Thank you for using {lintr} in your package {edgarWebR}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/mwaldstein/edgarWebR using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 20s on CRAN vs. 380s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/epigraphdb/attachments/epigraphdb.warnings b/.dev/revdep_emails/epigraphdb/attachments/epigraphdb.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/epigraphdb/attachments/epigraphdb.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/epigraphdb/email-body b/.dev/revdep_emails/epigraphdb/email-body deleted file mode 100644 index ac4451901..000000000 --- a/.dev/revdep_emails/epigraphdb/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Yi Liu! Thank you for using {lintr} in your package {epigraphdb}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/MRCIEU/epigraphdb-r using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 17s on CRAN vs. 9s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/fakemake/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/fakemake/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 9da57e81d..000000000 --- a/.dev/revdep_emails/fakemake/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,2 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/makelists.R",16,28,"style","Commas should never have a space before."," testing = ,","commas_linter" diff --git a/.dev/revdep_emails/fakemake/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/fakemake/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 8c8fe2df2..000000000 --- a/.dev/revdep_emails/fakemake/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,2 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/makelists.R",78,31,"style","Any function spanning multiple lines should use curly braces."," index <- which(sapply(ml, function(x) target %in% x[[""prerequisites""]] ||","brace_linter" diff --git a/.dev/revdep_emails/fakemake/email-body b/.dev/revdep_emails/fakemake/email-body deleted file mode 100644 index 502ae85da..000000000 --- a/.dev/revdep_emails/fakemake/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Andreas Dominik Cullmann! Thank you for using {lintr} in your package {fakemake}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://gitlab.com/fvafrcu/fakemake using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 13s on CRAN vs. 7s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/fixtuRes/attachments/fixtuRes.warnings b/.dev/revdep_emails/fixtuRes/attachments/fixtuRes.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/fixtuRes/attachments/fixtuRes.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/fixtuRes/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/fixtuRes/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index c7f5c21af..000000000 --- a/.dev/revdep_emails/fixtuRes/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,3 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/vectors.R",202,3,"warning","local variable β€˜differences_conversion_function’ assigned but may not be used"," differences_conversion_function <- switch(","object_usage_linter" -"vignettes/configuration.R",1,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" diff --git a/.dev/revdep_emails/fixtuRes/email-body b/.dev/revdep_emails/fixtuRes/email-body deleted file mode 100644 index c25dedce0..000000000 --- a/.dev/revdep_emails/fixtuRes/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Jakub Nowicki! Thank you for using {lintr} in your package {fixtuRes}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/jakubnowicki/fixtuRes using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 8s on CRAN vs. 5s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/fst/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/fst/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index d86cf0fd7..000000000 --- a/.dev/revdep_emails/fst/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,12 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/fst_table.R",345,13,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!drop | ncol(x) > 1) return(x)","vector_logic_linter" -"R/fst.R",170,1,"style","Variable and function name style should be snake_case or symbols.","write.fst <- function(x, path, compress = 50, uniform_encoding = TRUE) {","object_name_linter" -"R/fst.R",251,21,"style","Variable and function name style should be snake_case or symbols."," attr(res_table, ""row.names"") <- base::.set_row_names(nr_of_rows)","object_name_linter" -"R/hash.R",36,65,"style","Trailing semicolons are not needed."," stop(""Please specify an integer value for the hash seed."");","semicolon_linter" -"R/hash.R",42,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.logical(block_hash) | length(block_hash) != 1) {","vector_logic_linter" -"R/hash.R",43,69,"style","Trailing semicolons are not needed."," stop(""Please specify a logical value for parameter block_hash."");","semicolon_linter" -"R/hash.R",47,62,"style","Trailing semicolons are not needed."," stop(""Please specify a raw vector as input parameter x."");","semicolon_linter" -"tests/testthat/test_factor.R",21,5,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," ) }","brace_linter" -"tests/testthat/test_fst.R",23,5,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," ) }","brace_linter" -"tests/testthat/test_fst.R",30,7,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," ) }","brace_linter" -"tests/testthat/test_meta.R",223,17,"style","Use FALSE instead of the symbol F."," setkey(x, L, F, N)","T_and_F_symbol_linter" diff --git a/.dev/revdep_emails/fst/email-body b/.dev/revdep_emails/fst/email-body deleted file mode 100644 index 933d58f57..000000000 --- a/.dev/revdep_emails/fst/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Mark Klik! Thank you for using {lintr} in your package {fst}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/fstpackage/fst using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 22s on CRAN vs. 13s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/geofacet/email-body b/.dev/revdep_emails/geofacet/email-body deleted file mode 100644 index 5941db735..000000000 --- a/.dev/revdep_emails/geofacet/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Ryan Hafen! Thank you for using {lintr} in your package {geofacet}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/hafen/geofacet using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 0s on CRAN vs. 0s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/geogrid/email-body b/.dev/revdep_emails/geogrid/email-body deleted file mode 100644 index 8ebbddd1a..000000000 --- a/.dev/revdep_emails/geogrid/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Joseph Bailey! Thank you for using {lintr} in your package {geogrid}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/jbaileyh/geogrid using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 0s on CRAN vs. 0s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/ggRandomForests/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/ggRandomForests/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 1cfa3f9b3..000000000 --- a/.dev/revdep_emails/ggRandomForests/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,12 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/gg_error.R",233,1,"style","Variable and function name style should be snake_case.","gg_error.randomForest.formula <- gg_error.randomForest","object_name_linter" -"R/kaplan.R",113,31,"style","Place a space before left parenthesis, except in a function call."," lag_s <- c(1, gg_dta$surv)[-(dim(gg_dta)[1] + 1)]","spaces_left_parentheses_linter" -"R/kaplan.R",114,31,"style","Place a space before left parenthesis, except in a function call."," lag_t <- c(0, gg_dta$time)[-(dim(gg_dta)[1] + 1)]","spaces_left_parentheses_linter" -"R/nelson.R",134,36,"style","Place a space before left parenthesis, except in a function call."," lag_surv <- c(1, gg_dta$surv)[-(dim(gg_dta)[1] + 1)]","spaces_left_parentheses_linter" -"R/nelson.R",135,36,"style","Place a space before left parenthesis, except in a function call."," lag_time <- c(0, gg_dta$time)[-(dim(gg_dta)[1] + 1)]","spaces_left_parentheses_linter" -"R/plot.gg_interaction.R",121,56,"style","Trailing whitespace is superfluous."," stop(""gg_interaction expects a rfsrc object, or a ","trailing_whitespace_linter" -"R/plot.gg_variable.R",283,58,"style","Trailing whitespace is superfluous."," ""Mismatched variable types for panel plots... ","trailing_whitespace_linter" -"R/plot.gg_variable.R",360,48,"style","Trailing whitespace is superfluous."," warning(""Mismatched variable types... ","trailing_whitespace_linter" -"tests/testthat/test_gg_error.R",42,14,"style","Variable and function name style should be snake_case."," rfsrc_iris$err.rate <- NULL","object_name_linter" -"tests/testthat/test_gg_error.R",101,11,"style","Variable and function name style should be snake_case."," rf_iris$err.rate <- NULL","object_name_linter" -"tests/testthat/test_gg_partial.R",73,18,"style","Variable and function name style should be snake_case."," partial_boston$xvar.names <- ""lstat""","object_name_linter" diff --git a/.dev/revdep_emails/ggRandomForests/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/ggRandomForests/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index a406c67bc..000000000 --- a/.dev/revdep_emails/ggRandomForests/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,357 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/cache_rfsrc_datasets.R",89,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/cache_rfsrc_datasets.R",92,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/cache_rfsrc_datasets.R",179,5,"style","Either both or neither branch in `if`/`else` should use curly braces."," else{","brace_linter" -"R/cache_rfsrc_datasets.R",179,9,"style","There should be a space before an opening curly brace."," else{","brace_linter" -"R/cache_rfsrc_datasets.R",305,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" -"R/calc_roc.R",63,12,"style","Variable and function name style should be snake_case or symbols."," which.outcome = ""all"",","object_name_linter" -"R/calc_roc.R",72,32,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(arg_list$oob) & is.logical(arg_list$oob))","vector_logic_linter" -"R/calc_roc.R",89,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/calc_roc.R",91,7,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- 1","object_name_linter" -"R/calc_roc.R",125,22,"style","Variable and function name style should be snake_case or symbols."," which.outcome = ""all"",","object_name_linter" -"R/calc_roc.R",136,12,"style","Variable and function name style should be snake_case or symbols."," which.outcome = 1,","object_name_linter" -"R/calc_roc.R",143,7,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- 1","object_name_linter" -"R/combine.gg_partial.R",95,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((!inherits(x, ""gg_partial_list"") &","vector_logic_linter" -"R/combine.gg_partial.R",96,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !inherits(x, ""gg_partial"")) &","vector_logic_linter" -"R/combine.gg_partial.R",97,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," (!inherits(y, ""gg_partial_list"") &","vector_logic_linter" -"R/gg_error.R",225,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_minimal_depth.R",135,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_minimal_vimp.R",128,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_minimal_vimp.R",134,34,"warning","1:dim(...)[1] is likely to be wrong in the empty edge case. Use seq_len() instead."," rnk_md$depth <- rnk_vm$vimp <- 1:dim(rnk_md)[1]","seq_linter" -"R/gg_minimal_vimp.R",143,18,"warning","1:dim(...)[1] is likely to be wrong in the empty edge case. Use seq_len() instead."," rnk_vm$vimp <- 1:dim(rnk_vm)[1]","seq_linter" -"R/gg_partial_coplot.R",115,5,"style","Either both or neither branch in `if`/`else` should use curly braces."," else{","brace_linter" -"R/gg_partial_coplot.R",115,9,"style","There should be a space before an opening curly brace."," else{","brace_linter" -"R/gg_partial.R",222,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_partial.R",232,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_partial.R",257,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",152,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",157,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.vector(grp) | is.factor(grp)) {","vector_logic_linter" -"R/gg_rfsrc.R",163,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",184,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",187,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",190,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",203,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",230,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",248,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",255,36,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(arg_list$conf.int) & missing(by)) {","vector_logic_linter" -"R/gg_rfsrc.R",266,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",279,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",285,7,"style","Either both or neither branch in `if`/`else` should use curly braces."," else{","brace_linter" -"R/gg_rfsrc.R",285,11,"style","There should be a space before an opening curly brace."," else{","brace_linter" -"R/gg_rfsrc.R",308,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",317,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",327,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",352,47,"style","Use TRUE instead of the symbol T."," replace = T)","T_and_F_symbol_linter" -"R/gg_rfsrc.R",375,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",413,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",418,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.vector(grp) | is.factor(grp)) {","vector_logic_linter" -"R/gg_rfsrc.R",424,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",451,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",463,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",481,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_roc.R",69,34,"style","Variable and function name style should be snake_case or symbols.","gg_roc.rfsrc <- function(object, which.outcome, oob, ...) {","object_name_linter" -"R/gg_roc.R",70,71,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (sum(inherits(object, c(""rfsrc"", ""grow""), TRUE) == c(1, 2)) != 2 &","vector_logic_linter" -"R/gg_roc.R",71,74,"warning","Conditional expressions require scalar logical operators (&& and ||)"," sum(inherits(object, c(""rfsrc"", ""predict""), TRUE) == c(1, 2)) != 2 &","vector_logic_linter" -"R/gg_roc.R",85,5,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- ""all""","object_name_linter" -"R/gg_roc.R",101,28,"style","Variable and function name style should be snake_case or symbols.","gg_roc <- function(object, which.outcome, oob, ...) {","object_name_linter" -"R/gg_roc.R",106,41,"style","Variable and function name style should be snake_case or symbols.","gg_roc.randomForest <- function(object, which.outcome, oob, ...) {","object_name_linter" -"R/gg_roc.R",116,5,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- ""all""","object_name_linter" -"R/gg_variable.R",163,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_variable.R",195,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_variable.R",236,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_variable.R",257,3,"warning","local variable β€˜oob’ assigned but may not be used"," oob <- if (!is.null(arg_list$oob)) {","object_usage_linter" -"R/gg_variable.R",259,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_vimp.R",107,71,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (sum(inherits(object, c(""rfsrc"", ""grow""), TRUE) == c(1, 2)) != 2 &","vector_logic_linter" -"R/gg_vimp.R",119,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_vimp.R",148,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_vimp.R",158,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_vimp.R",165,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_vimp.R",177,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_vimp.R",187,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_vimp.R",223,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_vimp.R",232,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_vimp.R",257,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_vimp.R",267,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_vimp.R",274,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_vimp.R",286,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_vimp.R",295,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/kaplan.R",59,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/kaplan.R",71,3,"warning","local variable β€˜delta_time’ assigned but may not be used"," delta_time <- sapply(2:length(times), function(ind) {","object_usage_linter" -"R/kaplan.R",124,15,"warning","1:dim(...)[1] is likely to be wrong in the empty edge case. Use seq_len() instead."," for (ind in 1:dim(gg_dta)[1]) {","seq_linter" -"R/nelson.R",74,5,"warning","local variable β€˜srv’ assigned but may not be used"," srv <-","object_usage_linter" -"R/nelson.R",78,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/nelson.R",94,5,"warning","local variable β€˜delta_time’ assigned but may not be used"," delta_time <- sapply(2:length(times), function(ind) {","object_usage_linter" -"R/nelson.R",145,17,"warning","1:dim(...)[1] is likely to be wrong in the empty edge case. Use seq_len() instead."," for (ind in 1:dim(gg_dta)[1]) {","seq_linter" -"R/plot.gg_error.R",131,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_interaction.R",145,20,"warning","1:dim(...)[1] is likely to be wrong in the empty edge case. Use seq_len() instead."," gg_dta$rank <- 1:dim(gg_dta)[1]","seq_linter" -"R/plot.gg_interaction.R",184,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/plot.gg_interaction.R",185,39,"warning","1:dim(...)[1] is likely to be wrong in the empty edge case. Use seq_len() instead."," gg_dta <- data.frame(cbind(rank = 1:dim(object)[1],","seq_linter" -"R/plot.gg_minimal_depth.R",128,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.numeric(arg_set$nvar) & arg_set$nvar > 1) {","vector_logic_linter" -"R/plot.gg_minimal_depth.R",179,18,"warning","1:dim(...)[1] is likely to be wrong in the empty edge case. Use seq_len() instead."," vsel$rank <- 1:dim(vsel)[1]","seq_linter" -"R/plot.gg_minimal_depth.R",219,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_minimal_vimp.R",132,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_partial_list.R",194,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_partial_list.R",208,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_partial_list.R",212,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_partial_list.R",220,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_partial.R",182,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_partial.R",202,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_partial.R",205,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_partial.R",255,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_partial.R",259,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_rfsrc.R",116,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (inherits(gg_dta, ""class"") |","vector_logic_linter" -"R/plot.gg_rfsrc.R",135,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_rfsrc.R",152,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_rfsrc.R",174,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_rfsrc.R",184,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_rfsrc.R",200,39,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (inherits(gg_dta, ""regr"") |","vector_logic_linter" -"R/plot.gg_rfsrc.R",204,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_rfsrc.R",216,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_roc.R",67,28,"style","Variable and function name style should be snake_case or symbols.","plot.gg_roc <- function(x, which.outcome = NULL, ...) {","object_name_linter" -"R/plot.gg_roc.R",76,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (crv > 2 & is.null(which.outcome)) {","vector_logic_linter" -"R/plot.gg_roc.R",81,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_roc.R",83,11,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- 2","object_name_linter" -"R/plot.gg_roc.R",86,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_roc.R",93,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (crv > 2 & is.null(which.outcome)) {","vector_logic_linter" -"R/plot.gg_roc.R",98,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_roc.R",100,11,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- 2","object_name_linter" -"R/plot.gg_roc.R",133,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_survival.R",83,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_survival.R",121,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",177,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",217,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",260,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",271,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",279,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",309,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",316,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",330,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",353,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",357,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",372,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",381,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",396,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",423,17,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",431,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",450,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",470,19,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",483,17,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",500,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",511,17,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",531,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",539,17,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",546,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_vimp.R",96,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.numeric(arg_set$nvar) & arg_set$nvar > 1) {","vector_logic_linter" -"R/plot.gg_vimp.R",119,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_vimp.R",143,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(gg_dta$set) | length(unique(gg_dta$set)) < 2) {","vector_logic_linter" -"R/plot.gg_vimp.R",146,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/quantile_pts.R",64,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"tests/testthat/test_gg_error.R",113,3,"style","Variable and function name style should be snake_case or symbols."," Boston$chas <- as.logical(Boston$chas)","object_name_linter" -"tests/testthat/test_gg_error.R",159,3,"style","Variable and function name style should be snake_case or symbols."," Boston$chas <- as.logical(Boston$chas)","object_name_linter" -"tests/testthat/test_gg_interaction.R",51,3,"style","Variable and function name style should be snake_case or symbols."," Boston$chas <- as.logical(Boston$chas)","object_name_linter" -"tests/testthat/test_gg_roc.R",15,3,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- 1","object_name_linter" -"tests/testthat/test_gg_roc.R",69,3,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- 1","object_name_linter" -"tests/testthat/test_gg_vimp.R",125,15,"warning","1:dim(...)[2] is likely to be wrong in the empty edge case. Use seq_len() instead."," for (ind in 1:dim(pbc)[2]) {","seq_linter" -"tests/testthat/test_gg_vimp.R",132,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"tests/testthat/test_gg_vimp.R",225,3,"style","Variable and function name style should be snake_case or symbols."," Boston$chas <- as.logical(Boston$chas)","object_name_linter" -"tests/testthat/test_surface_matrix.R",17,3,"style","Variable and function name style should be snake_case or symbols."," rm.tmp <- do.call(c, lapply(rm_pts,","object_name_linter" -"tests/testthat/test_survival_datasets.R",21,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"vignettes/ggrfRegression.Rmd",37,81,"style","Lines should not be more than 80 characters.","# set global chunk options for knitr. These can be changed in the header for each individual R code chunk","line_length_linter" -"vignettes/ggrfRegression.Rmd",39,28,"style","Only use double-quotes."," fig.align = 'center',","single_quotes_linter" -"vignettes/ggrfRegression.Rmd",41,27,"style","Only use double-quotes."," fig.show = 'hold',","single_quotes_linter" -"vignettes/ggrfRegression.Rmd",44,23,"style","Only use double-quotes."," size = 'footnotesize',","single_quotes_linter" -"vignettes/ggrfRegression.Rmd",48,81,"style","Lines should not be more than 80 characters."," echo = FALSE, # Change this to TRUE if you want to see all the code examples","line_length_linter" -"vignettes/ggrfRegression.Rmd",55,63,"style","Trailing whitespace is superfluous.","options(object.size = Inf, expressions = 100000, memory = Inf, ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",73,46,"style","Trailing whitespace is superfluous.","library(""plot3D"") # for 3d surfaces. ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",79,73,"style","Trailing whitespace is superfluous.","library(""randomForestSRC"") # random forests for survival, regression and ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",86,50,"style","Trailing whitespace is superfluous.","## Set open circle for censored, and x for events ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",87,1,"style","Variable and function name style should be snake_case or symbols.","event.marks <- c(1, 4)","object_name_linter" -"vignettes/ggrfRegression.Rmd",88,1,"style","Variable and function name style should be snake_case or symbols.","event.labels <- c(FALSE, TRUE)","object_name_linter" -"vignettes/ggrfRegression.Rmd",91,1,"style","Variable and function name style should be snake_case or symbols.","strCol <- brewer.pal(3, ""Set1"")[c(2,1,3)]","object_name_linter" -"vignettes/ggrfRegression.Rmd",91,37,"style","Commas should always have a space after.","strCol <- brewer.pal(3, ""Set1"")[c(2,1,3)]","commas_linter" -"vignettes/ggrfRegression.Rmd",91,39,"style","Commas should always have a space after.","strCol <- brewer.pal(3, ""Set1"")[c(2,1,3)]","commas_linter" -"vignettes/ggrfRegression.Rmd",128,21,"style","Put spaces around all infix operators.","data(Boston, package=""MASS"")","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",131,1,"style","Variable and function name style should be snake_case or symbols.","Boston$chas <- as.logical(Boston$chas)","object_name_linter" -"vignettes/ggrfRegression.Rmd",135,29,"style","Trailing whitespace is superfluous.","cls <- sapply(Boston, class) ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",136,2,"style","Trailing whitespace is superfluous.","# ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",137,8,"style","Trailing whitespace is superfluous.","lbls <- ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",168,1,"style","Variable and function name style should be snake_case or symbols.","dta.labs <- data.frame(cbind(Variable=names(cls), Description=lbls, type=cls))","object_name_linter" -"vignettes/ggrfRegression.Rmd",168,38,"style","Put spaces around all infix operators.","dta.labs <- data.frame(cbind(Variable=names(cls), Description=lbls, type=cls))","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",168,62,"style","Put spaces around all infix operators.","dta.labs <- data.frame(cbind(Variable=names(cls), Description=lbls, type=cls))","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",168,73,"style","Put spaces around all infix operators.","dta.labs <- data.frame(cbind(Variable=names(cls), Description=lbls, type=cls))","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",171,1,"style","Variable and function name style should be snake_case or symbols.","st.labs <- as.character(dta.labs$Description)","object_name_linter" -"vignettes/ggrfRegression.Rmd",172,7,"style","Variable and function name style should be snake_case or symbols.","names(st.labs) <- names(cls)","object_name_linter" -"vignettes/ggrfRegression.Rmd",175,16,"style","Trailing whitespace is superfluous.","kable(dta.labs, ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",176,25,"style","Trailing whitespace is superfluous."," row.names = FALSE, ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",177,14,"style","Put spaces around all infix operators."," caption=""`Boston` housing data dictionary."",","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",194,12,"style","Put spaces around all infix operators.","ggplot(dta)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",195,19,"style","Put spaces around all infix operators."," geom_point(alpha=0.4, aes(x=medv, y=value, color=chas))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",195,30,"style","Put spaces around all infix operators."," geom_point(alpha=0.4, aes(x=medv, y=value, color=chas))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",195,38,"style","Put spaces around all infix operators."," geom_point(alpha=0.4, aes(x=medv, y=value, color=chas))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",195,51,"style","Put spaces around all infix operators."," geom_point(alpha=0.4, aes(x=medv, y=value, color=chas))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",195,58,"style","Put spaces around all infix operators."," geom_point(alpha=0.4, aes(x=medv, y=value, color=chas))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",196,20,"style","Put spaces around all infix operators."," geom_smooth(aes(x=medv, y=value), se=FALSE)+ ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",196,28,"style","Put spaces around all infix operators."," geom_smooth(aes(x=medv, y=value), se=FALSE)+ ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",196,39,"style","Put spaces around all infix operators."," geom_smooth(aes(x=medv, y=value), se=FALSE)+ ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",196,46,"style","Put spaces around all infix operators."," geom_smooth(aes(x=medv, y=value), se=FALSE)+ ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",196,47,"style","Trailing whitespace is superfluous."," geom_smooth(aes(x=medv, y=value), se=FALSE)+ ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",197,9,"style","Put spaces around all infix operators."," labs(y="""", x=st.labs[""medv""]) +","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",197,15,"style","Put spaces around all infix operators."," labs(y="""", x=st.labs[""medv""]) +","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",198,29,"style","Put spaces around all infix operators."," scale_color_brewer(palette=""Set2"")+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",198,37,"style","Put spaces around all infix operators."," scale_color_brewer(palette=""Set2"")+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",199,31,"style","Put spaces around all infix operators."," facet_wrap(~variable, scales=""free_y"", ncol=3)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",199,46,"style","Put spaces around all infix operators."," facet_wrap(~variable, scales=""free_y"", ncol=3)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",216,1,"style","Variable and function name style should be snake_case or symbols.","rfsrc_Boston <- rfsrc(medv~., data=Boston, ","object_name_linter" -"vignettes/ggrfRegression.Rmd",216,27,"style","Put spaces around all infix operators.","rfsrc_Boston <- rfsrc(medv~., data=Boston, ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",216,35,"style","Put spaces around all infix operators.","rfsrc_Boston <- rfsrc(medv~., data=Boston, ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",216,43,"style","Trailing whitespace is superfluous.","rfsrc_Boston <- rfsrc(medv~., data=Boston, ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",235,29,"style","Commas should always have a space after.","class(gg_e) <- c(""gg_error"",class(gg_e))","commas_linter" -"vignettes/ggrfRegression.Rmd",247,35,"style","Put spaces around all infix operators.","plot(gg_rfsrc(rfsrc_Boston), alpha=.5)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",247,39,"style","Put spaces around all infix operators.","plot(gg_rfsrc(rfsrc_Boston), alpha=.5)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",248,23,"style","Put spaces around all infix operators."," coord_cartesian(ylim=c(5,49))","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",248,28,"style","Commas should always have a space after."," coord_cartesian(ylim=c(5,49))","commas_linter" -"vignettes/ggrfRegression.Rmd",267,33,"style","Put spaces around all infix operators.","plot(gg_vimp(rfsrc_Boston), lbls=st.labs)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",288,1,"style","Variable and function name style should be snake_case or symbols.","varsel_Boston <- var.select(rfsrc_Boston)","object_name_linter" -"vignettes/ggrfRegression.Rmd",294,17,"style","Put spaces around all infix operators.","plot(gg_md, lbls=st.labs)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",330,39,"style","Trailing whitespace is superfluous.","# plotted in minimal depth rank order. ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",334,16,"style","Put spaces around all infix operators.","plot(gg_v, xvar=xvar, panel=TRUE, alpha=.5)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",334,28,"style","Put spaces around all infix operators.","plot(gg_v, xvar=xvar, panel=TRUE, alpha=.5)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",334,40,"style","Put spaces around all infix operators.","plot(gg_v, xvar=xvar, panel=TRUE, alpha=.5)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",334,44,"style","Put spaces around all infix operators.","plot(gg_v, xvar=xvar, panel=TRUE, alpha=.5)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",335,9,"style","Put spaces around all infix operators."," labs(y=st.labs[""medv""], x="""")","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",335,28,"style","Put spaces around all infix operators."," labs(y=st.labs[""medv""], x="""")","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",343,16,"style","Put spaces around all infix operators.","plot(gg_v, xvar=""chas"", alpha=.4)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",343,30,"style","Put spaces around all infix operators.","plot(gg_v, xvar=""chas"", alpha=.4)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",343,34,"style","Put spaces around all infix operators.","plot(gg_v, xvar=""chas"", alpha=.4)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",344,9,"style","Put spaces around all infix operators."," labs(y=st.labs[""medv""])","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",362,1,"style","Variable and function name style should be snake_case or symbols.","partial_Boston <- plot.variable(rfsrc_Boston,","object_name_linter" -"vignettes/ggrfRegression.Rmd",363,37,"style","Put spaces around all infix operators."," xvar=gg_md$topvars,","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",364,40,"style","Put spaces around all infix operators."," partial=TRUE, sorted=FALSE,","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",364,53,"style","Put spaces around all infix operators."," partial=TRUE, sorted=FALSE,","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",365,51,"style","Do not place spaces before parentheses."," show.plots = FALSE )","spaces_inside_linter" -"vignettes/ggrfRegression.Rmd",371,17,"style","Put spaces around all infix operators.","plot(gg_p, panel=TRUE) +","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",372,9,"style","Put spaces around all infix operators."," labs(y=st.labs[""medv""], x="""") +","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",372,28,"style","Put spaces around all infix operators."," labs(y=st.labs[""medv""], x="""") +","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",373,24,"style","Only use double-quotes."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)","single_quotes_linter" -"vignettes/ggrfRegression.Rmd",373,40,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",373,41,"style","Only use double-quotes."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)","single_quotes_linter" -"vignettes/ggrfRegression.Rmd",373,52,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",390,1,"style","Variable and function name style should be snake_case or symbols.","interaction_Boston <- find.interaction(rfsrc_Boston)","object_name_linter" -"vignettes/ggrfRegression.Rmd",393,41,"style","Trailing whitespace is superfluous.","plot(gg_interaction(interaction_Boston), ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",394,10,"style","Put spaces around all infix operators."," xvar=gg_md$topvars, panel=TRUE)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",394,31,"style","Put spaces around all infix operators."," xvar=gg_md$topvars, panel=TRUE)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",408,63,"style","Trailing whitespace is superfluous.","# Find the rm variable points to create 6 intervals of roughly ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",410,52,"style","Put spaces around all infix operators.","rm_pts <- quantile_pts(rfsrc_Boston$xvar$rm, groups=6, ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",410,55,"style","Trailing whitespace is superfluous.","rm_pts <- quantile_pts(rfsrc_Boston$xvar$rm, groups=6, ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",411,33,"style","Put spaces around all infix operators."," intervals=TRUE)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",414,43,"style","Put spaces around all infix operators.","rm_grp <- cut(rfsrc_Boston$xvar$rm, breaks=rm_pts)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",419,49,"style","Trailing whitespace is superfluous.","# Modify the labels for descriptive panel titles ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",420,39,"style","Trailing whitespace is superfluous.","levels(gg_v$rm_grp) <- paste(""rm in "", ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",421,54,"style","Put spaces around all infix operators."," levels(gg_v$rm_grp), sep="""")","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",423,41,"style","Trailing whitespace is superfluous.","# Create a variable dependence (co)plot, ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",425,27,"style","Put spaces around all infix operators.","plot(gg_v, xvar = ""lstat"")+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",426,48,"style","Trailing whitespace is superfluous."," # method = ""loess"", span=1.5, se = FALSE) + ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",427,30,"style","Put spaces around all infix operators."," labs(y = st.labs[""medv""], x=st.labs[""lstat""]) + ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",427,50,"style","Trailing whitespace is superfluous."," labs(y = st.labs[""medv""], x=st.labs[""lstat""]) + ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",428,36,"style","Trailing whitespace is superfluous."," theme(legend.position = ""none"") + ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",429,41,"style","Trailing whitespace is superfluous."," scale_color_brewer(palette = ""Set3"") + ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",439,66,"style","Trailing whitespace is superfluous.","# Find the lstat variable points to create 6 intervals of roughly ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",441,58,"style","Put spaces around all infix operators.","lstat_pts <- quantile_pts(rfsrc_Boston$xvar$lstat, groups=6, intervals=TRUE)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",441,71,"style","Put spaces around all infix operators.","lstat_pts <- quantile_pts(rfsrc_Boston$xvar$lstat, groups=6, intervals=TRUE)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",444,49,"style","Put spaces around all infix operators.","lstat_grp <- cut(rfsrc_Boston$xvar$lstat, breaks=lstat_pts)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",449,49,"style","Trailing whitespace is superfluous.","# Modify the labels for descriptive panel titles ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",450,77,"style","Commas should always have a space after.","levels(gg_v$lstat_grp) <- paste(""lstat in "", levels(gg_v$lstat_grp), "" (%)"",sep="""")","commas_linter" -"vignettes/ggrfRegression.Rmd",450,80,"style","Put spaces around all infix operators.","levels(gg_v$lstat_grp) <- paste(""lstat in "", levels(gg_v$lstat_grp), "" (%)"",sep="""")","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",450,81,"style","Lines should not be more than 80 characters.","levels(gg_v$lstat_grp) <- paste(""lstat in "", levels(gg_v$lstat_grp), "" (%)"",sep="""")","line_length_linter" -"vignettes/ggrfRegression.Rmd",453,36,"style","Put spaces around all infix operators.","plot(gg_v, xvar = ""rm"", alpha = .5)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",454,47,"style","Trailing whitespace is superfluous."," #method = ""loess"", span=1.5, , se = FALSE) + ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",455,30,"style","Put spaces around all infix operators."," labs(y = st.labs[""medv""], x=st.labs[""rm""]) + ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",455,47,"style","Trailing whitespace is superfluous."," labs(y = st.labs[""medv""], x=st.labs[""rm""]) + ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",456,36,"style","Trailing whitespace is superfluous."," theme(legend.position = ""none"") + ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",457,41,"style","Trailing whitespace is superfluous."," scale_color_brewer(palette = ""Set3"") + ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",459,68,"style","Trailing whitespace is superfluous."," #scale_shape_manual(values = event.marks, labels = event.labels)+ ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",482,1,"style","Variable and function name style should be snake_case or symbols.","partial_coplot_Boston <- gg_partial_coplot(rfsrc_Boston, xvar=""lstat"", ","object_name_linter" -"vignettes/ggrfRegression.Rmd",482,62,"style","Put spaces around all infix operators.","partial_coplot_Boston <- gg_partial_coplot(rfsrc_Boston, xvar=""lstat"", ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",482,71,"style","Trailing whitespace is superfluous.","partial_coplot_Boston <- gg_partial_coplot(rfsrc_Boston, xvar=""lstat"", ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",483,50,"style","Put spaces around all infix operators."," groups=rm_grp,","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",484,54,"style","Put spaces around all infix operators."," show.plots=FALSE)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",493,36,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston, aes(x=lstat, y=yhat, col=group))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",493,45,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston, aes(x=lstat, y=yhat, col=group))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",493,55,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston, aes(x=lstat, y=yhat, col=group))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",493,63,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston, aes(x=lstat, y=yhat, col=group))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",494,15,"style","Put spaces around all infix operators."," geom_point()+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",495,24,"style","Only use double-quotes."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE, alpha=.25)+","single_quotes_linter" -"vignettes/ggrfRegression.Rmd",495,40,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE, alpha=.25)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",495,41,"style","Only use double-quotes."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE, alpha=.25)+","single_quotes_linter" -"vignettes/ggrfRegression.Rmd",495,52,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE, alpha=.25)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",495,65,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE, alpha=.25)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",495,70,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE, alpha=.25)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",496,9,"style","Put spaces around all infix operators."," labs(x=st.labs[""lstat""], y=st.labs[""medv""],","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",496,29,"style","Put spaces around all infix operators."," labs(x=st.labs[""lstat""], y=st.labs[""medv""],","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",497,13,"style","Put spaces around all infix operators."," color=""Room"", shape=""Room"")+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",497,27,"style","Put spaces around all infix operators."," color=""Room"", shape=""Room"")+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",497,35,"style","Put spaces around all infix operators."," color=""Room"", shape=""Room"")+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",498,29,"style","Put spaces around all infix operators."," scale_color_brewer(palette=""Set1"")","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",508,1,"style","Variable and function name style should be snake_case or symbols.","partial_coplot_Boston2 <- gg_partial_coplot(rfsrc_Boston, xvar=""rm"", ","object_name_linter" -"vignettes/ggrfRegression.Rmd",508,63,"style","Put spaces around all infix operators.","partial_coplot_Boston2 <- gg_partial_coplot(rfsrc_Boston, xvar=""rm"", ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",508,69,"style","Trailing whitespace is superfluous.","partial_coplot_Boston2 <- gg_partial_coplot(rfsrc_Boston, xvar=""rm"", ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",509,51,"style","Put spaces around all infix operators."," groups=lstat_grp,","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",510,55,"style","Put spaces around all infix operators."," show.plots=FALSE)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",516,37,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston2, aes(x=rm, y=yhat, col=group))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",516,43,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston2, aes(x=rm, y=yhat, col=group))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",516,53,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston2, aes(x=rm, y=yhat, col=group))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",516,61,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston2, aes(x=rm, y=yhat, col=group))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",517,15,"style","Put spaces around all infix operators."," geom_point()+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",518,24,"style","Only use double-quotes."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)+","single_quotes_linter" -"vignettes/ggrfRegression.Rmd",518,40,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",518,41,"style","Only use double-quotes."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)+","single_quotes_linter" -"vignettes/ggrfRegression.Rmd",518,52,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",518,59,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",519,9,"style","Put spaces around all infix operators."," labs(x=st.labs[""rm""], y=st.labs[""medv""], ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",519,26,"style","Put spaces around all infix operators."," labs(x=st.labs[""rm""], y=st.labs[""medv""], ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",519,43,"style","Trailing whitespace is superfluous."," labs(x=st.labs[""rm""], y=st.labs[""medv""], ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",520,13,"style","Put spaces around all infix operators."," color=""Lower Status"", shape=""Lower Status"")+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",520,35,"style","Put spaces around all infix operators."," color=""Lower Status"", shape=""Lower Status"")+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",520,51,"style","Put spaces around all infix operators."," color=""Lower Status"", shape=""Lower Status"")+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",521,29,"style","Put spaces around all infix operators."," scale_color_brewer(palette=""Set1"")","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",533,52,"style","Put spaces around all infix operators.","rm_pts <- quantile_pts(rfsrc_Boston$xvar$rm, groups=49, intervals = TRUE)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",542,13,"style","Variable and function name style should be snake_case or symbols.","system.time(partial_Boston_surf <- lapply(rm_pts, function(ct){","object_name_linter" -"vignettes/ggrfRegression.Rmd",542,63,"style","There should be a space before an opening curly brace.","system.time(partial_Boston_surf <- lapply(rm_pts, function(ct){","brace_linter" -"vignettes/ggrfRegression.Rmd",542,63,"style","There should be a space between a right parenthesis and a body expression.","system.time(partial_Boston_surf <- lapply(rm_pts, function(ct){","paren_body_linter" -"vignettes/ggrfRegression.Rmd",543,3,"style","Variable and function name style should be snake_case or symbols."," rfsrc_Boston$xvar$rm <- ct","object_name_linter" -"vignettes/ggrfRegression.Rmd",545,47,"style","Trailing whitespace is superfluous."," npts = 50, show.plots = FALSE, ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",548,29,"style","Trailing whitespace is superfluous.","# user system elapsed ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",549,29,"style","Trailing whitespace is superfluous.","# 1109.641 76.516 1199.732 ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",557,1,"style","Variable and function name style should be snake_case or symbols.","rm.tmp <- do.call(c,lapply(rm_pts, ","object_name_linter" -"vignettes/ggrfRegression.Rmd",557,21,"style","Commas should always have a space after.","rm.tmp <- do.call(c,lapply(rm_pts, ","commas_linter" -"vignettes/ggrfRegression.Rmd",557,35,"style","Trailing whitespace is superfluous.","rm.tmp <- do.call(c,lapply(rm_pts, ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",558,41,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," function(grp){rep(grp, 50)}))","brace_linter" -"vignettes/ggrfRegression.Rmd",558,41,"style","There should be a space before an opening curly brace."," function(grp){rep(grp, 50)}))","brace_linter" -"vignettes/ggrfRegression.Rmd",558,41,"style","There should be a space between a right parenthesis and a body expression."," function(grp){rep(grp, 50)}))","paren_body_linter" -"vignettes/ggrfRegression.Rmd",560,46,"style","Trailing whitespace is superfluous.","# Convert the list of plot.variable output to ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",561,31,"style","Commas should always have a space after.","partial_surf <- do.call(rbind,lapply(partial_Boston_surf, gg_partial))","commas_linter" -"vignettes/ggrfRegression.Rmd",567,27,"style","Put spaces around all infix operators.","ggplot(partial_surf, aes(x=lstat, y=rm, z=yhat))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",567,36,"style","Put spaces around all infix operators.","ggplot(partial_surf, aes(x=lstat, y=rm, z=yhat))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",567,42,"style","Put spaces around all infix operators.","ggplot(partial_surf, aes(x=lstat, y=rm, z=yhat))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",567,49,"style","Put spaces around all infix operators.","ggplot(partial_surf, aes(x=lstat, y=rm, z=yhat))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",568,55,"style","Put spaces around all infix operators."," stat_contour(aes(colour = ..level..), binwidth = .5)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",569,9,"style","Put spaces around all infix operators."," labs(x=st.labs[""lstat""], y=st.labs[""rm""], ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",569,29,"style","Put spaces around all infix operators."," labs(x=st.labs[""lstat""], y=st.labs[""rm""], ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",569,44,"style","Trailing whitespace is superfluous."," labs(x=st.labs[""lstat""], y=st.labs[""rm""], ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",570,13,"style","Put spaces around all infix operators."," color=""Median Home Values"")+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",570,35,"style","Put spaces around all infix operators."," color=""Median Home Values"")+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",571,33,"style","Put spaces around all infix operators."," scale_colour_gradientn(colours=topo.colors(10))","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",580,15,"style","Commas should always have a space after.","par(mai = c(0,0,0,0))","commas_linter" -"vignettes/ggrfRegression.Rmd",580,17,"style","Commas should always have a space after.","par(mai = c(0,0,0,0))","commas_linter" -"vignettes/ggrfRegression.Rmd",580,19,"style","Commas should always have a space after.","par(mai = c(0,0,0,0))","commas_linter" -"vignettes/ggrfRegression.Rmd",589,9,"style","Put spaces around all infix operators.","surf3D(x=srf$x, y=srf$y, z=srf$z, col=topo.colors(10),","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",589,18,"style","Put spaces around all infix operators.","surf3D(x=srf$x, y=srf$y, z=srf$z, col=topo.colors(10),","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",589,27,"style","Put spaces around all infix operators.","surf3D(x=srf$x, y=srf$y, z=srf$z, col=topo.colors(10),","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",589,38,"style","Put spaces around all infix operators.","surf3D(x=srf$x, y=srf$y, z=srf$z, col=topo.colors(10),","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",590,14,"style","Put spaces around all infix operators."," colkey=FALSE, border = ""black"", bty=""b2"", ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",590,43,"style","Put spaces around all infix operators."," colkey=FALSE, border = ""black"", bty=""b2"", ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",590,49,"style","Trailing whitespace is superfluous."," colkey=FALSE, border = ""black"", bty=""b2"", ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",591,34,"style","Trailing whitespace is superfluous."," shade = 0.5, expand = 0.5, ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",593,12,"style","Put spaces around all infix operators."," xlab=""Lower Status"", ylab=""Average Rooms"", zlab=""Median Value""","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",593,33,"style","Put spaces around all infix operators."," xlab=""Lower Status"", ylab=""Average Rooms"", zlab=""Median Value""","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",593,55,"style","Put spaces around all infix operators."," xlab=""Lower Status"", ylab=""Average Rooms"", zlab=""Median Value""","infix_spaces_linter" diff --git a/.dev/revdep_emails/ggRandomForests/email-body b/.dev/revdep_emails/ggRandomForests/email-body deleted file mode 100644 index be7f0ee30..000000000 --- a/.dev/revdep_emails/ggRandomForests/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello John Ehrlinger! Thank you for using {lintr} in your package {ggRandomForests}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/ehrlinger/ggRandomForests using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 90s on CRAN vs. 59s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/ggcharts/attachments/ggcharts.warnings b/.dev/revdep_emails/ggcharts/attachments/ggcharts.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/ggcharts/attachments/ggcharts.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/ggcharts/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/ggcharts/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 652215dab..000000000 --- a/.dev/revdep_emails/ggcharts/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,3 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/zzz.R",1,1,"style","Variable and function name style should be snake_case.",".onLoad <- function(libname, pkgname) {","object_name_linter" -"R/zzz.R",43,1,"style","Variable and function name style should be snake_case.",".onUnload <- function(libpath) {","object_name_linter" diff --git a/.dev/revdep_emails/ggcharts/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/ggcharts/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index d22aa5cde..000000000 --- a/.dev/revdep_emails/ggcharts/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,5 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/bar_chart.R",81,14,"warning","possible error in post_process_plot(plot = p, is_sorted = sort, horizontal = horizontal, facet = !!facet, fill = has_fill, highlight = highlight, color = bar_color, other = other, threshold = threshold): unused arguments (other = other, threshold = threshold)","bar_chart <- function(data, x, y, facet = NULL, ..., bar_color = ""auto"",","object_usage_linter" -"R/lollipop_chart.R",83,19,"warning","possible error in post_process_plot(plot = p, is_sorted = TRUE, horizontal = horizontal, facet = !!facet, fill = FALSE, highlight = highlight, color = line_color, other = other, threshold = threshold): unused arguments (other = other, threshold = threshold)","lollipop_chart <- function(data, x, y, facet = NULL, ..., line_size = 0.75,","object_usage_linter" -"R/post_process_plot.R",47,13,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (other & !is.null(threshold)) {","vector_logic_linter" -"vignettes/customize.Rmd",52,101,"style","Lines should not be more than 100 characters."," y = ""Developers Who are Developing with the Language but\nHave not Expressed Interest in Continuing to Do so"",","line_length_linter" diff --git a/.dev/revdep_emails/ggcharts/email-body b/.dev/revdep_emails/ggcharts/email-body deleted file mode 100644 index 3242ac753..000000000 --- a/.dev/revdep_emails/ggcharts/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Thomas Neitmann! Thank you for using {lintr} in your package {ggcharts}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/thomas-neitmann/ggcharts using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 18s on CRAN vs. 12s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/ggfortify/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/ggfortify/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 172b5ab90..000000000 --- a/.dev/revdep_emails/ggfortify/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,118 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/base_fortify_list.R",7,1,"style","Variable and function name style should be snake_case.","fortify.list <- function(model, data = NULL, ...) {","object_name_linter" -"R/base_fortify_list.R",31,1,"style","Variable and function name style should be snake_case.","autoplot.list <- function(object, data = NULL,","object_name_linter" -"R/base_fortify_ts.R",88,1,"style","Variable and function name style should be snake_case.","fortify.timeSeries <- fortify.ts","object_name_linter" -"R/base_fortify_ts.R",91,1,"style","Variable and function name style should be snake_case.","fortify.irts <- fortify.ts","object_name_linter" -"R/base_fortify_ts.R",269,1,"style","Variable and function name style should be snake_case.","autoplot.zooreg <- autoplot.ts","object_name_linter" -"R/base_fortify_ts.R",272,1,"style","Variable and function name style should be snake_case.","autoplot.xts <- autoplot.ts","object_name_linter" -"R/base_fortify_ts.R",275,1,"style","Variable and function name style should be snake_case.","autoplot.timeSeries <- autoplot.ts","object_name_linter" -"R/base_fortify_ts.R",278,1,"style","Variable and function name style should be snake_case.","autoplot.irts <- autoplot.ts","object_name_linter" -"R/base_fortify_ts.R",391,1,"style","Variable and function name style should be snake_case.","fortify.ar <- fortify.tsmodel","object_name_linter" -"R/base_fortify_ts.R",394,1,"style","Variable and function name style should be snake_case.","fortify.Arima <- fortify.tsmodel","object_name_linter" -"R/base_fortify_ts.R",397,1,"style","Variable and function name style should be snake_case.","fortify.tsmodel <- fortify.tsmodel","object_name_linter" -"R/base_fortify_ts.R",400,1,"style","Variable and function name style should be snake_case.","fortify.HoltWinters <- fortify.tsmodel","object_name_linter" -"R/base_fortify_ts.R",403,1,"style","Variable and function name style should be snake_case.","fortify.fracdiff <- fortify.tsmodel","object_name_linter" -"R/base_fortify_ts.R",406,1,"style","Variable and function name style should be snake_case.","fortify.nnetar <- fortify.tsmodel","object_name_linter" -"R/base_fortify_ts.R",409,1,"style","Variable and function name style should be snake_case.","fortify.fGARCH <- fortify.tsmodel","object_name_linter" -"R/base_fortify_ts.R",412,1,"style","Variable and function name style should be snake_case.","fortify.dlmFiltered <- fortify.tsmodel","object_name_linter" -"R/base_fortify_ts.R",415,1,"style","Variable and function name style should be snake_case.","fortify.KFS <- fortify.tsmodel","object_name_linter" -"R/base_fortify_ts.R",457,1,"style","Variable and function name style should be snake_case.","autoplot.tsmodel <- function(object, data = NULL,","object_name_linter" -"R/base_fortify_ts.R",499,1,"style","Variable and function name style should be snake_case.","autoplot.ar <- autoplot.tsmodel","object_name_linter" -"R/base_fortify_ts.R",502,1,"style","Variable and function name style should be snake_case.","autoplot.Arima <- autoplot.tsmodel","object_name_linter" -"R/base_fortify_ts.R",505,1,"style","Variable and function name style should be snake_case.","autoplot.HoltWinters <- autoplot.tsmodel","object_name_linter" -"R/base_fortify_ts.R",508,1,"style","Variable and function name style should be snake_case.","autoplot.fracdiff <- autoplot.tsmodel","object_name_linter" -"R/base_fortify_ts.R",511,1,"style","Variable and function name style should be snake_case.","autoplot.nnetar <- autoplot.tsmodel","object_name_linter" -"R/base_fortify_ts.R",514,1,"style","Variable and function name style should be snake_case.","autoplot.fGARCH <- autoplot.tsmodel","object_name_linter" -"R/base_fortify_ts.R",517,1,"style","Variable and function name style should be snake_case.","autoplot.dlmFiltered <- autoplot.tsmodel","object_name_linter" -"R/base_fortify_ts.R",520,1,"style","Variable and function name style should be snake_case.","autoplot.KFS <- autoplot.tsmodel","object_name_linter" -"R/fortify_base.R",20,1,"style","Variable and function name style should be snake_case.","fortify.table <- function(model, data, ...) {","object_name_linter" -"R/fortify_base.R",38,1,"style","Variable and function name style should be snake_case.","fortify.matrix <- function(model, data = NULL, compat = FALSE, ...) {","object_name_linter" -"R/fortify_base.R",91,15,"style","Variable and function name style should be snake_case."," fortified$Index <- rownames(fortified)","object_name_linter" -"R/fortify_basis.R",24,1,"style","Variable and function name style should be snake_case.","as_tibble.basis <- function(x, ...) {","object_name_linter" -"R/fortify_changepoint.R",21,1,"style","Variable and function name style should be snake_case.","fortify.cpt <- function(model, data = NULL,","object_name_linter" -"R/fortify_changepoint.R",56,1,"style","Variable and function name style should be snake_case.","fortify.breakpoints <- fortify.cpt","object_name_linter" -"R/fortify_changepoint.R",59,1,"style","Variable and function name style should be snake_case.","fortify.breakpointsfull <- fortify.cpt","object_name_linter" -"R/fortify_changepoint.R",111,1,"style","Variable and function name style should be snake_case.","autoplot.breakpoints <- function(object, data = NULL,","object_name_linter" -"R/fortify_changepoint.R",129,1,"style","Variable and function name style should be snake_case.","fortify.breakpointsfull <- fortify.breakpoints","object_name_linter" -"R/fortify_cluster.R",13,1,"style","Variable and function name style should be snake_case.","fortify.kmeans <- function(model, data = NULL, ...) {","object_name_linter" -"R/fortify_cluster.R",43,1,"style","Variable and function name style should be snake_case.","autoplot.kmeans <- function(object, data = NULL,","object_name_linter" -"R/fortify_cluster.R",67,1,"style","Variable and function name style should be snake_case.","fortify.partition <- fortify.kmeans","object_name_linter" -"R/fortify_cluster.R",70,1,"style","Variable and function name style should be snake_case.","fortify.clara <- fortify.partition","object_name_linter" -"R/fortify_cluster.R",73,1,"style","Variable and function name style should be snake_case.","fortify.fanny <- fortify.partition","object_name_linter" -"R/fortify_cluster.R",76,1,"style","Variable and function name style should be snake_case.","fortify.pam <- fortify.partition","object_name_linter" -"R/fortify_cluster.R",79,1,"style","Variable and function name style should be snake_case.","autoplot.partition <- autoplot.kmeans","object_name_linter" -"R/fortify_cluster.R",82,1,"style","Variable and function name style should be snake_case.","autoplot.clara <- autoplot.partition","object_name_linter" -"R/fortify_cluster.R",85,1,"style","Variable and function name style should be snake_case.","autoplot.fanny <- autoplot.partition","object_name_linter" -"R/fortify_cluster.R",88,1,"style","Variable and function name style should be snake_case.","autoplot.pam <- autoplot.partition","object_name_linter" -"R/fortify_cluster.R",103,1,"style","Variable and function name style should be snake_case.","fortify.silhouette <- function(model, data = NULL, ...) {","object_name_linter" -"R/fortify_cluster.R",138,1,"style","Variable and function name style should be snake_case.","autoplot.silhouette <- function(object, colour = ""red"",","object_name_linter" -"R/fortify_forecast.R",18,14,"style","Variable and function name style should be snake_case."," forecasted$Index <- get.dtindex(model$mean, is.date = is.date)","object_name_linter" -"R/fortify_forecast.R",96,1,"style","Variable and function name style should be snake_case.","fortify.ets <- function(model, data = NULL, ...) {","object_name_linter" -"R/fortify_forecast.R",144,1,"style","Variable and function name style should be snake_case.","fortify.bats <- fortify.ets","object_name_linter" -"R/fortify_forecast.R",147,1,"style","Variable and function name style should be snake_case.","autoplot.ets <- autoplot.ts","object_name_linter" -"R/fortify_forecast.R",150,1,"style","Variable and function name style should be snake_case.","autoplot.bats <- autoplot.ts","object_name_linter" -"R/fortify_glmnet.R",9,1,"style","Variable and function name style should be snake_case.","fortify.glmnet <- function(model, data = NULL, ...) {","object_name_linter" -"R/fortify_glmnet.R",95,1,"style","Variable and function name style should be snake_case.","fortify.cv.glmnet <- function(model, data = NULL, ...) {","object_name_linter" -"R/fortify_MSwM.R",15,1,"style","Variable and function name style should be snake_case.","fortify.MSM.lm <- function(model, data = NULL, melt = FALSE, ...) {","object_name_linter" -"R/fortify_MSwM.R",28,10,"style","Variable and function name style should be snake_case."," md$Index <- factor(md$Index, levels = idx)","object_name_linter" -"R/fortify_MSwM.R",29,10,"style","Variable and function name style should be snake_case."," md$Model <- rep(k, nrow(md))","object_name_linter" -"R/fortify_MSwM.R",30,10,"style","Variable and function name style should be snake_case."," md$ProbableModel <- probable","object_name_linter" -"R/fortify_MSwM.R",34,7,"style","Variable and function name style should be snake_case."," d$Model <- as.factor(d$Model)","object_name_linter" -"R/fortify_performance.R",7,1,"style","Variable and function name style should be snake_case.","fortify.performance <- function(model, data = NULL, ...) {","object_name_linter" -"R/fortify_performance.R",60,1,"style","Variable and function name style should be snake_case.","autoplot.performance <- function(object, p = NULL,","object_name_linter" -"R/fortify_raster.R",9,1,"style","Variable and function name style should be snake_case.","fortify.RasterCommon <- function(model, data = NULL, maxpixels = 100000,","object_name_linter" -"R/fortify_raster.R",49,1,"style","Variable and function name style should be snake_case.","fortify.RasterLayer <- fortify.RasterCommon","object_name_linter" -"R/fortify_raster.R",52,1,"style","Variable and function name style should be snake_case.","fortify.RasterBrick <- fortify.RasterCommon","object_name_linter" -"R/fortify_raster.R",55,1,"style","Variable and function name style should be snake_case.","fortify.RasterStack <- fortify.RasterCommon","object_name_linter" -"R/fortify_raster.R",95,1,"style","Variable and function name style should be snake_case.","autoplot.RasterLayer <- autoplot.RasterCommon","object_name_linter" -"R/fortify_raster.R",98,1,"style","Variable and function name style should be snake_case.","autoplot.RasterBrick <- autoplot.RasterCommon","object_name_linter" -"R/fortify_raster.R",101,1,"style","Variable and function name style should be snake_case.","autoplot.RasterStack <- autoplot.RasterCommon","object_name_linter" -"R/fortify_spatial.R",8,1,"style","Variable and function name style should be snake_case.","fortify.SpatialCommon <- function(model, data = NULL,","object_name_linter" -"R/fortify_spatial.R",39,1,"style","Variable and function name style should be snake_case.","fortify.SpatialPoints <- fortify.SpatialCommon","object_name_linter" -"R/fortify_spatial.R",42,1,"style","Variable and function name style should be snake_case.","fortify.SpatialPointsDataFrame <- fortify.SpatialCommon","object_name_linter" -"R/fortify_spatial.R",45,1,"style","Variable and function name style should be snake_case.","fortify.SpatialLines <- fortify.SpatialCommon","object_name_linter" -"R/fortify_spatial.R",135,1,"style","Variable and function names should not be longer than 30 characters.","autoplot.SpatialPointsDataFrame <- autoplot.SpatialCommon","object_length_linter" -"R/fortify_spatial.R",135,1,"style","Variable and function name style should be snake_case.","autoplot.SpatialPointsDataFrame <- autoplot.SpatialCommon","object_name_linter" -"R/fortify_spatial.R",138,1,"style","Variable and function name style should be snake_case.","autoplot.SpatialPoints <- autoplot.SpatialCommon","object_name_linter" -"R/fortify_spatial.R",141,1,"style","Variable and function name style should be snake_case.","autoplot.Line <- autoplot.SpatialCommon","object_name_linter" -"R/fortify_spatial.R",144,1,"style","Variable and function name style should be snake_case.","autoplot.Lines <- autoplot.SpatialCommon","object_name_linter" -"R/fortify_spatial.R",147,1,"style","Variable and function name style should be snake_case.","autoplot.SpatialLines <- autoplot.SpatialCommon","object_name_linter" -"R/fortify_spatial.R",150,1,"style","Variable and function name style should be snake_case.","autoplot.SpatialLinesDataFrame <- autoplot.SpatialCommon","object_name_linter" -"R/fortify_spatial.R",153,1,"style","Variable and function name style should be snake_case.","autoplot.Polygon <- autoplot.SpatialCommon","object_name_linter" -"R/fortify_spatial.R",156,1,"style","Variable and function name style should be snake_case.","autoplot.Polygons <- autoplot.SpatialCommon","object_name_linter" -"R/fortify_spatial.R",159,1,"style","Variable and function name style should be snake_case.","autoplot.SpatialPolygons <- autoplot.SpatialCommon","object_name_linter" -"R/fortify_spatial.R",162,1,"style","Variable and function names should not be longer than 30 characters.","autoplot.SpatialPolygonsDataFrame <- autoplot.SpatialCommon","object_length_linter" -"R/fortify_spatial.R",162,1,"style","Variable and function name style should be snake_case.","autoplot.SpatialPolygonsDataFrame <- autoplot.SpatialCommon","object_name_linter" -"R/fortify_stats_density.R",9,1,"style","Variable and function name style should be snake_case.","fortify.density <- function(model, data = NULL, ...) {","object_name_linter" -"R/fortify_stats_lm.R",335,1,"style","Variable and function name style should be snake_case.","autoplot.glm <- autoplot.lm","object_name_linter" -"R/fortify_stats.R",2,1,"style","Variable and function name style should be snake_case.","fortify.stl <- fortify.ts","object_name_linter" -"R/fortify_stats.R",5,1,"style","Variable and function name style should be snake_case.","fortify.decomposed.ts <- fortify.ts","object_name_linter" -"R/fortify_stats.R",8,1,"style","Variable and function name style should be snake_case.","autoplot.stl <- autoplot.ts","object_name_linter" -"R/fortify_stats.R",11,1,"style","Variable and function name style should be snake_case.","autoplot.decomposed.ts <- autoplot.ts","object_name_linter" -"R/fortify_stats.R",28,1,"style","Variable and function name style should be snake_case.","fortify.acf <- function(model, data = NULL,","object_name_linter" -"R/fortify_stats.R",57,1,"style","Variable and function name style should be snake_case.","autoplot.acf <- function(object,","object_name_linter" -"R/fortify_stats.R",98,1,"style","Variable and function name style should be snake_case.","fortify.spec <- function(model, data = NULL, ...) {","object_name_linter" -"R/fortify_stats.R",114,1,"style","Variable and function name style should be snake_case.","autoplot.spec <- function(object,","object_name_linter" -"R/fortify_stats.R",140,1,"style","Variable and function name style should be snake_case.","fortify.prcomp <- function(model, data = NULL, ...) {","object_name_linter" -"R/fortify_stats.R",160,1,"style","Variable and function name style should be snake_case.","fortify.princomp <- fortify.prcomp","object_name_linter" -"R/fortify_stats.R",172,1,"style","Variable and function name style should be snake_case.","fortify.factanal <- function(model, data = NULL, ...) {","object_name_linter" -"R/fortify_stats.R",194,1,"style","Variable and function name style should be snake_case.","fortify.lfda <- function(model, data = NULL, ...) {","object_name_linter" -"R/fortify_stats.R",252,1,"style","Variable and function name style should be snake_case.","autoplot.pca_common <- function(object, data = NULL,","object_name_linter" -"R/fortify_stats.R",345,1,"style","Variable and function name style should be snake_case.","autoplot.prcomp <- autoplot.pca_common","object_name_linter" -"R/fortify_stats.R",348,1,"style","Variable and function name style should be snake_case.","autoplot.princomp <- autoplot.pca_common","object_name_linter" -"R/fortify_stats.R",351,1,"style","Variable and function name style should be snake_case.","autoplot.factanal <- autoplot.pca_common","object_name_linter" -"R/fortify_stats.R",354,1,"style","Variable and function name style should be snake_case.","autoplot.lfda <- autoplot.pca_common","object_name_linter" -"R/fortify_stats.R",365,1,"style","Variable and function name style should be snake_case.","fortify.dist <- function(model, data = NULL, ...) {","object_name_linter" -"R/fortify_stats.R",371,1,"style","Variable and function name style should be snake_case.","autoplot.dist <- autoplot.matrix","object_name_linter" -"R/fortify_stats.R",385,1,"style","Variable and function name style should be snake_case.","fortify.stepfun <- function(model, data, ...) {","object_name_linter" -"R/fortify_stats.R",418,1,"style","Variable and function name style should be snake_case.","autoplot.stepfun <- function(object,","object_name_linter" -"R/fortify_surv.R",282,1,"style","Variable and function name style should be snake_case.","fortify.aareg <- function(model, data = NULL,","object_name_linter" -"R/fortify_vars.R",26,21,"style","There should be a space between right parenthesis and an opening curly brace."," for (col in cols){","paren_brace_linter" -"R/fortify_vars.R",28,12,"style","Variable and function name style should be snake_case."," pred$Index <- dtindex.cont","object_name_linter" -"R/fortify_vars.R",37,21,"style","There should be a space between right parenthesis and an opening curly brace."," for (col in cols){","paren_brace_linter" -"R/fortify_vars.R",41,10,"style","Variable and function name style should be snake_case."," pred$Index <- dtindex.cont","object_name_linter" -"R/plotlib.R",457,1,"style","Variable and function name style should be snake_case.","autoplot.ggplot <- function(object, ...) {","object_name_linter" -"R/plotlib.R",468,1,"style","Variable and function name style should be snake_case.","autoplot.ggmultiplot <- function(object, ...) {","object_name_linter" -"R/tslib.R",130,3,"style","Variable and function name style should be snake_case."," with.ci.ma <- with.ci && ci.type == ""ma"" && x$type == ""correlation""","object_name_linter" -"R/tslib.R",134,5,"style","Variable and function name style should be snake_case."," with.ci.ma <- FALSE","object_name_linter" -"tests/testthat/test-raster.R",35,7,"style","Variable and function name style should be snake_case."," exp$layer.2 <- exp$layer","object_name_linter" diff --git a/.dev/revdep_emails/ggfortify/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/ggfortify/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 89239abb7..000000000 --- a/.dev/revdep_emails/ggfortify/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,190 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/base_fortify_list.R",54,25,"style","Any function spanning multiple lines should use curly braces."," p <- lapply(object, function(x) autoplot(x, data = data, nrow = nrow,","brace_linter" -"R/fortify_basis.R",25,13,"style","Variable and function name style should be snake_case or symbols."," attr(x, ""basis.class"") <- attr(x, ""class"")","object_name_linter" -"R/fortify_basis.R",87,5,"style","Variable and function name style should be snake_case or symbols."," all.knots <- c(attr(object, ""Boundary.knots""),","object_name_linter" -"R/fortify_glmnet.R",69,3,"style","Variable and function name style should be snake_case or symbols."," label.data$label_y <- rep(max(plot.data$value), nrow(label.data))","object_name_linter" -"R/fortify_glmnet.R",115,33,"style","Variable and function name style should be snake_case or symbols."," sign.lambda = 1,","object_name_linter" -"R/fortify_stats_lm.R",150,15,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (label & label.n > 0) {","vector_logic_linter" -"R/fortify_stats.R",283,5,"style","Either both or neither branch in `if`/`else` should use curly braces."," if (is.null(attr(object, ""covariance""))) {","brace_linter" -"R/fortify_stats.R",319,5,"style","Variable and function name style should be snake_case or symbols."," loadings.data$rownames <- rownames(loadings.data)","object_name_linter" -"R/fortify_stats.R",328,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(ve) | !variance_percentage) {","vector_logic_linter" -"R/fortify_stats.R",433,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nrow(plot.data) >= 3 & !is.null(shape)) {","vector_logic_linter" -"R/fortify_surv.R",99,5,"style","`else` should come on the same line as the previous `}`."," else if (!is.function(fun)) {","brace_linter" -"R/fortify_surv.R",233,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (missing(conf.int.fill) & !is.null(surv.colour)) {","vector_logic_linter" -"R/plotlib.R",350,1,"style","Variable and function name style should be snake_case or symbols.","get.layout <- function(nplots, ncol, nrow) {","object_name_linter" -"R/plotlib.R",592,5,"style","Variable and function name style should be snake_case or symbols."," loadings.data[, 1L:2L] <- loadings.data[, 1L:2L] * scaler * 0.8","object_name_linter" -"R/tslib.R",224,3,"style","Either both or neither branch in `if`/`else` should use curly braces."," if (length(x) %% 2 == 0) {","brace_linter" -"R/tslib.R",229,3,"style","`else` should come on the same line as the previous `}`."," else y <- y[seq_along(x)]","brace_linter" -"tests/testthat/test-stats-lm.R",563,31,"style","Put spaces around all infix operators."," p <- autoplot(lm(Petal.Width~Petal.Length, data = iris), size = 5)","infix_spaces_linter" -"tests/testthat/test-surv.R",166,45,"style","Use TRUE instead of the symbol T."," fortified <- fortify(fit, surv.connect = T)","T_and_F_symbol_linter" -"vignettes/basics.Rmd",8,25,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/basics-', warning=FALSE)","infix_spaces_linter" -"vignettes/basics.Rmd",8,39,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/basics-', warning=FALSE)","infix_spaces_linter" -"vignettes/basics.Rmd",8,51,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/basics-', warning=FALSE)","infix_spaces_linter" -"vignettes/basics.Rmd",8,52,"style","Only use double-quotes.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/basics-', warning=FALSE)","single_quotes_linter" -"vignettes/basics.Rmd",8,78,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/basics-', warning=FALSE)","infix_spaces_linter" -"vignettes/basics.Rmd",8,81,"style","Lines should not be more than 80 characters.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/basics-', warning=FALSE)","line_length_linter" -"vignettes/basics.Rmd",32,37,"style","Only use double-quotes.","autoplot(AirPassengers, ts.colour = 'blue')","single_quotes_linter" -"vignettes/basics.Rmd",46,13,"style","Only use double-quotes.","p + ggtitle('AirPassengers') + xlab('Year') + ylab('Passengers')","single_quotes_linter" -"vignettes/basics.Rmd",46,37,"style","Only use double-quotes.","p + ggtitle('AirPassengers') + xlab('Year') + ylab('Passengers')","single_quotes_linter" -"vignettes/basics.Rmd",46,52,"style","Only use double-quotes.","p + ggtitle('AirPassengers') + xlab('Year') + ylab('Passengers')","single_quotes_linter" -"vignettes/basics.Rmd",50,49,"style","Trailing whitespace is superfluous.","# these common options are supported as keywords ","trailing_whitespace_linter" -"vignettes/basics.Rmd",51,33,"style","Only use double-quotes.","autoplot(AirPassengers, title = 'AirPassengers', xlab = 'Year', ylab = 'Passengers')","single_quotes_linter" -"vignettes/basics.Rmd",51,57,"style","Only use double-quotes.","autoplot(AirPassengers, title = 'AirPassengers', xlab = 'Year', ylab = 'Passengers')","single_quotes_linter" -"vignettes/basics.Rmd",51,72,"style","Only use double-quotes.","autoplot(AirPassengers, title = 'AirPassengers', xlab = 'Year', ylab = 'Passengers')","single_quotes_linter" -"vignettes/basics.Rmd",51,81,"style","Lines should not be more than 80 characters.","autoplot(AirPassengers, title = 'AirPassengers', xlab = 'Year', ylab = 'Passengers')","line_length_linter" -"vignettes/basics.Rmd",74,17,"style","Put spaces around all infix operators.","ggplot(df, aes(x= cluster, fill = cluster)) + geom_bar()","infix_spaces_linter" -"vignettes/basics.Rmd",82,40,"style","Trailing whitespace is superfluous.","res <- lm(Volume ~ Girth, data = trees) ","trailing_whitespace_linter" -"vignettes/basics.Rmd",155,5,"style","Only use double-quotes.","new('ggmultiplot', plots = list(p1, p2))","single_quotes_linter" -"vignettes/basics.Rmd",161,5,"style","Only use double-quotes.","new('ggmultiplot', plots = list(p1, p2), ncol = 1)","single_quotes_linter" -"vignettes/plot_dist.Rmd",8,25,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/dist-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_dist.Rmd",8,39,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/dist-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_dist.Rmd",8,51,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/dist-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_dist.Rmd",8,52,"style","Only use double-quotes.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/dist-', warning=FALSE)","single_quotes_linter" -"vignettes/plot_dist.Rmd",8,76,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/dist-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_dist.Rmd",8,81,"style","Lines should not be more than 80 characters.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/dist-', warning=FALSE)","line_length_linter" -"vignettes/plot_dist.Rmd",27,67,"style","Only use double-quotes.","ggdistribution(pnorm, seq(-3, 3, 0.1), mean = 0, sd = 1, colour = 'red')","single_quotes_linter" -"vignettes/plot_dist.Rmd",28,54,"style","Only use double-quotes.","ggdistribution(dpois, seq(0, 20), lambda = 9, fill = 'blue')","single_quotes_linter" -"vignettes/plot_dist.Rmd",34,63,"style","Only use double-quotes.","p <- ggdistribution(dchisq, seq(0, 20, 0.1), df = 7, colour = 'blue')","single_quotes_linter" -"vignettes/plot_dist.Rmd",35,63,"style","Only use double-quotes.","p <- ggdistribution(dchisq, seq(0, 20, 0.1), df = 9, colour = 'green', p = p)","single_quotes_linter" -"vignettes/plot_dist.Rmd",36,59,"style","Only use double-quotes.","ggdistribution(dchisq, seq(0, 20, 0.1), df = 11, colour = 'red', p = p)","single_quotes_linter" -"vignettes/plot_dist.Rmd",44,39,"style","Only use double-quotes.","autoplot(density(rnorm(1:50)), fill = 'green')","single_quotes_linter" -"vignettes/plot_lm.Rmd",8,25,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=8, fig.height=6, fig.path='figures/lm-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_lm.Rmd",8,39,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=8, fig.height=6, fig.path='figures/lm-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_lm.Rmd",8,51,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=8, fig.height=6, fig.path='figures/lm-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_lm.Rmd",8,52,"style","Only use double-quotes.","opts_chunk$set(fig.width=8, fig.height=6, fig.path='figures/lm-', warning=FALSE)","single_quotes_linter" -"vignettes/plot_lm.Rmd",8,74,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=8, fig.height=6, fig.path='figures/lm-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_lm.Rmd",57,35,"style","Only use double-quotes.","autoplot(m, which = 1:6, colour = 'dodgerblue3',","single_quotes_linter" -"vignettes/plot_lm.Rmd",58,26,"style","Only use double-quotes."," smooth.colour = 'black', smooth.linetype = 'dashed',","single_quotes_linter" -"vignettes/plot_lm.Rmd",58,53,"style","Only use double-quotes."," smooth.colour = 'black', smooth.linetype = 'dashed',","single_quotes_linter" -"vignettes/plot_lm.Rmd",59,22,"style","Only use double-quotes."," ad.colour = 'blue',","single_quotes_linter" -"vignettes/plot_lm.Rmd",60,54,"style","Only use double-quotes."," label.size = 3, label.n = 5, label.colour = 'blue',","single_quotes_linter" -"vignettes/plot_lm.Rmd",68,19,"style","Only use double-quotes."," colour = 'Species', label.size = 3)","single_quotes_linter" -"vignettes/plot_lm.Rmd",83,24,"style","Only use double-quotes.","autoplot(fit, colour = 'blue')","single_quotes_linter" -"vignettes/plot_map.Rmd",8,25,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=3, fig.height=3, fig.path='figures/map-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_map.Rmd",8,39,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=3, fig.height=3, fig.path='figures/map-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_map.Rmd",8,51,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=3, fig.height=3, fig.path='figures/map-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_map.Rmd",8,52,"style","Only use double-quotes.","opts_chunk$set(fig.width=3, fig.height=3, fig.path='figures/map-', warning=FALSE)","single_quotes_linter" -"vignettes/plot_map.Rmd",8,75,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=3, fig.height=3, fig.path='figures/map-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_map.Rmd",8,81,"style","Lines should not be more than 80 characters.","opts_chunk$set(fig.width=3, fig.height=3, fig.path='figures/map-', warning=FALSE)","line_length_linter" -"vignettes/plot_map.Rmd",21,25,"style","Only use double-quotes.","jp <- ggplot2::map_data('world2', 'japan')","single_quotes_linter" -"vignettes/plot_map.Rmd",21,35,"style","Only use double-quotes.","jp <- ggplot2::map_data('world2', 'japan')","single_quotes_linter" -"vignettes/plot_map.Rmd",32,12,"style","Only use double-quotes.","jp <- map('world2', 'japan', plot = FALSE, fill = TRUE)","single_quotes_linter" -"vignettes/plot_map.Rmd",32,22,"style","Only use double-quotes.","jp <- map('world2', 'japan', plot = FALSE, fill = TRUE)","single_quotes_linter" -"vignettes/plot_map.Rmd",36,26,"style","Only use double-quotes.","p <- autoplot(jp, geom = 'polygon', fill = 'subregion') + ","single_quotes_linter" -"vignettes/plot_map.Rmd",36,44,"style","Only use double-quotes.","p <- autoplot(jp, geom = 'polygon', fill = 'subregion') + ","single_quotes_linter" -"vignettes/plot_map.Rmd",36,58,"style","Trailing whitespace is superfluous.","p <- autoplot(jp, geom = 'polygon', fill = 'subregion') + ","trailing_whitespace_linter" -"vignettes/plot_map.Rmd",37,24,"style","Put spaces around all infix operators."," theme(legend.position=""none"")","infix_spaces_linter" -"vignettes/plot_map.Rmd",44,15,"style","Only use double-quotes.","cities <- get('world.cities')","single_quotes_linter" -"vignettes/plot_map.Rmd",45,40,"style","Only use double-quotes.","cities <- cities[cities$country.etc == 'Japan', ]","single_quotes_linter" -"vignettes/plot_map.Rmd",49,25,"style","Only use double-quotes."," colour = 'blue', size = 0.1)","single_quotes_linter" -"vignettes/plot_map.Rmd",55,40,"style","Only use double-quotes.","p + geom_point(data = cities, colour = 'blue', size = 0.1)","single_quotes_linter" -"vignettes/plot_map.Rmd",81,28,"style","Only use double-quotes."," label = c('Tokyo', 'Osaka'),","single_quotes_linter" -"vignettes/plot_map.Rmd",81,37,"style","Only use double-quotes."," label = c('Tokyo', 'Osaka'),","single_quotes_linter" -"vignettes/plot_map.Rmd",85,30,"style","Only use double-quotes.","autoplot(df, p = p, colour = 'red', size = 10)","single_quotes_linter" -"vignettes/plot_map.Rmd",91,30,"style","Only use double-quotes.","autoplot(df, p = p, colour = 'red', size = 'population') +","single_quotes_linter" -"vignettes/plot_map.Rmd",91,44,"style","Only use double-quotes.","autoplot(df, p = p, colour = 'red', size = 'population') +","single_quotes_linter" -"vignettes/plot_map.Rmd",104,30,"style","Only use double-quotes.","autoplot(df, p = p, colour = 'red', size = 'population') + ","single_quotes_linter" -"vignettes/plot_map.Rmd",104,44,"style","Only use double-quotes.","autoplot(df, p = p, colour = 'red', size = 'population') + ","single_quotes_linter" -"vignettes/plot_map.Rmd",104,59,"style","Trailing whitespace is superfluous.","autoplot(df, p = p, colour = 'red', size = 'population') + ","trailing_whitespace_linter" -"vignettes/plot_pca.Rmd",8,25,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/pca-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_pca.Rmd",8,39,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/pca-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_pca.Rmd",8,51,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/pca-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_pca.Rmd",8,52,"style","Only use double-quotes.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/pca-', warning=FALSE)","single_quotes_linter" -"vignettes/plot_pca.Rmd",8,75,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/pca-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_pca.Rmd",8,81,"style","Lines should not be more than 80 characters.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/pca-', warning=FALSE)","line_length_linter" -"vignettes/plot_pca.Rmd",28,41,"style","Only use double-quotes.","autoplot(pca_res, data = iris, colour = 'Species')","single_quotes_linter" -"vignettes/plot_pca.Rmd",34,41,"style","Only use double-quotes.","autoplot(pca_res, data = iris, colour = 'Species', label = TRUE, label.size = 3)","single_quotes_linter" -"vignettes/plot_pca.Rmd",40,41,"style","Only use double-quotes.","autoplot(pca_res, data = iris, colour = 'Species', shape = FALSE, label.size = 3)","single_quotes_linter" -"vignettes/plot_pca.Rmd",40,81,"style","Lines should not be more than 80 characters.","autoplot(pca_res, data = iris, colour = 'Species', shape = FALSE, label.size = 3)","line_length_linter" -"vignettes/plot_pca.Rmd",46,41,"style","Only use double-quotes.","autoplot(pca_res, data = iris, colour = 'Species', loadings = TRUE)","single_quotes_linter" -"vignettes/plot_pca.Rmd",52,41,"style","Only use double-quotes.","autoplot(pca_res, data = iris, colour = 'Species',","single_quotes_linter" -"vignettes/plot_pca.Rmd",53,45,"style","Only use double-quotes."," loadings = TRUE, loadings.colour = 'blue',","single_quotes_linter" -"vignettes/plot_pca.Rmd",70,1,"style","Variable and function name style should be snake_case or symbols.","d.factanal <- factanal(state.x77, factors = 3, scores = 'regression')","object_name_linter" -"vignettes/plot_pca.Rmd",70,57,"style","Only use double-quotes.","d.factanal <- factanal(state.x77, factors = 3, scores = 'regression')","single_quotes_linter" -"vignettes/plot_pca.Rmd",71,49,"style","Only use double-quotes.","autoplot(d.factanal, data = state.x77, colour = 'Income')","single_quotes_linter" -"vignettes/plot_pca.Rmd",106,55,"style","Only use double-quotes.","autoplot(pam(iris[-5], 3), frame = TRUE, frame.type = 'norm')","single_quotes_linter" -"vignettes/plot_pca.Rmd",128,49,"style","Put spaces around all infix operators.","model <- lfda(iris[-5], iris[, 5], r = 3, metric=""plain"")","infix_spaces_linter" -"vignettes/plot_pca.Rmd",129,59,"style","Only use double-quotes.","autoplot(model, data = iris, frame = TRUE, frame.colour = 'Species')","single_quotes_linter" -"vignettes/plot_pca.Rmd",134,61,"style","Put spaces around all infix operators.","model <- self(iris[-5], iris[, 5], beta = 0.1, r = 3, metric=""plain"")","infix_spaces_linter" -"vignettes/plot_pca.Rmd",135,59,"style","Only use double-quotes.","autoplot(model, data = iris, frame = TRUE, frame.colour = 'Species')","single_quotes_linter" -"vignettes/plot_pca.Rmd",175,37,"style","Only use double-quotes.","autoplot(isoMDS(eurodist), colour = 'orange', size = 4, shape = 3)","single_quotes_linter" -"vignettes/plot_pca.Rmd",181,58,"style","Only use double-quotes.","autoplot(sammon(eurodist), shape = FALSE, label.colour = 'blue', label.size = 3)","single_quotes_linter" -"vignettes/plot_surv.Rmd",8,25,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/surv-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_surv.Rmd",8,39,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/surv-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_surv.Rmd",8,51,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/surv-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_surv.Rmd",8,52,"style","Only use double-quotes.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/surv-', warning=FALSE)","single_quotes_linter" -"vignettes/plot_surv.Rmd",8,76,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/surv-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_surv.Rmd",8,81,"style","Lines should not be more than 80 characters.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/surv-', warning=FALSE)","line_length_linter" -"vignettes/plot_surv.Rmd",27,31,"style","Only use double-quotes.","autoplot(fit, surv.linetype = 'dashed', conf.int = FALSE,","single_quotes_linter" -"vignettes/plot_surv.Rmd",28,25,"style","Only use double-quotes."," censor.shape = '*', censor.size = 5, facets = TRUE, ncol = 2)","single_quotes_linter" -"vignettes/plot_surv.Rmd",30,70,"style","Only use double-quotes.","autoplot(survfit(Surv(time, status) ~ 1, data = lung), surv.colour = 'orange', censor.colour = 'red')","single_quotes_linter" -"vignettes/plot_surv.Rmd",30,81,"style","Lines should not be more than 80 characters.","autoplot(survfit(Surv(time, status) ~ 1, data = lung), surv.colour = 'orange', censor.colour = 'red')","line_length_linter" -"vignettes/plot_surv.Rmd",30,96,"style","Only use double-quotes.","autoplot(survfit(Surv(time, status) ~ 1, data = lung), surv.colour = 'orange', censor.colour = 'red')","single_quotes_linter" -"vignettes/plot_surv.Rmd",32,64,"style","Only use double-quotes.","autoplot(survfit(Surv(time, status) ~ sex, data = lung), fun = 'event')","single_quotes_linter" -"vignettes/plot_surv.Rmd",34,1,"style","Variable and function name style should be snake_case or symbols.","d.coxph <- survfit(coxph(Surv(time, status) ~ sex, data = lung))","object_name_linter" -"vignettes/plot_surv.Rmd",35,35,"style","Only use double-quotes.","autoplot(d.coxph, surv.linetype = 'dashed', surv.colour = 'blue',","single_quotes_linter" -"vignettes/plot_surv.Rmd",35,59,"style","Only use double-quotes.","autoplot(d.coxph, surv.linetype = 'dashed', surv.colour = 'blue',","single_quotes_linter" -"vignettes/plot_surv.Rmd",36,26,"style","Only use double-quotes."," conf.int.fill = 'dodgerblue3', conf.int.alpha = 0.5, censor = FALSE)","single_quotes_linter" -"vignettes/plot_ts.Rmd",8,25,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/ts-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_ts.Rmd",8,39,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/ts-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_ts.Rmd",8,51,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/ts-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_ts.Rmd",8,52,"style","Only use double-quotes.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/ts-', warning=FALSE)","single_quotes_linter" -"vignettes/plot_ts.Rmd",8,74,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/ts-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_ts.Rmd",25,37,"style","Only use double-quotes.","autoplot(AirPassengers, ts.colour = 'red', ts.linetype = 'dashed')","single_quotes_linter" -"vignettes/plot_ts.Rmd",25,58,"style","Only use double-quotes.","autoplot(AirPassengers, ts.colour = 'red', ts.linetype = 'dashed')","single_quotes_linter" -"vignettes/plot_ts.Rmd",51,45,"style","Only use double-quotes.","autoplot(as.xts(AirPassengers), ts.colour = 'green')","single_quotes_linter" -"vignettes/plot_ts.Rmd",54,53,"style","Only use double-quotes.","autoplot(as.timeSeries(AirPassengers), ts.colour = ('dodgerblue3'))","single_quotes_linter" -"vignettes/plot_ts.Rmd",62,35,"style","Only use double-quotes.","autoplot(AirPassengers, ts.geom = 'bar', fill = 'blue')","single_quotes_linter" -"vignettes/plot_ts.Rmd",62,49,"style","Only use double-quotes.","autoplot(AirPassengers, ts.geom = 'bar', fill = 'blue')","single_quotes_linter" -"vignettes/plot_ts.Rmd",66,35,"style","Only use double-quotes.","autoplot(AirPassengers, ts.geom = 'ribbon', fill = 'green')","single_quotes_linter" -"vignettes/plot_ts.Rmd",66,52,"style","Only use double-quotes.","autoplot(AirPassengers, ts.geom = 'ribbon', fill = 'green')","single_quotes_linter" -"vignettes/plot_ts.Rmd",70,35,"style","Only use double-quotes.","autoplot(AirPassengers, ts.geom = 'point', shape = 3)","single_quotes_linter" -"vignettes/plot_ts.Rmd",76,81,"style","Lines should not be more than 80 characters.","mts <- ts(data.frame(a = c(1, 2, 3, 4, 4, 3), b = c(3, 2, 3, 2, 2, 1)), start = 2010)","line_length_linter" -"vignettes/plot_ts.Rmd",77,25,"style","Only use double-quotes.","autoplot(mts, ts.geom = 'bar', facets = FALSE)","single_quotes_linter" -"vignettes/plot_ts.Rmd",81,25,"style","Only use double-quotes.","autoplot(mts, ts.geom = 'bar', facets = FALSE, stacked = TRUE)","single_quotes_linter" -"vignettes/plot_ts.Rmd",85,25,"style","Only use double-quotes.","autoplot(mts, ts.geom = 'ribbon', facets = FALSE)","single_quotes_linter" -"vignettes/plot_ts.Rmd",89,25,"style","Only use double-quotes.","autoplot(mts, ts.geom = 'ribbon', facets = FALSE, stacked = TRUE)","single_quotes_linter" -"vignettes/plot_ts.Rmd",98,1,"style","Variable and function name style should be snake_case or symbols.","d.arima <- auto.arima(AirPassengers)","object_name_linter" -"vignettes/plot_ts.Rmd",99,1,"style","Variable and function name style should be snake_case or symbols.","d.forecast <- forecast(d.arima, level = c(95), h = 50)","object_name_linter" -"vignettes/plot_ts.Rmd",106,34,"style","Only use double-quotes.","autoplot(d.forecast, ts.colour = 'firebrick1', predict.colour = 'red',","single_quotes_linter" -"vignettes/plot_ts.Rmd",106,65,"style","Only use double-quotes.","autoplot(d.forecast, ts.colour = 'firebrick1', predict.colour = 'red',","single_quotes_linter" -"vignettes/plot_ts.Rmd",107,29,"style","Only use double-quotes."," predict.linetype = 'dashed', conf.int = FALSE)","single_quotes_linter" -"vignettes/plot_ts.Rmd",116,1,"style","Variable and function name style should be snake_case or symbols.","d.vselect <- VARselect(Canada, lag.max = 5, type = 'const')$selection[1]","object_name_linter" -"vignettes/plot_ts.Rmd",116,52,"style","Only use double-quotes.","d.vselect <- VARselect(Canada, lag.max = 5, type = 'const')$selection[1]","single_quotes_linter" -"vignettes/plot_ts.Rmd",117,1,"style","Variable and function name style should be snake_case or symbols.","d.var <- VAR(Canada, p = d.vselect, type = 'const')","object_name_linter" -"vignettes/plot_ts.Rmd",117,44,"style","Only use double-quotes.","d.var <- VAR(Canada, p = d.vselect, type = 'const')","single_quotes_linter" -"vignettes/plot_ts.Rmd",123,52,"style","Only use double-quotes.","autoplot(predict(d.var, n.ahead = 50), ts.colour = 'dodgerblue4',","single_quotes_linter" -"vignettes/plot_ts.Rmd",124,27,"style","Only use double-quotes."," predict.colour = 'blue', predict.linetype = 'dashed')","single_quotes_linter" -"vignettes/plot_ts.Rmd",124,54,"style","Only use double-quotes."," predict.colour = 'blue', predict.linetype = 'dashed')","single_quotes_linter" -"vignettes/plot_ts.Rmd",139,51,"style","Only use double-quotes.","autoplot(cpt.meanvar(AirPassengers), cpt.colour = 'blue', cpt.linetype = 'solid')","single_quotes_linter" -"vignettes/plot_ts.Rmd",139,74,"style","Only use double-quotes.","autoplot(cpt.meanvar(AirPassengers), cpt.colour = 'blue', cpt.linetype = 'solid')","single_quotes_linter" -"vignettes/plot_ts.Rmd",139,81,"style","Lines should not be more than 80 characters.","autoplot(cpt.meanvar(AirPassengers), cpt.colour = 'blue', cpt.linetype = 'solid')","line_length_linter" -"vignettes/plot_ts.Rmd",149,45,"style","Only use double-quotes.","autoplot(breakpoints(Nile ~ 1), ts.colour = 'blue', ts.linetype = 'dashed',","single_quotes_linter" -"vignettes/plot_ts.Rmd",149,67,"style","Only use double-quotes.","autoplot(breakpoints(Nile ~ 1), ts.colour = 'blue', ts.linetype = 'dashed',","single_quotes_linter" -"vignettes/plot_ts.Rmd",150,23,"style","Only use double-quotes."," cpt.colour = 'dodgerblue3', cpt.linetype = 'solid')","single_quotes_linter" -"vignettes/plot_ts.Rmd",150,53,"style","Only use double-quotes."," cpt.colour = 'dodgerblue3', cpt.linetype = 'solid')","single_quotes_linter" -"vignettes/plot_ts.Rmd",159,24,"style","There should be a space before an opening curly brace.","form <- function(theta){","brace_linter" -"vignettes/plot_ts.Rmd",159,24,"style","There should be a space between a right parenthesis and a body expression.","form <- function(theta){","paren_body_linter" -"vignettes/plot_ts.Rmd",160,3,"warning","no visible global function definition for β€˜dlmModPoly’"," dlmModPoly(order = 1, dV = exp(theta[1]), dW = exp(theta[2]))","object_usage_linter" -"vignettes/plot_ts.Rmd",172,34,"style","Only use double-quotes.","autoplot(filtered, ts.linetype = 'dashed', fitted.colour = 'blue')","single_quotes_linter" -"vignettes/plot_ts.Rmd",172,60,"style","Only use double-quotes.","autoplot(filtered, ts.linetype = 'dashed', fitted.colour = 'blue')","single_quotes_linter" -"vignettes/plot_ts.Rmd",187,32,"style","Only use double-quotes.","autoplot(smoothed, ts.colour = 'blue', p = p)","single_quotes_linter" -"vignettes/plot_ts.Rmd",197,25,"style","Put spaces around all infix operators."," Nile ~ SSMtrend(degree=1, Q=matrix(NA)), H=matrix(NA)","infix_spaces_linter" -"vignettes/plot_ts.Rmd",197,30,"style","Put spaces around all infix operators."," Nile ~ SSMtrend(degree=1, Q=matrix(NA)), H=matrix(NA)","infix_spaces_linter" -"vignettes/plot_ts.Rmd",197,45,"style","Put spaces around all infix operators."," Nile ~ SSMtrend(degree=1, Q=matrix(NA)), H=matrix(NA)","infix_spaces_linter" -"vignettes/plot_ts.Rmd",199,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/plot_ts.Rmd",200,20,"style","Put spaces around all infix operators.","fit <- fitSSM(model=model, inits=c(log(var(Nile)),log(var(Nile))), method=""BFGS"")","infix_spaces_linter" -"vignettes/plot_ts.Rmd",200,33,"style","Put spaces around all infix operators.","fit <- fitSSM(model=model, inits=c(log(var(Nile)),log(var(Nile))), method=""BFGS"")","infix_spaces_linter" -"vignettes/plot_ts.Rmd",200,51,"style","Commas should always have a space after.","fit <- fitSSM(model=model, inits=c(log(var(Nile)),log(var(Nile))), method=""BFGS"")","commas_linter" -"vignettes/plot_ts.Rmd",200,74,"style","Put spaces around all infix operators.","fit <- fitSSM(model=model, inits=c(log(var(Nile)),log(var(Nile))), method=""BFGS"")","infix_spaces_linter" -"vignettes/plot_ts.Rmd",200,81,"style","Lines should not be more than 80 characters.","fit <- fitSSM(model=model, inits=c(log(var(Nile)),log(var(Nile))), method=""BFGS"")","line_length_linter" -"vignettes/plot_ts.Rmd",208,37,"style","Put spaces around all infix operators.","filtered <- KFS(fit$model, filtering=""mean"", smoothing='none')","infix_spaces_linter" -"vignettes/plot_ts.Rmd",208,55,"style","Put spaces around all infix operators.","filtered <- KFS(fit$model, filtering=""mean"", smoothing='none')","infix_spaces_linter" -"vignettes/plot_ts.Rmd",208,56,"style","Only use double-quotes.","filtered <- KFS(fit$model, filtering=""mean"", smoothing='none')","single_quotes_linter" -"vignettes/plot_ts.Rmd",215,33,"style","Put spaces around all infix operators.","trend <- signal(smoothed, states=""trend"")","infix_spaces_linter" -"vignettes/plot_ts.Rmd",223,29,"style","Only use double-quotes.","autoplot(trend, ts.colour = 'blue', p = p)","single_quotes_linter" -"vignettes/plot_ts.Rmd",237,40,"style","Only use double-quotes.","autoplot(stl(AirPassengers, s.window = 'periodic'), ts.colour = 'blue')","single_quotes_linter" -"vignettes/plot_ts.Rmd",237,65,"style","Only use double-quotes.","autoplot(stl(AirPassengers, s.window = 'periodic'), ts.colour = 'blue')","single_quotes_linter" -"vignettes/plot_ts.Rmd",249,60,"style","Only use double-quotes.","autoplot(acf(AirPassengers, plot = FALSE), conf.int.fill = '#0000FF', conf.int.value = 0.8, conf.int.type = 'ma')","single_quotes_linter" -"vignettes/plot_ts.Rmd",249,81,"style","Lines should not be more than 80 characters.","autoplot(acf(AirPassengers, plot = FALSE), conf.int.fill = '#0000FF', conf.int.value = 0.8, conf.int.type = 'ma')","line_length_linter" -"vignettes/plot_ts.Rmd",249,109,"style","Only use double-quotes.","autoplot(acf(AirPassengers, plot = FALSE), conf.int.fill = '#0000FF', conf.int.value = 0.8, conf.int.type = 'ma')","single_quotes_linter" diff --git a/.dev/revdep_emails/ggfortify/email-body b/.dev/revdep_emails/ggfortify/email-body deleted file mode 100644 index 2290841a4..000000000 --- a/.dev/revdep_emails/ggfortify/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Yuan Tang! Thank you for using {lintr} in your package {ggfortify}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/sinhrks/ggfortify using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 67s on CRAN vs. 38s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/ggthemes/attachments/ggthemes.warnings b/.dev/revdep_emails/ggthemes/attachments/ggthemes.warnings deleted file mode 100644 index 82e46410d..000000000 --- a/.dev/revdep_emails/ggthemes/attachments/ggthemes.warnings +++ /dev/null @@ -1,2 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Trying to remove β€˜snake_case_linter’, β€˜camel_case_linter’ and β€˜multiple_dots_linter’, which are not in `defaults`. diff --git a/.dev/revdep_emails/ggthemes/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/ggthemes/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 63b0ec688..000000000 --- a/.dev/revdep_emails/ggthemes/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,2 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/utils.R",10,1,"style","Variable and function name style should be snake_case.","""%||%"" <- function(a, b) {","object_name_linter" diff --git a/.dev/revdep_emails/ggthemes/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/ggthemes/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 29295fec8..000000000 --- a/.dev/revdep_emails/ggthemes/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,48 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"data-raw/build.R",9,1,"style","Variable and function name style should be snake_case or symbols.","utf8ToPch <- function(x) {","object_name_linter" -"data-raw/build.R",15,20,"warning","no visible global function definition for β€˜map_int’"," as.integer(-1L * map_int(x, ~ utf8ToInt(.x)[[1]]))","object_usage_linter" -"data-raw/build.R",26,7,"warning","no visible global function definition for β€˜tibble’"," tibble(name = out$colors$schemes[[i]]) %>%","object_usage_linter" -"data-raw/build.R",27,7,"warning","no visible global function definition for β€˜left_join’"," left_join(out$colors$names, by = ""name"")","object_usage_linter" -"data-raw/build.R",29,17,"warning","no visible global function definition for β€˜select’"," out$shapes <- select(map_dfr(out$shapes, as_tibble), -comment) %>%","object_usage_linter" -"data-raw/build.R",30,5,"warning","no visible global function definition for β€˜mutate’"," mutate(pch = utf8ToPch(character))","object_usage_linter" -"data-raw/build.R",53,23,"warning","no visible global function definition for β€˜map_chr’"," out$bg <- set_names(map_chr(out$bg, ""value""), map_chr(out$bg, ""name""))","object_usage_linter" -"data-raw/build.R",53,23,"warning","no visible global function definition for β€˜map_chr’"," out$bg <- set_names(map_chr(out$bg, ""value""), map_chr(out$bg, ""name""))","object_usage_linter" -"data-raw/build.R",85,17,"warning","no visible global function definition for β€˜tibble’"," out$colors <- tibble(value = rev(map_chr(xml_children(x), xml_text)))","object_usage_linter" -"data-raw/build.R",85,36,"warning","no visible global function definition for β€˜map_chr’"," out$colors <- tibble(value = rev(map_chr(xml_children(x), xml_text)))","object_usage_linter" -"data-raw/build.R",90,3,"warning","local variable β€˜classic’ assigned but may not be used"," classic <- read_xml(here(""data-raw"", ""theme-data"", ""tableau-classic.xml"")) %>%","object_usage_linter" -"data-raw/build.R",104,7,"warning","no visible global function definition for β€˜mutate’"," mutate(pch = utf8ToPch(character))","object_usage_linter" -"data-raw/build.R",153,5,"warning","no visible global function definition for β€˜mutate’"," mutate(pch = utf8ToPch(character))","object_usage_linter" -"data-raw/build.R",163,17,"warning","no visible global function definition for β€˜mutate’"," out$shapes <- mutate(out$shapes, pch = utf8ToPch(character))","object_usage_linter" -"data-raw/build.R",171,17,"warning","no visible global function definition for β€˜mutate’"," out$shapes <- mutate(out$shapes, pch = utf8ToPch(character))","object_usage_linter" -"data-raw/build.R",178,28,"warning","no visible global function definition for β€˜mutate’"," out$cleveland$default <- mutate(map_dfr(out$cleveland$default, as_tibble),","object_usage_linter" -"data-raw/build.R",182,21,"warning","no visible global function definition for β€˜map_df’"," out$circlefill <- map_df(out$circlefill, as_tibble) %>%","object_usage_linter" -"data-raw/build.R",183,5,"warning","no visible global function definition for β€˜mutate’"," mutate(pch = utf8ToPch(character))","object_usage_linter" -"data-raw/canva_palette.R",3,81,"style","Lines should not be more than 80 characters.","#' #' The color list is from http://makeadifferencewithdata.com/2017/01/150-paletas-colores-tableau/,","line_length_linter" -"data-raw/canva_palette.R",4,81,"style","Lines should not be more than 80 characters.","#' #' and referenced here: https://policyviz.com/2017/01/12/150-color-palettes-for-excel/.","line_length_linter" -"data-raw/canva_palette.R",10,81,"style","Lines should not be more than 80 characters.","#' color_palettes_url <- ""http://makeadifferencewithdata.com/wp-content/uploads/2016/12/color-palettes.txt""","line_length_linter" -"data-raw/canva_palette.R",34,81,"style","Lines should not be more than 80 characters.","#' duplicated(names(canva_palettes))] <- ""Vintage charm 2""","line_length_linter" -"data-raw/clean-colors.R",4,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" -"data-raw/excel_themes.R",8,81,"style","Lines should not be more than 80 characters.","# - https://support.office.com/en-us/article/change-a-theme-and-make-it-the-default-in-word-or-excel-c846f997-968e-4daa-b2d4-42bd2afef904?ui=en-US&rs=en-US&ad=US","line_length_linter" -"data-raw/excel_themes.R",10,81,"style","Lines should not be more than 80 characters.","# - https://support.office.com/en-us/article/open-xml-formats-and-file-name-extensions-5200d93c-3449-4380-8e11-31ef14555b18","line_length_linter" -"data-raw/excel_themes.R",16,81,"style","Lines should not be more than 80 characters.","theme_dir <- ""/Applications/Microsoft Excel.app/Contents/Resources/Office Themes""","line_length_linter" -"data-raw/excel_themes.R",30,3,"warning","no visible global function definition for β€˜set_names’"," set_names(list(val), name)","object_usage_linter" -"data-raw/excel_themes.R",33,1,"style","Variable and function name style should be snake_case or symbols.","process_clrScheme <- function(x) {","object_name_linter" -"data-raw/excel_themes.R",35,13,"warning","no visible global function definition for β€˜flatten_chr’"," colors <- flatten_chr(map(xml_children(x), process_color))","object_usage_linter" -"data-raw/excel_themes.R",39,37,"warning","no visible global function definition for β€˜str_subset’"," unname(colors[str_subset(names(colors), ""^accent"")])),","object_usage_linter" -"data-raw/libreoffice_palettes.R",7,81,"style","Lines should not be more than 80 characters.","# https://design.blog.documentfoundation.org/2016/11/11/additions-to-libreoffice/","line_length_linter" -"data-raw/libreoffice_palettes.R",18,3,"warning","no visible global function definition for β€˜tibble’"," tibble(name = xml_attr(x, ""name""),","object_usage_linter" -"data-raw/libreoffice_palettes.R",23,3,"warning","local variable β€˜name’ assigned but may not be used"," name <- tools::file_path_sans_ext(basename(path))","object_usage_linter" -"data-raw/libreoffice_palettes.R",43,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" -"R/economist.R",11,31,"style","Put spaces around all infix operators.","economist_pal <- function(fill=TRUE) {","infix_spaces_linter" -"R/few.R",87,50,"style","Put spaces around all infix operators.","theme_few <- function(base_size = 12, base_family="""") {","infix_spaces_linter" -"R/gdocs.R",9,52,"style","Put spaces around all infix operators.","theme_gdocs <- function(base_size = 12, base_family=""sans"") {","infix_spaces_linter" -"R/scales.R",31,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/shapes.R",168,40,"style","Put spaces around all infix operators.","scale_shape_tremmel <- function(overlap=FALSE, alt=TRUE, ...) {","infix_spaces_linter" -"R/shapes.R",168,51,"style","Put spaces around all infix operators.","scale_shape_tremmel <- function(overlap=FALSE, alt=TRUE, ...) {","infix_spaces_linter" -"R/stata.R",14,29,"style","Put spaces around all infix operators.","stata_pal <- function(scheme=""s2color"") {","infix_spaces_linter" -"R/stata.R",32,38,"style","Put spaces around all infix operators.","scale_colour_stata <- function(scheme=""s2color"", ...) {","infix_spaces_linter" -"R/stata.R",38,36,"style","Put spaces around all infix operators.","scale_fill_stata <- function(scheme=""s2color"", ...) {","infix_spaces_linter" -"R/stata.R",125,38,"style","Put spaces around all infix operators.","theme_stata_colors <- function(scheme=""s2color"") {","infix_spaces_linter" -"R/stata.R",232,31,"style","Put spaces around all infix operators."," scheme=""s2color"") {","infix_spaces_linter" -"R/theme-foundation.R",21,39,"style","Put spaces around all infix operators.","theme_foundation <- function(base_size=12, base_family="""") {","infix_spaces_linter" -"R/theme-foundation.R",21,55,"style","Put spaces around all infix operators.","theme_foundation <- function(base_size=12, base_family="""") {","infix_spaces_linter" diff --git a/.dev/revdep_emails/ggthemes/email-body b/.dev/revdep_emails/ggthemes/email-body deleted file mode 100644 index 7cf42c699..000000000 --- a/.dev/revdep_emails/ggthemes/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Jeffrey B. Arnold! Thank you for using {lintr} in your package {ggthemes}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/jrnold/ggthemes using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 52s on CRAN vs. 36s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/healthcareai/attachments/healthcareai.warnings b/.dev/revdep_emails/healthcareai/attachments/healthcareai.warnings deleted file mode 100644 index 182961f94..000000000 --- a/.dev/revdep_emails/healthcareai/attachments/healthcareai.warnings +++ /dev/null @@ -1,2 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Trying to remove β€˜camel_case_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/healthcareai/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/healthcareai/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index d1f7b6cc8..000000000 --- a/.dev/revdep_emails/healthcareai/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,149 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/db_connections.R",33,44,"style","Put spaces around all infix operators."," trusted=TRUE,","infix_spaces_linter" -"R/db_connections.R",44,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!missing(user_id) & !missing(password))","vector_logic_linter" -"R/db_connections.R",59,32,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (!missing(user_id) & !missing(password)) {","vector_logic_linter" -"R/find_unique_columns.R",39,22,"style","Any function spanning multiple lines should use curly braces."," dplyr::select_if(function(col)","brace_linter" -"R/missingness.R",32,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.matrix(d) | (is.vector(d) && !is.list(d)))","vector_logic_linter" -"R/pip.R",221,43,"style","Any function spanning multiple lines should use curly braces."," d <- purrr::map_df(names(split_vars), function(v)","brace_linter" -"R/plot_predictions.R",246,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.numeric(text_size) & !is.logical(text_size))","vector_logic_linter" -"R/plot_predictions.R",264,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.numeric(text_angle) & !is.logical(text_angle))","vector_logic_linter" -"R/predict.R",413,12,"style","Either both or neither branch in `if`/`else` should use curly braces."," } else if (mi$m_class == ""Multiclass"") {","brace_linter" -"R/prep_data.R",354,41,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (remove_near_zero_variance < 0 | remove_near_zero_variance > 1)","vector_logic_linter" -"R/save_load.R",55,44,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(attr(x, ""recipe"")$template) | !is.null(attr(x, ""recipe"")$orig_data))","vector_logic_linter" -"R/setup_hyperparameters.R",78,43,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (model_class == ""classification"" | model_class == ""multiclass"") {","vector_logic_linter" -"R/training_setup.R",272,21,"style","Any function spanning multiple lines should use curly braces.","character_in_quo <- function(x)","brace_linter" -"R/utilities.R",31,22,"style","Any function spanning multiple lines should use curly braces."," lapply(names(ref), function(v)","brace_linter" -"R/utilities.R",53,49,"style","Either both or neither branch in `if`/`else` should use curly braces."," if (!length(new_levels[[.x]])) return(NULL) else {","brace_linter" -"tests/testthat/test-hcai-impute.R",9,58,"style","Use TRUE instead of the symbol T."," vendorID = sample(1:9, size = n, replace = T),","T_and_F_symbol_linter" -"tests/testthat/test-hcai-impute.R",12,67,"style","Use TRUE instead of the symbol T."," heat = sample(c(""Cold"", ""Hot""), size = n, replace = T),","T_and_F_symbol_linter" -"tests/testthat/test-hcai-impute.R",14,54,"style","Use TRUE instead of the symbol T."," size = n, replace = T)","T_and_F_symbol_linter" -"tests/testthat/test-impute.r",11,68,"style","Use TRUE instead of the symbol T."," fur = sample(c(""Long"", ""Short""), size = n, replace = T),","T_and_F_symbol_linter" -"tests/testthat/test-impute.r",13,50,"style","Use TRUE instead of the symbol T."," size = n, replace = T)","T_and_F_symbol_linter" -"tests/testthat/test-PCA.R",9,69,"style","Use TRUE instead of the symbol T."," genre = sample(c(""Rock"", ""Jazz"", ""Country""), size = n, replace = T),","T_and_F_symbol_linter" -"tests/testthat/test-PCA.R",11,42,"style","Use TRUE instead of the symbol T."," size = n, replace = T),","T_and_F_symbol_linter" -"tests/testthat/test-PCA.R",12,54,"style","Use TRUE instead of the symbol T."," guitar_flag = sample(c(0, 1), size = n, replace = T),","T_and_F_symbol_linter" -"tests/testthat/test-PCA.R",13,56,"style","Use TRUE instead of the symbol T."," drum_flag = sample(c(0, 1, NA), size = n, replace = T,","T_and_F_symbol_linter" -"tests/testthat/test-PCA.R",21,78,"style","Use TRUE instead of the symbol T."," state = sample(c(""NY"", ""MA"", ""CT"", ""CA"", ""VT"", ""NH""), size = n, replace = T,","T_and_F_symbol_linter" -"tests/testthat/test-pip.R",59,16,"style","Any function spanning multiple lines should use curly braces."," max_count <- function(d)","brace_linter" -"tests/testthat/test-prep_data_utils.R",10,57,"style","Use TRUE instead of the symbol T."," tuba_flag = sample(c(0, 1), size = n, replace = T),","T_and_F_symbol_linter" -"tests/testthat/test-prep_data_utils.R",11,61,"style","Use TRUE instead of the symbol T."," drum_flag = sample(c(0, 1, NA), size = n, replace = T),","T_and_F_symbol_linter" -"tests/testthat/test-prep_data_utils.R",13,47,"style","Use TRUE instead of the symbol T."," size = n, replace = T),","T_and_F_symbol_linter" -"tests/testthat/test-prep_data.R",14,69,"style","Use TRUE instead of the symbol T."," genre = sample(c(""Rock"", ""Jazz"", ""Country""), size = n, replace = T),","T_and_F_symbol_linter" -"tests/testthat/test-prep_data.R",16,42,"style","Use TRUE instead of the symbol T."," size = n, replace = T, prob = c(4, 4, 4, 6)),","T_and_F_symbol_linter" -"tests/testthat/test-prep_data.R",17,54,"style","Use TRUE instead of the symbol T."," guitar_flag = sample(c(0, 1), size = n, replace = T),","T_and_F_symbol_linter" -"tests/testthat/test-prep_data.R",18,56,"style","Use TRUE instead of the symbol T."," drum_flag = sample(c(0, 1, NA), size = n, replace = T,","T_and_F_symbol_linter" -"tests/testthat/test-prep_data.R",26,78,"style","Use TRUE instead of the symbol T."," state = sample(c(""NY"", ""MA"", ""CT"", ""CA"", ""VT"", ""NH""), size = n, replace = T,","T_and_F_symbol_linter" -"tests/testthat/test-tune_models.R",295,18,"style","Any function spanning multiple lines should use curly braces."," phi_present <- function(messages)","brace_linter" -"vignettes/site_only/best_levels.Rmd",41,17,"style","Trailing whitespace is superfluous.","meds <- tribble( ","trailing_whitespace_linter" -"vignettes/site_only/best_levels.Rmd",50,13,"style","Trailing whitespace is superfluous.","pima_meds <- ","trailing_whitespace_linter" -"vignettes/site_only/best_levels.Rmd",54,79,"style","Trailing whitespace is superfluous."," medication = sample(x = meds$name, size = sample(0:4, 1), replace = FALSE, ","trailing_whitespace_linter" -"vignettes/site_only/best_levels.Rmd",72,22,"style","Trailing whitespace is superfluous.","pima_diabetes_meds <- ","trailing_whitespace_linter" -"vignettes/site_only/best_levels.Rmd",76,81,"style","Trailing whitespace is superfluous."," # Data frame with id, the high-cardinality factor, and (optionally) a column ","trailing_whitespace_linter" -"vignettes/site_only/best_levels.Rmd",103,30,"style","Trailing whitespace is superfluous.","pima_diabetes_med_duration <- ","trailing_whitespace_linter" -"vignettes/site_only/best_levels.Rmd",166,28,"style","Trailing whitespace is superfluous.","new_patient_med_duration <- ","trailing_whitespace_linter" -"vignettes/site_only/best_levels.Rmd",167,35,"style","Trailing whitespace is superfluous."," add_best_levels(d = new_patient, ","trailing_whitespace_linter" -"vignettes/site_only/best_levels.Rmd",168,40,"style","Trailing whitespace is superfluous."," longsheet = new_meds, ","trailing_whitespace_linter" -"vignettes/site_only/best_levels.Rmd",186,84,"style","Trailing whitespace is superfluous.","models <- machine_learn(pima_diabetes_med_duration, patient_id, outcome = diabetes, ","trailing_whitespace_linter" -"vignettes/site_only/best_levels.Rmd",188,33,"style","Trailing whitespace is superfluous.","add_best_levels(d = new_patient, ","trailing_whitespace_linter" -"vignettes/site_only/best_levels.Rmd",189,38,"style","Trailing whitespace is superfluous."," longsheet = new_meds, ","trailing_whitespace_linter" -"vignettes/site_only/best_levels.Rmd",196,38,"style","Trailing whitespace is superfluous."," missing_fill = 0) %>% ","trailing_whitespace_linter" -"vignettes/site_only/best_levels.Rmd",241,17,"style","Trailing whitespace is superfluous.","meds <- tribble( ","trailing_whitespace_linter" -"vignettes/site_only/best_levels.Rmd",255,13,"style","Trailing whitespace is superfluous.","pima_meds <- ","trailing_whitespace_linter" -"vignettes/site_only/best_levels.Rmd",259,79,"style","Trailing whitespace is superfluous."," medication = sample(x = meds$name, size = sample(0:4, 1), replace = FALSE, ","trailing_whitespace_linter" -"vignettes/site_only/db_connections.Rmd",12,70,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set(echo = TRUE, results = ""hold"", collapse = TRUE, ","trailing_whitespace_linter" -"vignettes/site_only/db_connections.Rmd",131,44,"style","Commas should always have a space after.","predictions <- data.frame(patient_id = c(1,2,3),","commas_linter" -"vignettes/site_only/db_connections.Rmd",131,46,"style","Commas should always have a space after.","predictions <- data.frame(patient_id = c(1,2,3),","commas_linter" -"vignettes/site_only/db_connections.Rmd",134,34,"style","Trailing whitespace is superfluous.","table_id <- Id(schema = ""Sepsis"", ","trailing_whitespace_linter" -"vignettes/site_only/db_connections.Rmd",155,44,"style","Commas should always have a space after.","predictions <- data.frame(patient_id = c(1,2,3),","commas_linter" -"vignettes/site_only/db_connections.Rmd",155,46,"style","Commas should always have a space after.","predictions <- data.frame(patient_id = c(1,2,3),","commas_linter" -"vignettes/site_only/db_connections.Rmd",159,13,"style","Trailing whitespace is superfluous.","sqlSave(con, ","trailing_whitespace_linter" -"vignettes/site_only/db_connections.Rmd",160,21,"style","Trailing whitespace is superfluous."," predictions, ","trailing_whitespace_linter" -"vignettes/site_only/db_connections.Rmd",161,30,"style","Trailing whitespace is superfluous."," ""Sepsis.Predictions"", ","trailing_whitespace_linter" -"vignettes/site_only/db_connections.Rmd",162,23,"style","Trailing whitespace is superfluous."," append = TRUE, ","trailing_whitespace_linter" -"vignettes/site_only/db_connections.Rmd",192,44,"style","Commas should always have a space after.","predictions <- data.frame(patient_id = c(1,2,3),","commas_linter" -"vignettes/site_only/db_connections.Rmd",192,46,"style","Commas should always have a space after.","predictions <- data.frame(patient_id = c(1,2,3),","commas_linter" -"vignettes/site_only/db_connections.Rmd",197,24,"style","Trailing whitespace is superfluous.","RODBC::sqlSave(con_out, ","trailing_whitespace_linter" -"vignettes/site_only/db_connections.Rmd",198,28,"style","Trailing whitespace is superfluous."," predictions, ","trailing_whitespace_linter" -"vignettes/site_only/db_connections.Rmd",199,37,"style","Trailing whitespace is superfluous."," ""Sepsis.Predictions"", ","trailing_whitespace_linter" -"vignettes/site_only/db_connections.Rmd",200,30,"style","Trailing whitespace is superfluous."," append = TRUE, ","trailing_whitespace_linter" -"vignettes/site_only/deploy_model.Rmd",52,31,"style","Trailing whitespace is superfluous.","models <- machine_learn(d = d, ","trailing_whitespace_linter" -"vignettes/site_only/deploy_model.Rmd",100,31,"style","Trailing whitespace is superfluous.","predictions <- predictions %>% ","trailing_whitespace_linter" -"vignettes/site_only/deploy_model.Rmd",124,12,"style","Trailing whitespace is superfluous."," SELECT ","trailing_whitespace_linter" -"vignettes/site_only/deploy_model.Rmd",125,7,"style","Only use double-quotes."," '' AS FacilityAccountID","single_quotes_linter" -"vignettes/site_only/deploy_model.Rmd",125,10,"error","unexpected symbol"," '' AS FacilityAccountID",NA -"vignettes/site_only/deploy_model.Rmd",141,13,"style","Trailing whitespace is superfluous.","sqlSave(con, ","trailing_whitespace_linter" -"vignettes/site_only/deploy_model.Rmd",142,21,"style","Trailing whitespace is superfluous."," predictions, ","trailing_whitespace_linter" -"vignettes/site_only/deploy_model.Rmd",143,39,"style","Trailing whitespace is superfluous."," ""Schema.ReadmitMLOutputTable"", ","trailing_whitespace_linter" -"vignettes/site_only/deploy_model.Rmd",144,23,"style","Trailing whitespace is superfluous."," append = TRUE, ","trailing_whitespace_linter" -"vignettes/site_only/deploy_model.Rmd",175,22,"style","Trailing whitespace is superfluous.","prod_query <- ""SELECT ","trailing_whitespace_linter" -"vignettes/site_only/deploy_model.Rmd",193,13,"style","Trailing whitespace is superfluous.","sqlSave(con, ","trailing_whitespace_linter" -"vignettes/site_only/deploy_model.Rmd",194,21,"style","Trailing whitespace is superfluous."," predictions, ","trailing_whitespace_linter" -"vignettes/site_only/deploy_model.Rmd",195,43,"style","Trailing whitespace is superfluous."," ""Schema.ReadmitMLOutputTableBASE"", ","trailing_whitespace_linter" -"vignettes/site_only/deploy_model.Rmd",196,23,"style","Trailing whitespace is superfluous."," append = TRUE, ","trailing_whitespace_linter" -"vignettes/site_only/healthcareai.Rmd",12,70,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set(echo = TRUE, results = ""hold"", collapse = TRUE, ","trailing_whitespace_linter" -"vignettes/site_only/healthcareai.Rmd",65,17,"style","Trailing whitespace is superfluous.","quick_models %>% ","trailing_whitespace_linter" -"vignettes/site_only/healthcareai.Rmd",66,34,"style","Trailing whitespace is superfluous."," predict(outcome_groups = 2) %>% ","trailing_whitespace_linter" -"vignettes/site_only/healthcareai.Rmd",76,31,"style","Trailing whitespace is superfluous.","missingness(pima_diabetes) %>% ","trailing_whitespace_linter" -"vignettes/site_only/healthcareai.Rmd",132,28,"style","Trailing whitespace is superfluous.","models[""Random Forest""] %>% ","trailing_whitespace_linter" -"vignettes/site_only/healthcareai.Rmd",158,22,"style","Trailing whitespace is superfluous.","interpret(models) %>% ","trailing_whitespace_linter" -"vignettes/site_only/healthcareai.Rmd",176,20,"style","Trailing whitespace is superfluous.","explore(models) %>% ","trailing_whitespace_linter" -"vignettes/site_only/healthcareai.Rmd",194,20,"style","Trailing whitespace is superfluous.","test_predictions <- ","trailing_whitespace_linter" -"vignettes/site_only/healthcareai.Rmd",195,18,"style","Trailing whitespace is superfluous."," predict(models, ","trailing_whitespace_linter" -"vignettes/site_only/healthcareai.Rmd",196,27,"style","Trailing whitespace is superfluous."," split_data$test, ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",12,70,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set(echo = TRUE, results = ""hold"", collapse = TRUE, ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",83,44,"style","Put spaces around all infix operators.","print(paste(""Data is"", round(as.numeric(os)/1000000, 1), ""mb.""))","infix_spaces_linter" -"vignettes/site_only/performance.Rmd",113,22,"warning","1:nrow(...) is likely to be wrong in the empty edge case. Use seq_len() instead."," flight_id = 1:nrow(d)) %>%","seq_linter" -"vignettes/site_only/performance.Rmd",115,17,"style","Trailing whitespace is superfluous.","d_clean <- d %>% ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",118,43,"style","Trailing whitespace is superfluous."," collapse_rare_factors = FALSE, ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",122,52,"style","Put spaces around all infix operators.","print(paste(""Prepped data is"", round(as.numeric(os)/1000000, 1), ""mb.""))","infix_spaces_linter" -"vignettes/site_only/performance.Rmd",158,50,"style","Commas should never have a space before."," summarize_if(~ is.character(.x) | is.factor(.x) , n_distinct)","commas_linter" -"vignettes/site_only/performance.Rmd",166,83,"style","Trailing whitespace is superfluous."," ggplot(aes(x = reorder(dest, arr_delay, function(x) -sum(x == ""Y"") / length(x)), ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",219,33,"style","Trailing whitespace is superfluous."," prep_data(outcome = arr_delay, ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",231,33,"style","Trailing whitespace is superfluous."," prep_data(outcome = arr_delay, ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",286,6,"style","Trailing whitespace is superfluous.","d %>% ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",290,24,"style","Trailing whitespace is superfluous.","stratified_sample_d %>% ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",300,18,"style","Trailing whitespace is superfluous.","d_recent <- d %>% ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",314,18,"style","Trailing whitespace is superfluous.","downsampled_d %>% ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",361,33,"style","Trailing whitespace is superfluous."," prep_data(outcome = arr_delay, ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",365,32,"style","Trailing whitespace is superfluous.","m_rf_1 <- flash_models(d_clean, ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",366,44,"style","Trailing whitespace is superfluous."," outcome = arr_delay, ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",378,22,"style","Trailing whitespace is superfluous.","m <- machine_learn(d, ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",398,33,"style","Trailing whitespace is superfluous."," prep_data(outcome = arr_delay, ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",402,33,"style","Trailing whitespace is superfluous.","m_glm_1 <- flash_models(d_clean, ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",403,45,"style","Trailing whitespace is superfluous."," outcome = arr_delay, ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",419,33,"style","Trailing whitespace is superfluous."," prep_data(outcome = arr_delay, ","trailing_whitespace_linter" -"vignettes/site_only/transitioning.Rmd",12,70,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set(echo = TRUE, results = ""hold"", collapse = TRUE, ","trailing_whitespace_linter" -"vignettes/site_only/transitioning.Rmd",34,36,"style","Trailing whitespace is superfluous.","# csvfile <- system.file(""extdata"", ","trailing_whitespace_linter" -"vignettes/site_only/transitioning.Rmd",35,52,"style","Trailing whitespace is superfluous.","# ""HCRDiabetesClinical.csv"", ","trailing_whitespace_linter" -"vignettes/site_only/transitioning.Rmd",37,33,"style","Trailing whitespace is superfluous.","# df <- read.csv(file = csvfile, ","trailing_whitespace_linter" -"vignettes/site_only/transitioning.Rmd",38,32,"style","Trailing whitespace is superfluous.","# header = TRUE, ","trailing_whitespace_linter" -"vignettes/site_only/transitioning.Rmd",40,2,"style","Trailing whitespace is superfluous.","# ","trailing_whitespace_linter" -"vignettes/site_only/transitioning.Rmd",41,3,"style","Commented code should be removed.","# df$PatientID <- NULL # Only one ID column (ie, PatientEncounterID) is needed remove this column","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",62,3,"style","Commented code should be removed.","# dfDeploy <- df[951:1000,]","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",71,3,"style","Commented code should be removed.","# p <- SupervisedModelDevelopmentParams$new()","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",72,3,"style","Commented code should be removed.","# p$df <- df","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",73,3,"style","Commented code should be removed.","# p$type <- ""classification""","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",74,3,"style","Commented code should be removed.","# p$impute <- TRUE","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",75,3,"style","Commented code should be removed.","# p$grainCol <- ""PatientEncounterID""","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",76,3,"style","Commented code should be removed.","# p$predictedCol <- ""ThirtyDayReadmitFLG""","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",77,3,"style","Commented code should be removed.","# p$debug <- FALSE","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",78,3,"style","Commented code should be removed.","# p$cores <- 1","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",79,2,"style","Trailing whitespace is superfluous.","# ","trailing_whitespace_linter" -"vignettes/site_only/transitioning.Rmd",81,3,"style","Commented code should be removed.","# RandomForest <- RandomForestDevelopment$new(p)","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",82,3,"style","Commented code should be removed.","# RandomForest$run()","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",84,33,"style","Trailing whitespace is superfluous.","models <- machine_learn(d$train, ","trailing_whitespace_linter" -"vignettes/site_only/transitioning.Rmd",86,55,"style","Trailing whitespace is superfluous."," outcome = ThirtyDayReadmitFLG, ","trailing_whitespace_linter" -"vignettes/site_only/transitioning.Rmd",113,3,"style","Commented code should be removed.","# p2 <- SupervisedModelDeploymentParams$new()","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",114,3,"style","Commented code should be removed.","# p2$type <- ""classification""","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",115,3,"style","Commented code should be removed.","# p2$df <- dfDeploy","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",116,3,"style","Commented code should be removed.","# p2$grainCol <- ""PatientEncounterID""","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",117,3,"style","Commented code should be removed.","# p2$predictedCol <- ""ThirtyDayReadmitFLG""","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",118,3,"style","Commented code should be removed.","# p2$impute <- TRUE","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",119,3,"style","Commented code should be removed.","# p2$debug <- FALSE","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",120,3,"style","Commented code should be removed.","# p2$cores <- 1","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",121,2,"style","Trailing whitespace is superfluous.","# ","trailing_whitespace_linter" -"vignettes/site_only/transitioning.Rmd",122,3,"style","Commented code should be removed.","# dL <- RandomForestDeployment$new(p2)","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",123,3,"style","Commented code should be removed.","# dL$deploy()","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",124,2,"style","Trailing whitespace is superfluous.","# ","trailing_whitespace_linter" -"vignettes/site_only/transitioning.Rmd",125,3,"style","Commented code should be removed.","# dfOut <- dL$getOutDf()","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",126,3,"style","Commented code should be removed.","# head(dfOut)","commented_code_linter" diff --git a/.dev/revdep_emails/healthcareai/email-body b/.dev/revdep_emails/healthcareai/email-body deleted file mode 100644 index 77c958708..000000000 --- a/.dev/revdep_emails/healthcareai/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Mike Mastanduno! Thank you for using {lintr} in your package {healthcareai}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/HealthCatalyst/healthcareai-r using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 82s on CRAN vs. 33s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/i18n/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/i18n/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 72fed09e9..000000000 --- a/.dev/revdep_emails/i18n/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,345 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"data-raw/01-locales.R",7,15,"style","Trailing whitespace is superfluous.","all_locales <- ","trailing_whitespace_linter" -"data-raw/01-locales.R",10,40,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-core"", ","trailing_whitespace_linter" -"data-raw/02-default_locales.R",7,19,"style","Trailing whitespace is superfluous.","default_content <- ","trailing_whitespace_linter" -"data-raw/02-default_locales.R",10,40,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-core"", ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",15,15,"style","Trailing whitespace is superfluous."," languages <- ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",30,13,"style","Trailing whitespace is superfluous."," scripts <- ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",37,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",44,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",45,17,"style","Trailing whitespace is superfluous."," territories <- ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",52,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",59,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",60,14,"style","Trailing whitespace is superfluous."," variants <- ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",67,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",74,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",77,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",80,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",82,81,"style","Lines should not be more than 80 characters."," territories_values <- territories_data$main[[1]]$localeDisplayNames$territories","line_length_linter" -"data-raw/03-locale_names.R",83,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",86,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",95,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",98,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",15,3,"style","Variable and function names should not be longer than 30 characters."," dates_gregorian_json_url_locale <- ","object_length_linter" -"data-raw/04-dates.R",15,37,"style","Trailing whitespace is superfluous."," dates_gregorian_json_url_locale <- ","trailing_whitespace_linter" -"data-raw/04-dates.R",18,53,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-dates-full/main"", ","trailing_whitespace_linter" -"data-raw/04-dates.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" -"data-raw/04-dates.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",33,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",36,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$months$format$abbreviated","line_length_linter" -"data-raw/04-dates.R",37,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",40,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$months$format$narrow","line_length_linter" -"data-raw/04-dates.R",41,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",45,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",48,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$months$`stand-alone`$abbreviated","line_length_linter" -"data-raw/04-dates.R",49,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",52,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$months$`stand-alone`$narrow","line_length_linter" -"data-raw/04-dates.R",53,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",56,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$months$`stand-alone`$wide","line_length_linter" -"data-raw/04-dates.R",57,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",61,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",64,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$days$format$abbreviated","line_length_linter" -"data-raw/04-dates.R",65,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",69,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",73,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",77,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",80,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$days$`stand-alone`$abbreviated","line_length_linter" -"data-raw/04-dates.R",81,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",84,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$days$`stand-alone`$narrow","line_length_linter" -"data-raw/04-dates.R",85,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",88,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$days$`stand-alone`$short","line_length_linter" -"data-raw/04-dates.R",89,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",92,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$days$`stand-alone`$wide","line_length_linter" -"data-raw/04-dates.R",93,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",97,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",100,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$quarters$format$abbreviated","line_length_linter" -"data-raw/04-dates.R",101,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",104,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$quarters$format$narrow","line_length_linter" -"data-raw/04-dates.R",105,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",108,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$quarters$format$wide","line_length_linter" -"data-raw/04-dates.R",109,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",112,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$quarters$`stand-alone`$abbreviated","line_length_linter" -"data-raw/04-dates.R",113,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",116,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$quarters$`stand-alone`$narrow","line_length_linter" -"data-raw/04-dates.R",117,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",120,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$quarters$`stand-alone`$wide","line_length_linter" -"data-raw/04-dates.R",121,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",125,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",128,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dayPeriods$format$abbreviated","line_length_linter" -"data-raw/04-dates.R",129,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",132,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dayPeriods$format$narrow","line_length_linter" -"data-raw/04-dates.R",133,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",136,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dayPeriods$format$wide","line_length_linter" -"data-raw/04-dates.R",137,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",140,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dayPeriods$`stand-alone`$abbreviated","line_length_linter" -"data-raw/04-dates.R",141,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",144,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dayPeriods$`stand-alone`$narrow","line_length_linter" -"data-raw/04-dates.R",145,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",148,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dayPeriods$`stand-alone`$wide","line_length_linter" -"data-raw/04-dates.R",149,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",153,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",157,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",161,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",165,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",169,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",173,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",177,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",181,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",183,20,"style","Trailing whitespace is superfluous."," time_skeletons <- ","trailing_whitespace_linter" -"data-raw/04-dates.R",185,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",188,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dateTimeFormats[1:4]","line_length_linter" -"data-raw/04-dates.R",189,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",192,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dateTimeFormats[[5]]","line_length_linter" -"data-raw/04-dates.R",193,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",196,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dateTimeFormats$appendItems","line_length_linter" -"data-raw/04-dates.R",197,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",200,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dateTimeFormats$intervalFormats","line_length_linter" -"data-raw/04-dates.R",201,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",244,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",247,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",259,66,"style","Trailing whitespace is superfluous."," months_format_abbrev, months_format_narrow, months_format_wide, ","trailing_whitespace_linter" -"data-raw/04-dates.R",264,72,"style","Trailing whitespace is superfluous."," quarters_format_abbrev, quarters_format_narrow, quarters_format_wide, ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",15,35,"style","Trailing whitespace is superfluous."," dates_generic_json_url_locale <- ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",18,53,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-dates-full/main"", ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",33,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",36,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$months$format$abbreviated","line_length_linter" -"data-raw/05-dates_generic.R",37,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",41,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",45,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",48,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$months$`stand-alone`$abbreviated","line_length_linter" -"data-raw/05-dates_generic.R",49,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",52,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$months$`stand-alone`$narrow","line_length_linter" -"data-raw/05-dates_generic.R",53,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",56,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$months$`stand-alone`$wide","line_length_linter" -"data-raw/05-dates_generic.R",57,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",61,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",65,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",69,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",73,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",77,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",80,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$days$`stand-alone`$abbreviated","line_length_linter" -"data-raw/05-dates_generic.R",81,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",84,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$days$`stand-alone`$narrow","line_length_linter" -"data-raw/05-dates_generic.R",85,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",88,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$days$`stand-alone`$short","line_length_linter" -"data-raw/05-dates_generic.R",89,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",93,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",97,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",100,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$quarters$format$abbreviated","line_length_linter" -"data-raw/05-dates_generic.R",101,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",105,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",109,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",112,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$quarters$`stand-alone`$abbreviated","line_length_linter" -"data-raw/05-dates_generic.R",113,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",116,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$quarters$`stand-alone`$narrow","line_length_linter" -"data-raw/05-dates_generic.R",117,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",120,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$quarters$`stand-alone`$wide","line_length_linter" -"data-raw/05-dates_generic.R",121,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",125,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",128,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$dayPeriods$format$abbreviated","line_length_linter" -"data-raw/05-dates_generic.R",129,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",132,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$dayPeriods$format$narrow","line_length_linter" -"data-raw/05-dates_generic.R",133,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",137,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",140,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$dayPeriods$`stand-alone`$abbreviated","line_length_linter" -"data-raw/05-dates_generic.R",141,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",144,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$dayPeriods$`stand-alone`$narrow","line_length_linter" -"data-raw/05-dates_generic.R",145,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",148,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$dayPeriods$`stand-alone`$wide","line_length_linter" -"data-raw/05-dates_generic.R",149,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",153,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",157,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",161,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",165,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",169,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",173,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",177,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",181,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",183,20,"style","Trailing whitespace is superfluous."," time_skeletons <- ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",185,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",189,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",193,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",196,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$dateTimeFormats$appendItems","line_length_linter" -"data-raw/05-dates_generic.R",197,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",200,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$dateTimeFormats$intervalFormats","line_length_linter" -"data-raw/05-dates_generic.R",201,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",244,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",247,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",15,29,"style","Trailing whitespace is superfluous."," numbers_json_url_locale <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",18,55,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-numbers-full/main"", ","trailing_whitespace_linter" -"data-raw/06-numbers.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" -"data-raw/06-numbers.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",33,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",37,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",41,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",43,13,"style","Trailing whitespace is superfluous."," decimal <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",45,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",47,11,"style","Trailing whitespace is superfluous."," group <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",49,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",51,10,"style","Trailing whitespace is superfluous."," list <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",53,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",55,18,"style","Trailing whitespace is superfluous."," percent_sign <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",57,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",59,15,"style","Trailing whitespace is superfluous."," plus_sign <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",61,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",63,16,"style","Trailing whitespace is superfluous."," minus_sign <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",65,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",67,17,"style","Trailing whitespace is superfluous."," approx_sign <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",69,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",71,14,"style","Trailing whitespace is superfluous."," exp_sign <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",73,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",75,13,"style","Trailing whitespace is superfluous."," sup_exp <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",76,81,"style","Lines should not be more than 80 characters."," numbers_data$main[[1]]$numbers$`symbols-numberSystem-latn`$superscriptingExponent","line_length_linter" -"data-raw/06-numbers.R",77,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",79,15,"style","Trailing whitespace is superfluous."," per_mille <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",81,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",83,14,"style","Trailing whitespace is superfluous."," infinity <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",85,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",87,9,"style","Trailing whitespace is superfluous."," nan <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",89,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",91,14,"style","Trailing whitespace is superfluous."," time_sep <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",93,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",95,20,"style","Trailing whitespace is superfluous."," approx_pattern <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",96,81,"style","Lines should not be more than 80 characters."," numbers_data$main[[1]]$numbers$`miscPatterns-numberSystem-latn`$approximately","line_length_linter" -"data-raw/06-numbers.R",97,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",99,22,"style","Trailing whitespace is superfluous."," at_least_pattern <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",101,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",103,21,"style","Trailing whitespace is superfluous."," at_most_pattern <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",105,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",107,19,"style","Trailing whitespace is superfluous."," range_pattern <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",109,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",113,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",116,81,"style","Lines should not be more than 80 characters."," numbers_data$main[[1]]$numbers$`scientificFormats-numberSystem-latn`$standard","line_length_linter" -"data-raw/06-numbers.R",117,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",121,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",125,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",128,81,"style","Lines should not be more than 80 characters."," numbers_data$main[[1]]$numbers$`currencyFormats-numberSystem-latn`$accounting","line_length_linter" -"data-raw/06-numbers.R",129,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",141,17,"style","Put spaces around all infix operators."," plus_sign =plus_sign,","infix_spaces_linter" -"data-raw/06-numbers.R",160,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",163,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/07-currencies.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/07-currencies.R",15,32,"style","Trailing whitespace is superfluous."," currencies_json_url_locale <- ","trailing_whitespace_linter" -"data-raw/07-currencies.R",18,55,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-numbers-full/main"", ","trailing_whitespace_linter" -"data-raw/07-currencies.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" -"data-raw/07-currencies.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/07-currencies.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/07-currencies.R",31,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/07-currencies.R",41,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/07-currencies.R",49,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/07-currencies.R",63,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/07-currencies.R",77,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/07-currencies.R",78,3,"style","Variable and function names should not be longer than 30 characters."," currency_display_name_count_other <-","object_length_linter" -"data-raw/07-currencies.R",91,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/07-currencies.R",103,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/07-currencies.R",106,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/08-characters.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/08-characters.R",15,16,"style","Trailing whitespace is superfluous."," characters <- ","trailing_whitespace_linter" -"data-raw/08-characters.R",18,52,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-misc-full/main"", ","trailing_whitespace_linter" -"data-raw/08-characters.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" -"data-raw/08-characters.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/08-characters.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/08-characters.R",36,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/08-characters.R",38,81,"style","Lines should not be more than 80 characters."," leninent_scope_general <- characters_data$main[[1]]$characters$`lenient-scope-general`","line_length_linter" -"data-raw/08-characters.R",39,81,"style","Lines should not be more than 80 characters."," leninent_scope_date <- characters_data$main[[1]]$characters$`lenient-scope-date`","line_length_linter" -"data-raw/08-characters.R",40,81,"style","Lines should not be more than 80 characters."," leninent_scope_number <- characters_data$main[[1]]$characters$`lenient-scope-number`","line_length_linter" -"data-raw/08-characters.R",41,81,"style","Lines should not be more than 80 characters."," stricter_scope_number <- characters_data$main[[1]]$characters$`stricter-scope-number`","line_length_linter" -"data-raw/08-characters.R",42,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/08-characters.R",59,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/08-characters.R",62,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/09-character_labels.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/09-character_labels.R",15,17,"style","Trailing whitespace is superfluous."," char_labels <- ","trailing_whitespace_linter" -"data-raw/09-character_labels.R",18,52,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-misc-full/main"", ","trailing_whitespace_linter" -"data-raw/09-character_labels.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" -"data-raw/09-character_labels.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/09-character_labels.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/09-character_labels.R",31,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/09-character_labels.R",33,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/09-character_labels.R",41,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/09-character_labels.R",44,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/10-delimiters.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/10-delimiters.R",15,16,"style","Trailing whitespace is superfluous."," delimiters <- ","trailing_whitespace_linter" -"data-raw/10-delimiters.R",18,52,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-misc-full/main"", ","trailing_whitespace_linter" -"data-raw/10-delimiters.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" -"data-raw/10-delimiters.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/10-delimiters.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/10-delimiters.R",32,81,"style","Lines should not be more than 80 characters."," alt_quotation_start <- delimiters_data$main[[1]]$delimiters$alternateQuotationStart","line_length_linter" -"data-raw/10-delimiters.R",33,81,"style","Lines should not be more than 80 characters."," alt_quotation_end <- delimiters_data$main[[1]]$delimiters$alternateQuotationEnd","line_length_linter" -"data-raw/10-delimiters.R",44,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/10-delimiters.R",47,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/10-delimiters.R",59,74,"style","Trailing whitespace is superfluous."," quotation_start, quotation_end, alt_quotation_start, alt_quotation_end, ","trailing_whitespace_linter" -"data-raw/11-layout.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/11-layout.R",15,12,"style","Trailing whitespace is superfluous."," layout <- ","trailing_whitespace_linter" -"data-raw/11-layout.R",18,52,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-misc-full/main"", ","trailing_whitespace_linter" -"data-raw/11-layout.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" -"data-raw/11-layout.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/11-layout.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/11-layout.R",40,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/11-layout.R",43,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/12-script_metadata.R",8,15,"style","Trailing whitespace is superfluous.","script_meta <- ","trailing_whitespace_linter" -"data-raw/12-script_metadata.R",10,81,"style","Lines should not be more than 80 characters."," ""https://raw.githubusercontent.com/unicode-org/cldr-json/main/cldr-json/cldr-core"", ","line_length_linter" -"data-raw/12-script_metadata.R",10,88,"style","Trailing whitespace is superfluous."," ""https://raw.githubusercontent.com/unicode-org/cldr-json/main/cldr-json/cldr-core"", ","trailing_whitespace_linter" -"data-raw/12-script_metadata.R",30,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/12-script_metadata.R",41,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/12-script_metadata.R",49,31,"style","Trailing whitespace is superfluous."," lb_letters = lb_letters, ","trailing_whitespace_linter" -"data-raw/12-script_metadata.R",57,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/12-script_metadata.R",59,81,"style","Lines should not be more than 80 characters."," script_metadata_tbl <- dplyr::bind_rows(script_metadata_tbl, script_metadata_row_i)","line_length_linter" -"data-raw/12-script_metadata.R",60,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/12-script_metadata.R",63,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/13-units.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/13-units.R",15,11,"style","Trailing whitespace is superfluous."," units <- ","trailing_whitespace_linter" -"data-raw/13-units.R",18,53,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-units-full/main"", ","trailing_whitespace_linter" -"data-raw/13-units.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" -"data-raw/13-units.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/13-units.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/13-units.R",33,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/13-units.R",41,42,"style","Trailing whitespace is superfluous."," dplyr::mutate(unit = names(long)) %>% ","trailing_whitespace_linter" -"data-raw/13-units.R",45,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/13-units.R",53,43,"style","Trailing whitespace is superfluous."," dplyr::mutate(unit = names(short)) %>% ","trailing_whitespace_linter" -"data-raw/13-units.R",57,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/13-units.R",65,44,"style","Trailing whitespace is superfluous."," dplyr::mutate(unit = names(narrow)) %>% ","trailing_whitespace_linter" -"data-raw/13-units.R",81,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/13-units.R",84,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/13-units.R",91,19,"style","Trailing whitespace is superfluous.","colnames_sorted <- ","trailing_whitespace_linter" -"data-raw/13-units.R",118,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/14-tz_exemplar.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/14-tz_exemplar.R",15,17,"style","Trailing whitespace is superfluous."," tz_exemplar <- ","trailing_whitespace_linter" -"data-raw/14-tz_exemplar.R",18,53,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-dates-full/main"", ","trailing_whitespace_linter" -"data-raw/14-tz_exemplar.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" -"data-raw/14-tz_exemplar.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/14-tz_exemplar.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/14-tz_exemplar.R",31,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/14-tz_exemplar.R",33,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/14-tz_exemplar.R",35,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/14-tz_exemplar.R",39,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/14-tz_exemplar.R",40,28,"style","Trailing whitespace is superfluous."," names(exemplar_cities) <- ","trailing_whitespace_linter" -"data-raw/14-tz_exemplar.R",42,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/14-tz_exemplar.R",43,27,"style","Trailing whitespace is superfluous."," tz_exemplar_tbl_row_i <- ","trailing_whitespace_linter" -"data-raw/14-tz_exemplar.R",48,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/14-tz_exemplar.R",51,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/15-tz_map.R",8,10,"style","Trailing whitespace is superfluous.","tz_map <- ","trailing_whitespace_linter" -"data-raw/15-tz_map.R",11,54,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-core/supplemental/"", ","trailing_whitespace_linter" -"data-raw/15-tz_map.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/15-tz_map.R",21,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/15-tz_map.R",24,26,"style","Trailing whitespace is superfluous.","colnames(map_data_all) <- ","trailing_whitespace_linter" -"data-raw/16-tz_formats.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/16-tz_formats.R",15,16,"style","Trailing whitespace is superfluous."," tz_formats <- ","trailing_whitespace_linter" -"data-raw/16-tz_formats.R",18,53,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-dates-full/main"", ","trailing_whitespace_linter" -"data-raw/16-tz_formats.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" -"data-raw/16-tz_formats.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/16-tz_formats.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/16-tz_formats.R",31,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/16-tz_formats.R",39,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/16-tz_formats.R",51,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/16-tz_formats.R",54,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/i18n/email-body b/.dev/revdep_emails/i18n/email-body deleted file mode 100644 index 2cf9f9a4c..000000000 --- a/.dev/revdep_emails/i18n/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Richard Iannone! Thank you for using {lintr} in your package {i18n}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/rich-iannone/i18n using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 1s on CRAN vs. 5s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/jpmesh/attachments/jpmesh.warnings b/.dev/revdep_emails/jpmesh/attachments/jpmesh.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/jpmesh/attachments/jpmesh.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/jpmesh/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/jpmesh/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 25badc69e..000000000 --- a/.dev/revdep_emails/jpmesh/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,3 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/administration_mesh.R",54,44,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (to_mesh_size <= mesh_units[5] & to_mesh_size >= mesh_units[7]) {","vector_logic_linter" -"R/coords_to_mesh.R",48,39,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!rlang::is_missing(longitude) | !rlang::is_missing(latitude))","vector_logic_linter" diff --git a/.dev/revdep_emails/jpmesh/email-body b/.dev/revdep_emails/jpmesh/email-body deleted file mode 100644 index df021afd6..000000000 --- a/.dev/revdep_emails/jpmesh/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Shinya Uryu! Thank you for using {lintr} in your package {jpmesh}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/uribo/jpmesh using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 14s on CRAN vs. 9s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/languageserver/attachments/languageserver.warnings b/.dev/revdep_emails/languageserver/attachments/languageserver.warnings deleted file mode 100644 index 182961f94..000000000 --- a/.dev/revdep_emails/languageserver/attachments/languageserver.warnings +++ /dev/null @@ -1,2 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Trying to remove β€˜camel_case_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/languageserver/email-body b/.dev/revdep_emails/languageserver/email-body deleted file mode 100644 index e385e3d24..000000000 --- a/.dev/revdep_emails/languageserver/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Randy Lai! Thank you for using {lintr} in your package {languageserver}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/REditorSupport/languageserver using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 33s on CRAN vs. 10s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/latrend/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/latrend/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 6cf6f9344..000000000 --- a/.dev/revdep_emails/latrend/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,35 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/test-cases/data-na.R",50,13,"style","Variable and function name style should be snake_case.","testData2[, Value := replace(Value, .GRP %% M + 1L, NA), by = Id]","object_name_linter" -"R/data.R",168,13,"style","Variable and function name style should be snake_case."," alldata[, Mu.class := rowSums(Xc * t(clusterCoefs)[Class, ])]","object_name_linter" -"R/data.R",191,15,"style","Variable and function name style should be snake_case."," alldata[, Mu.random := rowSums(Xr * idCoefs[Id, ])]","object_name_linter" -"R/data.R",193,15,"style","Variable and function name style should be snake_case."," alldata[, Mu := Mu.fixed + Mu.class + Mu.random]","object_name_linter" -"R/data.R",195,15,"style","Variable and function name style should be snake_case."," alldata[, Mu := Mu.fixed + Mu.class]","object_name_linter" -"R/data.R",205,13,"style","Variable and function name style should be snake_case."," alldata[, Value := Mu + rnoise(.N, 0, noiseScales[Class])]","object_name_linter" -"R/data.R",215,13,"style","Variable and function name style should be snake_case."," alldata[, Class := factor(clusterNames[Class], levels = clusterNames)]","object_name_linter" -"R/matrix.R",161,10,"style","Variable and function name style should be snake_case."," dt[, .Fill := FALSE]","object_name_linter" -"R/matrix.R",166,10,"style","Variable and function name style should be snake_case."," dt[, .Fill := NULL]","object_name_linter" -"R/methodStratify.R",216,11,"style","Variable and function name style should be snake_case."," out[, Cluster := as.integer(Cluster) + 1L]","object_name_linter" -"R/model.R",948,15,"style","Variable and function name style should be snake_case."," newdata[, Cluster := factor(Cluster, levels = clusterNames(object))]","object_name_linter" -"R/model.R",961,38,"style","Variable and function name style should be snake_case."," lapply(function(cdata) cdata[, Cluster := NULL])","object_name_linter" -"R/model.R",1289,15,"style","Variable and function name style should be snake_case."," rawdata[, Cluster := trajAssignments[make.idRowIndices(object)]]","object_name_linter" -"R/modelCustom.R",197,19,"style","Place a space before left parenthesis, except in a function call."," object@predict(object, newdata, what, ...)","spaces_left_parentheses_linter" -"R/modelCustom.R",228,11,"style","Variable and function name style should be snake_case."," .[, Cluster := factor(Cluster,","object_name_linter" -"R/modelLcmmGMM.R",22,37,"style","Variable and function name style should be snake_case."," dataIndex[object@model$na.action, Include := FALSE]","object_name_linter" -"R/modelMixtoolsRM.R",57,11,"style","Variable and function name style should be snake_case."," .[, Time := times[.Block]] %>%","object_name_linter" -"R/modelMixtoolsRM.R",59,11,"style","Variable and function name style should be snake_case."," .[, .Component := NULL] %>%","object_name_linter" -"R/modelMixtoolsRM.R",60,11,"style","Variable and function name style should be snake_case."," .[, .Block := NULL] %>%","object_name_linter" -"R/models.R",515,9,"style","Variable and function name style should be snake_case."," .[, .ROW_INDEX := .I] %>%","object_name_linter" -"R/test.R",74,10,"style","Variable and function name style should be snake_case."," data[, Id := as.character(Id)]","object_name_linter" -"R/test.R",75,10,"style","Variable and function name style should be snake_case."," data[, Cluster := as.character(Cluster)]","object_name_linter" -"tests/testthat/setup-data.R",22,7,"style","Variable and function name style should be snake_case."," .[, Constant := 1] %>%","object_name_linter" -"tests/testthat/setup-data.R",23,7,"style","Variable and function name style should be snake_case."," .[, Cluster := Class]","object_name_linter" -"tests/testthat/test-akmedoids.R",24,12,"style","Variable and function name style should be snake_case.","trajData[, Cluster := LETTERS[as.integer(Id) %% 3 + 1]]","object_name_linter" -"tests/testthat/test-assert.R",197,32,"style","Variable and function name style should be snake_case."," .[Traj == unique(Traj)[2], Value := NA]","object_name_linter" -"tests/testthat/test-cluslong.R",111,23,"style","Variable and function name style should be snake_case."," .[sample(.N, 10), Traj := NA]","object_name_linter" -"tests/testthat/test-cluslong.R",118,9,"style","Variable and function name style should be snake_case."," .[, Traj := factor(Traj)]","object_name_linter" -"tests/testthat/test-cluslong.R",128,9,"style","Variable and function name style should be snake_case."," .[, Traj := factor(Traj, levels = rev(unique(Traj)))]","object_name_linter" -"tests/testthat/test-cluslong.R",138,9,"style","Variable and function name style should be snake_case."," .[, Traj := factor(Traj, levels = seq(0, uniqueN(Traj) + 1))]","object_name_linter" -"tests/testthat/test-cluslong.R",147,18,"style","Variable and function name style should be snake_case."," .[Traj == 1, Traj := NA]","object_name_linter" -"tests/testthat/test-cluslong.R",165,23,"style","Variable and function name style should be snake_case."," .[sample(.N, 10), Value := NA]","object_name_linter" -"tests/testthat/test-cluslong.R",175,23,"style","Variable and function name style should be snake_case."," .[sample(.N, 10), Value := Inf]","object_name_linter" -"tests/testthat/test-crimcv.R",32,7,"style","Variable and function name style should be snake_case."," .[, Cluster := rep(LETTERS[1:3], each = 33 * ncol(subTO1adj))]","object_name_linter" diff --git a/.dev/revdep_emails/latrend/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/latrend/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index c3fd426a9..000000000 --- a/.dev/revdep_emails/latrend/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,331 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"data-raw/latrendData.R",6,1,"style","Variable and function name style should be snake_case or symbols.","latrendData = generateLongData(","object_name_linter" -"data-raw/latrendData.R",6,13,"style","Use <-, not =, for assignment.","latrendData = generateLongData(","assignment_linter" -"data-raw/latrendData.R",11,8,"style","Only use double-quotes."," id = 'Id',","single_quotes_linter" -"data-raw/latrendData.R",17,24,"style","Only use double-quotes."," clusterNames = paste('Class', 1:3),","single_quotes_linter" -"data-raw/latrendData.R",22,42,"style","Only use double-quotes.","plotTrajectories(latrendData, response = 'Y')","single_quotes_linter" -"data-raw/latrendData.R",23,42,"style","Only use double-quotes.","plotTrajectories(latrendData, response = 'Y', cluster = 'Class', facet = FALSE)","single_quotes_linter" -"data-raw/latrendData.R",23,57,"style","Only use double-quotes.","plotTrajectories(latrendData, response = 'Y', cluster = 'Class', facet = FALSE)","single_quotes_linter" -"data-raw/latrendData.R",24,42,"style","Only use double-quotes.","plotTrajectories(latrendData, response = 'Y', cluster = 'Class', facet = TRUE)","single_quotes_linter" -"data-raw/latrendData.R",24,57,"style","Only use double-quotes.","plotTrajectories(latrendData, response = 'Y', cluster = 'Class', facet = TRUE)","single_quotes_linter" -"data-raw/osa-adherence-data.R",6,81,"style","Lines should not be more than 80 characters.","#' @description Generates data from the group definitions provided by M. Aloia et al. (2008).","line_length_linter" -"data-raw/osa-adherence-data.R",16,81,"style","Lines should not be more than 80 characters.","#' @param missing Whether to simulate measurements being missing (including drop-out)","line_length_linter" -"data-raw/osa-adherence-data.R",19,81,"style","Lines should not be more than 80 characters.","#' Mark S. Aloia, Matthew S. Goodwin, Wayne F. Velicer, J. Todd Arnedt, Molly Zimmerman, Jaime Skrekas, Sarah Harris, Richard P. Millman,","line_length_linter" -"data-raw/osa-adherence-data.R",20,81,"style","Lines should not be more than 80 characters.","#' Time Series Analysis of Treatment Adherence Patterns in Individuals with Obstructive Sleep Apnea, Annals of Behavioral Medicine,","line_length_linter" -"data-raw/osa-adherence-data.R",21,81,"style","Lines should not be more than 80 characters.","#' Volume 36, Issue 1, August 2008, Pages 44–53, https://doi.org/10.1007/s12160-008-9052-9","line_length_linter" -"data-raw/osa-adherence-data.R",22,19,"style","Use <-, not =, for assignment.","generate_osa_data = function(","assignment_linter" -"data-raw/osa-adherence-data.R",25,3,"style","Variable and function name style should be snake_case or symbols."," nAggr = 14,","object_name_linter" -"data-raw/osa-adherence-data.R",37,3,"style","Variable and function name style should be snake_case or symbols."," dropoutTimes = c(Inf, Inf, Inf, Inf, Inf, 90, 30),","object_name_linter" -"data-raw/osa-adherence-data.R",38,3,"style","Variable and function name style should be snake_case or symbols."," sd.dropoutTimes = c(0, 0, 0, 0, 0, 30, 10),","object_name_linter" -"data-raw/osa-adherence-data.R",39,3,"style","Variable and function name style should be snake_case or symbols."," attemptProbs = c(354, 344, 280, 299, 106, 55, 14) / pmin(dropoutTimes, 365),","object_name_linter" -"data-raw/osa-adherence-data.R",50,3,"style","Variable and function name style should be snake_case or symbols."," sd.intercepts = c(","object_name_linter" -"data-raw/osa-adherence-data.R",68,3,"style","Variable and function name style should be snake_case or symbols."," sd.slopes = c(","object_name_linter" -"data-raw/osa-adherence-data.R",86,3,"style","Variable and function name style should be snake_case or symbols."," sd.quads = c(","object_name_linter" -"data-raw/osa-adherence-data.R",104,3,"style","Variable and function name style should be snake_case or symbols."," sd.vars = c(","object_name_linter" -"data-raw/osa-adherence-data.R",122,3,"style","Variable and function name style should be snake_case or symbols."," groupNames = c(","object_name_linter" -"data-raw/osa-adherence-data.R",123,5,"style","Only use double-quotes."," 'Good users',","single_quotes_linter" -"data-raw/osa-adherence-data.R",124,5,"style","Only use double-quotes."," 'Slow improvers',","single_quotes_linter" -"data-raw/osa-adherence-data.R",125,5,"style","Only use double-quotes."," 'Slow decliners',","single_quotes_linter" -"data-raw/osa-adherence-data.R",126,5,"style","Only use double-quotes."," 'Variable users',","single_quotes_linter" -"data-raw/osa-adherence-data.R",127,5,"style","Only use double-quotes."," 'Occasional attempters',","single_quotes_linter" -"data-raw/osa-adherence-data.R",128,5,"style","Only use double-quotes."," 'Early drop-outs',","single_quotes_linter" -"data-raw/osa-adherence-data.R",129,5,"style","Only use double-quotes."," 'Non-users'","single_quotes_linter" -"data-raw/osa-adherence-data.R",134,3,"style","Variable and function name style should be snake_case or symbols."," groupCounts = floor(patients * props)","object_name_linter" -"data-raw/osa-adherence-data.R",134,15,"style","Use <-, not =, for assignment."," groupCounts = floor(patients * props)","assignment_linter" -"data-raw/osa-adherence-data.R",135,3,"style","Variable and function name style should be snake_case or symbols."," incrIdx = order((patients * props) %% 1) %>%","object_name_linter" -"data-raw/osa-adherence-data.R",135,11,"style","Use <-, not =, for assignment."," incrIdx = order((patients * props) %% 1) %>%","assignment_linter" -"data-raw/osa-adherence-data.R",137,3,"style","Variable and function name style should be snake_case or symbols."," groupCounts[incrIdx] = groupCounts[incrIdx] + 1 # increment the groups that were closest to receiving another patient","object_name_linter" -"data-raw/osa-adherence-data.R",137,24,"style","Use <-, not =, for assignment."," groupCounts[incrIdx] = groupCounts[incrIdx] + 1 # increment the groups that were closest to receiving another patient","assignment_linter" -"data-raw/osa-adherence-data.R",137,81,"style","Lines should not be more than 80 characters."," groupCounts[incrIdx] = groupCounts[incrIdx] + 1 # increment the groups that were closest to receiving another patient","line_length_linter" -"data-raw/osa-adherence-data.R",139,3,"style","Variable and function name style should be snake_case or symbols."," groupNames = factor(groupNames, levels = groupNames)","object_name_linter" -"data-raw/osa-adherence-data.R",139,14,"style","Use <-, not =, for assignment."," groupNames = factor(groupNames, levels = groupNames)","assignment_linter" -"data-raw/osa-adherence-data.R",142,3,"style","Variable and function name style should be snake_case or symbols."," groupCoefs = data.table(","object_name_linter" -"data-raw/osa-adherence-data.R",142,14,"style","Use <-, not =, for assignment."," groupCoefs = data.table(","assignment_linter" -"data-raw/osa-adherence-data.R",159,3,"style","Variable and function name style should be snake_case or symbols."," patCoefs = groupCoefs[, .(","object_name_linter" -"data-raw/osa-adherence-data.R",159,12,"style","Use <-, not =, for assignment."," patCoefs = groupCoefs[, .(","assignment_linter" -"data-raw/osa-adherence-data.R",160,19,"warning","no visible binding for global variable β€˜Patients’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" -"data-raw/osa-adherence-data.R",160,19,"warning","no visible binding for global variable β€˜Patients’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" -"data-raw/osa-adherence-data.R",160,19,"warning","no visible binding for global variable β€˜Patients’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" -"data-raw/osa-adherence-data.R",160,19,"warning","no visible binding for global variable β€˜Patients’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" -"data-raw/osa-adherence-data.R",160,19,"warning","no visible binding for global variable β€˜Patients’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" -"data-raw/osa-adherence-data.R",160,19,"warning","no visible binding for global variable β€˜Patients’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" -"data-raw/osa-adherence-data.R",160,29,"warning","no visible binding for global variable β€˜TDrop’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" -"data-raw/osa-adherence-data.R",160,36,"warning","no visible binding for global variable β€˜Sd.TDrop’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" -"data-raw/osa-adherence-data.R",161,13,"warning","no visible binding for global variable β€˜AProb’"," AProb = AProb,","object_usage_linter" -"data-raw/osa-adherence-data.R",162,33,"warning","no visible binding for global variable β€˜Int’"," Intercept = rnorm(Patients, Int, Sd.Int) %>% pmax(0),","object_usage_linter" -"data-raw/osa-adherence-data.R",162,38,"warning","no visible binding for global variable β€˜Sd.Int’"," Intercept = rnorm(Patients, Int, Sd.Int) %>% pmax(0),","object_usage_linter" -"data-raw/osa-adherence-data.R",163,29,"warning","no visible binding for global variable β€˜Slope’"," Slope = rnorm(Patients, Slope, Sd.Slope),","object_usage_linter" -"data-raw/osa-adherence-data.R",163,36,"warning","no visible binding for global variable β€˜Sd.Slope’"," Slope = rnorm(Patients, Slope, Sd.Slope),","object_usage_linter" -"data-raw/osa-adherence-data.R",164,28,"warning","no visible binding for global variable β€˜Quad’"," Quad = rnorm(Patients, Quad, Sd.Quad),","object_usage_linter" -"data-raw/osa-adherence-data.R",164,34,"warning","no visible binding for global variable β€˜Sd.Quad’"," Quad = rnorm(Patients, Quad, Sd.Quad),","object_usage_linter" -"data-raw/osa-adherence-data.R",165,32,"warning","no visible binding for global variable β€˜Var’"," Variance = rnorm(Patients, Var, Sd.Var) %>% pmax(.75),","object_usage_linter" -"data-raw/osa-adherence-data.R",165,37,"warning","no visible binding for global variable β€˜Sd.Var’"," Variance = rnorm(Patients, Var, Sd.Var) %>% pmax(.75),","object_usage_linter" -"data-raw/osa-adherence-data.R",166,13,"warning","no visible binding for global variable β€˜R’"," R = rep(R, Patients)","object_usage_linter" -"data-raw/osa-adherence-data.R",167,11,"warning","no visible binding for global variable β€˜Group’"," ), by = Group]","object_usage_linter" -"data-raw/osa-adherence-data.R",170,3,"style","Variable and function name style should be snake_case or symbols."," genTs = function(N,","object_name_linter" -"data-raw/osa-adherence-data.R",170,9,"style","Use <-, not =, for assignment."," genTs = function(N,","assignment_linter" -"data-raw/osa-adherence-data.R",170,20,"style","Variable and function name style should be snake_case or symbols."," genTs = function(N,","object_name_linter" -"data-raw/osa-adherence-data.R",171,5,"style","Variable and function name style should be snake_case or symbols."," Intercept,","object_name_linter" -"data-raw/osa-adherence-data.R",172,5,"style","Variable and function name style should be snake_case or symbols."," Slope,","object_name_linter" -"data-raw/osa-adherence-data.R",173,5,"style","Variable and function name style should be snake_case or symbols."," Quad,","object_name_linter" -"data-raw/osa-adherence-data.R",174,5,"style","Variable and function name style should be snake_case or symbols."," Variance,","object_name_linter" -"data-raw/osa-adherence-data.R",175,5,"style","Variable and function name style should be snake_case or symbols."," R,","object_name_linter" -"data-raw/osa-adherence-data.R",176,5,"style","Variable and function name style should be snake_case or symbols."," AProb,","object_name_linter" -"data-raw/osa-adherence-data.R",177,5,"style","Variable and function name style should be snake_case or symbols."," TDrop,","object_name_linter" -"data-raw/osa-adherence-data.R",179,7,"style","Use <-, not =, for assignment."," y = as.numeric(Intercept + times * Slope + times ^ 2 * Quad + arima.sim(list(ar = R),","assignment_linter" -"data-raw/osa-adherence-data.R",179,81,"style","Lines should not be more than 80 characters."," y = as.numeric(Intercept + times * Slope + times ^ 2 * Quad + arima.sim(list(ar = R),","line_length_linter" -"data-raw/osa-adherence-data.R",183,5,"style","Variable and function name style should be snake_case or symbols."," skipMask = !rbinom(length(times), size = 1, prob = AProb)","object_name_linter" -"data-raw/osa-adherence-data.R",183,14,"style","Use <-, not =, for assignment."," skipMask = !rbinom(length(times), size = 1, prob = AProb)","assignment_linter" -"data-raw/osa-adherence-data.R",184,17,"style","Use <-, not =, for assignment."," y[skipMask] = 0","assignment_linter" -"data-raw/osa-adherence-data.R",187,7,"style","Variable and function name style should be snake_case or symbols."," obsMask = times <= TDrop","object_name_linter" -"data-raw/osa-adherence-data.R",187,15,"style","Use <-, not =, for assignment."," obsMask = times <= TDrop","assignment_linter" -"data-raw/osa-adherence-data.R",190,24,"style","Use <-, not =, for assignment."," y[times > TDrop] = 0","assignment_linter" -"data-raw/osa-adherence-data.R",195,3,"style","Variable and function name style should be snake_case or symbols."," patNames = paste0('P', 1:patients)","object_name_linter" -"data-raw/osa-adherence-data.R",195,12,"style","Use <-, not =, for assignment."," patNames = paste0('P', 1:patients)","assignment_linter" -"data-raw/osa-adherence-data.R",195,21,"style","Only use double-quotes."," patNames = paste0('P', 1:patients)","single_quotes_linter" -"data-raw/osa-adherence-data.R",196,11,"style","Use <-, not =, for assignment."," alldata = patCoefs[, do.call(genTs, .SD), by = .(Group, Id = factor(patNames, levels = patNames))] %>%","assignment_linter" -"data-raw/osa-adherence-data.R",196,52,"warning","no visible binding for global variable β€˜Group’"," alldata = patCoefs[, do.call(genTs, .SD), by = .(Group, Id = factor(patNames, levels = patNames))] %>%","object_usage_linter" -"data-raw/osa-adherence-data.R",196,81,"style","Lines should not be more than 80 characters."," alldata = patCoefs[, do.call(genTs, .SD), by = .(Group, Id = factor(patNames, levels = patNames))] %>%","line_length_linter" -"data-raw/osa-adherence-data.R",200,3,"style","Variable and function name style should be snake_case or symbols."," groupTrajs = groupCoefs[, .(","object_name_linter" -"data-raw/osa-adherence-data.R",200,14,"style","Use <-, not =, for assignment."," groupTrajs = groupCoefs[, .(","assignment_linter" -"data-raw/osa-adherence-data.R",202,19,"warning","no visible binding for global variable β€˜Int’"," Usage = (pmax(Int + times * Slope + times ^ 2 * Quad, 0) * AProb) %>% ifelse(times > TDrop, 0, .)","object_usage_linter" -"data-raw/osa-adherence-data.R",202,33,"warning","no visible binding for global variable β€˜Slope’"," Usage = (pmax(Int + times * Slope + times ^ 2 * Quad, 0) * AProb) %>% ifelse(times > TDrop, 0, .)","object_usage_linter" -"data-raw/osa-adherence-data.R",202,53,"warning","no visible binding for global variable β€˜Quad’"," Usage = (pmax(Int + times * Slope + times ^ 2 * Quad, 0) * AProb) %>% ifelse(times > TDrop, 0, .)","object_usage_linter" -"data-raw/osa-adherence-data.R",202,64,"warning","no visible binding for global variable β€˜AProb’"," Usage = (pmax(Int + times * Slope + times ^ 2 * Quad, 0) * AProb) %>% ifelse(times > TDrop, 0, .)","object_usage_linter" -"data-raw/osa-adherence-data.R",202,81,"style","Lines should not be more than 80 characters."," Usage = (pmax(Int + times * Slope + times ^ 2 * Quad, 0) * AProb) %>% ifelse(times > TDrop, 0, .)","line_length_linter" -"data-raw/osa-adherence-data.R",202,90,"warning","no visible binding for global variable β€˜TDrop’"," Usage = (pmax(Int + times * Slope + times ^ 2 * Quad, 0) * AProb) %>% ifelse(times > TDrop, 0, .)","object_usage_linter" -"data-raw/osa-adherence-data.R",203,13,"warning","no visible binding for global variable β€˜Group’"," ), by = Group]","object_usage_linter" -"data-raw/osa-adherence-data.R",205,20,"style","Only use double-quotes."," setattr(alldata, 'patCoefs', patCoefs)","single_quotes_linter" -"data-raw/osa-adherence-data.R",206,20,"style","Only use double-quotes."," setattr(alldata, 'groupCoefs', groupCoefs)","single_quotes_linter" -"data-raw/osa-adherence-data.R",207,20,"style","Only use double-quotes."," setattr(alldata, 'groupTrajs', groupTrajs)","single_quotes_linter" -"data-raw/osa-adherence-data.R",211,13,"style","Use <-, not =, for assignment."," alldata = transformToAverage(alldata, binSize = nAggr)","assignment_linter" -"data-raw/osa-adherence-data.R",211,15,"warning","no visible global function definition for β€˜transformToAverage’"," alldata = transformToAverage(alldata, binSize = nAggr)","object_usage_linter" -"data-raw/osa-adherence-data.R",217,1,"style","Variable and function name style should be snake_case or symbols.","transformToAverage = function(data, binSize = 14) {","object_name_linter" -"data-raw/osa-adherence-data.R",217,20,"style","Use <-, not =, for assignment.","transformToAverage = function(data, binSize = 14) {","assignment_linter" -"data-raw/osa-adherence-data.R",217,37,"style","Variable and function name style should be snake_case or symbols.","transformToAverage = function(data, binSize = 14) {","object_name_linter" -"data-raw/osa-adherence-data.R",218,8,"style","Use <-, not =, for assignment."," bins = seq(min(data$Time), max(data$Time), by = binSize)","assignment_linter" -"data-raw/osa-adherence-data.R",219,11,"style","Use <-, not =, for assignment."," bindata = data[, .(Usage = mean(Usage), Time = max(Time)),","assignment_linter" -"data-raw/osa-adherence-data.R",219,35,"warning","no visible binding for global variable β€˜Usage’"," bindata = data[, .(Usage = mean(Usage), Time = max(Time)),","object_usage_linter" -"data-raw/osa-adherence-data.R",221,7,"warning","no visible binding for global variable β€˜Group’"," Group,","object_usage_linter" -"data-raw/osa-adherence-data.R",226,3,"style","Variable and function name style should be snake_case or symbols."," groupTrajs = attr(data, 'groupTrajs')","object_name_linter" -"data-raw/osa-adherence-data.R",226,14,"style","Use <-, not =, for assignment."," groupTrajs = attr(data, 'groupTrajs')","assignment_linter" -"data-raw/osa-adherence-data.R",226,27,"style","Only use double-quotes."," groupTrajs = attr(data, 'groupTrajs')","single_quotes_linter" -"data-raw/osa-adherence-data.R",227,3,"style","Variable and function name style should be snake_case or symbols."," bingroupTrajs = groupTrajs[, .(Usage = mean(Usage)),","object_name_linter" -"data-raw/osa-adherence-data.R",227,17,"style","Use <-, not =, for assignment."," bingroupTrajs = groupTrajs[, .(Usage = mean(Usage)),","assignment_linter" -"data-raw/osa-adherence-data.R",227,47,"warning","no visible binding for global variable β€˜Usage’"," bingroupTrajs = groupTrajs[, .(Usage = mean(Usage)),","object_usage_linter" -"data-raw/osa-adherence-data.R",229,7,"warning","no visible binding for global variable β€˜Group’"," Group,","object_usage_linter" -"data-raw/osa-adherence-data.R",232,22,"warning","no visible binding for global variable β€˜Bin’"," .[, Time := bins[Bin]]","object_usage_linter" -"data-raw/osa-adherence-data.R",234,20,"style","Only use double-quotes."," setattr(bindata, 'groupTrajs', bingroupTrajs)","single_quotes_linter" -"data-raw/osa-adherence-data.R",239,9,"style","Use <-, not =, for assignment.","dataset = generate_osa_data(patients = 500, seed = 1)","assignment_linter" -"data-raw/osa-adherence-data.R",240,21,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" -"data-raw/osa-adherence-data.R",240,27,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" -"data-raw/osa-adherence-data.R",240,35,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" -"data-raw/osa-adherence-data.R",240,42,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" -"data-raw/osa-adherence-data.R",240,54,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" -"data-raw/osa-adherence-data.R",240,65,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" -"data-raw/osa-adherence-data.R",240,75,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" -"data-raw/osa-adherence-data.R",240,81,"style","Lines should not be more than 80 characters.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","line_length_linter" -"data-raw/osa-adherence-data.R",240,85,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" -"data-raw/osa-adherence-data.R",241,24,"style","Only use double-quotes.","setcolorder(dataset, c('Patient', 'Biweek', 'MaxDay', 'UsageHours', 'Group'))","single_quotes_linter" -"data-raw/osa-adherence-data.R",241,35,"style","Only use double-quotes.","setcolorder(dataset, c('Patient', 'Biweek', 'MaxDay', 'UsageHours', 'Group'))","single_quotes_linter" -"data-raw/osa-adherence-data.R",241,45,"style","Only use double-quotes.","setcolorder(dataset, c('Patient', 'Biweek', 'MaxDay', 'UsageHours', 'Group'))","single_quotes_linter" -"data-raw/osa-adherence-data.R",241,55,"style","Only use double-quotes.","setcolorder(dataset, c('Patient', 'Biweek', 'MaxDay', 'UsageHours', 'Group'))","single_quotes_linter" -"data-raw/osa-adherence-data.R",241,69,"style","Only use double-quotes.","setcolorder(dataset, c('Patient', 'Biweek', 'MaxDay', 'UsageHours', 'Group'))","single_quotes_linter" -"data-raw/osa-adherence-data.R",244,32,"style","Only use double-quotes.","plotTrajectories(dataset, id = 'Patient', time = 'Biweek', response = 'UsageHours', cluster = 'Group', facet = TRUE)","single_quotes_linter" -"data-raw/osa-adherence-data.R",244,50,"style","Only use double-quotes.","plotTrajectories(dataset, id = 'Patient', time = 'Biweek', response = 'UsageHours', cluster = 'Group', facet = TRUE)","single_quotes_linter" -"data-raw/osa-adherence-data.R",244,71,"style","Only use double-quotes.","plotTrajectories(dataset, id = 'Patient', time = 'Biweek', response = 'UsageHours', cluster = 'Group', facet = TRUE)","single_quotes_linter" -"data-raw/osa-adherence-data.R",244,81,"style","Lines should not be more than 80 characters.","plotTrajectories(dataset, id = 'Patient', time = 'Biweek', response = 'UsageHours', cluster = 'Group', facet = TRUE)","line_length_linter" -"data-raw/osa-adherence-data.R",244,95,"style","Only use double-quotes.","plotTrajectories(dataset, id = 'Patient', time = 'Biweek', response = 'UsageHours', cluster = 'Group', facet = TRUE)","single_quotes_linter" -"data-raw/osa-adherence-data.R",248,1,"style","Variable and function name style should be snake_case or symbols.","OSA.adherence = as.data.frame(dataset)","object_name_linter" -"data-raw/osa-adherence-data.R",248,15,"style","Use <-, not =, for assignment.","OSA.adherence = as.data.frame(dataset)","assignment_linter" -"R/assert.R",109,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/assert.R",341,7,"warning","no visible binding for global variable β€˜Dupe’"," .[Dupe == TRUE]","object_usage_linter" -"R/assert.R",371,7,"warning","no visible binding for global variable β€˜Moments’"," .[Moments < min]","object_usage_linter" -"R/assert.R",402,7,"warning","no visible binding for global variable β€˜HasMult’"," .[HasMult == TRUE]","object_usage_linter" -"R/assert.R",407,7,"warning","no visible global function definition for β€˜nroW’"," nroW(dtMult),","object_usage_linter" -"R/assert.R",413,9,"warning","no visible binding for global variable β€˜IsEqualLen’"," .[IsEqualLen == FALSE]","object_usage_linter" -"R/assert.R",438,7,"warning","no visible binding for global variable β€˜NaCount’"," .[NaCount > 0]","object_usage_linter" -"R/formula.R",31,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/generics.R",467,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/matrix.R",85,3,"style","`else` should come on the same line as the previous `}`."," else if (is.factor(times)) {","brace_linter" -"R/matrix.R",90,3,"style","`else` should come on the same line as the previous `}`."," else if (is.character(times)) {","brace_linter" -"R/method.R",364,3,"style","`else` should come on the same line as the previous `}`."," else if (is.list(args)) {","brace_linter" -"R/method.R",671,12,"warning","no visible binding for global variable β€˜label’"," object$label","object_usage_linter" -"R/method.R",1088,12,"warning","no visible binding for global variable β€˜response’"," object$response","object_usage_linter" -"R/method.R",1154,3,"style","`else` should come on the same line as the previous `}`."," else if (inherits(object, what = classes)) {","brace_linter" -"R/methods.R",123,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/model-transform.R",367,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/model-transform.R",388,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/model-transform.R",405,7,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/model.R",438,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/model.R",938,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/model.R",963,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/model.R",991,3,"style","`else` should come on the same line as the previous `}`."," else if (is.numeric(predList[[1]])) {","brace_linter" -"R/model.R",1004,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/model.R",1106,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/model.R",1381,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/modelKML.R",48,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/modelLMKM.R",59,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/models.R",53,3,"style","`else` should come on the same line as the previous `}`."," else if (is.lcModels(x)) {","brace_linter" -"R/models.R",56,3,"style","`else` should come on the same line as the previous `}`."," else if (is.lcModel(x)) {","brace_linter" -"R/models.R",59,3,"style","`else` should come on the same line as the previous `}`."," else if (is.list(x)) {","brace_linter" -"R/models.R",63,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/models.R",156,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/models.R",247,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/modelWeightedPartition.R",42,3,"style","`else` should come on the same line as the previous `}`."," else if (is.function(clusterNames)) {","brace_linter" -"R/random.R",12,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/test.R",410,3,"style","`else` should come on the same line as the previous `}`."," else if (!isFALSE(error)) {","brace_linter" -"tests/testthat/setup-init.R",160,17,"warning","no visible global function definition for β€˜is.ggplot’"," expect_true(is.ggplot(plot(object)))","object_usage_linter" -"tests/testthat/test-formula.R",9,28,"style","Put spaces around all infix operators."," expect_true(hasResponse(A~0))","infix_spaces_linter" -"tests/testthat/test-formula.R",10,36,"style","Put spaces around all infix operators."," expect_true(hasResponse(I(log(A))~B))","infix_spaces_linter" -"tests/testthat/test-formula.R",17,29,"style","Put spaces around all infix operators."," expect_true(hasIntercept(A~1))","infix_spaces_linter" -"tests/testthat/test-formula.R",18,30,"style","Put spaces around all infix operators."," expect_false(hasIntercept(A~-1))","infix_spaces_linter" -"tests/testthat/test-formula.R",25,34,"style","Put spaces around all infix operators."," expect_true(hasSingleResponse(A~0))","infix_spaces_linter" -"tests/testthat/test-formula.R",26,34,"style","Put spaces around all infix operators."," expect_true(hasSingleResponse(A~B))","infix_spaces_linter" -"tests/testthat/test-formula.R",43,27,"style","Put spaces around all infix operators."," expect_null(getREterms(A~B))","infix_spaces_linter" -"tests/testthat/test-formula.R",44,29,"style","Put spaces around all infix operators."," expect_length(getREterms(A~B + (1 | C)), 1)","infix_spaces_linter" -"tests/testthat/test-formula.R",45,29,"style","Put spaces around all infix operators."," expect_length(getREterms(A~B + (1 | C) + (1 | D)), 2)","infix_spaces_linter" -"tests/testthat/test-formula.R",62,28,"style","Put spaces around all infix operators."," expect_equal(getREterms(A~B + (1 | C))[[1]] %>% REtermAsFormula, ~1)","infix_spaces_linter" -"tests/testthat/test-formula.R",63,28,"style","Put spaces around all infix operators."," expect_equal(getREterms(A~B + (D | C))[[1]] %>% REtermAsFormula, ~D)","infix_spaces_linter" -"tests/testthat/test-formula.R",64,28,"style","Put spaces around all infix operators."," expect_equal(getREterms(A~B + (-1 + D | C))[[1]] %>% REtermAsFormula, ~-1 + D)","infix_spaces_linter" -"tests/testthat/test-formula.R",74,30,"style","Put spaces around all infix operators."," expect_true(hasCovariates(A~B))","infix_spaces_linter" -"tests/testthat/test-formula.R",76,30,"style","Put spaces around all infix operators."," expect_true(hasCovariates(A~poly(A, 2)))","infix_spaces_linter" -"tests/testthat/test-formula.R",77,31,"style","Put spaces around all infix operators."," expect_false(hasCovariates(A~0))","infix_spaces_linter" -"tests/testthat/test-formula.R",78,31,"style","Put spaces around all infix operators."," expect_false(hasCovariates(A~1))","infix_spaces_linter" -"tests/testthat/test-formula.R",84,32,"style","Put spaces around all infix operators."," expect_length(getCovariates(A~0), 0)","infix_spaces_linter" -"tests/testthat/test-formula.R",85,32,"style","Put spaces around all infix operators."," expect_length(getCovariates(A~1), 0)","infix_spaces_linter" -"tests/testthat/test-formula.R",101,31,"style","Put spaces around all infix operators."," expect_equal(merge.formula(Z~A, ~B), Z~A + B)","infix_spaces_linter" -"tests/testthat/test-formula.R",101,41,"style","Put spaces around all infix operators."," expect_equal(merge.formula(Z~A, ~B), Z~A + B)","infix_spaces_linter" -"tests/testthat/test-formula.R",102,31,"style","Put spaces around all infix operators."," expect_equal(merge.formula(Z~A + B, ~B), Z~A + B)","infix_spaces_linter" -"tests/testthat/test-formula.R",102,45,"style","Put spaces around all infix operators."," expect_equal(merge.formula(Z~A + B, ~B), Z~A + B)","infix_spaces_linter" -"tests/testthat/test-formula.R",103,31,"style","Put spaces around all infix operators."," expect_equal(merge.formula(Z~A + C, ~B), Z~A + C + B)","infix_spaces_linter" -"tests/testthat/test-formula.R",103,45,"style","Put spaces around all infix operators."," expect_equal(merge.formula(Z~A + C, ~B), Z~A + C + B)","infix_spaces_linter" -"tests/testthat/test-formula.R",104,35,"style","Put spaces around all infix operators."," expect_error(merge.formula(~A, Z~B))","infix_spaces_linter" -"tests/testthat/test-formula.R",111,42,"style","Put spaces around all infix operators."," expect_false(hasResponse(dropResponse(A~0)))","infix_spaces_linter" -"tests/testthat/test-formula.R",112,43,"style","Put spaces around all infix operators."," expect_false(hasIntercept(dropResponse(A~0)))","infix_spaces_linter" -"tests/testthat/test-formula.R",113,30,"style","Put spaces around all infix operators."," expect_equal(dropResponse(A~1), ~1)","infix_spaces_linter" -"tests/testthat/test-formula.R",114,30,"style","Put spaces around all infix operators."," expect_equal(dropResponse(A~B), ~B)","infix_spaces_linter" -"tests/testthat/test-formula.R",115,35,"style","Put spaces around all infix operators."," expect_equal(dropResponse(A + B ~C), ~C)","infix_spaces_linter" -"tests/testthat/test-formula.R",120,44,"style","Put spaces around all infix operators."," expect_false(hasIntercept(dropIntercept(A~0)))","infix_spaces_linter" -"tests/testthat/test-formula.R",121,44,"style","Put spaces around all infix operators."," expect_false(hasIntercept(dropIntercept(A~B)))","infix_spaces_linter" -"tests/testthat/test-method.R",15,11,"style","Put spaces around all infix operators."," form = A~B,","infix_spaces_linter" -"vignettes/demo.Rmd",28,23,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" -"vignettes/demo.Rmd",28,34,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" -"vignettes/demo.Rmd",28,41,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" -"vignettes/demo.Rmd",28,49,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" -"vignettes/demo.Rmd",28,81,"style","Lines should not be more than 80 characters."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","line_length_linter" -"vignettes/demo.Rmd",64,1,"style","Variable and function name style should be snake_case or symbols.","kmlMethod <- lcMethodKML(response = ""Y"", nClusters = 2, nbRedrawing = 1)","object_name_linter" -"vignettes/demo.Rmd",74,1,"style","Variable and function name style should be snake_case or symbols.","kmlModel <- latrend(kmlMethod, data = latrendData)","object_name_linter" -"vignettes/demo.Rmd",86,1,"style","Variable and function name style should be snake_case or symbols.","kmlMethods <- lcMethods(kmlMethod, nClusters = 1:8)","object_name_linter" -"vignettes/demo.Rmd",94,1,"style","Variable and function name style should be snake_case or symbols.","kmlModels <- latrendBatch(kmlMethods, data = latrendData, verbose = FALSE)","object_name_linter" -"vignettes/demo.Rmd",107,1,"style","Variable and function name style should be snake_case or symbols.","kmlModel4 <- subset(kmlModels, nClusters == 4, drop = TRUE)","object_name_linter" -"vignettes/demo.Rmd",144,1,"style","Variable and function name style should be snake_case or symbols.","gbtmMethod <- lcMethodLcmmGBTM(fixed = Y ~ bs(Time), mixture = fixed)","object_name_linter" -"vignettes/demo.Rmd",151,1,"style","Variable and function name style should be snake_case or symbols.","gbtmMethods <- lcMethods(gbtmMethod, nClusters = 1:5)","object_name_linter" -"vignettes/demo.Rmd",153,1,"style","Variable and function name style should be snake_case or symbols.","gbtmModels <- latrendBatch(gbtmMethods, data = latrendData, verbose = FALSE)","object_name_linter" -"vignettes/demo.Rmd",162,1,"style","Variable and function name style should be snake_case or symbols.","bestGbtmModel <- subset(gbtmModels, nClusters == 3, drop=TRUE)","object_name_linter" -"vignettes/demo.Rmd",162,57,"style","Put spaces around all infix operators.","bestGbtmModel <- subset(gbtmModels, nClusters == 3, drop=TRUE)","infix_spaces_linter" -"vignettes/demo.Rmd",170,1,"style","Variable and function name style should be snake_case or symbols.","gmmMethod <- lcMethodLcmmGMM(fixed = Y ~ poly(Time, 2, raw = TRUE), mixture = fixed, idiag = TRUE)","object_name_linter" -"vignettes/demo.Rmd",170,81,"style","Lines should not be more than 80 characters.","gmmMethod <- lcMethodLcmmGMM(fixed = Y ~ poly(Time, 2, raw = TRUE), mixture = fixed, idiag = TRUE)","line_length_linter" -"vignettes/demo.Rmd",176,1,"style","Variable and function name style should be snake_case or symbols.","gmmMethods <- lcMethods(gmmMethod, nClusters = 1:5)","object_name_linter" -"vignettes/demo.Rmd",178,1,"style","Variable and function name style should be snake_case or symbols.","gmmModels <- latrendBatch(gmmMethods, latrendData, verbose = FALSE)","object_name_linter" -"vignettes/demo.Rmd",186,1,"style","Variable and function name style should be snake_case or symbols.","bestGmmModel <- subset(gmmModels, nClusters == 3, drop=TRUE)","object_name_linter" -"vignettes/demo.Rmd",186,55,"style","Put spaces around all infix operators.","bestGmmModel <- subset(gmmModels, nClusters == 3, drop=TRUE)","infix_spaces_linter" -"vignettes/demo.Rmd",207,43,"style","Only use double-quotes.","metric(list(bestGbtmModel, bestGmmModel), 'WMAE')","single_quotes_linter" -"vignettes/demo.Rmd",211,45,"style","Only use double-quotes.","externalMetric(bestGbtmModel, bestGmmModel, 'WMMAE')","single_quotes_linter" -"vignettes/demo.Rmd",216,45,"style","Only use double-quotes.","externalMetric(bestGbtmModel, bestGmmModel, 'adjustedRand')","single_quotes_linter" -"vignettes/demo.Rmd",230,1,"style","Variable and function name style should be snake_case or symbols.","refTrajAssigns <- aggregate(Class ~ Id, data = latrendData, FUN = data.table::first)","object_name_linter" -"vignettes/demo.Rmd",230,81,"style","Lines should not be more than 80 characters.","refTrajAssigns <- aggregate(Class ~ Id, data = latrendData, FUN = data.table::first)","line_length_linter" -"vignettes/demo.Rmd",231,1,"style","Variable and function name style should be snake_case or symbols.","refModel <- lcModelPartition(data = latrendData, response = ""Y"", trajectoryAssignments = refTrajAssigns$Class)","object_name_linter" -"vignettes/demo.Rmd",231,81,"style","Lines should not be more than 80 characters.","refModel <- lcModelPartition(data = latrendData, response = ""Y"", trajectoryAssignments = refTrajAssigns$Class)","line_length_linter" -"vignettes/implement.Rmd",22,23,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" -"vignettes/implement.Rmd",22,34,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" -"vignettes/implement.Rmd",22,41,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" -"vignettes/implement.Rmd",22,81,"style","Lines should not be more than 80 characters."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","line_length_linter" -"vignettes/implement.Rmd",47,23,"style","Trailing whitespace is superfluous."," latrend.id = ""Traj"", ","trailing_whitespace_linter" -"vignettes/implement.Rmd",57,21,"style","Trailing whitespace is superfluous."," sizes = c(40, 60), ","trailing_whitespace_linter" -"vignettes/implement.Rmd",61,20,"style","Trailing whitespace is superfluous."," cluster = ~ Time, ","trailing_whitespace_linter" -"vignettes/implement.Rmd",66,6,"style","Trailing whitespace is superfluous.",") %>% ","trailing_whitespace_linter" -"vignettes/implement.Rmd",107,20,"style","Trailing whitespace is superfluous."," factor(int > 1.7, ","trailing_whitespace_linter" -"vignettes/implement.Rmd",108,34,"style","Trailing whitespace is superfluous."," levels = c(FALSE, TRUE), ","trailing_whitespace_linter" -"vignettes/implement.Rmd",122,18,"style","Trailing whitespace is superfluous."," response = ""Y"", ","trailing_whitespace_linter" -"vignettes/implement.Rmd",123,33,"style","Trailing whitespace is superfluous."," stratify = Intercept[1] > 1.7, ","trailing_whitespace_linter" -"vignettes/implement.Rmd",135,1,"style","Variable and function name style should be snake_case or symbols.","repStep <- function(method, data, verbose) {","object_name_linter" -"vignettes/implement.Rmd",137,72,"warning","no visible binding for global variable β€˜Traj’"," coefdata <- dt[, lm(Y ~ Time, .SD) %>% coef() %>% as.list(), keyby = Traj]","object_usage_linter" -"vignettes/implement.Rmd",148,1,"style","Variable and function name style should be snake_case or symbols.","clusStep <- function(method, data, repMat, envir, verbose) {","object_name_linter" -"vignettes/implement.Rmd",148,36,"style","Variable and function name style should be snake_case or symbols.","clusStep <- function(method, data, repMat, envir, verbose) {","object_name_linter" -"vignettes/implement.Rmd",152,32,"style","Trailing whitespace is superfluous."," response = method$response, ","trailing_whitespace_linter" -"vignettes/implement.Rmd",154,17,"style","Trailing whitespace is superfluous."," data = data, ","trailing_whitespace_linter" -"vignettes/implement.Rmd",164,1,"style","Variable and function name style should be snake_case or symbols.","m.twostep <- lcMethodFeature(","object_name_linter" -"vignettes/implement.Rmd",165,18,"style","Trailing whitespace is superfluous."," response = ""Y"", ","trailing_whitespace_linter" -"vignettes/implement.Rmd",166,32,"style","Trailing whitespace is superfluous."," representationStep = repStep, ","trailing_whitespace_linter" -"vignettes/implement.Rmd",172,1,"style","Variable and function name style should be snake_case or symbols.","model.twostep <- latrend(m.twostep, data = casedata)","object_name_linter" -"vignettes/implement.Rmd",183,1,"style","Variable and function name style should be snake_case or symbols.","repStep.gen <- function(method, data, verbose) {","object_name_linter" -"vignettes/implement.Rmd",185,81,"style","Lines should not be more than 80 characters."," coefdata <- dt[, lm(method$formula, .SD) %>% coef() %>% as.list(), keyby = c(method$id)]","line_length_linter" -"vignettes/implement.Rmd",192,1,"style","Variable and function name style should be snake_case or symbols.","clusStep.gen <- function(method, data, repMat, envir, verbose) {","object_name_linter" -"vignettes/implement.Rmd",192,40,"style","Variable and function name style should be snake_case or symbols.","clusStep.gen <- function(method, data, repMat, envir, verbose) {","object_name_linter" -"vignettes/implement.Rmd",198,17,"style","Trailing whitespace is superfluous."," data = data, ","trailing_whitespace_linter" -"vignettes/implement.Rmd",208,1,"style","Variable and function name style should be snake_case or symbols.","m.twostepgen <- lcMethodFeature(","object_name_linter" -"vignettes/implement.Rmd",210,36,"style","Trailing whitespace is superfluous."," representationStep = repStep.gen, ","trailing_whitespace_linter" -"vignettes/implement.Rmd",217,1,"style","Variable and function name style should be snake_case or symbols.","model.twostepgen <- latrend(m.twostepgen, formula = Y ~ Time, nClusters = 2, casedata)","object_name_linter" -"vignettes/implement.Rmd",217,81,"style","Lines should not be more than 80 characters.","model.twostepgen <- latrend(m.twostepgen, formula = Y ~ Time, nClusters = 2, casedata)","line_length_linter" -"vignettes/implement.Rmd",235,1,"style","Variable and function name style should be snake_case or symbols.","lcMethodSimpleGBTM <- function(...) {","object_name_linter" -"vignettes/implement.Rmd",236,6,"style","Use <-, not =, for assignment."," mc = match.call()","assignment_linter" -"vignettes/implement.Rmd",237,12,"style","Use <-, not =, for assignment."," mc$Class = 'lcMethodSimpleGBTM'","assignment_linter" -"vignettes/implement.Rmd",237,14,"style","Only use double-quotes."," mc$Class = 'lcMethodSimpleGBTM'","single_quotes_linter" -"vignettes/implement.Rmd",254,43,"style","Trailing whitespace is superfluous.","setMethod(""getName"", ""lcMethodSimpleGBTM"", ","trailing_whitespace_linter" -"vignettes/implement.Rmd",264,81,"style","Lines should not be more than 80 characters.","setMethod(""prepareData"", ""lcMethodSimpleGBTM"", function(method, data, verbose, ...) {","line_length_linter" -"vignettes/implement.Rmd",274,81,"style","Lines should not be more than 80 characters.","setMethod(""fit"", ""lcMethodSimpleGBTM"", function(method, data, envir, verbose, ...) {","line_length_linter" -"vignettes/implement.Rmd",286,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/implement.Rmd",288,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/implement.Rmd",290,25,"style","Trailing whitespace is superfluous."," ""lcModelSimpleGBTM"", ","trailing_whitespace_linter" -"vignettes/implement.Rmd",315,81,"style","Lines should not be more than 80 characters.","fitted.lcModelSimpleGBTM <- function(object, clusters = trajectoryAssignments(object)) {","line_length_linter" -"vignettes/implement.Rmd",316,3,"style","Variable and function name style should be snake_case or symbols."," predNames <- paste0(""pred_m"", 1:nClusters(object))","object_name_linter" -"vignettes/implement.Rmd",317,3,"style","Variable and function name style should be snake_case or symbols."," predMat <- as.matrix(object@model$pred[predNames])","object_name_linter" -"vignettes/implement.Rmd",318,12,"style","Variable and function name style should be snake_case or symbols."," colnames(predMat) <- clusterNames(object)","object_name_linter" -"vignettes/implement.Rmd",326,38,"style","Only use double-quotes."," object, newdata, cluster, what = 'mu', ...)","single_quotes_linter" -"vignettes/implement.Rmd",327,1,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","{","brace_linter" -"vignettes/implement.Rmd",328,3,"style","Variable and function name style should be snake_case or symbols."," predMat = lcmm::predictY(object@model, newdata = newdata)$pred %>%","object_name_linter" -"vignettes/implement.Rmd",328,11,"style","Use <-, not =, for assignment."," predMat = lcmm::predictY(object@model, newdata = newdata)$pred %>%","assignment_linter" -"vignettes/implement.Rmd",331,3,"style","Variable and function name style should be snake_case or symbols."," clusIdx = match(cluster, clusterNames(object))","object_name_linter" -"vignettes/implement.Rmd",331,11,"style","Use <-, not =, for assignment."," clusIdx = match(cluster, clusterNames(object))","assignment_linter" -"vignettes/simulation.Rmd",23,23,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'simTool', 'dplyr', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" -"vignettes/simulation.Rmd",23,34,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'simTool', 'dplyr', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" -"vignettes/simulation.Rmd",23,45,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'simTool', 'dplyr', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" -"vignettes/simulation.Rmd",23,54,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'simTool', 'dplyr', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" -"vignettes/simulation.Rmd",23,81,"style","Lines should not be more than 80 characters."," eval = all(vapply(c('ggplot2', 'simTool', 'dplyr', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","line_length_linter" -"vignettes/simulation.Rmd",66,1,"style","Variable and function name style should be snake_case or symbols.","dataGen <- function(numTraj, ..., data.seed) {","object_name_linter" -"vignettes/simulation.Rmd",66,21,"style","Variable and function name style should be snake_case or symbols.","dataGen <- function(numTraj, ..., data.seed) {","object_name_linter" -"vignettes/simulation.Rmd",66,35,"style","Variable and function name style should be snake_case or symbols.","dataGen <- function(numTraj, ..., data.seed) {","object_name_linter" -"vignettes/simulation.Rmd",91,1,"style","Variable and function name style should be snake_case or symbols.","exampleData <- dataGen(numTraj = 200, randomScale = .1, data.seed = 1)","object_name_linter" -"vignettes/simulation.Rmd",101,1,"style","Variable and function name style should be snake_case or symbols.","dataGrid <- simTool::expand_tibble(","object_name_linter" -"vignettes/simulation.Rmd",118,1,"style","Variable and function name style should be snake_case or symbols.","kmlMethodGrid <- simTool::expand_tibble(","object_name_linter" -"vignettes/simulation.Rmd",134,1,"style","Variable and function name style should be snake_case or symbols.","fitGCKM <- function(type, ...) {","object_name_linter" -"vignettes/simulation.Rmd",139,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/simulation.Rmd",146,1,"style","Variable and function name style should be snake_case or symbols.","gckmMethodGrid <- simTool::expand_tibble(","object_name_linter" -"vignettes/simulation.Rmd",157,1,"style","Variable and function name style should be snake_case or symbols.","methodGrid <- dplyr::bind_rows(kmlMethodGrid, gckmMethodGrid)","object_name_linter" -"vignettes/simulation.Rmd",166,1,"style","Variable and function name style should be snake_case or symbols.","analyzeModel <- function(model) {","object_name_linter" -"vignettes/simulation.Rmd",168,3,"style","Variable and function name style should be snake_case or symbols."," refModel <- lcModelPartition(data, response = ""Y"", trajectoryAssignments = ""Class"")","object_name_linter" -"vignettes/simulation.Rmd",168,81,"style","Lines should not be more than 80 characters."," refModel <- lcModelPartition(data, response = ""Y"", trajectoryAssignments = ""Class"")","line_length_linter" -"vignettes/simulation.Rmd",169,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/simulation.Rmd",182,24,"style","Trailing whitespace is superfluous."," data_grid = dataGrid, ","trailing_whitespace_linter" -"vignettes/simulation.Rmd",196,1,"style","Variable and function name style should be snake_case or symbols.","resultsTable <- as.data.table(result$simulation)","object_name_linter" -"vignettes/simulation.Rmd",204,81,"style","Lines should not be more than 80 characters.","resultsTable[, .(K = nClusters[which.min(BIC)]), keyby = .(numTraj, randomScales, data.seed, method)]","line_length_linter" -"vignettes/simulation.Rmd",213,81,"style","Lines should not be more than 80 characters.","resultsTable[nClusters > 1, .(ARI = mean(ARI)), keyby = .(nClusters, numTraj, randomScales, method)]","line_length_linter" -"vignettes/simulation.Rmd",217,81,"style","Lines should not be more than 80 characters.","resultsTable[nClusters > 1, .(ARI = mean(ARI)), keyby = .(randomScales, nClusters, method)]","line_length_linter" -"vignettes/simulation.Rmd",225,81,"style","Lines should not be more than 80 characters.","resultsTable[randomScales == .1, .(WMAE = mean(WMAE)), keyby = .(nClusters, method)]","line_length_linter" -"vignettes/validation.Rmd",29,23,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'mclustcomp', 'caret'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" -"vignettes/validation.Rmd",29,34,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'mclustcomp', 'caret'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" -"vignettes/validation.Rmd",29,41,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'mclustcomp', 'caret'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" -"vignettes/validation.Rmd",29,55,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'mclustcomp', 'caret'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" -"vignettes/validation.Rmd",29,81,"style","Lines should not be more than 80 characters."," eval = all(vapply(c('ggplot2', 'kml', 'mclustcomp', 'caret'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","line_length_linter" -"vignettes/validation.Rmd",64,1,"style","Variable and function name style should be snake_case or symbols.","repModels <- latrendRep(kml, data = latrendData, .rep=10)","object_name_linter" -"vignettes/validation.Rmd",64,54,"style","Put spaces around all infix operators.","repModels <- latrendRep(kml, data = latrendData, .rep=10)","infix_spaces_linter" -"vignettes/validation.Rmd",69,1,"style","Variable and function name style should be snake_case or symbols.","repSelfMetrics <- metric(repModels, name = c(""BIC"", ""WMAE"", ""APPA""))","object_name_linter" -"vignettes/validation.Rmd",81,1,"style","Variable and function name style should be snake_case or symbols.","bestRepModel <- min(repModels, ""BIC"")","object_name_linter" -"vignettes/validation.Rmd",88,1,"style","Variable and function name style should be snake_case or symbols.","simMat <- externalMetric(repModels, name = ""adjustedRand"")","object_name_linter" -"vignettes/validation.Rmd",98,1,"style","Variable and function name style should be snake_case or symbols.","bootModels <- latrendBoot(kml, data = latrendData, samples = 10)","object_name_linter" -"vignettes/validation.Rmd",103,1,"style","Variable and function name style should be snake_case or symbols.","bootMetrics <- metric(bootModels, name = c(""BIC"", ""WMAE"", ""APPA""))","object_name_linter" -"vignettes/validation.Rmd",119,1,"style","Variable and function name style should be snake_case or symbols.","trainModels <- latrendCV(kml, data = latrendData, folds = 10, seed = 1)","object_name_linter" -"vignettes/validation.Rmd",127,1,"style","Variable and function name style should be snake_case or symbols.","dataFolds <- createTrainDataFolds(latrendData, folds = 10)","object_name_linter" -"vignettes/validation.Rmd",128,1,"style","Variable and function name style should be snake_case or symbols.","foldModels <- latrendBatch(kml, data = dataFolds)","object_name_linter" -"vignettes/validation.Rmd",133,1,"style","Variable and function name style should be snake_case or symbols.","testDataFolds <- createTestDataFolds(latrendData, dataFolds)","object_name_linter" diff --git a/.dev/revdep_emails/latrend/email-body b/.dev/revdep_emails/latrend/email-body deleted file mode 100644 index 2823e1538..000000000 --- a/.dev/revdep_emails/latrend/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Niek Den Teuling! Thank you for using {lintr} in your package {latrend}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/philips-software/latrend using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 139s on CRAN vs. 89s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/lifecycle/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/lifecycle/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 7733b67eb..000000000 --- a/.dev/revdep_emails/lifecycle/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,5 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/aaa.R",6,6,"style","Variable and function name style should be snake_case."," ns$.__rlang_hook__. <- c(ns$.__rlang_hook__., list(callback))","object_name_linter" -"R/aaa.R",21,6,"style","Variable and function name style should be snake_case."," ns$.__rlang_hook__. <- NULL","object_name_linter" -"R/lifecycle-package.R",11,1,"style","Variable and function name style should be snake_case.",".onLoad <- function(lib, pkg) {","object_name_linter" -"R/warning.R",48,1,"style","Variable and function names should not be longer than 30 characters.","conditionMessage.lifecycle_warning_deprecated <- function(c) {","object_length_linter" diff --git a/.dev/revdep_emails/lifecycle/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/lifecycle/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 080c856e1..000000000 --- a/.dev/revdep_emails/lifecycle/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,24 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"vignettes/communicate.Rmd",70,3,"style","Trailing whitespace is superfluous.","#' ","trailing_whitespace_linter" -"vignettes/communicate.Rmd",73,3,"style","Trailing whitespace is superfluous.","#' ","trailing_whitespace_linter" -"vignettes/communicate.Rmd",81,13,"style","Trailing whitespace is superfluous.","#' @examples ","trailing_whitespace_linter" -"vignettes/communicate.Rmd",118,13,"style","Trailing whitespace is superfluous."," ""1.0.0"", ","trailing_whitespace_linter" -"vignettes/communicate.Rmd",119,17,"style","Trailing whitespace is superfluous."," ""add_two()"", ","trailing_whitespace_linter" -"vignettes/communicate.Rmd",186,3,"style","Trailing whitespace is superfluous.","#' ","trailing_whitespace_linter" -"vignettes/communicate.Rmd",187,16,"style","Trailing whitespace is superfluous.","#' @description ","trailing_whitespace_linter" -"vignettes/communicate.Rmd",189,3,"style","Trailing whitespace is superfluous.","#' ","trailing_whitespace_linter" -"vignettes/communicate.Rmd",227,3,"style","Trailing whitespace is superfluous.","#' ","trailing_whitespace_linter" -"vignettes/communicate.Rmd",274,27,"style","Variable and function name style should be snake_case or symbols.","add_two <- function(x, y, na.rm = TRUE) {","object_name_linter" -"vignettes/communicate.Rmd",290,27,"style","Variable and function name style should be snake_case or symbols.","add_two <- function(x, y, na.rm = TRUE) {","object_name_linter" -"vignettes/communicate.Rmd",293,22,"style","Trailing whitespace is superfluous."," when = ""1.0.0"", ","trailing_whitespace_linter" -"vignettes/communicate.Rmd",295,81,"style","Lines should not be more than 80 characters."," details = ""Ability to retain missing values will be dropped in next release.""","line_length_linter" -"vignettes/communicate.Rmd",298,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/communicate.Rmd",313,27,"style","Variable and function name style should be snake_case or symbols.","add_two <- function(x, y, na.rm = deprecated()) {","object_name_linter" -"vignettes/communicate.Rmd",316,22,"style","Trailing whitespace is superfluous."," when = ""1.0.0"", ","trailing_whitespace_linter" -"vignettes/communicate.Rmd",318,81,"style","Lines should not be more than 80 characters."," details = ""Ability to retain missing values will be dropped in next release.""","line_length_linter" -"vignettes/communicate.Rmd",321,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/communicate.Rmd",340,41,"style","Variable and function name style should be snake_case or symbols.","add_two <- function(x, y, na_rm = TRUE, na.rm = deprecated()) {","object_name_linter" -"vignettes/communicate.Rmd",345,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/manage.Rmd",36,81,"style","Lines should not be more than 80 characters.","#> Call `lifecycle::last_lifecycle_warnings()` to see where this warning was generated.","line_length_linter" -"vignettes/stages.Rmd",57,81,"style","Lines should not be more than 80 characters.","#> Call `lifecycle::last_lifecycle_warnings()` to see where this warning was generated. ","line_length_linter" -"vignettes/stages.Rmd",57,88,"style","Trailing whitespace is superfluous.","#> Call `lifecycle::last_lifecycle_warnings()` to see where this warning was generated. ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/lifecycle/email-body b/.dev/revdep_emails/lifecycle/email-body deleted file mode 100644 index d7e11d4bd..000000000 --- a/.dev/revdep_emails/lifecycle/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Lionel Henry! Thank you for using {lintr} in your package {lifecycle}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/r-lib/lifecycle using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 11s on CRAN vs. 8s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/lightgbm/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/lightgbm/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 9ad81cde0..000000000 --- a/.dev/revdep_emails/lightgbm/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,14 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/callback.R",27,1,"style","Variable and function name style should be snake_case.","format.eval.string <- function(eval_res, eval_err) {","object_name_linter" -"R/callback.R",43,1,"style","Variable and function name style should be snake_case.","merge.eval.string <- function(env) {","object_name_linter" -"R/lgb.Booster.R",805,1,"style","Variable and function name style should be snake_case.","predict.lgb.Booster <- function(object,","object_name_linter" -"R/lgb.Booster.R",853,1,"style","Variable and function name style should be snake_case.","print.lgb.Booster <- function(x, ...) {","object_name_linter" -"R/lgb.Booster.R",902,1,"style","Variable and function name style should be snake_case.","summary.lgb.Booster <- function(object, ...) {","object_name_linter" -"R/lgb.Dataset.R",956,1,"style","Variable and function name style should be snake_case.","dim.lgb.Dataset <- function(x) {","object_name_linter" -"R/lgb.Dataset.R",991,1,"style","Variable and function name style should be snake_case.","dimnames.lgb.Dataset <- function(x) {","object_name_linter" -"R/lgb.Dataset.R",1004,1,"style","Variable and function name style should be snake_case.","`dimnames<-.lgb.Dataset` <- function(x, value) {","object_name_linter" -"R/lgb.Dataset.R",1064,1,"style","Variable and function name style should be snake_case.","slice.lgb.Dataset <- function(dataset, idxset) {","object_name_linter" -"R/lgb.Dataset.R",1111,1,"style","Variable and function name style should be snake_case.","get_field.lgb.Dataset <- function(dataset, field_name) {","object_name_linter" -"R/lgb.Dataset.R",1160,1,"style","Variable and function name style should be snake_case.","set_field.lgb.Dataset <- function(dataset, field_name, data) {","object_name_linter" -"tests/testthat/test_lgb.interprete.R",71,10,"style","Variable and function name style should be snake_case."," iris$Species <- as.numeric(as.factor(iris$Species)) - 1L","object_name_linter" -"tests/testthat/test_lgb.plot.interpretation.R",69,10,"style","Variable and function name style should be snake_case."," iris$Species <- as.numeric(as.factor(iris$Species)) - 1L","object_name_linter" diff --git a/.dev/revdep_emails/lightgbm/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/lightgbm/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 1111460de..000000000 --- a/.dev/revdep_emails/lightgbm/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,67 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"demo/basic_walkthrough.R",11,81,"style","Lines should not be more than 80 characters.","# The loaded data is stored in sparseMatrix, and label is a numeric vector in {0,1}","line_length_linter" -"demo/basic_walkthrough.R",25,81,"style","Lines should not be more than 80 characters.","# Note: we are putting in sparse matrix here, lightgbm naturally handles sparse input","line_length_linter" -"demo/basic_walkthrough.R",26,81,"style","Lines should not be more than 80 characters.","# Use sparse matrix when your feature is sparse (e.g. when you are using one-hot encoding vector)","line_length_linter" -"demo/basic_walkthrough.R",44,81,"style","Lines should not be more than 80 characters.","# You can also put in lgb.Dataset object, which stores label, data and other meta datas needed for advanced features","line_length_linter" -"demo/basic_walkthrough.R",82,81,"style","Lines should not be more than 80 characters.","# Since we do not have this file with us, the following line is just for illustration","line_length_linter" -"demo/basic_walkthrough.R",84,7,"style","Commented code should be removed.","# data = ""agaricus.train.svm""","commented_code_linter" -"demo/basic_walkthrough.R",111,81,"style","Lines should not be more than 80 characters.","dtrain <- lgb.Dataset(data = train$data, label = train$label, free_raw_data = FALSE)","line_length_linter" -"demo/boost_from_prediction.R",8,81,"style","Lines should not be more than 80 characters.","dtest <- lgb.Dataset.create.valid(dtrain, data = agaricus.test$data, label = agaricus.test$label)","line_length_linter" -"demo/boost_from_prediction.R",24,81,"style","Lines should not be more than 80 characters.","# Note: we need the margin value instead of transformed prediction in set_init_score","line_length_linter" -"demo/categorical_features_rules.R",58,81,"style","Lines should not be more than 80 characters.","bank_test <- lgb.convert_with_rules(data = bank_test, rules = bank_rules$rules)$data","line_length_linter" -"demo/categorical_features_rules.R",70,81,"style","Lines should not be more than 80 characters.","# The categorical features can be passed to lgb.train to not copy and paste a lot","line_length_linter" -"demo/cross_validation.R",7,81,"style","Lines should not be more than 80 characters.","dtest <- lgb.Dataset.create.valid(dtrain, data = agaricus.test$data, label = agaricus.test$label)","line_length_linter" -"demo/cross_validation.R",52,81,"style","Lines should not be more than 80 characters.","# User-defined evaluation function returns a pair (metric_name, result, higher_better)","line_length_linter" -"demo/cross_validation.R",53,81,"style","Lines should not be more than 80 characters.","# NOTE: when you do customized loss function, the default prediction value is margin","line_length_linter" -"demo/cross_validation.R",55,81,"style","Lines should not be more than 80 characters.","# For example, we are doing logistic loss, the prediction is score before logistic transformation","line_length_linter" -"demo/cross_validation.R",56,81,"style","Lines should not be more than 80 characters.","# Keep this in mind when you use the customization, and maybe you need write customized evaluation function","line_length_linter" -"demo/early_stopping.R",9,81,"style","Lines should not be more than 80 characters.","dtest <- lgb.Dataset.create.valid(dtrain, data = agaricus.test$data, label = agaricus.test$label)","line_length_linter" -"demo/early_stopping.R",21,81,"style","Lines should not be more than 80 characters.","# User define objective function, given prediction, return gradient and second order gradient","line_length_linter" -"demo/early_stopping.R",31,81,"style","Lines should not be more than 80 characters.","# User-defined evaluation function returns a pair (metric_name, result, higher_better)","line_length_linter" -"demo/early_stopping.R",32,81,"style","Lines should not be more than 80 characters.","# NOTE: when you do customized loss function, the default prediction value is margin","line_length_linter" -"demo/early_stopping.R",34,81,"style","Lines should not be more than 80 characters.","# For example, we are doing logistic loss, the prediction is score before logistic transformation","line_length_linter" -"demo/early_stopping.R",36,81,"style","Lines should not be more than 80 characters.","# Keep this in mind when you use the customization, and maybe you need write customized evaluation function","line_length_linter" -"demo/efficient_many_training.R",2,81,"style","Lines should not be more than 80 characters.","# In the case of many trainings (like 100+ models), RAM will be eaten very quickly","line_length_linter" -"demo/efficient_many_training.R",5,81,"style","Lines should not be more than 80 characters.","# More results can be found here: https://github.com/microsoft/LightGBM/issues/879#issuecomment-326656580","line_length_linter" -"demo/efficient_many_training.R",7,81,"style","Lines should not be more than 80 characters.","# With reset=FALSE you get after 500 iterations (not 1000): OS reports 27GB usage, while R gc() reports 1.5GB.","line_length_linter" -"demo/efficient_many_training.R",9,81,"style","Lines should not be more than 80 characters.","# Doing reset=TRUE and calling gc() in the loop will have OS 1.3GB. Thanks for the latest tip.""","line_length_linter" -"demo/efficient_many_training.R",16,81,"style","Lines should not be more than 80 characters.","x_data <- matrix(rnorm(n = 100000000L, mean = 0.0, sd = 100.0), nrow = 1000000L, ncol = 100L)","line_length_linter" -"demo/efficient_many_training.R",23,81,"style","Lines should not be more than 80 characters.","# Loop through a training of 1000 models, please check your RAM on your task manager","line_length_linter" -"demo/leaf_stability.R",1,81,"style","Lines should not be more than 80 characters.","# We are going to look at how iterating too much might generate observation instability.","line_length_linter" -"demo/leaf_stability.R",9,81,"style","Lines should not be more than 80 characters.","# output of `RColorBrewer::brewer.pal(10, ""RdYlGn"")`, hardcooded here to avoid a dependency","line_length_linter" -"demo/leaf_stability.R",108,3,"style","Commented code should be removed.","# Z = logloss","commented_code_linter" -"demo/leaf_stability.R",124,81,"style","Lines should not be more than 80 characters.","new_data$Z <- -1.0 * (agaricus.test$label * log(new_data$Y) + (1L - agaricus.test$label) * log(1L - new_data$Y))","line_length_linter" -"demo/leaf_stability.R",140,81,"style","Lines should not be more than 80 characters.","# On the second plot, we clearly notice the lower the bin (the lower the leaf value), the higher the loss","line_length_linter" -"demo/leaf_stability.R",178,81,"style","Lines should not be more than 80 characters.","new_data2$Z <- -1.0 * (agaricus.test$label * log(new_data2$Y) + (1L - agaricus.test$label) * log(1L - new_data2$Y))","line_length_linter" -"demo/leaf_stability.R",194,81,"style","Lines should not be more than 80 characters.","# On the second plot, we clearly notice the lower the bin (the lower the leaf value), the higher the loss","line_length_linter" -"demo/leaf_stability.R",195,81,"style","Lines should not be more than 80 characters.","# On the third plot, it is clearly not smooth! We are severely overfitting the data, but the rules are","line_length_linter" -"demo/leaf_stability.R",234,81,"style","Lines should not be more than 80 characters.","new_data3$Z <- -1.0 * (agaricus.test$label * log(new_data3$Y) + (1L - agaricus.test$label) * log(1L - new_data3$Y))","line_length_linter" -"demo/leaf_stability.R",250,81,"style","Lines should not be more than 80 characters.","# On the third plot, it is clearly not smooth! We are severely overfitting the data, but the rules","line_length_linter" -"demo/leaf_stability.R",252,81,"style","Lines should not be more than 80 characters.","# However, if the rules were not true, the loss would explode. See the sudden spikes?","line_length_linter" -"demo/multiclass_custom_objective.R",17,81,"style","Lines should not be more than 80 characters.","dtest <- lgb.Dataset.create.valid(dtrain, data = test[, 1L:4L], label = test[, 5L])","line_length_linter" -"demo/multiclass_custom_objective.R",44,81,"style","Lines should not be more than 80 characters.","# User defined objective function, given prediction, return gradient and second order gradient","line_length_linter" -"demo/multiclass_custom_objective.R",48,81,"style","Lines should not be more than 80 characters."," # preds is a matrix with rows corresponding to samples and columns corresponding to choices","line_length_linter" -"demo/multiclass.R",17,81,"style","Lines should not be more than 80 characters.","dtest <- lgb.Dataset.create.valid(dtrain, data = test[, 1L:4L], label = test[, 5L])","line_length_linter" -"demo/multiclass.R",37,81,"style","Lines should not be more than 80 characters.","# Order: obs1 class1, obs1 class2, obs1 class3, obs2 class1, obs2 class2, obs2 class3...","line_length_linter" -"demo/weight_param.R",9,81,"style","Lines should not be more than 80 characters.","# - Run 1: sum of weights equal to 6513 (x 1e-5) without adjusted regularization (not learning)","line_length_linter" -"demo/weight_param.R",10,81,"style","Lines should not be more than 80 characters.","# - Run 2: sum of weights equal to 6513 (x 1e-5) adjusted regularization (learning)","line_length_linter" -"demo/weight_param.R",23,81,"style","Lines should not be more than 80 characters.","dtest <- lgb.Dataset.create.valid(dtrain, test$data, label = test$label, weight = weights2)","line_length_linter" -"demo/weight_param.R",26,81,"style","Lines should not be more than 80 characters.","# Run 1: sum of weights equal to 6513 (x 1e-5) without adjusted regularization (not learning)","line_length_linter" -"demo/weight_param.R",28,81,"style","Lines should not be more than 80 characters.","# min_sum_hessian alone is bigger than the sum of weights, thus you will never learn anything","line_length_linter" -"demo/weight_param.R",50,81,"style","Lines should not be more than 80 characters.","# Run 2: sum of weights equal to 6513 (x 1e-5) with adjusted regularization (learning)","line_length_linter" -"demo/weight_param.R",51,81,"style","Lines should not be more than 80 characters.","# Adjusted regularization just consisting in multiplicating results by 1e4 (x10000)","line_length_linter" -"demo/weight_param.R",52,81,"style","Lines should not be more than 80 characters.","# Notice how it learns, there is no issue as we adjusted regularization ourselves","line_length_linter" -"inst/make-r-def.R",49,22,"warning","no visible global function definition for β€˜shoQuote’"," , args = shoQuote(args)","object_usage_linter" -"R/aliases.R",50,13,"warning","no visible binding for global variable β€˜LGBM_DumpParamAliases_R’"," LGBM_DumpParamAliases_R","object_usage_linter" -"R/lgb.cv.R",288,14,"warning","no visible global function definition for β€˜cb_early_stop’"," , cb = cb_early_stop(","object_usage_linter" -"R/lgb.cv.R",583,7,"style","Variable and function name style should be snake_case or symbols."," foldVector[y == dimnames(numInClass)$y[i]] <- sample(seqVector)","object_name_linter" -"R/lgb.train.R",253,14,"warning","no visible global function definition for β€˜cb_early_stop’"," , cb = cb_early_stop(","object_usage_linter" -"tests/testthat/test_basic.R",1758,10,"style","Variable and function name style should be snake_case or symbols."," mode(X) <- data_mode","object_name_linter" -"tests/testthat/test_basic.R",2591,5,"style","Variable and function name style should be snake_case or symbols."," X[, 1L] <- rnorm(100L)","object_name_linter" -"tests/testthat/test_basic.R",2592,5,"style","Variable and function name style should be snake_case or symbols."," X[, 2L] <- sample(seq_len(4L), size = 100L, replace = TRUE)","object_name_linter" -"tests/testthat/test_Predictor.R",51,18,"style","Variable and function name style should be snake_case or symbols."," storage.mode(X_double) <- ""double""","object_name_linter" -"tests/testthat/test_Predictor.R",310,15,"style","Variable and function name style should be snake_case or symbols."," row.names(Xcopy) <- NULL","object_name_linter" -"tests/testthat/test_Predictor.R",327,15,"style","Variable and function name style should be snake_case or symbols."," row.names(Xcopy) <- NULL","object_name_linter" -"tests/testthat/test_Predictor.R",358,15,"style","Variable and function name style should be snake_case or symbols."," row.names(X) <- paste(""rname"", seq(1L, nrow(X)), sep = """")","object_name_linter" -"tests/testthat/test_Predictor.R",373,15,"style","Variable and function name style should be snake_case or symbols."," row.names(X) <- paste(""rname"", seq(1L, nrow(X)), sep = """")","object_name_linter" -"vignettes/basic_walkthrough.Rmd",59,1,"style","Variable and function name style should be snake_case or symbols.","X <- data.matrix(bank[, c(""age"", ""balance"")])","object_name_linter" diff --git a/.dev/revdep_emails/lightgbm/email-body b/.dev/revdep_emails/lightgbm/email-body deleted file mode 100644 index f3b0cdb25..000000000 --- a/.dev/revdep_emails/lightgbm/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Yu Shi! Thank you for using {lintr} in your package {lightgbm}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/microsoft/LightGBM using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 72s on CRAN vs. 38s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/mlflow/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/mlflow/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 9386eedd9..000000000 --- a/.dev/revdep_emails/mlflow/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,3 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/tracking-rest.R",34,13,"style","Variable and function name style should be snake_case."," headers$Authorization <- auth_header","object_name_linter" -"R/tracking-rest.R",36,11,"style","Variable and function name style should be snake_case."," headers$`User-Agent` <- paste(""mlflow-r-client"", utils::packageVersion(""mlflow""), sep = ""/"")","object_name_linter" diff --git a/.dev/revdep_emails/mlflow/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/mlflow/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 6262bcd68..000000000 --- a/.dev/revdep_emails/mlflow/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,12 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/model.R",39,12,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," tryCatch({ mlflow_record_logged_model(model_spec) }, error = function(e) {","brace_linter" -"R/model.R",198,47,"style","Put spaces around all infix operators.","parse_json <- function(input_path, json_format=""split"") {","infix_spaces_linter" -"R/project-param.R",54,13,"style","Any function spanning multiple lines should use curly braces."," error = function(e) stop(""`default` value for `"", name, ""` cannot be casted to type "",","brace_linter" -"R/project-param.R",60,13,"style","Any function spanning multiple lines should use curly braces."," error = function(e) stop(""Provided value for `"", name,","brace_linter" -"R/project-param.R",76,9,"style","Compound semicolons are discouraged. Replace them by a newline."," i <- 0; n <- length(arguments)","semicolon_linter" -"R/tracking-observer.R",41,31,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," error = function(e) { }","brace_linter" -"R/tracking-observer.R",41,33,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," error = function(e) { }","brace_linter" -"R/tracking-rest.R",50,49,"style","Put spaces around all infix operators."," max_rate_limit_interval=60) {","infix_spaces_linter" -"tests/testthat/test-databricks-utils.R",35,66,"style","Any function spanning multiple lines should use curly braces."," with_mock(.env = ""mlflow"", get_databricks_config_for_profile = function(profile) list(","brace_linter" -"tests/testthat/test-databricks-utils.R",187,42,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," assign("".get_job_info"", function() { job_info }, envir = databricks_internal_env)","brace_linter" -"tests/testthat/test-ui.R",12,3,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","brace_linter" diff --git a/.dev/revdep_emails/mlflow/attachments/mlflow.warnings b/.dev/revdep_emails/mlflow/attachments/mlflow.warnings deleted file mode 100644 index e85af501f..000000000 --- a/.dev/revdep_emails/mlflow/attachments/mlflow.warnings +++ /dev/null @@ -1,2 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Trying to remove β€˜closed_curly_linter’, β€˜open_curly_linter’ and β€˜absolute_paths_linter’, which are not in `defaults`. diff --git a/.dev/revdep_emails/mlflow/email-body b/.dev/revdep_emails/mlflow/email-body deleted file mode 100644 index 89ff5dde4..000000000 --- a/.dev/revdep_emails/mlflow/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Matei Zaharia! Thank you for using {lintr} in your package {mlflow}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/mlflow/mlflow using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 29s on CRAN vs. 19s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/mlr/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/mlr/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 52bb8b49d..000000000 --- a/.dev/revdep_emails/mlr/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,152 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/analyzeFeatSelResult.R",49,6,"style","Variable and function name style should be snake_case or CamelCase."," df$n.feats = rowSums(df[, features, drop = FALSE])","object_name_linter" -"R/BaggingWrapper.R",50,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$bw.iters = bw.iters","object_name_linter" -"R/BaggingWrapper.R",54,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$bw.replace = bw.replace","object_name_linter" -"R/BaggingWrapper.R",58,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$bw.size = bw.size","object_name_linter" -"R/BaggingWrapper.R",62,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$bw.feats = bw.feats","object_name_linter" -"R/BaseEnsemble_operators.R",69,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$base.learners = lapply(lrn$base.learners, setPredictType, predict.type = predict.type)","object_name_linter" -"R/BaseEnsemble.R",66,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$base.learners = setNames(base.learners, ids)","object_name_linter" -"R/BaseEnsemble.R",67,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$par.set.bls = par.set.bls","object_name_linter" -"R/BaseEnsemble.R",68,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$par.set.ens = par.set","object_name_linter" -"R/BaseWrapper_operators.R",2,1,"style","Variable and function name style should be snake_case or CamelCase.","getParamSet.BaseWrapper = function(x) {","object_name_linter" -"R/BaseWrapper.R",41,11,"style","Variable and function name style should be snake_case or CamelCase."," learner$fix.factors.prediction = FALSE","object_name_linter" -"R/BaseWrapper.R",43,11,"style","Variable and function name style should be snake_case or CamelCase."," learner$model.subclass = model.subclass","object_name_linter" -"R/BenchmarkResultOrderLevels.R",11,8,"style","Variable and function name style should be snake_case or CamelCase."," df$task.id = factor(df$task.id, order.tsks)","object_name_linter" -"R/BenchmarkResultOrderLevels.R",26,8,"style","Variable and function name style should be snake_case or CamelCase."," df$learner.id = factor(df$learner.id, order.lrns)","object_name_linter" -"R/calculateConfusionMatrix.R",118,12,"style","Variable and function name style should be snake_case or CamelCase."," result$relative.row = result.rel.row","object_name_linter" -"R/calculateConfusionMatrix.R",119,12,"style","Variable and function name style should be snake_case or CamelCase."," result$relative.col = result.rel.col","object_name_linter" -"R/calculateConfusionMatrix.R",120,12,"style","Variable and function name style should be snake_case or CamelCase."," result$relative.error = result$result[k + 1, k + 1] / n.pred","object_name_linter" -"R/ClassifTask.R",36,8,"style","Variable and function name style should be snake_case or CamelCase."," task$task.desc = makeClassifTaskDesc(id, data, target, weights, blocking, positive, coordinates)","object_name_linter" -"R/ClusterTask.R",16,8,"style","Variable and function name style should be snake_case or CamelCase."," task$task.desc = makeClusterTaskDesc(id, data, weights, blocking, coordinates)","object_name_linter" -"R/CostSensTask.R",45,8,"style","Variable and function name style should be snake_case or CamelCase."," task$task.desc = makeCostSensTaskDesc(id, data, target, blocking, costs, coordinates)","object_name_linter" -"R/CostSensWeightedPairsWrapper.R",61,15,"style","Variable and function name style should be snake_case or CamelCase."," feats$..y.. = y","object_name_linter" -"R/createSpatialResamplingPlots.R",153,5,"style","Variable and function name style should be snake_case or CamelCase."," length.n.resamp = length(resample)","object_name_linter" -"R/createSpatialResamplingPlots.R",160,3,"style","Variable and function name style should be snake_case or CamelCase."," plot.list.out.all = lapply(resample, function(r) {","object_name_linter" -"R/createSpatialResamplingPlots.R",171,5,"style","Variable and function name style should be snake_case or CamelCase."," plot.list.out = imap(plot.list, function(.x, .y) {","object_name_linter" -"R/downsample.R",37,7,"style","Variable and function name style should be snake_case or CamelCase."," obj$train.inds = lapply(obj$train.inds, function(x) sample(x, size = length(x) * perc))","object_name_linter" -"R/DownsampleWrapper.R",26,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$dw.perc = dw.perc","object_name_linter" -"R/DownsampleWrapper.R",30,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$dw.stratify = dw.stratify","object_name_linter" -"R/DownsampleWrapper.R",55,5,"style","Variable and function name style should be snake_case or CamelCase."," m$train.task = .task","object_name_linter" -"R/extractFDAFeatures.R",89,8,"style","Variable and function name style should be snake_case or CamelCase."," desc$extractFDAFeat = Map(function(x) {","object_name_linter" -"R/extractFDAFeatures.R",102,8,"style","Variable and function name style should be snake_case or CamelCase."," desc$fd.cols = names(desc$extractFDAFeat)","object_name_linter" -"R/extractFDAFeatures.R",115,8,"style","Variable and function name style should be snake_case or CamelCase."," desc$extractFDAFeat = extracts","object_name_linter" -"R/FeatSelWrapper.R",71,5,"style","Variable and function name style should be snake_case or CamelCase."," x$opt.result = or","object_name_linter" -"R/FilterWrapper.R",168,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$more.args = ddd","object_name_linter" -"R/getHyperPars.R",43,26,"style","Variable and function name style should be snake_case or CamelCase."," learner$par.set$pars$fw.base.methods = NULL","object_name_linter" -"R/getHyperPars.R",44,26,"style","Variable and function name style should be snake_case or CamelCase."," learner$par.set$pars$fw.method = NULL","object_name_linter" -"R/getHyperPars.R",45,22,"style","Variable and function name style should be snake_case or CamelCase."," learner$par.vals$fw.method = NULL","object_name_linter" -"R/getHyperPars.R",46,22,"style","Variable and function name style should be snake_case or CamelCase."," learner$par.vals$fw.base.methods = NULL","object_name_linter" -"R/getHyperPars.R",49,39,"style","Variable and function name style should be snake_case or CamelCase."," learner$next.learner$par.set$pars$fw.base.methods = NULL","object_name_linter" -"R/getHyperPars.R",50,39,"style","Variable and function name style should be snake_case or CamelCase."," learner$next.learner$par.set$pars$fw.method = NULL","object_name_linter" -"R/getHyperPars.R",51,35,"style","Variable and function name style should be snake_case or CamelCase."," learner$next.learner$par.vals$fw.method = NULL","object_name_linter" -"R/getHyperPars.R",52,35,"style","Variable and function name style should be snake_case or CamelCase."," learner$next.learner$par.vals$fw.base.methods = NULL","object_name_linter" -"R/getMultilabelBinaryPerformances.R",39,20,"style","Variable and function name style should be snake_case or CamelCase."," predi$data$prob.TRUE = probs[, label]","object_name_linter" -"R/getParamSet.R",13,1,"style","Variable and function name style should be snake_case or CamelCase.","getParamSet.Learner = function(x) {","object_name_linter" -"R/getParamSet.R",18,1,"style","Variable and function name style should be snake_case or CamelCase.","getParamSet.character = function(x) {","object_name_linter" -"R/Impute.R",179,8,"style","Variable and function name style should be snake_case or CamelCase."," desc$recode.factor.levels = recode.factor.levels","object_name_linter" -"R/Impute.R",180,8,"style","Variable and function name style should be snake_case or CamelCase."," desc$impute.new.levels = impute.new.levels","object_name_linter" -"R/logFunOpt.R",9,5,"style","Variable and function name style should be snake_case or CamelCase."," start.time = Sys.time()","object_name_linter" -"R/logFunOpt.R",13,5,"style","Variable and function name style should be snake_case or CamelCase."," end.time = Sys.time()","object_name_linter" -"R/logFunOpt.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," start.time = Sys.time()","object_name_linter" -"R/logFunOpt.R",35,5,"style","Variable and function name style should be snake_case or CamelCase."," end.time = Sys.time()","object_name_linter" -"R/makeLearner.R",173,6,"style","Variable and function name style should be snake_case or CamelCase."," wl$fix.factors.prediction = fix.factors.prediction","object_name_linter" -"R/Measure_operators.R",22,11,"style","Variable and function name style should be snake_case or CamelCase."," measure$extra.args = insert(measure$extra.args, insert(par.vals, args))","object_name_linter" -"R/ModelMultiplexer.R",93,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$par.set = c(lrn$par.set, ps)","object_name_linter" -"R/ModelMultiplexer.R",94,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$par.set.ens = ps","object_name_linter" -"R/ModelMultiplexer.R",95,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$fix.factors.prediction = TRUE","object_name_linter" -"R/MultilabelNestedStackingWrapper.R",37,5,"style","Variable and function name style should be snake_case or CamelCase."," x$cv.folds = cv.folds","object_name_linter" -"R/MultilabelStackingWrapper.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," x$cv.folds = cv.folds","object_name_linter" -"R/MultilabelTask.R",34,8,"style","Variable and function name style should be snake_case or CamelCase."," task$task.desc = makeMultilabelTaskDesc(id, data, target, weights, blocking, coordinates)","object_name_linter" -"R/OptWrapper.R",8,5,"style","Variable and function name style should be snake_case or CamelCase."," x$opt.pars = par.set","object_name_linter" -"R/OptWrapper.R",9,5,"style","Variable and function name style should be snake_case or CamelCase."," x$bit.names = bit.names","object_name_linter" -"R/OptWrapper.R",10,5,"style","Variable and function name style should be snake_case or CamelCase."," x$bits.to.features = bits.to.features","object_name_linter" -"R/OptWrapper.R",11,5,"style","Variable and function name style should be snake_case or CamelCase."," x$opt.pars = par.set","object_name_linter" -"R/OptWrapper.R",13,5,"style","Variable and function name style should be snake_case or CamelCase."," x$show.info = show.info","object_name_linter" -"R/OverBaggingWrapper.R",48,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$obw.iters = obw.iters","object_name_linter" -"R/OverBaggingWrapper.R",52,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$obw.rate = obw.rate","object_name_linter" -"R/OverBaggingWrapper.R",56,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$obw.maxcl = obw.maxcl","object_name_linter" -"R/OverBaggingWrapper.R",60,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$obw.cl = obw.cl","object_name_linter" -"R/OverUndersampleWrapper.R",36,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$usw.rate = usw.rate","object_name_linter" -"R/OverUndersampleWrapper.R",40,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$usw.cl = usw.cl","object_name_linter" -"R/OverUndersampleWrapper.R",58,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$osw.rate = osw.rate","object_name_linter" -"R/OverUndersampleWrapper.R",62,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$osw.cl = osw.cl","object_name_linter" -"R/OverUndersampleWrapper.R",86,5,"style","Variable and function name style should be snake_case or CamelCase."," m$train.task = .task","object_name_linter" -"R/OverUndersampleWrapper.R",103,5,"style","Variable and function name style should be snake_case or CamelCase."," m$train.task = .task","object_name_linter" -"R/plotBMRRanksAsBarChart.R",39,6,"style","Variable and function name style should be snake_case or CamelCase."," df$learner.id = factor(rownames(df))","object_name_linter" -"R/plotCritDifferences.R",83,6,"style","Variable and function name style should be snake_case or CamelCase."," df$short.name = getBMRLearnerShortNames(bmr)","object_name_linter" -"R/plotLearnerPrediction.R",182,14,"style","Variable and function name style should be snake_case or CamelCase."," grid$.prob.pred.class = prob","object_name_linter" -"R/predict.R",101,5,"style","Variable and function name style should be snake_case or CamelCase."," time.predict = NA_real_","object_name_linter" -"R/predict.R",131,5,"style","Variable and function name style should be snake_case or CamelCase."," time.predict = measureTime(fun1({","object_name_linter" -"R/predict.R",142,7,"style","Variable and function name style should be snake_case or CamelCase."," time.predict = NA_real_","object_name_linter" -"R/Prediction.R",142,8,"style","Variable and function name style should be snake_case or CamelCase."," data$truth.time = truth[, 1L]","object_name_linter" -"R/Prediction.R",143,8,"style","Variable and function name style should be snake_case or CamelCase."," data$truth.event = truth[, 2L]","object_name_linter" -"R/RegrTask.R",27,8,"style","Variable and function name style should be snake_case or CamelCase."," task$task.desc = makeRegrTaskDesc(id, data, target, weights, blocking, coordinates)","object_name_linter" -"R/RemoveConstantFeaturesWrapper.R",18,10,"style","Variable and function name style should be snake_case or CamelCase."," args$dont.rm = union(args$dont.rm, target)","object_name_linter" -"R/ResampleDesc.R",123,5,"style","Variable and function name style should be snake_case or CamelCase."," d$stratify.cols = stratify.cols","object_name_linter" -"R/ResampleDesc.R",125,5,"style","Variable and function name style should be snake_case or CamelCase."," d$blocking.cv = blocking.cv","object_name_linter" -"R/ResampleInstance.R",92,10,"style","Variable and function name style should be snake_case or CamelCase."," inst$train.inds = lapply(inst$train.inds, function(i) sample(which(blocking %in% levs[i])))","object_name_linter" -"R/ResampleInstance.R",94,10,"style","Variable and function name style should be snake_case or CamelCase."," inst$test.inds = lapply(inst$train.inds, function(x) setdiff(ti, x))","object_name_linter" -"R/ResampleInstance.R",136,10,"style","Variable and function name style should be snake_case or CamelCase."," inst$train.inds = Reduce(function(i1, i2) Map(c, i1, i2), train.inds)","object_name_linter" -"R/ResampleInstance.R",137,10,"style","Variable and function name style should be snake_case or CamelCase."," inst$test.inds = Reduce(function(i1, i2) Map(c, i1, i2), test.inds)","object_name_linter" -"R/ResampleInstances.R",50,5,"style","Variable and function name style should be snake_case or CamelCase."," length.test.inds = unlist(lapply(test.inds, function(x) length(x)))","object_name_linter" -"R/ResampleResult_operators.R",149,11,"style","Variable and function name style should be snake_case or CamelCase."," res$measures.train = cbind(res$measures.train, perf$train[, missing.measures, drop = FALSE])","object_name_linter" -"R/ResampleResult_operators.R",154,11,"style","Variable and function name style should be snake_case or CamelCase."," res$measures.test = cbind(res$measures.test, perf$test[, missing.measures, drop = FALSE])","object_name_linter" -"R/RLearner_classif_h2odeeplearning.R",252,7,"style","Variable and function name style should be snake_case or CamelCase."," d$.mlr.weights = .weights","object_name_linter" -"R/RLearner_classif_h2oglm.R",47,7,"style","Variable and function name style should be snake_case or CamelCase."," d$.mlr.weights = .weights","object_name_linter" -"R/RLearner_regr_h2odeeplearning.R",253,7,"style","Variable and function name style should be snake_case or CamelCase."," d$.mlr.weights = .weights","object_name_linter" -"R/RLearner_regr_h2oglm.R",45,7,"style","Variable and function name style should be snake_case or CamelCase."," d$.mlr.weights = .weights","object_name_linter" -"R/RLearner_regr_km.R",54,10,"style","Variable and function name style should be snake_case or CamelCase."," args$nugget.stability = NULL","object_name_linter" -"R/RLearner.R",92,11,"style","Variable and function name style should be snake_case or CamelCase."," learner$short.name = short.name","object_name_linter" -"R/RLearner.R",95,11,"style","Variable and function name style should be snake_case or CamelCase."," learner$help.list = makeParamHelpList(callees, package, par.set)","object_name_linter" -"R/RLearner.R",113,11,"style","Variable and function name style should be snake_case or CamelCase."," lrn$class.weights.param = class.weights.param","object_name_linter" -"R/SMOTEWrapper.R",42,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$sw.rate = sw.rate","object_name_linter" -"R/SMOTEWrapper.R",46,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$sw.nn = sw.nn","object_name_linter" -"R/SMOTEWrapper.R",49,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$sw.standardize = sw.standardize","object_name_linter" -"R/SMOTEWrapper.R",52,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$sw.alt.logic = sw.alt.logic","object_name_linter" -"R/StackedLearner.R",153,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$fix.factors.prediction = TRUE","object_name_linter" -"R/StackedLearner.R",154,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$use.feat = use.feat","object_name_linter" -"R/StackedLearner.R",157,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$super.learner = super.learner","object_name_linter" -"R/SurvTask.R",48,8,"style","Variable and function name style should be snake_case or CamelCase."," task$task.desc = makeSurvTaskDesc(id, data, target, weights, blocking, coordinates)","object_name_linter" -"R/Task_operators.R",460,8,"style","Variable and function name style should be snake_case or CamelCase."," task$task.desc = switch(td$type,","object_name_linter" -"R/train.R",81,5,"style","Variable and function name style should be snake_case or CamelCase."," time.train = 0","object_name_linter" -"R/train.R",105,5,"style","Variable and function name style should be snake_case or CamelCase."," time.train = measureTime(fun1({","object_name_linter" -"R/TuneControlIrace.R",45,18,"style","Variable and function name style should be snake_case or CamelCase."," x$extra.args$maxExperiments = asCount(x$extra.args$maxExperiments)","object_name_linter" -"R/TuneControlIrace.R",55,18,"style","Variable and function name style should be snake_case or CamelCase."," x$extra.args$maxExperiments = x$budget","object_name_linter" -"R/TuneControlMBO.R",58,5,"style","Variable and function name style should be snake_case or CamelCase."," x$mbo.control = mbo.control","object_name_linter" -"R/TuneControlMBO.R",60,5,"style","Variable and function name style should be snake_case or CamelCase."," x$mbo.design = mbo.design","object_name_linter" -"R/tuneIrace.R",26,22,"style","Variable and function name style should be snake_case or CamelCase."," control$extra.args$n.instances = NULL","object_name_linter" -"R/tuneIrace.R",28,22,"style","Variable and function name style should be snake_case or CamelCase."," control$extra.args$show.irace.output = NULL","object_name_linter" -"R/TuneMultiCritControlMBO.R",37,5,"style","Variable and function name style should be snake_case or CamelCase."," x$mbo.control = mbo.control","object_name_linter" -"R/TuneMultiCritControlMBO.R",39,5,"style","Variable and function name style should be snake_case or CamelCase."," x$mbo.design = mbo.design","object_name_linter" -"R/TuneWrapper.R",72,5,"style","Variable and function name style should be snake_case or CamelCase."," x$opt.result = or","object_name_linter" -"R/utils_opt.R",11,13,"style","Variable and function name style should be snake_case or CamelCase."," control$impute.val = vnapply(measures, getDefVal)","object_name_linter" -"R/utils.R",35,1,"style","Variable and function name style should be snake_case or CamelCase.","print.mlr.dump = function(x, ...) {","object_name_linter" -"R/WeightedClassesWrapper.R",92,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$wcw.weight = wcw.weight","object_name_linter" -"R/WeightedClassesWrapper.R",100,5,"style","Variable and function name style should be snake_case or CamelCase."," x$wcw.param = wcw.param","object_name_linter" -"R/zzz.R",15,1,"style","Variable and function name style should be snake_case or CamelCase.",".onLoad = function(libname, pkgname) {","object_name_linter" -"R/zzz.R",20,1,"style","Variable and function name style should be snake_case or CamelCase.",".onAttach = function(libname, pkgname) {","object_name_linter" -"R/zzz.R",34,5,"style","Variable and function name style should be snake_case or CamelCase.","mlr$learner.properties = list(","object_name_linter" -"tests/testthat/helper_lint.R",279,13,"style","Variable and function name style should be snake_case or CamelCase."," linters$T.and.F.symbol = lintr::T_and_F_symbol_linter","object_name_linter" -"tests/testthat/helper_lint.R",282,13,"style","Variable and function name style should be snake_case or CamelCase."," linters$semicolon.terminator = lintr::semicolon_terminator_linter","object_name_linter" -"tests/testthat/helper_lint.R",288,13,"style","Variable and function name style should be snake_case or CamelCase."," linters$unneeded.concatenation = lintr::unneeded_concatenation_linter","object_name_linter" -"tests/testthat/test_base_BaseWrapper.R",34,41,"style","Place a space before left parenthesis, except in a function call."," makeDiscreteParam(""C"", values = 2^(-2:2)),","spaces_left_parentheses_linter" -"tests/testthat/test_base_BaseWrapper.R",35,45,"style","Place a space before left parenthesis, except in a function call."," makeDiscreteParam(""sigma"", values = 2^(-2:2))","spaces_left_parentheses_linter" -"tests/testthat/test_base_BaseWrapper.R",63,43,"style","Place a space before left parenthesis, except in a function call."," makeDiscreteParam(""C"", values = 2^(-2:2)),","spaces_left_parentheses_linter" -"tests/testthat/test_base_BaseWrapper.R",64,47,"style","Place a space before left parenthesis, except in a function call."," makeDiscreteParam(""sigma"", values = 2^(-2:2))","spaces_left_parentheses_linter" -"tests/testthat/test_base_generateHyperParsEffect.R",35,55,"style","Place a space before left parenthesis, except in a function call."," ps = makeParamSet(makeDiscreteParam(""C"", values = 2^(-2:2)))","spaces_left_parentheses_linter" -"tests/testthat/test_base_measures.R",202,3,"style","Variable and function name style should be snake_case or CamelCase."," time.surv = c(5, 10, 5, 10)","object_name_linter" -"tests/testthat/test_base_MulticlassWrapper.R",46,6,"style","Variable and function name style should be snake_case or CamelCase."," df$Sepal.Length = factor(df$Sepal.Length)","object_name_linter" -"tests/testthat/test_base_plotCritDifferences.R",33,5,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" -"tests/testthat/test_base_selectFeatures.R",17,8,"style","Variable and function name style should be snake_case or CamelCase."," ctrl$impute.val = 10","object_name_linter" -"tests/testthat/test_base_tuning.R",34,8,"style","Variable and function name style should be snake_case or CamelCase."," ctrl$impute.val = 10","object_name_linter" -"tests/testthat/test_base_tuning.R",192,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$par.set = c(lrn$par.set, long.learner.params)","object_name_linter" -"tests/testthat/test_classif_ksvm.R",26,10,"style","Variable and function name style should be snake_case or CamelCase."," pars$prob.model = TRUE","object_name_linter" -"tests/testthat/test_classif_pamr.R",20,14,"style","Variable and function name style should be snake_case or CamelCase."," parset$threshold.predict = NULL","object_name_linter" -"tests/testthat/test_regr_frbs.R",20,10,"style","Variable and function name style should be snake_case or CamelCase."," pars$data.train = regr.num.train","object_name_linter" -"tests/testthat/test_regr_mob.R",33,12,"style","Variable and function name style should be snake_case or CamelCase."," parset$term.feats = parset$part.feats = NULL","object_name_linter" -"tests/testthat/test_regr_mob.R",33,32,"style","Variable and function name style should be snake_case or CamelCase."," parset$term.feats = parset$part.feats = NULL","object_name_linter" -"tests/testthat/test_tune_tuneDesign.R",6,3,"style","Variable and function name style should be snake_case or CamelCase."," sigma.seq = 2^seq(-2, 2, length.out = reso)","object_name_linter" -"tests/testthat/test_tune_tuneGrid.R",6,3,"style","Variable and function name style should be snake_case or CamelCase."," sigma.seq = 2^seq(-2, 2, length.out = reso)","object_name_linter" -"tests/testthat/test_tune_tuneGrid.R",7,3,"style","Variable and function name style should be snake_case or CamelCase."," sigma.seq.2 = 2^seq(-2, 2, length.out = reso * 2)","object_name_linter" -"tests/testthat/test_tune_tuneGrid.R",41,7,"style","Variable and function name style should be snake_case or CamelCase."," op1$exec.time = op2$exec.time = NULL","object_name_linter" -"tests/testthat/test_tune_tuneGrid.R",41,23,"style","Variable and function name style should be snake_case or CamelCase."," op1$exec.time = op2$exec.time = NULL","object_name_linter" diff --git a/.dev/revdep_emails/mlr/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/mlr/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 819f871a1..000000000 --- a/.dev/revdep_emails/mlr/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,791 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/makeData.R",96,1,"style","Variable and function name style should be snake_case or CamelCase.","fuelSubset$UVVIS = scale(fuelSubset$UVVIS, scale = FALSE)","object_name_linter" -"inst/makeData.R",97,1,"style","Variable and function name style should be snake_case or CamelCase.","fuelSubset$NIR = scale(fuelSubset$NIR, scale = FALSE)","object_name_linter" -"R/analyzeFeatSelResult.R",95,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.na(ctrl$max.features) & (length(x) == ctrl$max.features)) {","vector_logic_linter" -"R/batchmark.R",59,5,"style","Variable and function name style should be snake_case or CamelCase."," apply.fun = getAlgoFun(learner, measures, models, keep.extract)","object_name_linter" -"R/benchmark.R",67,11,"style","Variable and function name style should be snake_case or CamelCase."," names(results.by.task[[taskname]]) = grid$learner[grid$task == taskname]","object_name_linter" -"R/BenchmarkResult_operators.R",125,7,"style","Variable and function name style should be snake_case or CamelCase."," drop.tasks = length(task.ids) == 1L","object_name_linter" -"R/BenchmarkResult_operators.R",126,7,"style","Variable and function name style should be snake_case or CamelCase."," drop.learners = length(learner.ids) == 1L","object_name_linter" -"R/BenchmarkResult_operators.R",127,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (drop.tasks | drop.learners) {","vector_logic_linter" -"R/BenchmarkResult_operators.R",129,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (drop.tasks & drop.learners) {","vector_logic_linter" -"R/BenchmarkResult_operators.R",132,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (drop.tasks & !drop.learners) {","vector_logic_linter" -"R/BenchmarkResult_operators.R",135,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!drop.tasks & drop.learners) {","vector_logic_linter" -"R/calculateConfusionMatrix.R",83,3,"style","Variable and function name style should be snake_case or CamelCase."," row.err = rowSums(mt)","object_name_linter" -"R/calculateConfusionMatrix.R",84,3,"style","Variable and function name style should be snake_case or CamelCase."," col.err = colSums(mt)","object_name_linter" -"R/calculateConfusionMatrix.R",158,5,"style","Variable and function name style should be snake_case or CamelCase."," col.err = x$relative.col[k + 1, ]","object_name_linter" -"R/calculateConfusionMatrix.R",159,5,"style","Variable and function name style should be snake_case or CamelCase."," row.err = x$relative.row[, k + 1]","object_name_linter" -"R/calculateConfusionMatrix.R",183,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/checkLearner.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," missing.props = setdiff(props, learner.props)","object_name_linter" -"R/configureMlr.R",74,3,"style","Variable and function name style should be snake_case or CamelCase."," any.change = FALSE","object_name_linter" -"R/configureMlr.R",78,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" -"R/configureMlr.R",83,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" -"R/configureMlr.R",88,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" -"R/configureMlr.R",93,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" -"R/configureMlr.R",98,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" -"R/configureMlr.R",103,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" -"R/configureMlr.R",108,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" -"R/configureMlr.R",113,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" -"R/evalOptimizationState.R",15,3,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = control$log.fun","object_name_linter" -"R/evalOptimizationState.R",50,7,"style","Variable and function name style should be snake_case or CamelCase."," th.args$pred = r$pred","object_name_linter" -"R/evalOptimizationState.R",51,7,"style","Variable and function name style should be snake_case or CamelCase."," th.args$measure = measures[[1L]]","object_name_linter" -"R/extractFDAFeatures.R",68,3,"style","Variable and function name style should be snake_case or CamelCase."," all.fds = which(names(feat.methods) == ""all"")","object_name_linter" -"R/extractFDAFeatures.R",71,5,"style","Variable and function name style should be snake_case or CamelCase."," feat.methods[all.fds] = NULL","object_name_linter" -"R/extractFDAFeaturesMethods.R",389,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(refs) | is.integer(refs)) {","vector_logic_linter" -"R/extractFDAFeaturesMethods.R",526,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(dim(df)) | vals$res.level == 1L) {","vector_logic_linter" -"R/FeatSelControl.R",106,3,"style","Variable and function name style should be snake_case or CamelCase."," max.features = asCount(max.features, na.ok = TRUE, positive = TRUE)","object_name_linter" -"R/FeatSelControl.R",108,5,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = logFunFeatSel","object_name_linter" -"R/FeatSelControl.R",110,5,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = logFunTuneMemory","object_name_linter" -"R/FeatSelControlExhaustive.R",5,3,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = ""default"") {","object_name_linter" -"R/FeatSelControlGA.R",4,24,"style","Variable and function name style should be snake_case or CamelCase."," maxit = NA_integer_, max.features = NA_integer_, comma = FALSE, mu = 10L, lambda,","object_name_linter" -"R/FeatSelControlGA.R",6,3,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = ""default"") {","object_name_linter" -"R/FeatSelControlSequential.R",4,53,"style","Variable and function name style should be snake_case or CamelCase."," alpha = 0.01, beta = -0.001, maxit = NA_integer_, max.features = NA_integer_,","object_name_linter" -"R/FilterEnsemble.R",56,3,"warning","local variable β€˜tag2df’ assigned but may not be used"," tag2df = function(tags, prefix = """") {","object_usage_linter" -"R/FilterEnsemble.R",113,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(fval.ens) = c(""name"", ""value"")","object_name_linter" -"R/FilterEnsemble.R",117,5,"style","Variable and function name style should be snake_case or CamelCase."," fval.ens$filter = ""E-min""","object_name_linter" -"R/FilterEnsemble.R",146,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(fval.ens) = c(""name"", ""value"")","object_name_linter" -"R/FilterEnsemble.R",150,5,"style","Variable and function name style should be snake_case or CamelCase."," fval.ens$filter = ""E-mean""","object_name_linter" -"R/FilterEnsemble.R",180,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(fval.ens) = c(""name"", ""value"")","object_name_linter" -"R/FilterEnsemble.R",184,5,"style","Variable and function name style should be snake_case or CamelCase."," fval.ens$filter = ""E-max""","object_name_linter" -"R/FilterEnsemble.R",213,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(fval.ens) = c(""name"", ""value"")","object_name_linter" -"R/FilterEnsemble.R",217,5,"style","Variable and function name style should be snake_case or CamelCase."," fval.ens$filter = ""E-median""","object_name_linter" -"R/FilterEnsemble.R",250,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(fval.ens) = c(""name"", ""value"")","object_name_linter" -"R/FilterEnsemble.R",254,5,"style","Variable and function name style should be snake_case or CamelCase."," fval.ens$filter = ""E-Borda""","object_name_linter" -"R/FilterEnsemble.R",290,3,"style","Variable and function name style should be snake_case or CamelCase."," all.filters = rbind(simple_filters, ensemble_filters)","object_name_linter" -"R/filterFeatures.R",170,22,"warning","no visible binding for global variable β€˜value’"," order(filter, -value)), ][[""value""]]), fun.args))","object_usage_linter" -"R/filterFeatures.R",191,47,"warning","no visible binding for global variable β€˜value’"," features = fval[with(fval, order(filter, -value)), ]","object_usage_linter" -"R/filterFeatures.R",206,3,"style","Variable and function name style should be snake_case or CamelCase."," sum.null = sum(!is.null(perc), !is.null(abs), !is.null(threshold), !is.null(fun))","object_name_linter" -"R/friedmanPostHocTestBMR.R",74,3,"style","Variable and function name style should be snake_case or CamelCase."," q.nemenyi = qtukey(1 - p.value, n.learners, 1e+06) / sqrt(2L)","object_name_linter" -"R/friedmanPostHocTestBMR.R",76,3,"style","Variable and function name style should be snake_case or CamelCase."," q.bd = qtukey(1L - (p.value / (n.learners - 1L)), 2L, 1e+06) / sqrt(2L)","object_name_linter" -"R/generateCalibration.R",101,7,"style","Variable and function name style should be snake_case or CamelCase."," break.points = hist(df$Probability, breaks = breaks, plot = FALSE)$breaks","object_name_linter" -"R/generateCalibration.R",121,3,"style","Variable and function name style should be snake_case or CamelCase."," max.bin = sapply(stri_split(levels(proportion$bin), regex = "",|]|\\)""),","object_name_linter" -"R/generateCalibration.R",201,5,"style","Variable and function name style should be snake_case or CamelCase."," top.data$x = jitter(as.numeric(top.data$bin))","object_name_linter" -"R/generateCalibration.R",204,5,"style","Variable and function name style should be snake_case or CamelCase."," bottom.data$x = jitter(as.numeric(bottom.data$bin))","object_name_linter" -"R/generateFilterValues.R",141,7,"style","Variable and function name style should be snake_case or CamelCase."," missing.score = setdiff(fn, names(x))","object_name_linter" -"R/generateFilterValues.R",165,44,"warning","no visible binding for global variable β€˜value’"," print(x$data[with(x$data, order(filter, -value)), ])","object_usage_linter" -"R/generateHyperParsEffect.R",304,7,"style","Variable and function name style should be snake_case or CamelCase."," col.name = stri_split_fixed(col, "".test.mean"", omit_empty = TRUE)[[1]]","object_name_linter" -"R/generateHyperParsEffect.R",353,9,"style","Variable and function name style should be snake_case or CamelCase."," col.name = stri_split_fixed(col, "".test.mean"", omit_empty = TRUE)[[1]]","object_name_linter" -"R/generateLearningCurve.R",135,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((color == ""learner"" & nlearn == 1L) | (color == ""measure"" & nmeas == 1L)) {","vector_logic_linter" -"R/generateLearningCurve.R",135,43,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((color == ""learner"" & nlearn == 1L) | (color == ""measure"" & nmeas == 1L)) {","vector_logic_linter" -"R/generateLearningCurve.R",135,65,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((color == ""learner"" & nlearn == 1L) | (color == ""measure"" & nmeas == 1L)) {","vector_logic_linter" -"R/generateLearningCurve.R",138,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((facet == ""learner"" & nlearn == 1L) | (facet == ""measure"" & nmeas == 1L)) {","vector_logic_linter" -"R/generateLearningCurve.R",138,43,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((facet == ""learner"" & nlearn == 1L) | (facet == ""measure"" & nmeas == 1L)) {","vector_logic_linter" -"R/generateLearningCurve.R",138,65,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((facet == ""learner"" & nlearn == 1L) | (facet == ""measure"" & nmeas == 1L)) {","vector_logic_linter" -"R/generatePartialDependence.R",113,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (obj$learner$predict.type == ""se"" & individual) {","vector_logic_linter" -"R/generatePartialDependence.R",116,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (obj$learner$predict.type == ""se"" & derivative) {","vector_logic_linter" -"R/generatePartialDependence.R",144,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (derivative & interaction) {","vector_logic_linter" -"R/generatePartialDependence.R",166,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(names(test.fun)) & !individual) {","vector_logic_linter" -"R/generatePartialDependence.R",406,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (obj$interaction & length(obj$features) > 2L & geom != ""tile"") {","vector_logic_linter" -"R/generatePartialDependence.R",406,51,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (obj$interaction & length(obj$features) > 2L & geom != ""tile"") {","vector_logic_linter" -"R/generatePartialDependence.R",444,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(features) > 1L & !(length(features) == 2L & geom == ""tile"")) {","vector_logic_linter" -"R/generatePartialDependence.R",444,58,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(features) > 1L & !(length(features) == 2L & geom == ""tile"")) {","vector_logic_linter" -"R/generatePartialDependence.R",497,53,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (obj$task.desc$type %in% c(""regr"", ""surv"") |","vector_logic_linter" -"R/generatePartialDependence.R",498,42,"warning","Conditional expressions require scalar logical operators (&& and ||)"," (obj$task.desc$type == ""classif"" & length(obj$task.desc$class.levels) <= 2L)) {","vector_logic_linter" -"R/generatePartialDependence.R",506,53,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (obj$task.desc$type %in% c(""regr"", ""surv"") |","vector_logic_linter" -"R/generatePartialDependence.R",507,42,"warning","Conditional expressions require scalar logical operators (&& and ||)"," (obj$task.desc$type == ""classif"" & length(obj$task.desc$class.levels) <= 2L)) {","vector_logic_linter" -"R/generateThreshVsPerf.R",203,3,"style","`else` should come on the same line as the previous `}`."," else if (length(obj$measures) == 1L) {","brace_linter" -"R/getCaretParamSet.R",95,5,"style","Variable and function name style should be snake_case or CamelCase."," par.vals[vlapply(par.vals, testIntegerish)] =","object_name_linter" -"R/getNestedTuneResults.R",53,5,"style","Variable and function name style should be snake_case or CamelCase."," op.dfs[[i]][, ""iter""] = i","object_name_linter" -"R/getResamplingIndices.R",42,5,"style","Variable and function name style should be snake_case or CamelCase."," outer.inds = object$pred$instance[c(""train.inds"", ""test.inds"")]","object_name_linter" -"R/helpers_FDGAMBoost.R",46,11,"style","Variable and function name style should be snake_case or CamelCase."," names(fd.grids) = fdns","object_name_linter" -"R/helpers_FDGAMBoost.R",55,7,"warning","local variable β€˜gn’ assigned but may not be used"," gn = stri_paste(fdn, "".grid"")","object_usage_linter" -"R/helpers_FDGAMBoost.R",57,7,"style","Variable and function name style should be snake_case or CamelCase."," mat.list[[fdn]] = mdata[, fdn]","object_name_linter" -"R/helpers_FDGAMBoost.R",81,3,"style","Variable and function name style should be snake_case or CamelCase."," mat.list[[targetname]] = mdata[, targetname]","object_name_linter" -"R/helpers_FDGAMBoost.R",112,11,"style","Variable and function name style should be snake_case or CamelCase."," names(fd.grids) = fdns","object_name_linter" -"R/helpers_FDGAMBoost.R",123,7,"style","Variable and function name style should be snake_case or CamelCase."," mat.list[[fdn]] = tdata[, fdn]","object_name_linter" -"R/helpers_FDGAMBoost.R",137,5,"style","Variable and function name style should be snake_case or CamelCase."," mat.list[[fsn]] = as.vector(as.matrix(tdata[, fsn, drop = FALSE]))","object_name_linter" -"R/helpers_FDGAMBoost.R",143,3,"style","Variable and function name style should be snake_case or CamelCase."," mat.list[[tn]] = tdata[, tn]","object_name_linter" -"R/helpers.R",59,11,"style","Variable and function name style should be snake_case or CamelCase."," attr(x, ""mlr.train.info"") = info","object_name_linter" -"R/helpers.R",113,3,"style","Variable and function name style should be snake_case or CamelCase."," meas.names[dupes] = new.names","object_name_linter" -"R/helpLearner.R",70,7,"style","Variable and function name style should be snake_case or CamelCase."," next.learner = current.learner$next.learner","object_name_linter" -"R/helpLearner.R",99,3,"style","Variable and function name style should be snake_case or CamelCase."," all.param = getParamIds(learner$par.set)","object_name_linter" -"R/helpLearner.R",217,11,"style","Variable and function name style should be snake_case or CamelCase."," help.list[[par.name]] = stri_join(""Argument of: "",","object_name_linter" -"R/Impute.R",257,9,"style","Variable and function name style should be snake_case or CamelCase."," names(dummy.cols) = sprintf(""%s.dummy"", desc$dummies)","object_name_linter" -"R/Learner_properties.R",86,3,"style","Variable and function name style should be snake_case or CamelCase."," all.props = c(listTaskTypes(), ""any"")","object_name_linter" -"R/Learner.R",7,11,"style","Variable and function name style should be snake_case or CamelCase."," names(par.vals) = character(0L)","object_name_linter" -"R/listLearners.R",6,3,"warning","local variable β€˜slots’ assigned but may not be used"," slots = c(""cl"", ""name"", ""short.name"", ""package"", ""properties"", ""note"")","object_usage_linter" -"R/Measure_colAUC.R",42,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (n1 > 0 & n2 > 0) {","vector_logic_linter" -"R/measures.R",808,3,"style","Variable and function name style should be snake_case or CamelCase."," class.values = seq_along(levels(truth)) - 1L","object_name_linter" -"R/measures.R",1450,5,"style","Variable and function name style should be snake_case or CamelCase."," max.time = assertNumber(extra.args$max.time, null.ok = TRUE) %??% max(getTaskTargets(task)[, 1L])","object_name_linter" -"R/measures.R",1471,5,"style","Variable and function name style should be snake_case or CamelCase."," max.time = assertNumber(extra.args$max.time, null.ok = TRUE) %??% max(getTaskTargets(task)[, 1L])","object_name_linter" -"R/measures.R",1499,5,"style","Variable and function name style should be snake_case or CamelCase."," max.time = extra.args$max.time %??% max(newdata[[tn[1L]]])","object_name_linter" -"R/mergeBenchmarkResults.R",40,3,"style","Variable and function name style should be snake_case or CamelCase."," all.combos = expand.grid(task.id = task.ids, learner.id = learner.ids)","object_name_linter" -"R/mergeBenchmarkResults.R",41,3,"style","Variable and function name style should be snake_case or CamelCase."," all.combos = stri_paste(all.combos$task.id, all.combos$learner.id, sep = "" - "")","object_name_linter" -"R/mergeBenchmarkResults.R",67,7,"style","Variable and function name style should be snake_case or CamelCase."," res.merged[[i]][[j]] = addRRMeasure(res.merged[[i]][[j]], measures.merged)","object_name_linter" -"R/ModelMultiplexerParamSet.R",69,7,"style","Variable and function name style should be snake_case or CamelCase."," for.learner = stri_replace(found, """", regex = long.pid.end)","object_name_linter" -"R/ModelMultiplexerParamSet.R",70,7,"style","Variable and function name style should be snake_case or CamelCase."," for.pars = pss[[for.learner]]$pars","object_name_linter" -"R/ModelMultiplexerParamSet.R",71,7,"style","Variable and function name style should be snake_case or CamelCase."," for.pars[[pid]] = p","object_name_linter" -"R/MulticlassWrapper.R",148,3,"style","Variable and function name style should be snake_case or CamelCase."," row.inds = lapply(binary.targets, function(v) which(v != 0))","object_name_linter" -"R/MulticlassWrapper.R",149,9,"style","Variable and function name style should be snake_case or CamelCase."," names(row.inds) = NULL","object_name_linter" -"R/MultilabelDBRWrapper.R",48,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(true.label.data) = setdiff(targets, tn)","object_name_linter" -"R/MultilabelDBRWrapper.R",51,5,"style","Variable and function name style should be snake_case or CamelCase."," models.meta[[tn]] = train(.learner$next.learner, ctask, weights = .weights)","object_name_linter" -"R/MultilabelNestedStackingWrapper.R",67,7,"style","Variable and function name style should be snake_case or CamelCase."," data.nst[[tnprevious]] = predlabel","object_name_linter" -"R/MultilabelStackingWrapper.R",77,12,"style","Variable and function name style should be snake_case or CamelCase."," colnames(pred.lvl1) = paste(.model$task.desc$target, "".1"", sep = """")","object_name_linter" -"R/options.R",11,9,"style","Variable and function name style should be snake_case or CamelCase."," names(mlr.options) = stri_sub(names(mlr.options), from = 5L)","object_name_linter" -"R/plotBMRBoxplots.R",41,13,"style","Variable and function name style should be snake_case or CamelCase."," names(learner.short.names) = learner.ids","object_name_linter" -"R/plotBMRRanksAsBarChart.R",33,18,"style","Variable and function name style should be snake_case or CamelCase."," pos = ""stack"", order.lrns = NULL, order.tsks = NULL, pretty.names = TRUE) {","object_name_linter" -"R/plotBMRRanksAsBarChart.R",33,37,"style","Variable and function name style should be snake_case or CamelCase."," pos = ""stack"", order.lrns = NULL, order.tsks = NULL, pretty.names = TRUE) {","object_name_linter" -"R/plotBMRRanksAsBarChart.R",50,11,"style","Variable and function name style should be snake_case or CamelCase."," names(learner.short.names) = learner.ids","object_name_linter" -"R/plotCritDifferences.R",117,5,"style","Variable and function name style should be snake_case or CamelCase."," nem.df$y = seq(from = 0.1, to = 0.35, length.out = dim(nem.df)[1])","object_name_linter" -"R/predict.R",111,5,"style","Variable and function name style should be snake_case or CamelCase."," debug.seed = getMlrOption(""debug.seed"", NULL)","object_name_linter" -"R/Prediction_operators.R",2,40,"style","Variable and function name style should be snake_case or CamelCase.","as.data.frame.Prediction = function(x, row.names = NULL, optional = FALSE, ...) {","object_name_linter" -"R/PreprocWrapperCaret.R",54,5,"style","Variable and function name style should be snake_case or CamelCase."," all.methods = c(","object_name_linter" -"R/PreprocWrapperCaret.R",102,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (par.vals$ppc.bagImpute | par.vals$ppc.knnImpute | par.vals$ppc.medianImpute) {","vector_logic_linter" -"R/PreprocWrapperCaret.R",102,55,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (par.vals$ppc.bagImpute | par.vals$ppc.knnImpute | par.vals$ppc.medianImpute) {","vector_logic_linter" -"R/relativeOverfitting.R",49,3,"warning","local variable β€˜mids’ assigned but may not be used"," mids = vcapply(measures, function(m) m$id)","object_usage_linter" -"R/relativeOverfitting.R",76,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.permuted$data = data.frame(truth = rep(c(predish$data$truth, pred.train$data$truth), each = nrows),","object_name_linter" -"R/resample.R",112,5,"style","Variable and function name style should be snake_case or CamelCase."," more.args$weights = weights","object_name_linter" -"R/resample.R",114,5,"style","Variable and function name style should be snake_case or CamelCase."," more.args$weights = getTaskWeights(task)","object_name_linter" -"R/resample.R",163,5,"style","Variable and function name style should be snake_case or CamelCase."," err.msgs[1L] = getFailureModelMsg(m)","object_name_linter" -"R/resample.R",164,5,"style","Variable and function name style should be snake_case or CamelCase."," err.dumps$train = getFailureModelDump(m)","object_name_linter" -"R/resample.R",182,35,"style","Variable and function name style should be snake_case or CamelCase."," if (!is.na(pred.train$error)) err.msgs[2L] = pred.train$error","object_name_linter" -"R/resample.R",184,11,"style","Variable and function name style should be snake_case or CamelCase."," names(ms.train) = vcapply(measures, measureAggrName)","object_name_linter" -"R/resample.R",185,5,"style","Variable and function name style should be snake_case or CamelCase."," err.dumps$predict.train = getPredictionDump(pred.train)","object_name_linter" -"R/resample.R",188,34,"style","Variable and function name style should be snake_case or CamelCase."," if (!is.na(pred.test$error)) err.msgs[2L] = pred.test$error","object_name_linter" -"R/resample.R",190,11,"style","Variable and function name style should be snake_case or CamelCase."," names(ms.test) = vcapply(measures, measureAggrName)","object_name_linter" -"R/resample.R",191,5,"style","Variable and function name style should be snake_case or CamelCase."," err.dumps$predict.test = getPredictionDump(pred.test)","object_name_linter" -"R/resample.R",200,35,"style","Variable and function name style should be snake_case or CamelCase."," if (!is.na(pred.train$error)) err.msgs[2L] = pred.train$error","object_name_linter" -"R/resample.R",202,11,"style","Variable and function name style should be snake_case or CamelCase."," names(ms.train) = vcapply(measures, measureAggrName)","object_name_linter" -"R/resample.R",203,5,"style","Variable and function name style should be snake_case or CamelCase."," err.dumps$predict.train = getPredictionDump(pred.train)","object_name_linter" -"R/resample.R",206,34,"style","Variable and function name style should be snake_case or CamelCase."," if (!is.na(pred.test$error)) err.msgs[2L] = paste(err.msgs[2L], pred.test$error)","object_name_linter" -"R/resample.R",208,11,"style","Variable and function name style should be snake_case or CamelCase."," names(ms.test) = vcapply(measures, measureAggrName)","object_name_linter" -"R/resample.R",209,5,"style","Variable and function name style should be snake_case or CamelCase."," err.dumps$predict.test = getPredictionDump(pred.test)","object_name_linter" -"R/resample.R",214,5,"style","Variable and function name style should be snake_case or CamelCase."," err.dumps$predict.train = NULL","object_name_linter" -"R/resample.R",215,5,"style","Variable and function name style should be snake_case or CamelCase."," err.dumps$predict.test = NULL","object_name_linter" -"R/resample.R",274,12,"style","Variable and function name style should be snake_case or CamelCase."," colnames(ms.test) = mids","object_name_linter" -"R/resample.R",275,12,"style","Variable and function name style should be snake_case or CamelCase."," rownames(ms.test) = NULL","object_name_linter" -"R/resample.R",277,12,"style","Variable and function name style should be snake_case or CamelCase."," colnames(ms.train) = mids","object_name_linter" -"R/resample.R",278,12,"style","Variable and function name style should be snake_case or CamelCase."," rownames(ms.train) = NULL","object_name_linter" -"R/resample.R",282,12,"style","Variable and function name style should be snake_case or CamelCase."," rownames(err.msgs) = NULL","object_name_linter" -"R/resample.R",283,12,"style","Variable and function name style should be snake_case or CamelCase."," colnames(err.msgs) = c(""train"", ""predict"")","object_name_linter" -"R/ResampleInstance.R",129,9,"style","Variable and function name style should be snake_case or CamelCase."," train.inds[[i]] = lapply(inst$train.inds, function(j) ci[j])","object_name_linter" -"R/ResampleInstance.R",130,9,"style","Variable and function name style should be snake_case or CamelCase."," test.inds[[i]] = lapply(inst$test.inds, function(j) ci[j])","object_name_linter" -"R/ResampleInstance.R",132,9,"style","Variable and function name style should be snake_case or CamelCase."," train.inds[[i]] = test.inds[[i]] = replicate(desc$iters, integer(0L), simplify = FALSE)","object_name_linter" -"R/ResampleInstance.R",132,27,"style","Variable and function name style should be snake_case or CamelCase."," train.inds[[i]] = test.inds[[i]] = replicate(desc$iters, integer(0L), simplify = FALSE)","object_name_linter" -"R/ResampleInstances.R",53,7,"style","Variable and function name style should be snake_case or CamelCase."," test.inds[[index]] = NULL","object_name_linter" -"R/ResampleResult_operators.R",102,7,"style","Variable and function name style should be snake_case or CamelCase."," p.split[[i]]$time = time[i]","object_name_linter" -"R/ResampleResult_operators.R",129,3,"style","Variable and function name style should be snake_case or CamelCase."," missing.measures = setdiff(measures.id, colnames(res$measures.test))","object_name_linter" -"R/RLearner_classif_dcSVM.R",44,5,"style","Variable and function name style should be snake_case or CamelCase."," max.levels = 1","object_name_linter" -"R/RLearner_classif_dcSVM.R",47,5,"style","Variable and function name style should be snake_case or CamelCase."," max.levels = pars$max.levels","object_name_linter" -"R/RLearner_classif_dcSVM.R",55,3,"style","Variable and function name style should be snake_case or CamelCase."," min.cluster = ceiling(5 * m / (k^max.levels))","object_name_linter" -"R/RLearner_classif_evtree.R",52,5,"warning","local variable β€˜p’ assigned but may not be used"," p = predict(.model$learner.model, newdata = .newdata, type = ""prob"", ...)","object_usage_linter" -"R/RLearner_classif_fdausc.kernel.R",43,3,"warning","local variable β€˜trainfun’ assigned but may not be used"," trainfun = getFromNamespace(""classif.kernel"", ""fda.usc"")","object_usage_linter" -"R/RLearner_classif_fdausc.kernel.R",44,3,"warning","local variable β€˜mod’ assigned but may not be used"," mod = do.call(""trainfun"",","object_usage_linter" -"R/RLearner_classif_fdausc.knn.R",37,3,"warning","local variable β€˜trainfun’ assigned but may not be used"," trainfun = getFromNamespace(""classif.knn"", ""fda.usc"")","object_usage_linter" -"R/RLearner_classif_fdausc.knn.R",39,3,"warning","local variable β€˜mod’ assigned but may not be used"," mod = suppressAll(do.call(""trainfun"",","object_usage_linter" -"R/RLearner_classif_fdausc.np.R",42,3,"warning","local variable β€˜trainfun’ assigned but may not be used"," trainfun = getFromNamespace(""classif.np"", ""fda.usc"")","object_usage_linter" -"R/RLearner_classif_featureless.R",22,3,"warning","local variable β€˜lvls’ assigned but may not be used"," lvls = getTaskClassLevels(.task)","object_usage_linter" -"R/RLearner_classif_fnn.R",32,11,"style","Variable and function name style should be snake_case or CamelCase."," attr(p, ""nn.index"") = NULL","object_name_linter" -"R/RLearner_classif_fnn.R",33,11,"style","Variable and function name style should be snake_case or CamelCase."," attr(p, ""nn.dist"") = NULL","object_name_linter" -"R/RLearner_classif_h2odeeplearning.R",271,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(p.df)[pcol] = stri_sub(colnames(p.df)[pcol], 2L)","object_name_linter" -"R/RLearner_classif_h2odeeplearning.R",277,5,"style","Variable and function name style should be snake_case or CamelCase."," p.df$predict = NULL","object_name_linter" -"R/RLearner_classif_h2ogbm.R",63,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(p.df)[pcol] = stri_sub(colnames(p.df)[pcol], 2L)","object_name_linter" -"R/RLearner_classif_h2ogbm.R",69,5,"style","Variable and function name style should be snake_case or CamelCase."," p.df$predict = NULL","object_name_linter" -"R/RLearner_classif_h2oglm.R",66,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(p.df)[pcol] = stri_sub(colnames(p.df)[pcol], 2L)","object_name_linter" -"R/RLearner_classif_h2oglm.R",72,5,"style","Variable and function name style should be snake_case or CamelCase."," p.df$predict = NULL","object_name_linter" -"R/RLearner_classif_h2orandomForest.R",55,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(p.df)[pcol] = stri_sub(colnames(p.df)[pcol], 2L)","object_name_linter" -"R/RLearner_classif_h2orandomForest.R",61,5,"style","Variable and function name style should be snake_case or CamelCase."," p.df$predict = NULL","object_name_linter" -"R/RLearner_classif_lvq1.R",20,3,"style","Variable and function name style should be snake_case or CamelCase."," cdbk.args$x = d$data","object_name_linter" -"R/RLearner_classif_lvq1.R",21,3,"style","Variable and function name style should be snake_case or CamelCase."," cdbk.args$cl = d$target","object_name_linter" -"R/RLearner_classif_lvq1.R",25,3,"style","Variable and function name style should be snake_case or CamelCase."," lvq.args$x = d$data","object_name_linter" -"R/RLearner_classif_lvq1.R",26,3,"style","Variable and function name style should be snake_case or CamelCase."," lvq.args$cl = d$target","object_name_linter" -"R/RLearner_classif_lvq1.R",27,3,"style","Variable and function name style should be snake_case or CamelCase."," lvq.args$codebk = codebk","object_name_linter" -"R/RLearner_regr_bcart.R",34,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(d$data, function(x) class(x))","object_name_linter" -"R/RLearner_regr_bcart.R",35,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" -"R/RLearner_regr_bcart.R",51,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(.newdata, function(x) class(x))","object_name_linter" -"R/RLearner_regr_bcart.R",52,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" -"R/RLearner_regr_btgp.R",42,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(d$data, function(x) class(x))","object_name_linter" -"R/RLearner_regr_btgp.R",43,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" -"R/RLearner_regr_btgp.R",59,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(.newdata, function(x) class(x))","object_name_linter" -"R/RLearner_regr_btgp.R",60,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" -"R/RLearner_regr_btgpllm.R",44,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(d$data, function(x) class(x))","object_name_linter" -"R/RLearner_regr_btgpllm.R",45,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" -"R/RLearner_regr_btgpllm.R",61,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(.newdata, function(x) class(x))","object_name_linter" -"R/RLearner_regr_btgpllm.R",62,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" -"R/RLearner_regr_btlm.R",36,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(d$data, function(x) class(x))","object_name_linter" -"R/RLearner_regr_btlm.R",37,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" -"R/RLearner_regr_btlm.R",53,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(.newdata, function(x) class(x))","object_name_linter" -"R/RLearner_regr_btlm.R",54,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" -"R/RLearner_regr_evtree.R",51,3,"warning","local variable β€˜p’ assigned but may not be used"," p = predict(.model$learner.model, newdata = .newdata, ...)","object_usage_linter" -"R/RLearner_regr_randomForest.R",88,3,"style","Variable and function name style should be snake_case or CamelCase."," single.model = getLearnerModel(.model)$single.model # get raw RF model","object_name_linter" -"R/RLearner_surv_gamboost.R",47,5,"warning","local variable β€˜model’ assigned but may not be used"," model = mboost::gamboost(f, data = data, control = ctrl, family = family, ...)","object_usage_linter" -"R/selectFeaturesGA.R",24,10,"style","Variable and function name style should be snake_case or CamelCase."," mode(pop.featmat) = ""integer""","object_name_linter" -"R/smote.R",79,9,"style","Variable and function name style should be snake_case or CamelCase."," x.min.matrix[, i] = as.numeric(as.integer(x.min.matrix[, i]))","object_name_linter" -"R/smote.R",85,16,"style","Variable and function name style should be snake_case or CamelCase."," storage.mode(x.min.matrix) = ""numeric""","object_name_linter" -"R/smote.R",100,13,"style","Variable and function name style should be snake_case or CamelCase."," x.scaled[, j] = (x.scaled[, j] != 0)","object_name_linter" -"R/smote.R",128,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/smote.R",131,10,"style","Variable and function name style should be snake_case or CamelCase."," diag(minclass.dist) = NA","object_name_linter" -"R/StackedLearner.R",106,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(resampling) & method != ""stack.cv"") {","vector_logic_linter" -"R/StackedLearner.R",124,55,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((method == ""average"" || method == ""hill.climb"") & (!is.null(super.learner) || is.null(predict.type))) {","vector_logic_linter" -"R/StackedLearner.R",127,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (method != ""average"" & method != ""hill.climb"" & is.null(super.learner)) {","vector_logic_linter" -"R/StackedLearner.R",127,52,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (method != ""average"" & method != ""hill.climb"" & is.null(super.learner)) {","vector_logic_linter" -"R/StackedLearner.R",132,55,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((method == ""average"" || method == ""hill.climb"") & use.feat) {","vector_logic_linter" -"R/StackedLearner.R",327,5,"style","Variable and function name style should be snake_case or CamelCase."," base.models[[i]] = model","object_name_linter" -"R/StackedLearner.R",349,5,"style","Variable and function name style should be snake_case or CamelCase."," base.models[[i]] = model","object_name_linter" -"R/StackedLearner.R",396,5,"style","Variable and function name style should be snake_case or CamelCase."," base.models[[i]] = train(bl, task)","object_name_linter" -"R/StackedLearner.R",475,5,"style","Variable and function name style should be snake_case or CamelCase."," base.models[[i]] = train(bl, task)","object_name_linter" -"R/StackedLearner.R",599,16,"style","Variable and function name style should be snake_case or CamelCase."," colnames(pred.return) = td$class.levels","object_name_linter" -"R/train.R",44,5,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," } # I believe this is a bug, see #2098","brace_linter" -"R/train.R",45,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/train.R",85,5,"style","Variable and function name style should be snake_case or CamelCase."," debug.seed = getMlrOption(""debug.seed"", NULL)","object_name_linter" -"R/train.R",113,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.levels = getTaskFactorLevels(task)","object_name_linter" -"R/tuneCMAES.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," ctrl.cmaes$lambda = 4 + floor(3 * log(N))","object_name_linter" -"R/tuneCMAES.R",42,3,"style","Variable and function name style should be snake_case or CamelCase."," ctrl.cmaes$maxit = maxit","object_name_linter" -"R/TuneControl.R",39,5,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = logFunTune","object_name_linter" -"R/TuneControl.R",41,5,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = logFunTuneMemory","object_name_linter" -"R/tuneIrace.R",37,3,"style","Variable and function name style should be snake_case or CamelCase."," log.file = tempfile()","object_name_linter" -"R/TuneMultiCritControl.R",47,5,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = logFunTune","object_name_linter" -"R/TuneMultiCritControl.R",49,5,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = logFunTuneMemory","object_name_linter" -"R/utils_imbalancy.R",7,3,"style","Variable and function name style should be snake_case or CamelCase."," min.name = ns[j.small]","object_name_linter" -"R/utils_imbalancy.R",8,3,"style","Variable and function name style should be snake_case or CamelCase."," max.name = ns[-j.small]","object_name_linter" -"R/WeightedClassesWrapper.R",113,11,"style","Variable and function name style should be snake_case or CamelCase."," names(wcw.weight) = c(td$positive, td$negative)","object_name_linter" -"R/WeightedClassesWrapper.R",116,11,"style","Variable and function name style should be snake_case or CamelCase."," names(wcw.weight) = levs","object_name_linter" -"tests/testthat/helper_helpers.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," cv.instance$train.inds[[i]] = inds[[i]]","object_name_linter" -"tests/testthat/helper_helpers.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," cv.instance$test.inds[[i]] = setdiff(1:size, inds[[i]])","object_name_linter" -"tests/testthat/helper_helpers.R",39,5,"style","Variable and function name style should be snake_case or CamelCase."," bs.instance$train.inds[[i]] = inds[[i]]","object_name_linter" -"tests/testthat/helper_helpers.R",40,5,"style","Variable and function name style should be snake_case or CamelCase."," bs.instance$test.inds[[i]] = setdiff(1:size, inds[[i]])","object_name_linter" -"tests/testthat/helper_helpers.R",96,3,"warning","local variable β€˜train’ assigned but may not be used"," train = df[inds, ]","object_usage_linter" -"tests/testthat/helper_helpers.R",97,3,"warning","local variable β€˜test’ assigned but may not be used"," test = df[-inds, ]","object_usage_linter" -"tests/testthat/helper_helpers.R",102,5,"warning","no visible global function definition for β€˜testSimple’"," testSimple(t.name, df, target, train.inds, old.predicts, parset)","object_usage_linter" -"tests/testthat/helper_helpers.R",123,21,"warning","no visible binding for global variable β€˜old.predicts’"," expect_s3_class(old.predicts, ""try-error"")","object_usage_linter" -"tests/testthat/helper_helpers.R",128,13,"style","Variable and function name style should be snake_case or CamelCase."," names(old.probs) = NULL","object_name_linter" -"tests/testthat/helper_helpers.R",138,28,"style","Variable and function name style should be snake_case or CamelCase."," colnames(p) = colnames(old.probs) = NULL","object_name_linter" -"tests/testthat/helper_helpers.R",139,28,"style","Variable and function name style should be snake_case or CamelCase."," rownames(p) = rownames(old.probs) = NULL","object_name_linter" -"tests/testthat/helper_helpers.R",140,11,"style","Variable and function name style should be snake_case or CamelCase."," class(old.probs) = NULL","object_name_linter" -"tests/testthat/helper_helpers.R",162,21,"warning","no visible binding for global variable β€˜old.predicts’"," expect_s3_class(old.predicts, ""try-error"")","object_usage_linter" -"tests/testthat/helper_helpers.R",167,13,"style","Variable and function name style should be snake_case or CamelCase."," names(old.probs) = NULL","object_name_linter" -"tests/testthat/helper_helpers.R",177,28,"style","Variable and function name style should be snake_case or CamelCase."," colnames(p) = colnames(old.probs) = NULL","object_name_linter" -"tests/testthat/helper_helpers.R",178,28,"style","Variable and function name style should be snake_case or CamelCase."," rownames(p) = rownames(old.probs) = NULL","object_name_linter" -"tests/testthat/helper_helpers.R",179,11,"style","Variable and function name style should be snake_case or CamelCase."," class(old.probs) = NULL","object_name_linter" -"tests/testthat/helper_helpers.R",180,44,"warning","no visible binding for global variable β€˜tol’"," expect_equal(p, old.probs, tolerance = tol)","object_usage_linter" -"tests/testthat/helper_helpers.R",187,3,"warning","local variable β€˜train’ assigned but may not be used"," train = df[inds, ]","object_usage_linter" -"tests/testthat/helper_helpers.R",188,3,"warning","local variable β€˜test’ assigned but may not be used"," test = df[-inds, ]","object_usage_linter" -"tests/testthat/helper_helpers.R",193,5,"warning","no visible global function definition for β€˜testProb’"," testProb(t.name, df, target, train.inds, old.probs, parset)","object_usage_linter" -"tests/testthat/helper_helpers.R",201,3,"warning","local variable β€˜train’ assigned but may not be used"," train = df[inds, ]","object_usage_linter" -"tests/testthat/helper_helpers.R",202,3,"warning","local variable β€˜test’ assigned but may not be used"," test = df[-inds, ]","object_usage_linter" -"tests/testthat/helper_helpers.R",207,5,"warning","no visible global function definition for β€˜testProbWithTol’"," testProbWithTol(t.name, df, target, train.inds, old.probs, parset, tolerance = tol)","object_usage_linter" -"tests/testthat/helper_helpers.R",207,84,"warning","no visible binding for global variable β€˜tol’"," testProbWithTol(t.name, df, target, train.inds, old.probs, parset, tolerance = tol)","object_usage_linter" -"tests/testthat/helper_helpers.R",261,5,"warning","no visible global function definition for β€˜testCV’"," testCV(t.name, df, target, folds, parset, tune.train, tune.predict)","object_usage_linter" -"tests/testthat/helper_helpers.R",313,44,"warning","no visible binding for global variable β€˜ns.svg’"," nodes = XML::getNodeSet(doc, text.paths, ns.svg)","object_usage_linter" -"tests/testthat/helper_learners_all.R",24,3,"warning","local variable β€˜rin’ assigned but may not be used"," rin = makeResampleInstance(""Holdout"", task = task)","object_usage_linter" -"tests/testthat/helper_learners_all.R",128,3,"warning","no visible global function definition for β€˜testBasicLearnerProperties’"," testBasicLearnerProperties(lrn = lrn, task = task, hyperpars = hyperpars)","object_usage_linter" -"tests/testthat/helper_learners_all.R",145,3,"warning","no visible global function definition for β€˜testBasicLearnerProperties’"," testBasicLearnerProperties(lrn = lrn, task = task, hyperpars = hyperpars)","object_usage_linter" -"tests/testthat/helper_learners_all.R",163,3,"warning","no visible global function definition for β€˜testBasicLearnerProperties’"," testBasicLearnerProperties(lrn = lrn, task = task, hyperpars = hyperpars)","object_usage_linter" -"tests/testthat/helper_learners_all.R",236,3,"warning","local variable β€˜ses’ assigned but may not be used"," ses = getPredictionSE(res$pred)","object_usage_linter" -"tests/testthat/helper_objects.R",50,1,"style","Variable and function name style should be snake_case or CamelCase.","multilabel.df[, ""y1""] = rep(c(TRUE, FALSE), 75L)","object_name_linter" -"tests/testthat/helper_objects.R",51,1,"style","Variable and function name style should be snake_case or CamelCase.","multilabel.df[, ""y2""] = rep(c(FALSE, TRUE), 75L)","object_name_linter" -"tests/testthat/helper_objects.R",101,1,"style","Variable and function name style should be snake_case or CamelCase.","regr.na.num.df[1, 1] = NA","object_name_linter" -"tests/testthat/helper_objects.R",125,3,"style","Variable and function name style should be snake_case or CamelCase."," obs.time[i] = q","object_name_linter" -"tests/testthat/helper_objects.R",126,3,"style","Variable and function name style should be snake_case or CamelCase."," cens.time[i] = FALSE","object_name_linter" -"tests/testthat/helper_objects.R",222,1,"style","Variable and function name style should be snake_case or CamelCase.","task.filters.rank$env$data = structure(list(trt = c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1,","object_name_linter" -"tests/testthat/test_base_benchmark.R",358,3,"style","Variable and function name style should be snake_case or CamelCase."," stop.learner = makeLearner(""classif.__mlrmocklearners__3"",","object_name_linter" -"tests/testthat/test_base_benchmark.R",360,3,"style","Variable and function name style should be snake_case or CamelCase."," stop.learner = makeFilterWrapper(stop.learner,","object_name_linter" -"tests/testthat/test_base_benchmark.R",363,3,"style","Variable and function name style should be snake_case or CamelCase."," stop.learner = makeTuneWrapper(stop.learner,","object_name_linter" -"tests/testthat/test_base_createDummyFeatures.R",22,3,"style","Variable and function name style should be snake_case or CamelCase."," dummy.task$env = NULL","object_name_linter" -"tests/testthat/test_base_createDummyFeatures.R",23,3,"style","Variable and function name style should be snake_case or CamelCase."," iris.task$env = NULL","object_name_linter" -"tests/testthat/test_base_getHyperPars.R",8,9,"style","Variable and function name style should be snake_case or CamelCase."," names(named.list) = character(0)","object_name_linter" -"tests/testthat/test_base_measures.R",167,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.regr$data$response = pred.art.regr","object_name_linter" -"tests/testthat/test_base_measures.R",177,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.classif$data$response = pred.art.classif","object_name_linter" -"tests/testthat/test_base_measures.R",187,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.bin$data$response = pred.art.bin","object_name_linter" -"tests/testthat/test_base_measures.R",199,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.multilabel$data[, 4:5] = pred.art.multilabel","object_name_linter" -"tests/testthat/test_base_measures.R",214,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.surv$data[, ""response""] = pred.art.surv","object_name_linter" -"tests/testthat/test_base_measures.R",228,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.costsens$data$response = pred.art.costsens","object_name_linter" -"tests/testthat/test_base_measures.R",237,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.cluster$data$response = pred.art.cluster","object_name_linter" -"tests/testthat/test_base_measures.R",267,3,"style","Variable and function name style should be snake_case or CamelCase."," abs.errs = abs(c(5 - 4, 10 - 11, 0 - 0, 5 - 4))","object_name_linter" -"tests/testthat/test_base_measures.R",347,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.regr.mape$data$truth = c(5, 10, 1, 5) # we change the 0 target because mape is undefined","object_name_linter" -"tests/testthat/test_base_measures.R",365,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.art.regr.neg[[1L]] = -3","object_name_linter" -"tests/testthat/test_base_measures.R",488,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.probs[pred.probs > 1 - 1e-15] = 1 - 1e-15","object_name_linter" -"tests/testthat/test_base_measures.R",489,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.probs[pred.probs < 1e-15] = 1e-15","object_name_linter" -"tests/testthat/test_base_measures.R",549,10,"style","Variable and function name style should be snake_case or CamelCase."," levels(tar.classif2) = as.numeric(levels(tar.classif))^2","object_name_linter" -"tests/testthat/test_base_measures.R",550,10,"style","Variable and function name style should be snake_case or CamelCase."," levels(pred.art.classif2) = as.numeric(levels(pred.art.classif))^2","object_name_linter" -"tests/testthat/test_base_measures.R",744,3,"style","Variable and function name style should be snake_case or CamelCase."," f1.test[is.na(f1.test)] = 1","object_name_linter" -"tests/testthat/test_base_measures.R",767,3,"style","Variable and function name style should be snake_case or CamelCase."," acc.test[is.na(acc.test)] = 1","object_name_linter" -"tests/testthat/test_base_multilabel.R",40,3,"style","Variable and function name style should be snake_case or CamelCase."," multilabel.df2[c(2, 10, 14), c(1, 5)] = NA","object_name_linter" -"tests/testthat/test_base_multilabel.R",71,23,"warning","no visible binding for global variable β€˜multilabel.task’"," mod = train(lrn2, multilabel.task)","object_usage_linter" -"tests/testthat/test_base_multilabel.R",72,25,"warning","no visible binding for global variable β€˜multilabel.task’"," pred = predict(mod, multilabel.task)","object_usage_linter" -"tests/testthat/test_base_multilabel.R",79,35,"warning","no visible binding for global variable β€˜multilabel.df’"," pred = predict(mod, newdata = multilabel.df)","object_usage_linter" -"tests/testthat/test_base_multilabel.R",85,55,"warning","no visible binding for global variable β€˜multilabel.task’"," expect_equal(rownames(pmulti), getTaskTargetNames(multilabel.task))","object_usage_linter" -"tests/testthat/test_base_multilabel.R",88,23,"warning","no visible binding for global variable β€˜multilabel.task’"," r = holdout(lrn2, multilabel.task)","object_usage_linter" -"tests/testthat/test_base_multilabel.R",93,55,"warning","no visible binding for global variable β€˜multilabel.task’"," expect_equal(rownames(pmulti), getTaskTargetNames(multilabel.task))","object_usage_linter" -"tests/testthat/test_base_multilabel.R",97,23,"warning","no visible binding for global variable β€˜multilabel.task’"," r = holdout(lrn2, multilabel.task)","object_usage_linter" -"tests/testthat/test_base_multilabel.R",101,63,"warning","no visible binding for global variable β€˜multilabel.task’"," p = getPredictionProbabilities(r$pred, getTaskClassLevels(multilabel.task))","object_usage_linter" -"tests/testthat/test_base_multilabel.R",107,23,"warning","no visible binding for global variable β€˜multilabel.task’"," r = holdout(lrn2, multilabel.task)","object_usage_linter" -"tests/testthat/test_base_multilabel.R",110,30,"warning","no visible binding for global variable β€˜multilabel.task’"," cls = getTaskClassLevels(multilabel.task)","object_usage_linter" -"tests/testthat/test_base_multilabel.R",122,59,"warning","no visible binding for global variable β€˜multilabel.task’"," expect_equal(length(tr$th), length(getTaskClassLevels(multilabel.task)))","object_usage_linter" -"tests/testthat/test_base_multilabel.R",128,5,"style","Variable and function name style should be snake_case or CamelCase."," multilabel.df2[c(2, 10, 14), c(1, 5)] = NA","object_name_linter" -"tests/testthat/test_base_multilabel.R",137,23,"warning","no visible binding for global variable β€˜multilabel.task’"," mod = train(lrn2, multilabel.task)","object_usage_linter" -"tests/testthat/test_base_multilabel.R",138,25,"warning","no visible binding for global variable β€˜multilabel.task’"," pred = predict(mod, multilabel.task)","object_usage_linter" -"tests/testthat/test_base_multilabel.R",143,5,"style","Variable and function name style should be snake_case or CamelCase."," three.target.df$y3 = three.target.df$y2","object_name_linter" -"tests/testthat/test_base_resample_operators.R",46,21,"style","Variable and function name style should be snake_case or CamelCase."," attr(ptrain$data, ""row.names"") = as.integer(row.names(ptrain$data))","object_name_linter" -"tests/testthat/test_base_resample_operators.R",49,20,"style","Variable and function name style should be snake_case or CamelCase."," attr(ptest$data, ""row.names"") = as.integer(row.names(ptest$data))","object_name_linter" -"tests/testthat/test_base_UnsupervisedTask.R",11,3,"style","Variable and function name style should be snake_case or CamelCase."," sub.task = subsetTask(noclass.task, features = 1:2)","object_name_linter" -"tests/testthat/test_classif_ada.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p[, 1]","object_name_linter" -"tests/testthat/test_classif_ada.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(binaryclass.class.levs[ifelse(p[, 2] > 0.5, 2, 1)])","object_name_linter" -"tests/testthat/test_classif_adaboostm1.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p[, 1]","object_name_linter" -"tests/testthat/test_classif_adaboostm1.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(binaryclass.class.levs[ifelse(p[, 2] > 0.5, 2, 1)])","object_name_linter" -"tests/testthat/test_classif_adaboostm1.R",44,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_adaboostm1.R",45,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_bartMachine.R",33,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_bartMachine.R",34,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_binomial.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p.class","object_name_linter" -"tests/testthat/test_classif_binomial.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_boost.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(p$class)","object_name_linter" -"tests/testthat/test_classif_boost.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = setColNames(p$prob, levels(multiclass.df[, multiclass.target]))","object_name_linter" -"tests/testthat/test_classif_bst.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = ifelse(p > 0, binaryclass.class.levs[2], binaryclass.class.levs[1])","object_name_linter" -"tests/testthat/test_classif_C50.R",31,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_C50.R",32,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_cforest.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, newdata = binaryclass.test)","object_name_linter" -"tests/testthat/test_classif_cforest.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = sapply(p, ""["", 1)","object_name_linter" -"tests/testthat/test_classif_clusterSVM.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, data.matrix(binaryclass.test[, -61]))$predictions","object_name_linter" -"tests/testthat/test_classif_ctree.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_ctree.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_cvglmnet.R",34,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_cvglmnet.R",35,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = 1 - p2","object_name_linter" -"tests/testthat/test_classif_dbnDNN.R",37,7,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(colnames(p)[max.col(p)])","object_name_linter" -"tests/testthat/test_classif_earth.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = 1 - p","object_name_linter" -"tests/testthat/test_classif_earth.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(binaryclass.class.levs[ifelse(p > 0.5, 2, 1)])","object_name_linter" -"tests/testthat/test_classif_earth.R",61,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_earth.R",62,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(predict(m,","object_name_linter" -"tests/testthat/test_classif_evtree.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, newdata = binaryclass.test)","object_name_linter" -"tests/testthat/test_classif_evtree.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p[, 1]","object_name_linter" -"tests/testthat/test_classif_extraTrees.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, x.test)","object_name_linter" -"tests/testthat/test_classif_extraTrees.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = predict(m, x.test, probability = TRUE)[, 1L]","object_name_linter" -"tests/testthat/test_classif_FDboost.R",17,9,"style","Variable and function name style should be snake_case or CamelCase."," names(fd.grids) = fdns","object_name_linter" -"tests/testthat/test_classif_fnn.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list1[[i]] = do.call(FNN::knn, pars)","object_name_linter" -"tests/testthat/test_classif_fnn.R",28,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list2[[i]] = do.call(FNN::knn, pars)","object_name_linter" -"tests/testthat/test_classif_gamboost.R",30,7,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] <- predict(m, newdata = binaryclass.test, type = ""class"")","object_name_linter" -"tests/testthat/test_classif_gamboost.R",33,7,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] <- 1 - predict(m, newdata = binaryclass.test, type = ""response"")[, 1]","object_name_linter" -"tests/testthat/test_classif_gausspr.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_gausspr.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_gbm.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_gbm.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_glmboost.R",28,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, newdata = binaryclass.test, type = ""class"")","object_name_linter" -"tests/testthat/test_classif_glmboost.R",29,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = 1 - predict(m, newdata = binaryclass.test, type = ""response"")[, 1]","object_name_linter" -"tests/testthat/test_classif_glmnet.R",39,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_glmnet.R",40,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = 1 - p2","object_name_linter" -"tests/testthat/test_classif_h2odeeplearning.R",15,3,"style","Variable and function name style should be snake_case or CamelCase."," debug.seed = getOption(""mlr.debug.seed"")","object_name_linter" -"tests/testthat/test_classif_h2odeeplearning.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = as.data.frame(p)[, 2L]","object_name_linter" -"tests/testthat/test_classif_h2ogbm.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = as.data.frame(p)[, 2L]","object_name_linter" -"tests/testthat/test_classif_h2oglm.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = as.data.frame(p)[, 2]","object_name_linter" -"tests/testthat/test_classif_h2oglm.R",55,9,"style","Variable and function name style should be snake_case or CamelCase."," names(feat.imp) = names(feat.imp.h2o)","object_name_linter" -"tests/testthat/test_classif_h2orandomForest.R",14,3,"style","Variable and function name style should be snake_case or CamelCase."," debug.seed = getOption(""mlr.debug.seed"")","object_name_linter" -"tests/testthat/test_classif_h2orandomForest.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = as.data.frame(p)[, 2L]","object_name_linter" -"tests/testthat/test_classif_h2orandomForest.R",56,9,"style","Variable and function name style should be snake_case or CamelCase."," names(feat.imp) = names(feat.imp.h2o)","object_name_linter" -"tests/testthat/test_classif_IBk.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_IBk.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_J48.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_J48.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_JRip.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_JRip.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_kknn.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_kknn.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = m$prob","object_name_linter" -"tests/testthat/test_classif_knn.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_ksvm.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = kernlab::predict(m, newdata = multiclass.test)","object_name_linter" -"tests/testthat/test_classif_ksvm.R",31,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = kernlab::predict(m, newdata = multiclass.test, type = ""prob"")","object_name_linter" -"tests/testthat/test_classif_ksvm.R",55,51,"style","Use TRUE instead of the symbol T."," B = factor(sample(c(""A"", ""B""), 10, replace = T))","T_and_F_symbol_linter" -"tests/testthat/test_classif_ksvm.R",59,56,"style","Use TRUE instead of the symbol T."," B = factor(sample(c(""A"", ""B"", ""C""), 10, replace = T))","T_and_F_symbol_linter" -"tests/testthat/test_classif_LiblineaRL1L2SVC.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(p$predictions)","object_name_linter" -"tests/testthat/test_classif_LiblineaRL1LogReg.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(p$predictions)","object_name_linter" -"tests/testthat/test_classif_LiblineaRL1LogReg.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p$probabilities[, 2L]","object_name_linter" -"tests/testthat/test_classif_LiblineaRL2L1SVC.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(p$predictions)","object_name_linter" -"tests/testthat/test_classif_LiblineaRL2LogReg.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(p$predictions)","object_name_linter" -"tests/testthat/test_classif_LiblineaRL2LogReg.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p$probabilities[, 2L]","object_name_linter" -"tests/testthat/test_classif_LiblineaRL2SVC.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(p$predictions)","object_name_linter" -"tests/testthat/test_classif_LibLineaRMultiClassSVC.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(p$predictions)","object_name_linter" -"tests/testthat/test_classif_lssvm.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = suppressMessages(kernlab::predict(m, newdata = multiclass.test))","object_name_linter" -"tests/testthat/test_classif_mda.R",28,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_mda.R",29,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_nodeHarvest.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = ifelse(p > 0.5, binaryclass.class.levs[1],","object_name_linter" -"tests/testthat/test_classif_nodeHarvest.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_OneR.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_OneR.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_pamr.R",28,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = pamr::pamr.predict(m, newdata,","object_name_linter" -"tests/testthat/test_classif_pamr.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = pamr::pamr.predict(m, newdata,","object_name_linter" -"tests/testthat/test_classif_PART.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_PART.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_penalized.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = 1 - penalized::predict(m, data = binaryclass.test)","object_name_linter" -"tests/testthat/test_classif_plr.R",34,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_plr.R",35,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_plsdaCaret.R",28,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_plsdaCaret.R",29,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_plsdaCaret.R",63,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_plsdaCaret.R",64,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_randomForest.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_randomForest.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_randomForestSRC.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p$class","object_name_linter" -"tests/testthat/test_classif_randomForestSRC.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p$predicted[, 1]","object_name_linter" -"tests/testthat/test_classif_ranger.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p$predictions[, 1]","object_name_linter" -"tests/testthat/test_classif_rda.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p$class","object_name_linter" -"tests/testthat/test_classif_rda.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p$posterior","object_name_linter" -"tests/testthat/test_classif_rFerns.R",18,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = factor(predict(m, binaryclass.test))","object_name_linter" -"tests/testthat/test_classif_rknn.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_rotationForest.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," binaryclass.test[, binaryclass.target] = NULL","object_name_linter" -"tests/testthat/test_classif_rotationForest.R",29,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_rotationForest.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_rpart.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_rpart.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_RRF.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_RRF.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_sparseLDA.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = sparseLDA:::predict.sda(m,","object_name_linter" -"tests/testthat/test_classif_sparseLDA.R",28,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = sparseLDA:::predict.sda(m,","object_name_linter" -"tests/testthat/test_classif_svm.R",32,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m1, newdata = multiclass.test)","object_name_linter" -"tests/testthat/test_classif_svm.R",33,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = predict(m2, newdata = multiclass.test,","object_name_linter" -"tests/testthat/test_classif_xgboost.R",29,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = factor(as.numeric(pred > 0.5),","object_name_linter" -"tests/testthat/test_classif_xgboost.R",49,7,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = y[, 1]","object_name_linter" -"tests/testthat/test_classif_xgboost.R",51,7,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = 1 - pred","object_name_linter" -"tests/testthat/test_cluster_cmeans.R",19,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_cluster_Cobweb.R",16,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_cluster_dbscan.R",15,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_cluster_EM.R",18,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_cluster_FarthestFirst.R",17,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_cluster_kkmeans.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_cluster_kmeans.R",19,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_cluster_MiniBatchKmeans.R",31,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_cluster_SimpleKMeans.R",17,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_cluster_XMeans.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_featsel_generateFilterValuesData.R",16,3,"style","Variable and function name style should be snake_case or CamelCase."," binaryclass.task.cp$env = NULL","object_name_linter" -"tests/testthat/test_learners_all_classif.R",90,3,"style","Variable and function name style should be snake_case or CamelCase."," min.task = makeClassifTask(""oneCol"", data.frame(","object_name_linter" -"tests/testthat/test_learners_all_regr.R",71,3,"style","Variable and function name style should be snake_case or CamelCase."," min.task = makeRegrTask(""oneCol"", data.frame(x = 1:10, y = 1:10),","object_name_linter" -"tests/testthat/test_learners_all_surv.R",12,3,"style","Variable and function name style should be snake_case or CamelCase."," sub.task = subsetTask(surv.task, subset = c(1:70),","object_name_linter" -"tests/testthat/test_multilabel_cforest.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = data.frame(p2)","object_name_linter" -"tests/testthat/test_multilabel_randomForestSRC.R",19,7,"style","Variable and function name style should be snake_case or CamelCase."," multilabel.train[j] = factor(multilabel.train[[j]],","object_name_linter" -"tests/testthat/test_multilabel_randomForestSRC.R",21,7,"style","Variable and function name style should be snake_case or CamelCase."," multilabel.test[j] = factor(multilabel.test[[j]],","object_name_linter" -"tests/testthat/test_multilabel_randomForestSRC.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.data.frame(lapply(p$classOutput,","object_name_linter" -"tests/testthat/test_multilabel_randomForestSRC.R",32,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = as.data.frame(lapply(p$classOutput,","object_name_linter" -"tests/testthat/test_regr_bartMachine.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, new_data = regr.test[, xind])","object_name_linter" -"tests/testthat/test_regr_bcart.R",15,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(df, function(x) class(x))","object_name_linter" -"tests/testthat/test_regr_bcart.R",16,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" -"tests/testthat/test_regr_bcart.R",33,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, XX = test, pred.n = FALSE)$ZZ.km","object_name_linter" -"tests/testthat/test_regr_bgp.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m,","object_name_linter" -"tests/testthat/test_regr_bgpllm.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m,","object_name_linter" -"tests/testthat/test_regr_blm.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m,","object_name_linter" -"tests/testthat/test_regr_brnn.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_bst.R",29,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, regr.num.test[, xind])","object_name_linter" -"tests/testthat/test_regr_btgp.R",13,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(df, function(x) class(x))","object_name_linter" -"tests/testthat/test_regr_btgp.R",14,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" -"tests/testthat/test_regr_btgp.R",31,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, XX = test, pred.n = FALSE)$ZZ.km","object_name_linter" -"tests/testthat/test_regr_btgpllm.R",12,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(df, function(x) class(x))","object_name_linter" -"tests/testthat/test_regr_btgpllm.R",13,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" -"tests/testthat/test_regr_btgpllm.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, XX = test, pred.n = FALSE)$ZZ.km","object_name_linter" -"tests/testthat/test_regr_btlm.R",16,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(df, function(x) class(x))","object_name_linter" -"tests/testthat/test_regr_btlm.R",17,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" -"tests/testthat/test_regr_btlm.R",34,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, XX = test, pred.n = FALSE)$ZZ.km","object_name_linter" -"tests/testthat/test_regr_cforest.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.vector(predict(m, newdata = regr.test))","object_name_linter" -"tests/testthat/test_regr_crs.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = pred","object_name_linter" -"tests/testthat/test_regr_ctree.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_cubist.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_cvglmnet.R",35,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_earth.R",18,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, newdata = regr.test)[, 1]","object_name_linter" -"tests/testthat/test_regr_evtree.R",18,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.vector(predict(m, newdata = regr.test))","object_name_linter" -"tests/testthat/test_regr_extraTrees.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, x.test)","object_name_linter" -"tests/testthat/test_regr_FDboost.R",17,9,"style","Variable and function name style should be snake_case or CamelCase."," names(fd.grids) = fdns","object_name_linter" -"tests/testthat/test_regr_fnn.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list1[[i]] = do.call(FNN::knn.reg, pars)$pred","object_name_linter" -"tests/testthat/test_regr_frbs.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_gamboost.R",35,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = suppressWarnings(as.vector(predict(m,","object_name_linter" -"tests/testthat/test_regr_gamboost.R",47,3,"style","Variable and function name style should be snake_case or CamelCase."," new.regr.df[, regr.target] = as.integer(floor(new.regr.df[, regr.target]))","object_name_linter" -"tests/testthat/test_regr_gamboost.R",48,3,"style","Variable and function name style should be snake_case or CamelCase."," new.regr.df[, ""chas""] = NULL","object_name_linter" -"tests/testthat/test_regr_gamboost.R",68,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = suppressWarnings(as.vector(predict(m,","object_name_linter" -"tests/testthat/test_regr_gausspr.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p[, 1]","object_name_linter" -"tests/testthat/test_regr_gbm.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_gbm.R",27,3,"style","Variable and function name style should be snake_case or CamelCase."," parset.list[[4]]$distribution = ""quantile""","object_name_linter" -"tests/testthat/test_regr_gbm.R",28,3,"style","Variable and function name style should be snake_case or CamelCase."," parset.list[[4]]$alpha = 0.2","object_name_linter" -"tests/testthat/test_regr_glm.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_glm.R",25,3,"style","Variable and function name style should be snake_case or CamelCase."," parset.list[[4]]$family = ""Gamma""","object_name_linter" -"tests/testthat/test_regr_glm.R",27,3,"style","Variable and function name style should be snake_case or CamelCase."," parset.list[[5]]$family = ""gaussian""","object_name_linter" -"tests/testthat/test_regr_glmboost.R",31,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.vector(predict(m, newdata = regr.test))","object_name_linter" -"tests/testthat/test_regr_glmboost.R",40,3,"style","Variable and function name style should be snake_case or CamelCase."," new.regr.df[, regr.target] = as.integer(floor(new.regr.df[, regr.target]))","object_name_linter" -"tests/testthat/test_regr_glmboost.R",59,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.vector(predict(m, newdata = new.regr.test))","object_name_linter" -"tests/testthat/test_regr_glmnet.R",35,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, as.matrix(newx), s = s)[, 1]","object_name_linter" -"tests/testthat/test_regr_glmnet.R",38,3,"style","Variable and function name style should be snake_case or CamelCase."," test.dat$chas = as.numeric(test.dat$chas)","object_name_linter" -"tests/testthat/test_regr_GPfit.R",11,12,"style","Variable and function name style should be snake_case or CamelCase."," colnames(gpfit.test.df) = c(""x1"", ""x2"", ""y"")","object_name_linter" -"tests/testthat/test_regr_h2odeeplearning.R",15,3,"style","Variable and function name style should be snake_case or CamelCase."," debug.seed = getOption(""mlr.debug.seed"")","object_name_linter" -"tests/testthat/test_regr_h2odeeplearning.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.data.frame(p)[, 1L]","object_name_linter" -"tests/testthat/test_regr_h2ogbm.R",46,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.data.frame(p)[, 1L]","object_name_linter" -"tests/testthat/test_regr_h2oglm.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.data.frame(p)[, 1L]","object_name_linter" -"tests/testthat/test_regr_h2orandomForest.R",13,3,"style","Variable and function name style should be snake_case or CamelCase."," debug.seed = getOption(""mlr.debug.seed"")","object_name_linter" -"tests/testthat/test_regr_h2orandomForest.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.data.frame(p)[, 1L]","object_name_linter" -"tests/testthat/test_regr_IBk.R",19,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_kknn.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_km.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = DiceKriging::predict(m, newdata = des2,","object_name_linter" -"tests/testthat/test_regr_ksvm.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p[, 1]","object_name_linter" -"tests/testthat/test_regr_laGP.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = do.call(laGP::aGP, pars)$mean","object_name_linter" -"tests/testthat/test_regr_LiblineaRL2L1SVR.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p$predictions","object_name_linter" -"tests/testthat/test_regr_LiblineaRL2L2SVR.R",33,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p$predictions","object_name_linter" -"tests/testthat/test_regr_mob.R",38,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_nodeHarvest.R",19,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, regr.df[-regr.train.inds, ])","object_name_linter" -"tests/testthat/test_regr_penalized.R",35,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p[, ""mu""]","object_name_linter" -"tests/testthat/test_regr_plsr.R",18,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = pls:::predict.mvr(m, newdata = regr.test,","object_name_linter" -"tests/testthat/test_regr_randomForest.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_randomForestSRC.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_ranger.R",19,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p$predictions","object_name_linter" -"tests/testthat/test_regr_ranger.R",42,5,"style","Variable and function name style should be snake_case or CamelCase."," parset.list[[i]] = c(parset, predict.type = ""se"")","object_name_linter" -"tests/testthat/test_regr_ranger.R",53,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = cbind(p$predictions, p$se)","object_name_linter" -"tests/testthat/test_regr_rknn.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_rknn.R",32,3,"style","Variable and function name style should be snake_case or CamelCase."," parset.list[[9]] = NULL","object_name_linter" -"tests/testthat/test_regr_rpart.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_RRF.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_svm.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_xgboost.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(model,","object_name_linter" -"tests/testthat/test_surv_cforest.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = -1 * predict(m, newdata = surv.test)","object_name_linter" -"tests/testthat/test_surv_coxph.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_surv_cvglmnet.R",31,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.numeric(p)","object_name_linter" -"tests/testthat/test_surv_gamboost.R",36,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = drop(p)","object_name_linter" -"tests/testthat/test_surv_gbm.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_surv_glmboost.R",33,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = drop(p)","object_name_linter" -"tests/testthat/test_surv_glmnet.R",32,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.numeric(p)","object_name_linter" -"tests/testthat/test_surv_randomForestSRC.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = drop(p)","object_name_linter" -"tests/testthat/test_surv_ranger.R",28,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = rowMeans(p$chf)","object_name_linter" -"tests/testthat/test_surv_rpart.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_tune_tuneGrid.R",30,3,"style","Variable and function name style should be snake_case or CamelCase."," op1.2$C = as.numeric(as.character(op1.2$C))","object_name_linter" -"tests/testthat/test_tune_tuneGrid.R",31,3,"style","Variable and function name style should be snake_case or CamelCase."," op1.2$sigma = as.numeric(as.character(op1.2$sigma))","object_name_linter" -"vignettes/tutorial/_mlr-tutorial_intro.Rmd",42,1,"style","Variable and function name style should be snake_case or CamelCase.","train.set = sample(n, size = 2 / 3 * n)","object_name_linter" -"vignettes/tutorial/_mlr-tutorial_intro.Rmd",43,1,"style","Variable and function name style should be snake_case or CamelCase.","test.set = setdiff(1:n, train.set)","object_name_linter" -"vignettes/tutorial/advanced_tune.Rmd",52,1,"style","Variable and function name style should be snake_case or CamelCase.","base.learners = list(","object_name_linter" -"vignettes/tutorial/bagging.Rmd",38,1,"style","Variable and function name style should be snake_case or CamelCase.","bag.lrn = makeBaggingWrapper(lrn, bw.iters = 50, bw.replace = TRUE,","object_name_linter" -"vignettes/tutorial/bagging.Rmd",69,1,"style","Variable and function name style should be snake_case or CamelCase.","bag.lrn = setPredictType(bag.lrn, predict.type = ""prob"")","object_name_linter" -"vignettes/tutorial/bagging.Rmd",80,1,"style","Variable and function name style should be snake_case or CamelCase.","train.inds = seq(1, n, 3)","object_name_linter" -"vignettes/tutorial/bagging.Rmd",81,1,"style","Variable and function name style should be snake_case or CamelCase.","test.inds = setdiff(1:n, train.inds)","object_name_linter" -"vignettes/tutorial/bagging.Rmd",83,1,"style","Variable and function name style should be snake_case or CamelCase.","bag.lrn = makeBaggingWrapper(lrn)","object_name_linter" -"vignettes/tutorial/bagging.Rmd",84,1,"style","Variable and function name style should be snake_case or CamelCase.","bag.lrn = setPredictType(bag.lrn, predict.type = ""se"")","object_name_linter" -"vignettes/tutorial/benchmark_experiments.Rmd",316,1,"style","Variable and function name style should be snake_case or CamelCase.","ring.task = convertMLBenchObjToTask(""mlbench.ringnorm"", n = 600)","object_name_linter" -"vignettes/tutorial/benchmark_experiments.Rmd",317,1,"style","Variable and function name style should be snake_case or CamelCase.","wave.task = convertMLBenchObjToTask(""mlbench.waveform"", n = 600)","object_name_linter" -"vignettes/tutorial/benchmark_experiments.Rmd",334,1,"style","Variable and function name style should be snake_case or CamelCase.","ring.task = convertMLBenchObjToTask(""mlbench.ringnorm"", n = 600)","object_name_linter" -"vignettes/tutorial/benchmark_experiments.Rmd",335,1,"style","Variable and function name style should be snake_case or CamelCase.","wave.task = convertMLBenchObjToTask(""mlbench.waveform"", n = 600)","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",92,1,"style","Variable and function name style should be snake_case or CamelCase.","credit.task = makeClassifTask(data = GermanCredit, target = ""Class"")","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",93,1,"style","Variable and function name style should be snake_case or CamelCase.","credit.task = removeConstantFeatures(credit.task)","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",157,1,"style","Variable and function name style should be snake_case or CamelCase.","pred.th = setThreshold(pred, th)","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",166,1,"style","Variable and function name style should be snake_case or CamelCase.","credit.costs = makeCostMeasure(id = ""credit.costs"", name = ""Credit costs"", costs = costs,","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",249,1,"style","Variable and function name style should be snake_case or CamelCase.","tune.res = tuneThreshold(pred = r$pred, measure = credit.costs)","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",267,1,"style","Variable and function name style should be snake_case or CamelCase.","tune.res = tuneThreshold(pred = r$pred, measure = credit.costs)","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",396,1,"style","Variable and function name style should be snake_case or CamelCase.","tune.res = tuneParams(lrn, credit.task, resampling = rin, par.set = ps,","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",411,1,"style","Variable and function name style should be snake_case or CamelCase.","credit.task.over = oversample(credit.task, rate = w, cl = ""Bad"")","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",467,1,"style","Variable and function name style should be snake_case or CamelCase.","tune.res = tuneParams(lrn, credit.task, rin, par.set = ps, measures = list(credit.costs, mmce),","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",488,1,"style","Variable and function name style should be snake_case or CamelCase.","wf.task = makeClassifTask(id = ""waveform"", data = as.data.frame(df), target = ""classes"")","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",495,1,"style","Variable and function name style should be snake_case or CamelCase.","wf.costs = makeCostMeasure(id = ""wf.costs"", name = ""Waveform costs"", costs = costs,","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",523,1,"style","Variable and function name style should be snake_case or CamelCase.","pred.th = setThreshold(r$pred, threshold = th)","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",547,1,"style","Variable and function name style should be snake_case or CamelCase.","pred.th = setThreshold(r$pred, threshold = th)","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",565,1,"style","Variable and function name style should be snake_case or CamelCase.","tune.res = tuneThreshold(pred = r$pred, measure = wf.costs)","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",589,1,"style","Variable and function name style should be snake_case or CamelCase.","tune.res = tuneParams(lrn, wf.task, resampling = rin, par.set = ps,","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",610,1,"style","Variable and function name style should be snake_case or CamelCase.","costsens.task = makeCostSensTask(id = ""iris"", data = df, cost = cost)","object_name_linter" -"vignettes/tutorial/create_filter.Rmd",125,1,"style","Variable and function name style should be snake_case or CamelCase.","iris.task.filtered = filterFeatures(iris.task, method = ""nonsense.filter"", abs = 2)","object_name_linter" -"vignettes/tutorial/create_imputation.Rmd",32,1,"style","Variable and function name style should be snake_case or CamelCase.","showFunctionDef = function(fun, name = sub(""^[^:]*:+"", """", deparse(substitute(fun)))) {","object_name_linter" -"vignettes/tutorial/create_imputation.Rmd",63,1,"style","Variable and function name style should be snake_case or CamelCase.","imputeLOCF = function() {","object_name_linter" -"vignettes/tutorial/create_imputation.Rmd",69,7,"style","Variable and function name style should be snake_case or CamelCase."," lastValue = which(dind == 1) # position of the last observed value previous to NA","object_name_linter" -"vignettes/tutorial/create_imputation.Rmd",70,7,"style","Variable and function name style should be snake_case or CamelCase."," lastNA = which(dind == -1) # position of the last of potentially several consecutive NA's","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",121,1,"style","Variable and function name style should be snake_case or CamelCase.","showFunctionDef = function(fun, name = gsub(""^[^:]*:+"", """", deparse(substitute(fun)))) {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",129,1,"style","Variable and function name style should be snake_case or CamelCase.","makeRLearner.classif.lda = function() {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",159,58,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","function(.learner, .task, .subset, .weights = NULL, ...) { }","brace_linter" -"vignettes/tutorial/create_learner.Rmd",159,60,"style","Closing curly-braces should always be on their own line, unless they are followed by an else.","function(.learner, .task, .subset, .weights = NULL, ...) { }","brace_linter" -"vignettes/tutorial/create_learner.Rmd",173,1,"style","Variable and function name style should be snake_case or CamelCase.","trainLearner.classif.lda = function(.learner, .task, .subset, .weights = NULL, ...) {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",186,43,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","function(.learner, .model, .newdata, ...) { }","brace_linter" -"vignettes/tutorial/create_learner.Rmd",186,45,"style","Closing curly-braces should always be on their own line, unless they are followed by an else.","function(.learner, .model, .newdata, ...) { }","brace_linter" -"vignettes/tutorial/create_learner.Rmd",199,1,"style","Variable and function name style should be snake_case or CamelCase.","predictLearner.classif.lda = function(.learner, .model, .newdata, predict.method = ""plug-in"", ...) {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",218,1,"style","Variable and function name style should be snake_case or CamelCase.","makeRLearner.regr.earth = function() {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",247,1,"style","Variable and function name style should be snake_case or CamelCase.","trainLearner.regr.earth = function(.learner, .task, .subset, .weights = NULL, ...) {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",254,1,"style","Variable and function name style should be snake_case or CamelCase.","predictLearner.regr.earth = function(.learner, .model, .newdata, ...) {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",273,1,"style","Variable and function name style should be snake_case or CamelCase.","makeRLearner.surv.coxph = function() {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",301,1,"style","Variable and function name style should be snake_case or CamelCase.","trainLearner.surv.coxph = function(.learner, .task, .subset, .weights = NULL, ...) {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",317,1,"style","Variable and function name style should be snake_case or CamelCase.","predictLearner.surv.coxph = function(.learner, .model, .newdata, ...) {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",321,5,"style","Variable and function name style should be snake_case or CamelCase."," surv.range = getTrainingInfo(.model$learner.model)$surv.range","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",342,1,"style","Variable and function names should not be longer than 30 characters.","makeRLearner.cluster.FarthestFirst = function() {","object_length_linter" -"vignettes/tutorial/create_learner.Rmd",342,1,"style","Variable and function name style should be snake_case or CamelCase.","makeRLearner.cluster.FarthestFirst = function() {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",360,1,"style","Variable and function names should not be longer than 30 characters.","trainLearner.cluster.FarthestFirst = function(.learner, .task, .subset, .weights = NULL, ...) {","object_length_linter" -"vignettes/tutorial/create_learner.Rmd",360,1,"style","Variable and function name style should be snake_case or CamelCase.","trainLearner.cluster.FarthestFirst = function(.learner, .task, .subset, .weights = NULL, ...) {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",367,1,"style","Variable and function names should not be longer than 30 characters.","predictLearner.cluster.FarthestFirst = function(.learner, .model, .newdata, ...) {","object_length_linter" -"vignettes/tutorial/create_learner.Rmd",367,1,"style","Variable and function name style should be snake_case or CamelCase.","predictLearner.cluster.FarthestFirst = function(.learner, .model, .newdata, ...) {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",390,1,"style","Variable and function name style should be snake_case or CamelCase.","makeRLearner.multilabel.rFerns = function() {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",407,1,"style","Variable and function name style should be snake_case or CamelCase.","trainLearner.multilabel.rFerns = function(.learner, .task, .subset, .weights = NULL, ...) {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",414,1,"style","Variable and function names should not be longer than 30 characters.","predictLearner.multilabel.rFerns = function(.learner, .model, .newdata, ...) {","object_length_linter" -"vignettes/tutorial/create_learner.Rmd",414,1,"style","Variable and function name style should be snake_case or CamelCase.","predictLearner.multilabel.rFerns = function(.learner, .model, .newdata, ...) {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",435,1,"style","Variable and function names should not be longer than 30 characters.","getFeatureImportanceLearner.classif.rpart = function(.learner, .model, ...) {","object_length_linter" -"vignettes/tutorial/create_learner.Rmd",435,1,"style","Variable and function name style should be snake_case or CamelCase.","getFeatureImportanceLearner.classif.rpart = function(.learner, .model, ...) {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",444,1,"style","Variable and function names should not be longer than 30 characters.","getFeatureImportanceLearner.classif.randomForestSRC = function(.learner, .model, ...) {","object_length_linter" -"vignettes/tutorial/create_learner.Rmd",444,1,"style","Variable and function name style should be snake_case or CamelCase.","getFeatureImportanceLearner.classif.randomForestSRC = function(.learner, .model, ...) {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",560,3,"style","Variable and function name style should be snake_case or CamelCase."," parset.list = list(","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",568,3,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list = list()","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",570,13,"warning","1:length(...) is likely to be wrong in the empty edge case. Use seq_along() instead."," for (i in 1:length(parset.list)) {","seq_linter" -"vignettes/tutorial/create_learner.Rmd",578,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"vignettes/tutorial/create_measure.Rmd",141,1,"style","Variable and function name style should be snake_case or CamelCase.","my.mmce.fun = function(task, model, pred, feats, extra.args) {","object_name_linter" -"vignettes/tutorial/create_measure.Rmd",141,50,"style","Variable and function name style should be snake_case or CamelCase.","my.mmce.fun = function(task, model, pred, feats, extra.args) {","object_name_linter" -"vignettes/tutorial/create_measure.Rmd",147,1,"style","Variable and function name style should be snake_case or CamelCase.","my.mmce = makeMeasure(","object_name_linter" -"vignettes/tutorial/create_measure.Rmd",182,1,"style","Variable and function name style should be snake_case or CamelCase.","my.costs = makeCostMeasure(","object_name_linter" -"vignettes/tutorial/create_measure.Rmd",214,1,"style","Variable and function name style should be snake_case or CamelCase.","my.range.aggr = makeAggregation(id = ""test.range"", name = ""Test Range"",","object_name_linter" -"vignettes/tutorial/create_measure.Rmd",216,24,"style","Variable and function name style should be snake_case or CamelCase."," fun = function(task, perf.test, perf.train, measure, group, pred) {","object_name_linter" -"vignettes/tutorial/create_measure.Rmd",216,35,"style","Variable and function name style should be snake_case or CamelCase."," fun = function(task, perf.test, perf.train, measure, group, pred) {","object_name_linter" -"vignettes/tutorial/create_measure.Rmd",244,1,"style","Variable and function name style should be snake_case or CamelCase.","perf.data = as.data.frame(res$opt.path)","object_name_linter" -"vignettes/tutorial/example_tasks.Rmd",14,1,"style","Variable and function name style should be snake_case or CamelCase.","urlMlrFunctions = ""https://mlr-org.github.io/mlr/reference/""","object_name_linter" -"vignettes/tutorial/example_tasks.Rmd",27,1,"style","Variable and function name style should be snake_case or CamelCase.","linkTask = function(x) {","object_name_linter" -"vignettes/tutorial/example_tasks.Rmd",28,47,"warning","no visible binding for global variable β€˜urlMlrFunctions’"," collapse(sprintf(""[%1$s](%2$s%1$s%3$s)"", x, urlMlrFunctions, ext), sep = ""
"")","object_usage_linter" -"vignettes/tutorial/example_tasks.Rmd",28,64,"warning","no visible binding for global variable β€˜ext’"," collapse(sprintf(""[%1$s](%2$s%1$s%3$s)"", x, urlMlrFunctions, ext), sep = ""
"")","object_usage_linter" -"vignettes/tutorial/feature_selection.Rmd",99,1,"style","Variable and function name style should be snake_case or CamelCase.","filtered.task = filterFeatures(iris.task, method = ""FSelectorRcpp_information.gain"", abs = 2)","object_name_linter" -"vignettes/tutorial/feature_selection.Rmd",102,1,"style","Variable and function name style should be snake_case or CamelCase.","filtered.task = filterFeatures(iris.task, fval = fv, perc = 0.25)","object_name_linter" -"vignettes/tutorial/feature_selection.Rmd",105,1,"style","Variable and function name style should be snake_case or CamelCase.","filtered.task = filterFeatures(iris.task, fval = fv, threshold = 0.5)","object_name_linter" -"vignettes/tutorial/feature_selection.Rmd",325,1,"style","Variable and function name style should be snake_case or CamelCase.","out.rdesc = makeResampleDesc(""CV"", iters = 5)","object_name_linter" -"vignettes/tutorial/filter_methods.Rmd",14,1,"style","Variable and function name style should be snake_case or CamelCase.","urlContribPackages = ""https://cran.r-project.org/package=""","object_name_linter" -"vignettes/tutorial/filter_methods.Rmd",29,1,"style","Variable and function name style should be snake_case or CamelCase.","linkPkg = function(x) {","object_name_linter" -"vignettes/tutorial/filter_methods.Rmd",30,63,"warning","no visible binding for global variable β€˜urlContribPackages’"," ifelse(x == """", """", collapse(sprintf(""[%1$s](%2$s%1$s)"", x, urlContribPackages), sep = ""
""))","object_usage_linter" -"vignettes/tutorial/filter_methods.Rmd",45,121,"style","Lines should not be more than 120 characters.","pandoc.table(dfnd, style = ""rmarkdown"", split.tables = Inf, split.cells = Inf, emphasize.rownames = FALSE, justify = just)","line_length_linter" -"vignettes/tutorial/functional_data.Rmd",118,1,"style","Variable and function name style should be snake_case or CamelCase.","fd.features = list(""UVVIS"" = 3:136, ""NIR"" = 137:367)","object_name_linter" -"vignettes/tutorial/functional_data.Rmd",157,1,"style","Variable and function name style should be snake_case or CamelCase.","knn.lrn = makeLearner(""classif.fdausc.knn"")","object_name_linter" -"vignettes/tutorial/functional_data.Rmd",203,1,"style","Variable and function name style should be snake_case or CamelCase.","rpart.lrn = makeLearner(""regr.rpart"")","object_name_linter" -"vignettes/tutorial/functional_data.Rmd",230,1,"style","Variable and function name style should be snake_case or CamelCase.","feat.methods = list(""UVVIS"" = extractFDAFourier(), ""NIR"" = extractFDAFPCA())","object_name_linter" -"vignettes/tutorial/functional_data.Rmd",250,1,"style","Variable and function name style should be snake_case or CamelCase.","feat.methods = list(""UVVIS"" = extractFDAWavelets(filter = ""haar""))","object_name_linter" -"vignettes/tutorial/functional_data.Rmd",251,1,"style","Variable and function name style should be snake_case or CamelCase.","task.w = extractFDAFeatures(tsk1, feat.methods = feat.methods)","object_name_linter" -"vignettes/tutorial/functional_data.Rmd",254,1,"style","Variable and function name style should be snake_case or CamelCase.","feat.methods = list(""NIR"" = extractFDAWavelets(filter = ""d4""))","object_name_linter" -"vignettes/tutorial/functional_data.Rmd",255,1,"style","Variable and function name style should be snake_case or CamelCase.","task.wd4 = extractFDAFeatures(tsk1, feat.methods = feat.methods)","object_name_linter" -"vignettes/tutorial/functional_data.Rmd",269,1,"style","Variable and function name style should be snake_case or CamelCase.","feat.methods = list(""NIR"" = extractFDAFourier(trafo.coeff = ""amplitude""),","object_name_linter" -"vignettes/tutorial/functional_data.Rmd",271,1,"style","Variable and function name style should be snake_case or CamelCase.","task.fourier = extractFDAFeatures(tsk1, feat.methods = feat.methods)","object_name_linter" -"vignettes/tutorial/functional_data.Rmd",283,1,"style","Variable and function name style should be snake_case or CamelCase.","feat.methods = list(""NIR"" = extractFDAFourier())","object_name_linter" -"vignettes/tutorial/functional_data.Rmd",284,1,"style","Variable and function name style should be snake_case or CamelCase.","wrapped.lrn = makeExtractFDAFeatsWrapper(""regr.rpart"", feat.methods = feat.methods)","object_name_linter" -"vignettes/tutorial/handling_of_spatial_data.Rmd",90,1,"style","Variable and function name style should be snake_case or CamelCase.","learner.rf = makeLearner(""classif.ranger"", predict.type = ""prob"")","object_name_linter" -"vignettes/tutorial/handling_of_spatial_data.Rmd",108,1,"style","Variable and function name style should be snake_case or CamelCase.","learner.rf = makeLearner(""classif.ranger"", predict.type = ""prob"")","object_name_linter" -"vignettes/tutorial/hyperpar_tuning_effects.Rmd",75,43,"style","Use TRUE instead of the symbol T.","generateHyperParsEffectData(res, trafo = T, include.diagnostics = FALSE)","T_and_F_symbol_linter" -"vignettes/tutorial/hyperpar_tuning_effects.Rmd",86,43,"style","Use TRUE instead of the symbol T.","generateHyperParsEffectData(res, trafo = T, include.diagnostics = FALSE)","T_and_F_symbol_linter" -"vignettes/tutorial/hyperpar_tuning_effects.Rmd",114,43,"style","Use TRUE instead of the symbol T.","generateHyperParsEffectData(res, trafo = T, include.diagnostics = FALSE)","T_and_F_symbol_linter" -"vignettes/tutorial/hyperpar_tuning_effects.Rmd",126,43,"style","Use TRUE instead of the symbol T.","generateHyperParsEffectData(res, trafo = T, include.diagnostics = FALSE)","T_and_F_symbol_linter" -"vignettes/tutorial/impute.Rmd",104,1,"style","Variable and function name style should be snake_case or CamelCase.","airq.train = airq[1:100, ]","object_name_linter" -"vignettes/tutorial/impute.Rmd",105,1,"style","Variable and function name style should be snake_case or CamelCase.","airq.test = airq[-c(1:100), ]","object_name_linter" -"vignettes/tutorial/impute.Rmd",134,1,"style","Variable and function name style should be snake_case or CamelCase.","airq.test.imp = reimpute(airq.test, imp$desc)","object_name_linter" -"vignettes/tutorial/integrated_learners.Rmd",14,1,"style","Variable and function name style should be snake_case or CamelCase.","urlContribPackages = urlBasePackages = ""http://www.rdocumentation.org/packages/""","object_name_linter" -"vignettes/tutorial/integrated_learners.Rmd",14,22,"style","Variable and function name style should be snake_case or CamelCase.","urlContribPackages = urlBasePackages = ""http://www.rdocumentation.org/packages/""","object_name_linter" -"vignettes/tutorial/integrated_learners.Rmd",31,1,"style","Variable and function name style should be snake_case or CamelCase.","linkPkg = function(x) {","object_name_linter" -"vignettes/tutorial/integrated_learners.Rmd",34,7,"warning","no visible binding for global variable β€˜urlBasePackages’"," if (urlBasePackages != urlContribPackages) {","object_usage_linter" -"vignettes/tutorial/integrated_learners.Rmd",34,26,"warning","no visible binding for global variable β€˜urlContribPackages’"," if (urlBasePackages != urlContribPackages) {","object_usage_linter" -"vignettes/tutorial/integrated_learners.Rmd",35,18,"warning","no visible binding for global variable β€˜baseR’"," ind = x %in% baseR","object_usage_linter" -"vignettes/tutorial/integrated_learners.Rmd",36,13,"warning","no visible binding for global variable β€˜urlContribPackages’"," url = c(urlContribPackages, urlBasePackages)[ind + 1]","object_usage_linter" -"vignettes/tutorial/integrated_learners.Rmd",36,33,"warning","no visible binding for global variable β€˜urlBasePackages’"," url = c(urlContribPackages, urlBasePackages)[ind + 1]","object_usage_linter" -"vignettes/tutorial/integrated_learners.Rmd",38,11,"warning","no visible binding for global variable β€˜urlContribPackages’"," url = urlContribPackages","object_usage_linter" -"vignettes/tutorial/integrated_learners.Rmd",43,1,"style","Variable and function name style should be snake_case or CamelCase.","getTab = function(type) {","object_name_linter" -"vignettes/tutorial/integrated_learners.Rmd",54,121,"style","Lines should not be more than 120 characters."," cols = c(""class"", ""type"", ""package"", ""short.name"", ""name"", ""numerics"", ""factors"", ""ordered"", ""missings"", ""weights"", ""note"", ""installed"")","line_length_linter" -"vignettes/tutorial/integrated_learners.Rmd",57,3,"style","Variable and function name style should be snake_case or CamelCase."," colNames = c(""Class / Short Name / Name"", ""Packages"", ""Num."", ""Fac."", ""Ord."", ""NAs"", ""Weights"", ""Props"", ""Note"")","object_name_linter" -"vignettes/tutorial/integrated_learners.Rmd",59,121,"style","Lines should not be more than 120 characters."," col.types = c(""character"", ""character"", ""logical"", ""logical"", ""logical"", ""logical"", ""logical"", ""character"", ""character""))","line_length_linter" -"vignettes/tutorial/integrated_learners.Rmd",65,38,"warning","no visible binding for global variable β€˜linkPkg’"," df$Packages = sapply(lrns$package, linkPkg)","object_usage_linter" -"vignettes/tutorial/integrated_learners.Rmd",74,1,"style","Variable and function name style should be snake_case or CamelCase.","makeTab = function(df) {","object_name_linter" -"vignettes/tutorial/learner.Rmd",39,1,"style","Variable and function name style should be snake_case or CamelCase.","classif.lrn = makeLearner(""classif.randomForest"", predict.type = ""prob"", fix.factors.prediction = TRUE)","object_name_linter" -"vignettes/tutorial/learner.Rmd",42,1,"style","Variable and function name style should be snake_case or CamelCase.","regr.lrn = makeLearner(""regr.gbm"", par.vals = list(n.trees = 500, interaction.depth = 3))","object_name_linter" -"vignettes/tutorial/learner.Rmd",45,1,"style","Variable and function name style should be snake_case or CamelCase.","surv.lrn = makeLearner(""surv.coxph"", id = ""cph"")","object_name_linter" -"vignettes/tutorial/learner.Rmd",48,1,"style","Variable and function name style should be snake_case or CamelCase.","cluster.lrn = makeLearner(""cluster.kmeans"", centers = 5)","object_name_linter" -"vignettes/tutorial/learner.Rmd",51,1,"style","Variable and function name style should be snake_case or CamelCase.","multilabel.lrn = makeLearner(""multilabel.rFerns"")","object_name_linter" -"vignettes/tutorial/learner.Rmd",142,1,"style","Variable and function name style should be snake_case or CamelCase.","surv.lrn = setLearnerId(surv.lrn, ""CoxModel"")","object_name_linter" -"vignettes/tutorial/learner.Rmd",146,1,"style","Variable and function name style should be snake_case or CamelCase.","classif.lrn = setPredictType(classif.lrn, ""response"")","object_name_linter" -"vignettes/tutorial/learner.Rmd",149,1,"style","Variable and function name style should be snake_case or CamelCase.","cluster.lrn = setHyperPars(cluster.lrn, centers = 4)","object_name_linter" -"vignettes/tutorial/learner.Rmd",152,1,"style","Variable and function name style should be snake_case or CamelCase.","regr.lrn = removeHyperPars(regr.lrn, c(""n.trees"", ""interaction.depth""))","object_name_linter" -"vignettes/tutorial/measures.Rmd",14,1,"style","Variable and function name style should be snake_case or CamelCase.","urlMlrFunctions = ""https://mlr-org.github.io/mlr/reference/""","object_name_linter" -"vignettes/tutorial/measures.Rmd",46,1,"style","Variable and function name style should be snake_case or CamelCase.","linkFct = function(x, y) {","object_name_linter" -"vignettes/tutorial/measures.Rmd",47,50,"warning","no visible binding for global variable β€˜urlMlrFunctions’"," collapse(sprintf(""[%1$s](%3$s%2$s%4$s)"", x, y, urlMlrFunctions, ext), sep = ""
"")","object_usage_linter" -"vignettes/tutorial/measures.Rmd",47,67,"warning","no visible binding for global variable β€˜ext’"," collapse(sprintf(""[%1$s](%3$s%2$s%4$s)"", x, y, urlMlrFunctions, ext), sep = ""
"")","object_usage_linter" -"vignettes/tutorial/measures.Rmd",54,1,"style","Variable and function name style should be snake_case or CamelCase.","getTab = function(type) {","object_name_linter" -"vignettes/tutorial/measures.Rmd",67,121,"style","Lines should not be more than 120 characters."," cols = c(""ID / Name"", ""Minim."", ""Best"", ""Worst"", ""Multi"", ""Pred."", ""Truth"", ""Probs"", ""Model"", ""Task"", ""Feats"", ""Aggr."", ""Note"")","line_length_linter" -"vignettes/tutorial/measures.Rmd",69,121,"style","Lines should not be more than 120 characters."," col.types = c(""character"", ""logical"", ""numeric"", ""numeric"", ""logical"", ""logical"", ""logical"", ""logical"", ""logical"", ""logical"", ""logical"", ""character"", ""character""))","line_length_linter" -"vignettes/tutorial/measures.Rmd",74,29,"warning","no visible global function definition for β€˜linkFct’"," df[i, 1] = paste0(""**"", linkFct(mea$id, ""measures""), ""**
"", mea$name)","object_usage_linter" -"vignettes/tutorial/measures.Rmd",85,17,"warning","no visible global function definition for β€˜linkFct’"," df[i, 12] = linkFct(mea$aggr$id, ""aggregations"")","object_usage_linter" -"vignettes/tutorial/measures.Rmd",86,17,"warning","no visible global function definition for β€˜urls’"," df[i, 13] = urls(cn(mea$note))","object_usage_linter" -"vignettes/tutorial/measures.Rmd",86,22,"warning","no visible global function definition for β€˜cn’"," df[i, 13] = urls(cn(mea$note))","object_usage_linter" -"vignettes/tutorial/measures.Rmd",89,121,"style","Lines should not be more than 120 characters."," just = c(""left"", ""center"", ""right"", ""right"", ""center"", ""center"", ""center"", ""center"", ""center"", ""center"", ""center"", ""left"", ""left"")","line_length_linter" -"vignettes/tutorial/multilabel.Rmd",37,1,"style","Variable and function name style should be snake_case or CamelCase.","yeast.task = makeMultilabelTask(id = ""multi"", data = yeast, target = labels)","object_name_linter" -"vignettes/tutorial/multilabel.Rmd",55,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.rfsrc = makeLearner(""multilabel.randomForestSRC"")","object_name_linter" -"vignettes/tutorial/multilabel.Rmd",56,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.rFerns = makeLearner(""multilabel.rFerns"")","object_name_linter" -"vignettes/tutorial/multilabel.Rmd",68,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.br = makeLearner(""classif.rpart"", predict.type = ""prob"")","object_name_linter" -"vignettes/tutorial/multilabel.Rmd",69,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.br = makeMultilabelBinaryRelevanceWrapper(lrn.br)","object_name_linter" -"vignettes/tutorial/multilabel.Rmd",72,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.br2 = makeMultilabelBinaryRelevanceWrapper(""classif.rpart"")","object_name_linter" -"vignettes/tutorial/nested_resampling.Rmd",145,1,"style","Variable and function name style should be snake_case or CamelCase.","opt.paths = getNestedTuneResultsOptPathDf(r)","object_name_linter" -"vignettes/tutorial/nested_resampling.Rmd",150,1,"style","Variable and function name style should be snake_case or CamelCase.","opt.paths = getNestedTuneResultsOptPathDf(r)","object_name_linter" -"vignettes/tutorial/nested_resampling.Rmd",265,1,"style","Variable and function name style should be snake_case or CamelCase.","opt.paths = lapply(r$extract, function(x) as.data.frame(x$opt.path))","object_name_linter" -"vignettes/tutorial/nested_resampling.Rmd",270,1,"style","Variable and function name style should be snake_case or CamelCase.","opt.paths = lapply(r$extract, function(x) as.data.frame(x$opt.path))","object_name_linter" -"vignettes/tutorial/nested_resampling.Rmd",363,1,"style","Variable and function name style should be snake_case or CamelCase.","opt.paths = lapply(res, function(x) as.data.frame(x$opt.path))","object_name_linter" -"vignettes/tutorial/nested_resampling.Rmd",458,1,"style","Variable and function name style should be snake_case or CamelCase.","tune.res = getBMRTuneResults(res,","object_name_linter" -"vignettes/tutorial/nested_resampling.Rmd",514,1,"style","Variable and function name style should be snake_case or CamelCase.","opt.paths = lapply(feats, function(x) as.data.frame(x$opt.path))","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",64,1,"style","Variable and function name style should be snake_case or CamelCase.","data.imbal.train = rbind(","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",69,1,"style","Variable and function name style should be snake_case or CamelCase.","task.over = oversample(task, rate = 8)","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",70,1,"style","Variable and function name style should be snake_case or CamelCase.","task.under = undersample(task, rate = 1 / 8)","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",87,1,"style","Variable and function name style should be snake_case or CamelCase.","mod.over = train(lrn, task.over)","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",88,1,"style","Variable and function name style should be snake_case or CamelCase.","mod.under = train(lrn, task.under)","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",89,1,"style","Variable and function name style should be snake_case or CamelCase.","data.imbal.test = rbind(","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",113,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.over = makeOversampleWrapper(lrn, osw.rate = 8)","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",114,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.under = makeUndersampleWrapper(lrn, usw.rate = 1 / 8)","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",116,1,"style","Variable and function name style should be snake_case or CamelCase.","mod.over = train(lrn.over, task)","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",117,1,"style","Variable and function name style should be snake_case or CamelCase.","mod.under = train(lrn.under, task)","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",140,1,"style","Variable and function name style should be snake_case or CamelCase.","task.smote = smote(task, rate = 8, nn = 5)","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",149,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.smote = makeSMOTEWrapper(lrn, sw.rate = 8, sw.nn = 5)","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",150,1,"style","Variable and function name style should be snake_case or CamelCase.","mod.smote = train(lrn.smote, task)","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",170,1,"style","Variable and function name style should be snake_case or CamelCase.","obw.lrn = makeOverBaggingWrapper(lrn, obw.rate = 8, obw.iters = 3)","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",186,1,"style","Variable and function name style should be snake_case or CamelCase.","obw.lrn = setPredictType(obw.lrn, ""prob"")","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",196,1,"style","Variable and function name style should be snake_case or CamelCase.","obw.lrn = makeOverBaggingWrapper(lrn, obw.rate = 8, obw.iters = 3)","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",203,1,"style","Variable and function name style should be snake_case or CamelCase.","obw.lrn = setPredictType(obw.lrn, ""prob"")","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",317,1,"style","Variable and function name style should be snake_case or CamelCase.","wcw.lrn = makeWeightedClassesWrapper(lrn, wcw.weight = 0.01)","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",328,1,"style","Variable and function name style should be snake_case or CamelCase.","wcw.lrn = makeWeightedClassesWrapper(lrn, wcw.weight = 0.01)","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",66,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.classif = makeLearner(""classif.ksvm"", predict.type = ""prob"")","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",67,1,"style","Variable and function name style should be snake_case or CamelCase.","fit.classif = train(lrn.classif, iris.task)","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",80,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.lst = generatePartialDependenceData(fit.classif, iris.task, c(""Petal.Width"", ""Petal.Length""), FALSE)","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",87,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.int = generatePartialDependenceData(fit.classif, iris.task, c(""Petal.Width"", ""Petal.Length""), TRUE)","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",104,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.regr = makeLearner(""regr.ksvm"")","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",105,1,"style","Variable and function name style should be snake_case or CamelCase.","fit.regr = train(lrn.regr, bh.task)","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",106,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.regr = generatePartialDependenceData(fit.regr, bh.task, ""lstat"", fun = median)","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",111,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.ci = generatePartialDependenceData(fit.regr, bh.task, ""lstat"",","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",117,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.classif = generatePartialDependenceData(fit.classif, iris.task, ""Petal.Length"", fun = median)","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",126,1,"style","Variable and function name style should be snake_case or CamelCase.","fit.se = train(makeLearner(""regr.randomForest"", predict.type = ""se""), bh.task)","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",127,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.se = generatePartialDependenceData(fit.se, bh.task, c(""lstat"", ""crim""))","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",137,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.ind.regr = generatePartialDependenceData(fit.regr, bh.task, ""lstat"", individual = TRUE)","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",146,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.ind.classif = generatePartialDependenceData(fit.classif, iris.task, ""Petal.Length"", individual = TRUE)","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",155,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.regr.der = generatePartialDependenceData(fit.regr, bh.task, ""lstat"", derivative = TRUE)","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",160,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.regr.der.ind = generatePartialDependenceData(fit.regr, bh.task, ""lstat"", derivative = TRUE,","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",166,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.classif.der = generatePartialDependenceData(fit.classif, iris.task, ""Petal.Width"", derivative = TRUE)","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",171,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.classif.der.ind = generatePartialDependenceData(fit.classif, iris.task, ""Petal.Width"", derivative = TRUE,","object_name_linter" -"vignettes/tutorial/predict.Rmd",36,1,"style","Variable and function name style should be snake_case or CamelCase.","train.set = seq(1, n, by = 2)","object_name_linter" -"vignettes/tutorial/predict.Rmd",37,1,"style","Variable and function name style should be snake_case or CamelCase.","test.set = seq(2, n, by = 2)","object_name_linter" -"vignettes/tutorial/predict.Rmd",41,1,"style","Variable and function name style should be snake_case or CamelCase.","task.pred = predict(mod, task = bh.task, subset = test.set)","object_name_linter" -"vignettes/tutorial/predict.Rmd",47,1,"style","Variable and function name style should be snake_case or CamelCase.","train.set = seq(1, n, by = 2)","object_name_linter" -"vignettes/tutorial/predict.Rmd",48,1,"style","Variable and function name style should be snake_case or CamelCase.","test.set = seq(2, n, by = 2)","object_name_linter" -"vignettes/tutorial/predict.Rmd",52,1,"style","Variable and function name style should be snake_case or CamelCase.","task.pred = predict(mod, task = bh.task, subset = test.set)","object_name_linter" -"vignettes/tutorial/predict.Rmd",77,1,"style","Variable and function name style should be snake_case or CamelCase.","iris.train = iris[seq(1, n, by = 2), -5]","object_name_linter" -"vignettes/tutorial/predict.Rmd",78,1,"style","Variable and function name style should be snake_case or CamelCase.","iris.test = iris[seq(2, n, by = 2), -5]","object_name_linter" -"vignettes/tutorial/predict.Rmd",82,1,"style","Variable and function name style should be snake_case or CamelCase.","newdata.pred = predict(mod, newdata = iris.test)","object_name_linter" -"vignettes/tutorial/predict.Rmd",88,1,"style","Variable and function name style should be snake_case or CamelCase.","iris.train = iris[seq(1, n, by = 2), -5]","object_name_linter" -"vignettes/tutorial/predict.Rmd",89,1,"style","Variable and function name style should be snake_case or CamelCase.","iris.test = iris[seq(2, n, by = 2), -5]","object_name_linter" -"vignettes/tutorial/predict.Rmd",93,1,"style","Variable and function name style should be snake_case or CamelCase.","newdata.pred = predict(mod, newdata = iris.test)","object_name_linter" -"vignettes/tutorial/predict.Rmd",156,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.lm = makeLearner(""regr.lm"", predict.type = ""se"")","object_name_linter" -"vignettes/tutorial/predict.Rmd",157,1,"style","Variable and function name style should be snake_case or CamelCase.","mod.lm = train(lrn.lm, bh.task, subset = train.set)","object_name_linter" -"vignettes/tutorial/predict.Rmd",158,1,"style","Variable and function name style should be snake_case or CamelCase.","task.pred.lm = predict(mod.lm, task = bh.task, subset = test.set)","object_name_linter" -"vignettes/tutorial/predict.Rmd",163,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.lm = makeLearner(""regr.lm"", predict.type = ""se"")","object_name_linter" -"vignettes/tutorial/predict.Rmd",164,1,"style","Variable and function name style should be snake_case or CamelCase.","mod.lm = train(lrn.lm, bh.task, subset = train.set)","object_name_linter" -"vignettes/tutorial/predict.Rmd",165,1,"style","Variable and function name style should be snake_case or CamelCase.","task.pred.lm = predict(mod.lm, task = bh.task, subset = test.set)","object_name_linter" -"vignettes/tutorial/predict.Rmd",246,1,"style","Variable and function name style should be snake_case or CamelCase.","conf.matrix = calculateConfusionMatrix(pred, relative = TRUE)","object_name_linter" -"vignettes/tutorial/preproc.Rmd",376,1,"style","Variable and function name style should be snake_case or CamelCase.","makePreprocWrapperScale = function(learner, center = TRUE, scale = TRUE) {","object_name_linter" -"vignettes/tutorial/resample.Rmd",182,121,"style","Lines should not be more than 120 characters.","## Aggregated Result: mmce.test.mean=0.2904762,fpr.test.mean=0.2932609,fnr.test.mean=0.2615067,timetrain.test.mean=0.0128000","line_length_linter" -"vignettes/tutorial/resample.Rmd",207,121,"style","Lines should not be more than 120 characters.","## Aggr perf: mmce.test.mean=0.2904762,fpr.test.mean=0.2932609,fnr.test.mean=0.2615067,timetrain.test.mean=0.0128000,ber.test.mean=0.2773838,timepredict.test.mean=0.0032000","line_length_linter" -"vignettes/tutorial/resample.Rmd",346,1,"style","Variable and function name style should be snake_case or CamelCase.","predList = getRRPredictionList(r)","object_name_linter" -"vignettes/tutorial/resample.Rmd",351,1,"style","Variable and function name style should be snake_case or CamelCase.","predList = getRRPredictionList(r)","object_name_linter" -"vignettes/tutorial/resample.Rmd",635,1,"style","Variable and function name style should be snake_case or CamelCase.","r.lda = resample(""classif.lda"", iris.task, rin, show.info = FALSE)","object_name_linter" -"vignettes/tutorial/resample.Rmd",636,1,"style","Variable and function name style should be snake_case or CamelCase.","r.rpart = resample(""classif.rpart"", iris.task, rin, show.info = FALSE)","object_name_linter" -"vignettes/tutorial/resample.Rmd",693,1,"style","Variable and function name style should be snake_case or CamelCase.","mseTestMedian = setAggregation(mse, test.median)","object_name_linter" -"vignettes/tutorial/resample.Rmd",694,1,"style","Variable and function name style should be snake_case or CamelCase.","mseTestMin = setAggregation(mse, test.min)","object_name_linter" -"vignettes/tutorial/resample.Rmd",695,1,"style","Variable and function name style should be snake_case or CamelCase.","mseTestMax = setAggregation(mse, test.max)","object_name_linter" -"vignettes/tutorial/resample.Rmd",704,1,"style","Variable and function name style should be snake_case or CamelCase.","mseTestMedian = setAggregation(mse, test.median)","object_name_linter" -"vignettes/tutorial/resample.Rmd",705,1,"style","Variable and function name style should be snake_case or CamelCase.","mseTestMin = setAggregation(mse, test.min)","object_name_linter" -"vignettes/tutorial/resample.Rmd",706,1,"style","Variable and function name style should be snake_case or CamelCase.","mseTestMax = setAggregation(mse, test.max)","object_name_linter" -"vignettes/tutorial/resample.Rmd",726,121,"style","Lines should not be more than 120 characters.","## Aggregated Result: mse.test.mean=24.0886607,mse.test.median=24.0782026,mse.test.min=18.6894718,mse.test.max=29.4983077","line_length_linter" -"vignettes/tutorial/resample.Rmd",748,1,"style","Variable and function name style should be snake_case or CamelCase.","mmceTrainMean = setAggregation(mmce, train.mean)","object_name_linter" -"vignettes/tutorial/resample.Rmd",777,1,"style","Variable and function name style should be snake_case or CamelCase.","mmceB632 = setAggregation(mmce, b632)","object_name_linter" -"vignettes/tutorial/resample.Rmd",778,1,"style","Variable and function name style should be snake_case or CamelCase.","mmceB632plus = setAggregation(mmce, b632plus)","object_name_linter" -"vignettes/tutorial/roc_analysis.Rmd",65,1,"style","Variable and function name style should be snake_case or CamelCase.","train.set = sample(n, size = round(2 / 3 * n))","object_name_linter" -"vignettes/tutorial/roc_analysis.Rmd",66,1,"style","Variable and function name style should be snake_case or CamelCase.","test.set = setdiff(seq_len(n), train.set)","object_name_linter" -"vignettes/tutorial/roc_analysis.Rmd",160,1,"style","Variable and function name style should be snake_case or CamelCase.","rdesc.inner = makeResampleDesc(""Holdout"")","object_name_linter" -"vignettes/tutorial/roc_analysis.Rmd",175,1,"style","Variable and function name style should be snake_case or CamelCase.","rdesc.outer = makeResampleDesc(""CV"", iters = 5)","object_name_linter" -"vignettes/tutorial/roc_analysis.Rmd",247,1,"style","Variable and function name style should be snake_case or CamelCase.","train.set = sample(n, size = round(2 / 3 * n))","object_name_linter" -"vignettes/tutorial/roc_analysis.Rmd",248,1,"style","Variable and function name style should be snake_case or CamelCase.","test.set = setdiff(seq_len(n), train.set)","object_name_linter" -"vignettes/tutorial/task.Rmd",46,1,"style","Variable and function name style should be snake_case or CamelCase.","regr.task = makeRegrTask(id = ""bh"", data = BostonHousing, target = ""medv"")","object_name_linter" -"vignettes/tutorial/task.Rmd",65,1,"style","Variable and function name style should be snake_case or CamelCase.","classif.task = makeClassifTask(id = ""BreastCancer"", data = df, target = ""Class"")","object_name_linter" -"vignettes/tutorial/task.Rmd",77,1,"style","Variable and function name style should be snake_case or CamelCase.","classif.task = makeClassifTask(id = ""BreastCancer"", data = df, target = ""Class"", positive = ""malignant"")","object_name_linter" -"vignettes/tutorial/task.Rmd",89,1,"style","Variable and function name style should be snake_case or CamelCase.","surv.task = makeSurvTask(data = lung, target = c(""time"", ""status""))","object_name_linter" -"vignettes/tutorial/task.Rmd",109,1,"style","Variable and function name style should be snake_case or CamelCase.","yeast.task = makeMultilabelTask(id = ""multi"", data = yeast, target = labels)","object_name_linter" -"vignettes/tutorial/task.Rmd",122,1,"style","Variable and function name style should be snake_case or CamelCase.","cluster.task = makeClusterTask(data = mtcars)","object_name_linter" -"vignettes/tutorial/task.Rmd",147,1,"style","Variable and function name style should be snake_case or CamelCase.","costsens.task = makeCostSensTask(data = df, cost = cost)","object_name_linter" -"vignettes/tutorial/task.Rmd",227,1,"style","Variable and function name style should be snake_case or CamelCase.","cluster.task = subsetTask(cluster.task, subset = 4:17)","object_name_linter" -"vignettes/tutorial/train.Rmd",74,1,"style","Variable and function name style should be snake_case or CamelCase.","ruspini.task = makeClusterTask(data = ruspini)","object_name_linter" -"vignettes/tutorial/train.Rmd",106,1,"style","Variable and function name style should be snake_case or CamelCase.","train.set = sample(n, size = n / 3)","object_name_linter" -"vignettes/tutorial/usecase_regression.Rmd",44,1,"style","Variable and function name style should be snake_case or CamelCase.","regr.task = makeRegrTask(data = BostonHousing, target = ""medv"")","object_name_linter" -"vignettes/tutorial/usecase_regression.Rmd",92,1,"style","Variable and function name style should be snake_case or CamelCase.","tuned.ksvm = makeTuneWrapper(learner = ""regr.ksvm"", resampling = rdesc, measures = meas,","object_name_linter" -"vignettes/tutorial/usecase_regression.Rmd",94,1,"style","Variable and function name style should be snake_case or CamelCase.","tuned.rf = makeTuneWrapper(learner = ""regr.ranger"", resampling = rdesc, measures = meas,","object_name_linter" -"vignettes/tutorial/wrapper.Rmd",56,1,"style","Variable and function name style should be snake_case or CamelCase.","base.lrn = makeLearner(""classif.rpart"")","object_name_linter" -"vignettes/tutorial/wrapper.Rmd",57,1,"style","Variable and function name style should be snake_case or CamelCase.","wrapped.lrn = makeBaggingWrapper(base.lrn, bw.iters = 100, bw.feats = 0.5)","object_name_linter" -"vignettes/tutorial/wrapper.Rmd",81,1,"style","Variable and function name style should be snake_case or CamelCase.","par.set = makeParamSet(","object_name_linter" -"vignettes/tutorial/wrapper.Rmd",85,1,"style","Variable and function name style should be snake_case or CamelCase.","tuned.lrn = makeTuneWrapper(wrapped.lrn, rdesc, mmce, par.set, ctrl)","object_name_linter" diff --git a/.dev/revdep_emails/mlr/attachments/mlr.warnings b/.dev/revdep_emails/mlr/attachments/mlr.warnings deleted file mode 100644 index be09e01a7..000000000 --- a/.dev/revdep_emails/mlr/attachments/mlr.warnings +++ /dev/null @@ -1,2 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Trying to remove β€˜todo_comment_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/mlr/email-body b/.dev/revdep_emails/mlr/email-body deleted file mode 100644 index a51707efa..000000000 --- a/.dev/revdep_emails/mlr/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Patrick Schratz! Thank you for using {lintr} in your package {mlr}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/mlr-org/mlr using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 319s on CRAN vs. 205s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/mlrCPO/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/mlrCPO/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 914c55203..000000000 --- a/.dev/revdep_emails/mlrCPO/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,4 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/makeCPO.R",110,28,"style","Variable and function name style should be snake_case."," predict.type.map = c(response = ""response""),","object_name_linter" -"R/makeCPO.R",140,28,"style","Variable and function name style should be snake_case."," predict.type.map = c(response = ""response""),","object_name_linter" -"tests/testthat/test_core_datasplit.R",400,11,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" diff --git a/.dev/revdep_emails/mlrCPO/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/mlrCPO/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 62b9ad28a..000000000 --- a/.dev/revdep_emails/mlrCPO/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,441 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/doc/toc/vignettetoc.Rmd",16,3,"style","Commented code should be removed.","# path = names(knitr::opts_knit$get(""encoding""))[1]","commented_code_linter" -"inst/doc/toc/vignettetoc.Rmd",16,3,"style","Commented code should be removed.","# path = names(knitr::opts_knit$get(""encoding""))[1]","commented_code_linter" -"inst/doc/toc/vignettetoc.Rmd",17,6,"style","Use <-, not =, for assignment.","base = knitr::opts_knit$get(""output.dir"")","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",17,6,"style","Use <-, not =, for assignment.","base = knitr::opts_knit$get(""output.dir"")","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",18,6,"style","Use <-, not =, for assignment.","file = sys.frame(min(grep(""^knitr::knit$|^knit$"", sapply(sys.calls(), function(x) as.character(x)[1]))))$input","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",18,6,"style","Use <-, not =, for assignment.","file = sys.frame(min(grep(""^knitr::knit$|^knit$"", sapply(sys.calls(), function(x) as.character(x)[1]))))$input","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",18,81,"style","Lines should not be more than 80 characters.","file = sys.frame(min(grep(""^knitr::knit$|^knit$"", sapply(sys.calls(), function(x) as.character(x)[1]))))$input","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",18,81,"style","Lines should not be more than 80 characters.","file = sys.frame(min(grep(""^knitr::knit$|^knit$"", sapply(sys.calls(), function(x) as.character(x)[1]))))$input","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",19,6,"style","Use <-, not =, for assignment.","file = basename(file)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",19,6,"style","Use <-, not =, for assignment.","file = basename(file)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",20,6,"style","Use <-, not =, for assignment.","path = file.path(base, file)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",20,6,"style","Use <-, not =, for assignment.","path = file.path(base, file)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",21,7,"style","Use <-, not =, for assignment.","rpath = gsub(""\\.[^.]*$"", "".R"", path)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",21,7,"style","Use <-, not =, for assignment.","rpath = gsub(""\\.[^.]*$"", "".R"", path)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",26,11,"style","Use <-, not =, for assignment."," lines = readLines(rpath)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",26,11,"style","Use <-, not =, for assignment."," lines = readLines(rpath)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",27,11,"style","Use <-, not =, for assignment."," lines = gsub("" *(\n|$)"", ""\\1"", lines)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",27,11,"style","Use <-, not =, for assignment."," lines = gsub("" *(\n|$)"", ""\\1"", lines)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",36,10,"style","Use <-, not =, for assignment.","fullfile = file","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",36,10,"style","Use <-, not =, for assignment.","fullfile = file","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",38,10,"style","Use <-, not =, for assignment.","allfiles = list.files(path = base, pattern = "".*\\.Rmd$"")","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",38,10,"style","Use <-, not =, for assignment.","allfiles = list.files(path = base, pattern = "".*\\.Rmd$"")","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",42,14,"style","Use <-, not =, for assignment.","fileinfolist = list()","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",42,14,"style","Use <-, not =, for assignment.","fileinfolist = list()","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",44,10,"style","Use <-, not =, for assignment."," ismain = TRUE","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",44,10,"style","Use <-, not =, for assignment."," ismain = TRUE","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",46,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""^z_"", """", cf)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",46,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""^z_"", """", cf)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",47,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""_terse\\.Rmd$"", """", infoslot)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",47,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""_terse\\.Rmd$"", """", infoslot)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",48,13,"style","Use <-, not =, for assignment."," subslot = ""compact""","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",48,13,"style","Use <-, not =, for assignment."," subslot = ""compact""","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",50,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""^a_"", """", cf)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",50,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""^a_"", """", cf)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",51,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""\\.Rmd$"", """", infoslot)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",51,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""\\.Rmd$"", """", infoslot)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",52,13,"style","Use <-, not =, for assignment."," subslot = ""main""","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",52,13,"style","Use <-, not =, for assignment."," subslot = ""main""","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",55,11,"style","Use <-, not =, for assignment."," content = scan(paste(base, cf, sep = ""/""), what = ""character"", quiet = TRUE)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",55,11,"style","Use <-, not =, for assignment."," content = scan(paste(base, cf, sep = ""/""), what = ""character"", quiet = TRUE)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",56,7,"style","Use <-, not =, for assignment."," pos = min(c(which(content == ""title:""), Inf))","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",56,7,"style","Use <-, not =, for assignment."," pos = min(c(which(content == ""title:""), Inf))","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",60,12,"style","Use <-, not =, for assignment."," infolist = list(title = content[pos + 1], url = cf, iscurrent = cf == file)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",60,12,"style","Use <-, not =, for assignment."," infolist = list(title = content[pos + 1], url = cf, iscurrent = cf == file)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",62,11,"style","Use <-, not =, for assignment."," applist = list(infolist)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",62,11,"style","Use <-, not =, for assignment."," applist = list(infolist)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",63,18,"style","Use <-, not =, for assignment."," names(applist) = subslot","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",63,18,"style","Use <-, not =, for assignment."," names(applist) = subslot","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",64,28,"style","Use <-, not =, for assignment."," fileinfolist[[infoslot]] = c(fileinfolist[[infoslot]], applist)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",64,28,"style","Use <-, not =, for assignment."," fileinfolist[[infoslot]] = c(fileinfolist[[infoslot]], applist)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",68,9,"style","Use <-, not =, for assignment.","linkify = function(info, title) {","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",68,9,"style","Use <-, not =, for assignment.","linkify = function(info, title) {","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",78,11,"style","Use <-, not =, for assignment."," content = fileinfolist[[sort(names(fileinfolist))[idx]]]","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",78,11,"style","Use <-, not =, for assignment."," content = fileinfolist[[sort(names(fileinfolist))[idx]]]","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",80,81,"style","Lines should not be more than 80 characters."," if (paste(sub(""[0-9]\\. "", """", content$main$title), ""(No Output)"") != sub(""^z "", """", content$compact$title)) {","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",80,81,"style","Lines should not be more than 80 characters."," if (paste(sub(""[0-9]\\. "", """", content$main$title), ""(No Output)"") != sub(""^z "", """", content$compact$title)) {","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",81,81,"style","Lines should not be more than 80 characters."," stop(sprintf(""File %s and its compact version %s have incompatible titles\nThe compact version must be paste(main_title, \""(No Output)\""). Is: '%s', expected: '%s'"",","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",81,81,"style","Lines should not be more than 80 characters."," stop(sprintf(""File %s and its compact version %s have incompatible titles\nThe compact version must be paste(main_title, \""(No Output)\""). Is: '%s', expected: '%s'"",","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",82,81,"style","Lines should not be more than 80 characters."," content$main$url, content$compact$url, content$compact$title, paste(content$main$title, ""(No Output)"")))","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",82,81,"style","Lines should not be more than 80 characters."," content$main$url, content$compact$url, content$compact$title, paste(content$main$title, ""(No Output)"")))","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",84,10,"style","Use <-, not =, for assignment."," line = sprintf(""%s (%s)"", linkify(content$main, content$main$title), linkify(content$compact, ""compact version""))","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",84,10,"style","Use <-, not =, for assignment."," line = sprintf(""%s (%s)"", linkify(content$main, content$main$title), linkify(content$compact, ""compact version""))","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",84,81,"style","Lines should not be more than 80 characters."," line = sprintf(""%s (%s)"", linkify(content$main, content$main$title), linkify(content$compact, ""compact version""))","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",84,81,"style","Lines should not be more than 80 characters."," line = sprintf(""%s (%s)"", linkify(content$main, content$main$title), linkify(content$compact, ""compact version""))","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",86,10,"style","Use <-, not =, for assignment."," line = linkify(content$main, content$main$title)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",86,10,"style","Use <-, not =, for assignment."," line = linkify(content$main, content$main$title)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",90,14,"style","Use <-, not =, for assignment."," fullfile = content$main$url","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",90,14,"style","Use <-, not =, for assignment."," fullfile = content$main$url","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",94,10,"style","Use <-, not =, for assignment.","fullpath = file.path(base, fullfile)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",94,10,"style","Use <-, not =, for assignment.","fullpath = file.path(base, fullfile)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",102,1,"style","Variable and function name style should be snake_case or symbols.","printToc = function(print.level = 3) {","object_name_linter" -"inst/doc/toc/vignettetoc.Rmd",102,1,"style","Variable and function name style should be snake_case or symbols.","printToc = function(print.level = 3) {","object_name_linter" -"inst/doc/toc/vignettetoc.Rmd",102,10,"style","Use <-, not =, for assignment.","printToc = function(print.level = 3) {","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",102,10,"style","Use <-, not =, for assignment.","printToc = function(print.level = 3) {","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",103,14,"style","Use <-, not =, for assignment."," owncontent = readLines(fullpath)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",103,14,"style","Use <-, not =, for assignment."," owncontent = readLines(fullpath)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",103,26,"warning","no visible binding for global variable β€˜fullpath’"," owncontent = readLines(fullpath)","object_usage_linter" -"inst/doc/toc/vignettetoc.Rmd",103,26,"warning","no visible binding for global variable β€˜fullpath’"," owncontent = readLines(fullpath)","object_usage_linter" -"inst/doc/toc/vignettetoc.Rmd",104,13,"style","Use <-, not =, for assignment."," tripletic = grepl(""^```"", owncontent)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",104,13,"style","Use <-, not =, for assignment."," tripletic = grepl(""^```"", owncontent)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",105,14,"style","Use <-, not =, for assignment."," owncontent = owncontent[cumsum(tripletic) %% 2 == 0] # exclude ```-delimited code","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",105,14,"style","Use <-, not =, for assignment."," owncontent = owncontent[cumsum(tripletic) %% 2 == 0] # exclude ```-delimited code","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",105,81,"style","Lines should not be more than 80 characters."," owncontent = owncontent[cumsum(tripletic) %% 2 == 0] # exclude ```-delimited code","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",105,81,"style","Lines should not be more than 80 characters."," owncontent = owncontent[cumsum(tripletic) %% 2 == 0] # exclude ```-delimited code","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",106,13,"style","Use <-, not =, for assignment."," headlines = grep(""^#+ +"", owncontent, value = TRUE)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",106,13,"style","Use <-, not =, for assignment."," headlines = grep(""^#+ +"", owncontent, value = TRUE)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",107,14,"style","Use <-, not =, for assignment."," headlevels = nchar(gsub("" .*"", """", headlines))","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",107,14,"style","Use <-, not =, for assignment."," headlevels = nchar(gsub("" .*"", """", headlines))","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",108,13,"style","Use <-, not =, for assignment."," headlines = gsub(""^[#]+ +"", """", headlines)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",108,13,"style","Use <-, not =, for assignment."," headlines = gsub(""^[#]+ +"", """", headlines)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",109,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"inst/doc/toc/vignettetoc.Rmd",109,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"inst/doc/toc/vignettetoc.Rmd",110,9,"style","Use <-, not =, for assignment."," links = gsub(""[^-a-z. ]"", """", tolower(headlines))","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",110,9,"style","Use <-, not =, for assignment."," links = gsub(""[^-a-z. ]"", """", tolower(headlines))","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",111,9,"style","Use <-, not =, for assignment."," links = gsub("" +"", ""-"", links)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",111,9,"style","Use <-, not =, for assignment."," links = gsub("" +"", ""-"", links)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",112,9,"style","Use <-, not =, for assignment."," links = gsub(""-$"", """", links)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",112,9,"style","Use <-, not =, for assignment."," links = gsub(""-$"", """", links)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",117,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"inst/doc/toc/vignettetoc.Rmd",117,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"inst/doc/toc/vignettetoc.Rmd",118,81,"style","Lines should not be more than 80 characters."," cat(""Table of Contents\n
\n"", sep = """")","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",118,81,"style","Lines should not be more than 80 characters."," cat(""Table of Contents\n
\n"", sep = """")","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",120,13,"style","Use <-, not =, for assignment."," lastlevel = headlevels[1] - 1","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",120,13,"style","Use <-, not =, for assignment."," lastlevel = headlevels[1] - 1","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",122,10,"style","Use <-, not =, for assignment."," line = headlines[idx]","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",122,10,"style","Use <-, not =, for assignment."," line = headlines[idx]","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",123,11,"style","Use <-, not =, for assignment."," level = headlevels[idx]","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",123,11,"style","Use <-, not =, for assignment."," level = headlevels[idx]","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",124,10,"style","Use <-, not =, for assignment."," link = links[idx]","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",124,10,"style","Use <-, not =, for assignment."," link = links[idx]","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",129,81,"style","Lines should not be more than 80 characters."," stop(""First headline level must be the lowest one used, but '"", line, ""' is lower."")","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",129,81,"style","Lines should not be more than 80 characters."," stop(""First headline level must be the lowest one used, but '"", line, ""' is lower."")","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",131,13,"style","Use <-, not =, for assignment."," lvldiff = level - lastlevel","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",131,13,"style","Use <-, not =, for assignment."," lvldiff = level - lastlevel","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",148,15,"style","Use <-, not =, for assignment."," lastlevel = level","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",148,15,"style","Use <-, not =, for assignment."," lastlevel = level","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",151,11,"style","Use <-, not =, for assignment."," lvldiff = lastlevel - headlevels[1]","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",151,11,"style","Use <-, not =, for assignment."," lvldiff = lastlevel - headlevels[1]","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",165,14,"style","Use <-, not =, for assignment.","replaceprint = function(ofunc) {","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",165,14,"style","Use <-, not =, for assignment.","replaceprint = function(ofunc) {","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",168,8,"style","Use <-, not =, for assignment."," cu = capture.output({ret = ofunc(x, ...)})","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",168,8,"style","Use <-, not =, for assignment."," cu = capture.output({ret = ofunc(x, ...)})","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",168,25,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," cu = capture.output({ret = ofunc(x, ...)})","brace_linter" -"inst/doc/toc/vignettetoc.Rmd",168,25,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," cu = capture.output({ret = ofunc(x, ...)})","brace_linter" -"inst/doc/toc/vignettetoc.Rmd",168,30,"style","Use <-, not =, for assignment."," cu = capture.output({ret = ofunc(x, ...)})","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",168,30,"style","Use <-, not =, for assignment."," cu = capture.output({ret = ofunc(x, ...)})","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",169,8,"style","Use <-, not =, for assignment."," cu = grep(""time: [-+e0-9.]{1,6}"", cu, value = TRUE, invert = TRUE)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",169,8,"style","Use <-, not =, for assignment."," cu = grep(""time: [-+e0-9.]{1,6}"", cu, value = TRUE, invert = TRUE)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",179,9,"style","Use <-, not =, for assignment."," ofunc = get(pfunc, asNamespace(""mlr""))","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",179,9,"style","Use <-, not =, for assignment."," ofunc = get(pfunc, asNamespace(""mlr""))","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",182,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" -"inst/doc/toc/vignettetoc.Rmd",182,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" -"inst/doc/toc/vignettetoc.Rmd",183,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" -"inst/doc/toc/vignettetoc.Rmd",183,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" -"R/CPO_encode.R",25,18,"style","Any function spanning multiple lines should use curly braces."," lapply(data, function(col)","brace_linter" -"R/CPO_encode.R",26,35,"style","Any function spanning multiple lines should use curly braces."," sapply(levels(target[[1]]), function(tl)","brace_linter" -"R/CPO_encode.R",27,37,"style","Any function spanning multiple lines should use curly braces."," vnapply(c(levels(col), NA), function(cl)","brace_linter" -"R/CPO_encode.R",79,18,"style","Any function spanning multiple lines should use curly braces."," lapply(data, function(col)","brace_linter" -"R/CPO_encode.R",137,18,"style","Any function spanning multiple lines should use curly braces."," lapply(data, function(col)","brace_linter" -"R/CPO_quantileBinNumerics.R",17,18,"style","Any function spanning multiple lines should use curly braces."," lapply(data, function(d)","brace_linter" -"tests/testthat/helper_cpo.R",408,5,"warning","no visible global function definition for β€˜pss’"," pss(numrows: integer[0, ],","object_usage_linter" -"tests/testthat/helper_cpo.R",408,9,"warning","no visible binding for global variable β€˜numrows’"," pss(numrows: integer[0, ],","object_usage_linter" -"tests/testthat/helper_cpo.R",409,7,"warning","no visible binding for global variable β€˜numtarget’"," numtarget: integer[0, ],","object_usage_linter" -"tests/testthat/helper_cpo.R",410,7,"warning","no visible binding for global variable β€˜numnumeric’"," numnumeric: integer[0, ] [[requires = quote(!isdf && !istask)]],","object_usage_linter" -"tests/testthat/helper_cpo.R",411,7,"warning","no visible binding for global variable β€˜numfactor’"," numfactor: integer[0, ] [[requires = quote(!isdf && !istask)]],","object_usage_linter" -"tests/testthat/helper_cpo.R",412,7,"warning","no visible binding for global variable β€˜numother’"," numother: integer[0, ] [[requires = quote(!isdf && !istask)]],","object_usage_linter" -"tests/testthat/helper_makecpo.R",333,57,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, target = target, param = param,","object_usage_linter" -"tests/testthat/helper_makecpo.R",333,57,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, target = target, param = param,","object_usage_linter" -"tests/testthat/helper_makecpo.R",342,44,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, param = param,","object_usage_linter" -"tests/testthat/helper_makecpo.R",342,44,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, param = param,","object_usage_linter" -"tests/testthat/helper_makecpo.R",350,46,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, param = param, control = control)","object_usage_linter" -"tests/testthat/helper_makecpo.R",356,59,"warning","no visible binding for global variable β€˜param’"," train(data = data, target = target, param = param)","object_usage_linter" -"tests/testthat/helper_makecpo.R",359,44,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, param = param, control = control)","object_usage_linter" -"tests/testthat/helper_makecpo.R",369,46,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, param = param, control = control)","object_usage_linter" -"tests/testthat/helper_makecpo.R",381,44,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, param = param, control = control)","object_usage_linter" -"tests/testthat/helper_makecpo.R",410,61,"warning","no visible binding for global variable β€˜param’"," train(data = data, target = target, param = param)","object_usage_linter" -"tests/testthat/helper_makecpo.R",449,73,"warning","no visible binding for global variable β€˜param’"," traininvert(data = data, control = control, param = param)","object_usage_linter" -"tests/testthat/helper_makecpo.R",492,63,"warning","no visible binding for global variable β€˜param’"," train(data = data, target = target, param = param)","object_usage_linter" -"tests/testthat/helper_makecpo.R",495,71,"warning","no visible binding for global variable β€˜param’"," traininvert(data = data, control = control, param = param)","object_usage_linter" -"tests/testthat/helper_makecpo.R",642,33,"warning","no visible binding for global variable β€˜allowedGMC’"," for (lineno in seq_len(nrow(allowedGMC))) {","object_usage_linter" -"tests/testthat/test_core_properties.R",34,33,"style","Any function spanning multiple lines should use curly braces."," lapply(getCPOProperties(x), function(y)","brace_linter" -"tests/testthat/test_meta_multiplex.R",158,38,"style","Variable and function name style should be snake_case or symbols."," cpo.build = function(data, target, logical.param, a, b) {","object_name_linter" -"vignettes/a_1_getting_started.Rmd",55,81,"style","Lines should not be more than 80 characters.","cpoScale(center = FALSE) # create a CPO object that scales, but does not center, data","line_length_linter" -"vignettes/a_1_getting_started.Rmd",66,1,"style","Variable and function name style should be snake_case or symbols.","iris.demo = iris[c(1, 2, 3, 51, 52, 102, 103), ]","object_name_linter" -"vignettes/a_1_getting_started.Rmd",66,11,"style","Use <-, not =, for assignment.","iris.demo = iris[c(1, 2, 3, 51, 52, 102, 103), ]","assignment_linter" -"vignettes/a_1_getting_started.Rmd",67,81,"style","Lines should not be more than 80 characters.","tail(iris.demo %>>% cpoQuantileBinNumerics()) # bin the data in below & above median","line_length_linter" -"vignettes/a_1_getting_started.Rmd",78,13,"style","Use <-, not =, for assignment.","quantilenum = cpoQuantileBinNumerics(numsplits = 3) %>>% cpoAsNumeric()","assignment_linter" -"vignettes/a_1_getting_started.Rmd",88,1,"style","Variable and function name style should be snake_case or symbols.","quantilenum.restricted = cpoQuantileBinNumerics(numsplits = 3) %>>%","object_name_linter" -"vignettes/a_1_getting_started.Rmd",88,24,"style","Use <-, not =, for assignment.","quantilenum.restricted = cpoQuantileBinNumerics(numsplits = 3) %>>%","assignment_linter" -"vignettes/a_1_getting_started.Rmd",97,1,"style","Variable and function name style should be snake_case or symbols.","demo.task = makeClassifTask(data = iris.demo, target = ""Species"")","object_name_linter" -"vignettes/a_1_getting_started.Rmd",97,11,"style","Use <-, not =, for assignment.","demo.task = makeClassifTask(data = iris.demo, target = ""Species"")","assignment_linter" -"vignettes/a_1_getting_started.Rmd",98,8,"style","Use <-, not =, for assignment.","result = demo.task %>>% quantilenum","assignment_linter" -"vignettes/a_1_getting_started.Rmd",114,5,"style","Use <-, not =, for assignment.","cpo = cpoScale()","assignment_linter" -"vignettes/a_1_getting_started.Rmd",129,6,"style","Use <-, not =, for assignment.","cpo2 = setHyperPars(cpo, scale.scale = FALSE)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",147,5,"style","Use <-, not =, for assignment.","cpo = cpoScale(id = ""a"") %>>% cpoScale(id = ""b"") # not very useful example","assignment_linter" -"vignettes/a_1_getting_started.Rmd",160,5,"style","Use <-, not =, for assignment.","cpo = cpoPca(export = c(""center"", ""rank""))","assignment_linter" -"vignettes/a_1_getting_started.Rmd",176,13,"style","Use <-, not =, for assignment.","transformed = iris.demo %>>% cpoPca(rank = 3)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",180,5,"style","Use <-, not =, for assignment.","ret = retrafo(transformed)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",198,4,"style","Use <-, not =, for assignment.","t2 = transformed %>>% cpoScale()","assignment_linter" -"vignettes/a_1_getting_started.Rmd",202,4,"style","Use <-, not =, for assignment.","t3 = clearRI(transformed) %>>% cpoScale()","assignment_linter" -"vignettes/a_1_getting_started.Rmd",222,1,"style","Variable and function name style should be snake_case or symbols.","iris.regr = makeRegrTask(data = iris.demo, target = ""Petal.Width"")","object_name_linter" -"vignettes/a_1_getting_started.Rmd",222,11,"style","Use <-, not =, for assignment.","iris.regr = makeRegrTask(data = iris.demo, target = ""Petal.Width"")","assignment_linter" -"vignettes/a_1_getting_started.Rmd",223,1,"style","Variable and function name style should be snake_case or symbols.","iris.logd = iris.regr %>>% cpoLogTrafoRegr()","object_name_linter" -"vignettes/a_1_getting_started.Rmd",223,11,"style","Use <-, not =, for assignment.","iris.logd = iris.regr %>>% cpoLogTrafoRegr()","assignment_linter" -"vignettes/a_1_getting_started.Rmd",229,5,"style","Use <-, not =, for assignment.","inv = inverter(iris.logd) # inverter object","assignment_linter" -"vignettes/a_1_getting_started.Rmd",235,10,"style","Use <-, not =, for assignment.","logmodel = train(""regr.lm"", iris.logd)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",236,6,"style","Use <-, not =, for assignment.","pred = predict(logmodel, iris.logd) # prediction on the task itself","assignment_linter" -"vignettes/a_1_getting_started.Rmd",246,9,"style","Use <-, not =, for assignment.","newdata = makeRegrTask(""newiris"", iris[7:9, ], target = ""Petal.Width"",","assignment_linter" -"vignettes/a_1_getting_started.Rmd",253,1,"style","Variable and function name style should be snake_case or symbols.","newdata.transformed = newdata %>>% retrafo(iris.logd)","object_name_linter" -"vignettes/a_1_getting_started.Rmd",253,21,"style","Use <-, not =, for assignment.","newdata.transformed = newdata %>>% retrafo(iris.logd)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",257,6,"style","Use <-, not =, for assignment.","pred = predict(logmodel, newdata.transformed)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",264,1,"style","Variable and function name style should be snake_case or symbols.","inv.newdata = inverter(newdata.transformed)","object_name_linter" -"vignettes/a_1_getting_started.Rmd",264,13,"style","Use <-, not =, for assignment.","inv.newdata = inverter(newdata.transformed)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",290,1,"style","Variable and function name style should be snake_case or symbols.","iris.resid = iris.regr %>>% cpoRegrResiduals(""regr.lm"")","object_name_linter" -"vignettes/a_1_getting_started.Rmd",290,12,"style","Use <-, not =, for assignment.","iris.resid = iris.regr %>>% cpoRegrResiduals(""regr.lm"")","assignment_linter" -"vignettes/a_1_getting_started.Rmd",295,1,"style","Variable and function name style should be snake_case or symbols.","model.resid = train(""regr.randomForest"", iris.resid)","object_name_linter" -"vignettes/a_1_getting_started.Rmd",295,13,"style","Use <-, not =, for assignment.","model.resid = train(""regr.randomForest"", iris.resid)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",297,1,"style","Variable and function name style should be snake_case or symbols.","newdata.resid = newdata %>>% retrafo(iris.resid)","object_name_linter" -"vignettes/a_1_getting_started.Rmd",297,15,"style","Use <-, not =, for assignment.","newdata.resid = newdata %>>% retrafo(iris.resid)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",298,81,"style","Lines should not be more than 80 characters.","getTaskData(newdata.resid) # Petal.Width are now the residuals of lm model predictions","line_length_linter" -"vignettes/a_1_getting_started.Rmd",302,6,"style","Use <-, not =, for assignment.","pred = predict(model.resid, newdata.resid)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",308,1,"style","Variable and function name style should be snake_case or symbols.","inv.newdata = inverter(newdata.resid)","object_name_linter" -"vignettes/a_1_getting_started.Rmd",308,13,"style","Use <-, not =, for assignment.","inv.newdata = inverter(newdata.resid)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",317,9,"style","Use <-, not =, for assignment.","sampled = iris %>>% cpoSample(size = 3)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",334,5,"style","Use <-, not =, for assignment.","lrn = cpoRegrResiduals(""regr.lm"") %>>% makeLearner(""regr.randomForest"")","assignment_linter" -"vignettes/a_1_getting_started.Rmd",338,7,"style","Use <-, not =, for assignment.","model = train(lrn, iris.regr)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",340,6,"style","Use <-, not =, for assignment.","pred = predict(model, newdata)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",353,8,"style","Use <-, not =, for assignment.","icalrn = cpoIca() %>>% makeLearner(""classif.logreg"")","assignment_linter" -"vignettes/a_1_getting_started.Rmd",358,4,"style","Use <-, not =, for assignment.","ps = makeParamSet(","assignment_linter" -"vignettes/a_1_getting_started.Rmd",362,3,"style","Commented code should be removed.","# ps = pSS(ica.n.comp: integer[1, 8], ica.alg.typ: discrete[parallel, deflation])","commented_code_linter" -"vignettes/a_1_getting_started.Rmd",362,81,"style","Lines should not be more than 80 characters.","# ps = pSS(ica.n.comp: integer[1, 8], ica.alg.typ: discrete[parallel, deflation])","line_length_linter" -"vignettes/a_1_getting_started.Rmd",405,7,"style","Use <-, not =, for assignment.","repca = retrafo(iris.demo %>>% cpoPca())","assignment_linter" -"vignettes/a_1_getting_started.Rmd",406,7,"style","Use <-, not =, for assignment.","state = getCPOTrainedState(repca)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",412,22,"style","Use <-, not =, for assignment.","state$control$center = FALSE","assignment_linter" -"vignettes/a_1_getting_started.Rmd",413,21,"style","Use <-, not =, for assignment.","state$control$scale = FALSE","assignment_linter" -"vignettes/a_1_getting_started.Rmd",414,1,"style","Variable and function name style should be snake_case or symbols.","nosc.repca = makeCPOTrainedFromState(cpoPca, state)","object_name_linter" -"vignettes/a_1_getting_started.Rmd",414,12,"style","Use <-, not =, for assignment.","nosc.repca = makeCPOTrainedFromState(cpoPca, state)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",442,5,"style","Use <-, not =, for assignment.","cpm = cpoMultiplex(list(cpoIca, cpoPca(export = ""export.all"")))","assignment_linter" -"vignettes/a_1_getting_started.Rmd",456,5,"style","Use <-, not =, for assignment.","cpa = cpoWrap()","assignment_linter" -"vignettes/a_1_getting_started.Rmd",474,7,"style","Use <-, not =, for assignment.","scale = cpoSelect(pattern = ""Sepal"", id = ""first"") %>>% cpoScale(id = ""scale"")","assignment_linter" -"vignettes/a_1_getting_started.Rmd",475,11,"style","Use <-, not =, for assignment.","scale.pca = scale %>>% cpoPca()","assignment_linter" -"vignettes/a_1_getting_started.Rmd",476,9,"style","Use <-, not =, for assignment.","cbinder = cpoCbind(scale, scale.pca, cpoSelect(pattern = ""Petal"", id = ""second""))","assignment_linter" -"vignettes/a_1_getting_started.Rmd",476,81,"style","Lines should not be more than 80 characters.","cbinder = cpoCbind(scale, scale.pca, cpoSelect(pattern = ""Petal"", id = ""second""))","line_length_linter" -"vignettes/a_2_mlrCPO_core.Rmd",41,40,"style","Commented code should be removed.","print(cpoAsNumeric, verbose = TRUE) # alternative: !cpoAsNumeric","commented_code_linter" -"vignettes/a_2_mlrCPO_core.Rmd",61,6,"style","Use <-, not =, for assignment.","(cpo = cpoScale()) # construct CPO with default Hyperparameter values","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",107,6,"style","Use <-, not =, for assignment.","task = applyCPO(cpoPca(), iris.task)","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",118,7,"style","Use <-, not =, for assignment.","scale = cpoScale()","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",119,5,"style","Use <-, not =, for assignment.","pca = cpoPca()","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",122,10,"style","Use <-, not =, for assignment.","compound = scale %>>% pca","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",157,5,"style","Use <-, not =, for assignment.","lrn = makeLearner(""classif.logreg"")","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",158,9,"style","Use <-, not =, for assignment.","(cpolrn = cpo %>>% lrn) # the new learner has the CPO hyperparameters","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",168,5,"style","Use <-, not =, for assignment.","lrn = cpoLogTrafoRegr() %>>% makeLearner(""regr.lm"")","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",169,7,"style","Use <-, not =, for assignment.","model = train(lrn, subsetTask(bh.task, 1:300))","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",174,7,"style","Use <-, not =, for assignment.","trafo = subsetTask(bh.task, 1:300) %>>% cpoLogTrafoRegr()","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",175,7,"style","Use <-, not =, for assignment.","model = train(""regr.lm"", trafo)","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",177,9,"style","Use <-, not =, for assignment.","newdata = subsetTask(bh.task, 301:500) %>>% retrafo(trafo)","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",178,6,"style","Use <-, not =, for assignment.","pred = predict(model, newdata)","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",198,13,"style","Use <-, not =, for assignment.","transformed = iris %>>% cpoScale()","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",200,6,"style","Use <-, not =, for assignment.","(ret = retrafo(transformed))","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",205,13,"style","Use <-, not =, for assignment.","transformed = bh.task %>>% cpoLogTrafoRegr()","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",207,6,"style","Use <-, not =, for assignment.","(inv = inverter(transformed))","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",219,5,"style","Use <-, not =, for assignment.","bh2 = bh.task","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",220,14,"style","Use <-, not =, for assignment.","retrafo(bh2) = ret","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",224,14,"style","Use <-, not =, for assignment.","retrafo(bh2) = NULLCPO","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",226,3,"style","Commented code should be removed.","# retrafo(bh2) = NULL","commented_code_linter" -"vignettes/a_2_mlrCPO_core.Rmd",232,5,"style","Use <-, not =, for assignment.","bh3 = clearRI(transformed)","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",275,8,"style","Use <-, not =, for assignment.","(state = getCPOTrainedState(retrafo(iris %>>% cpoScale())))","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",276,25,"style","Use <-, not =, for assignment.","state$control$center[1] = 1000 # will now subtract 1000 from the first column","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",277,1,"style","Variable and function name style should be snake_case or symbols.","new.retrafo = makeCPOTrainedFromState(cpoScale, state)","object_name_linter" -"vignettes/a_2_mlrCPO_core.Rmd",277,13,"style","Use <-, not =, for assignment.","new.retrafo = makeCPOTrainedFromState(cpoScale, state)","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",286,6,"style","Use <-, not =, for assignment.","data = head(iris) %>>% cpoPca()","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",288,7,"style","Use <-, not =, for assignment.","data2 = data %>>% cpoScale()","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",296,6,"style","Use <-, not =, for assignment.","data = clearRI(data)","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",297,7,"style","Use <-, not =, for assignment.","data2 = data %>>% cpoScale()","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",302,15,"style","Use <-, not =, for assignment.","retrafo(data) = NULL","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",303,16,"style","Use <-, not =, for assignment.","inverter(data) = NULL","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",304,7,"style","Use <-, not =, for assignment.","data3 = data %>>% cpoScale()","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",312,1,"style","Variable and function name style should be snake_case or symbols.","compound.retrafo = retrafo(head(iris) %>>% compound)","object_name_linter" -"vignettes/a_2_mlrCPO_core.Rmd",312,18,"style","Use <-, not =, for assignment.","compound.retrafo = retrafo(head(iris) %>>% compound)","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",316,14,"style","Use <-, not =, for assignment.","(retrafolist = as.list(compound.retrafo))","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",328,13,"style","Use <-, not =, for assignment.","transformed = iris %>>% cpoScale()","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",346,13,"style","Use <-, not =, for assignment.","transformed = bh.task %>>% cpoLogTrafoRegr()","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",347,12,"style","Use <-, not =, for assignment.","prediction = predict(train(""regr.lm"", transformed), transformed)","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",348,5,"style","Use <-, not =, for assignment.","inv = inverter(transformed)","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",352,5,"style","Use <-, not =, for assignment.","ret = retrafo(transformed)","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",381,81,"style","Lines should not be more than 80 characters.","# applying NULLCPO leads to a retrafo() of NULLCPO, so it is its own CPOTrainedCPO","line_length_linter" -"vignettes/a_2_mlrCPO_core.Rmd",401,5,"style","Use <-, not =, for assignment.","cpo = cpoPca()","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",436,81,"style","Lines should not be more than 80 characters.","train(cpoDummyEncode(reference.cat = TRUE) %>>% makeLearner(""classif.geoDA""), bc.task)","line_length_linter" -"vignettes/a_2_mlrCPO_core.Rmd",469,5,"style","Use <-, not =, for assignment.","cpo = cpoPca(affect.pattern = "".Length"")","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",473,8,"style","Use <-, not =, for assignment.","triris = iris %>>% cpo","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",27,5,"style","Use <-, not =, for assignment.","tab = listCPO()[, c(""name"", ""category"", ""subcategory"")]","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",28,12,"style","Use <-, not =, for assignment.","owncontent = readLines(path)","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",29,11,"style","Use <-, not =, for assignment.","headlines = grep(""^#+ +"", owncontent, value = TRUE)","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",30,11,"style","Use <-, not =, for assignment.","headlines = gsub(""^#+ +"", """", headlines)","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",31,10,"style","Use <-, not =, for assignment.","tab[[1]] = sapply(tab[[1]], function(x)","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",31,29,"style","Any function spanning multiple lines should use curly braces.","tab[[1]] = sapply(tab[[1]], function(x)","brace_linter" -"vignettes/a_3_all_CPOs.Rmd",54,5,"style","Use <-, not =, for assignment.","cpa = cpoWrap()","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",58,81,"style","Lines should not be more than 80 characters.","# attaching the cpo applicator to a learner gives this learner a ""cpo"" hyperparameter","line_length_linter" -"vignettes/a_3_all_CPOs.Rmd",67,5,"style","Use <-, not =, for assignment.","cpm = cpoMultiplex(list(cpoScale, cpoPca))","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",79,1,"style","Variable and function name style should be snake_case or symbols.","s.and.p = cpoCase(pSS(logical.param: logical),","object_name_linter" -"vignettes/a_3_all_CPOs.Rmd",79,9,"style","Use <-, not =, for assignment.","s.and.p = cpoCase(pSS(logical.param: logical),","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",80,33,"style","Trailing whitespace is superfluous."," export.cpos = list(cpoScale(), ","trailing_whitespace_linter" -"vignettes/a_3_all_CPOs.Rmd",82,38,"style","Variable and function name style should be snake_case or symbols."," cpo.build = function(data, target, logical.param, scale, pca) {","object_name_linter" -"vignettes/a_3_all_CPOs.Rmd",99,7,"style","Use <-, not =, for assignment.","scale = cpoScale(id = ""scale"")","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",100,11,"style","Use <-, not =, for assignment.","scale.pca = scale %>>% cpoPca()","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",101,9,"style","Use <-, not =, for assignment.","cbinder = cpoCbind(scaled = scale, pcad = scale.pca, original = NULLCPO)","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",104,81,"style","Lines should not be more than 80 characters.","# cpoCbind recognises that ""scale.scale"" happens before ""pca.pca"" but is also fed to the","line_length_linter" -"vignettes/a_3_all_CPOs.Rmd",110,81,"style","Lines should not be more than 80 characters.","# the unnecessary copies of ""Species"" are unfortunate. Remove them with cpoSelect:","line_length_linter" -"vignettes/a_3_all_CPOs.Rmd",111,10,"style","Use <-, not =, for assignment.","selector = cpoSelect(type = ""numeric"")","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",112,1,"style","Variable and function name style should be snake_case or symbols.","cbinder.select = cpoCbind(scaled = selector %>>% scale, pcad = selector %>>% scale.pca, original = NULLCPO)","object_name_linter" -"vignettes/a_3_all_CPOs.Rmd",112,16,"style","Use <-, not =, for assignment.","cbinder.select = cpoCbind(scaled = selector %>>% scale, pcad = selector %>>% scale.pca, original = NULLCPO)","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",112,81,"style","Lines should not be more than 80 characters.","cbinder.select = cpoCbind(scaled = selector %>>% scale, pcad = selector %>>% scale.pca, original = NULLCPO)","line_length_linter" -"vignettes/a_3_all_CPOs.Rmd",126,5,"style","Use <-, not =, for assignment.","cpo = cpoTransformParams(cpoPca(), alist(pca.scale = pca.center))","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",127,6,"style","Use <-, not =, for assignment.","retr = pid.task %>|% setHyperPars(cpo, pca.center = FALSE)","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",132,6,"style","Use <-, not =, for assignment.","mplx = cpoMultiplex(list(cpoIca(export = ""n.comp""), cpoPca(export = ""rank"")))","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",134,5,"style","Use <-, not =, for assignment.","mtx = cpoTransformParams(mplx, alist(ica.n.comp = comp, pca.rank = comp),","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",146,4,"style","Use <-, not =, for assignment.","df = data.frame(a = 1:3, b = -(1:3) * 10)","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",148,36,"style","Commented code should be removed.","df %>>% cpoScale(scale = FALSE) # center = TRUE","commented_code_linter" -"vignettes/a_3_all_CPOs.Rmd",190,9,"style","Use <-, not =, for assignment.","irisfix = head(iris) %>>% cpoFixFactors() # Species only has level 'setosa' in train","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",190,81,"style","Lines should not be more than 80 characters.","irisfix = head(iris) %>>% cpoFixFactors() # Species only has level 'setosa' in train","line_length_linter" -"vignettes/a_3_all_CPOs.Rmd",194,4,"style","Use <-, not =, for assignment.","rf = retrafo(irisfix)","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",203,9,"style","Use <-, not =, for assignment.","impdata = df","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",204,17,"style","Use <-, not =, for assignment.","impdata[[1]][1] = NA","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",233,7,"style","Use <-, not =, for assignment.","iris2 = iris","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",234,15,"style","Use <-, not =, for assignment.","iris2$Species = factor(c(""a"", ""b"", ""c"", ""b"", ""b"", ""c"", ""b"", ""c"",","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",281,81,"style","Lines should not be more than 80 characters.","impdata %>>% cpoImputeAll(cols = list(b = imputeMedian())) # error, since NAs remain","line_length_linter" -"vignettes/a_3_all_CPOs.Rmd",285,1,"style","Variable and function name style should be snake_case or symbols.","missing.task = makeRegrTask(""missing.task"", impdata, target = ""b"")","object_name_linter" -"vignettes/a_3_all_CPOs.Rmd",285,14,"style","Use <-, not =, for assignment.","missing.task = makeRegrTask(""missing.task"", impdata, target = ""b"")","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",286,81,"style","Lines should not be more than 80 characters.","# the following gives an error, since 'cpoImpute' does not make sure all missings are removed","line_length_linter" -"vignettes/a_3_all_CPOs.Rmd",288,81,"style","Lines should not be more than 80 characters.","train(cpoImpute(cols = list(a = imputeMedian())) %>>% makeLearner(""regr.lm""), missing.task)","line_length_linter" -"vignettes/a_3_all_CPOs.Rmd",292,81,"style","Lines should not be more than 80 characters.","train(cpoImputeAll(cols = list(a = imputeMedian())) %>>% makeLearner(""regr.lm""), missing.task)","line_length_linter" -"vignettes/a_3_all_CPOs.Rmd",302,81,"style","Lines should not be more than 80 characters.","listCPO()[listCPO()$category == ""imputation"" & listCPO()$subcategory == ""specialised"",","line_length_linter" -"vignettes/a_3_all_CPOs.Rmd",315,81,"style","Lines should not be more than 80 characters.","head(getTaskData(iris.task %>>% cpoFilterFeatures(method = ""variance"", perc = 0.5)))","line_length_linter" -"vignettes/a_3_all_CPOs.Rmd",318,81,"style","Lines should not be more than 80 characters.","listCPO()[listCPO()$category == ""featurefilter"" & listCPO()$subcategory == ""specialised"",","line_length_linter" -"vignettes/a_4_custom_CPOs.Rmd",109,13,"style","Use <-, not =, for assignment."," newsize = round(nrow(data) * fraction)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",110,5,"style","Variable and function name style should be snake_case or symbols."," row.indices = sample(nrow(data), newsize)","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",110,17,"style","Use <-, not =, for assignment."," row.indices = sample(nrow(data), newsize)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",114,5,"style","Use <-, not =, for assignment.","cpo = xmpSample(0.01)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",126,13,"style","Use <-, not =, for assignment."," newsize = round(nrow(data) * fraction)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",127,5,"style","Variable and function name style should be snake_case or symbols."," row.indices = sample(nrow(data), newsize)","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",127,17,"style","Use <-, not =, for assignment."," row.indices = sample(nrow(data), newsize)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",153,38,"style","Variable and function name style should be snake_case or symbols."," cpo.train = function(data, target, n.col) {","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",157,41,"style","Variable and function name style should be snake_case or symbols."," cpo.retrafo = function(data, control, n.col) {","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",162,14,"style","Use <-, not =, for assignment."," greatest = order(-control) # columns, ordered greatest to smallest var","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",166,5,"style","Use <-, not =, for assignment.","cpo = xmpFilterVar(2)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",172,8,"style","Use <-, not =, for assignment.","(trafd = head(iris) %>>% cpo)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",201,38,"style","Variable and function name style should be snake_case or symbols."," cpo.train = function(data, target, n.col) {","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",203,10,"style","Use <-, not =, for assignment."," ctrl = sapply(data, var, na.rm = TRUE)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",212,16,"style","Use <-, not =, for assignment."," greatest = order(-ctrl) # columns, ordered greatest to smallest var","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",217,5,"style","Use <-, not =, for assignment.","cpo = xmpFilterVarFunc(2)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",222,8,"style","Use <-, not =, for assignment.","(trafd = head(iris) %>>% cpo)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",241,5,"style","Use <-, not =, for assignment.","cpo = xmpAsNum()","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",246,8,"style","Use <-, not =, for assignment.","(trafd = head(iris) %>>% cpo)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",264,38,"style","Variable and function name style should be snake_case or symbols."," cpo.trafo = function(data, target, n.col) {","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",266,9,"style","Use <-, not =, for assignment."," pcr = prcomp(as.matrix(data), center = FALSE, scale. = FALSE, rank = n.col)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",268,13,"style","Use <-, not =, for assignment."," control = pcr$rotation","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",271,41,"style","Variable and function name style should be snake_case or symbols."," cpo.retrafo = function(data, control, n.col) {","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",277,5,"style","Use <-, not =, for assignment.","cpo = xmpPca(2)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",282,8,"style","Use <-, not =, for assignment.","(trafd = head(iris) %>>% cpo)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",302,38,"style","Variable and function name style should be snake_case or symbols."," cpo.trafo = function(data, target, n.col) {","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",304,9,"style","Use <-, not =, for assignment."," pcr = prcomp(as.matrix(data), center = FALSE, scale. = FALSE, rank = n.col)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",306,5,"style","Variable and function name style should be snake_case or symbols."," cpo.retrafo = function(data) {","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",306,17,"style","Use <-, not =, for assignment."," cpo.retrafo = function(data) {","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",314,5,"style","Use <-, not =, for assignment.","cpo = xmpPcaFunc(2)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",318,8,"style","Use <-, not =, for assignment.","(trafd = head(iris) %>>% cpo)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",368,9,"style","Use <-, not =, for assignment."," lrn = setPredictType(lrn, ""prob"")","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",373,16,"style","Use <-, not =, for assignment."," prediction = predict(control, target)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",374,11,"style","Use <-, not =, for assignment."," tname = getTaskTargetNames(target)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",375,11,"style","Use <-, not =, for assignment."," tdata = getTaskData(target)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",376,20,"style","Use <-, not =, for assignment."," tdata[[tname]] = factor(prediction$data$response == prediction$data$truth)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",384,33,"style","Variable and function name style should be snake_case or symbols."," cpo.invert = function(target, control.invert, predict.type, lrn) {","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",387,14,"style","Use <-, not =, for assignment."," outmat = as.matrix(control.invert[grep(""^prob\\."", names(control.invert))])","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",387,81,"style","Lines should not be more than 80 characters."," outmat = as.matrix(control.invert[grep(""^prob\\."", names(control.invert))])","line_length_linter" -"vignettes/a_4_custom_CPOs.Rmd",388,14,"style","Use <-, not =, for assignment."," revmat = outmat[, c(2, 1)]","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",393,7,"style","Variable and function name style should be snake_case or symbols."," numeric.prediction = as.numeric(control.invert$response)","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",393,26,"style","Use <-, not =, for assignment."," numeric.prediction = as.numeric(control.invert$response)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",394,7,"style","Variable and function name style should be snake_case or symbols."," numeric.res = ifelse(target == ""TRUE"",","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",394,19,"style","Use <-, not =, for assignment."," numeric.res = ifelse(target == ""TRUE"",","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",402,5,"style","Use <-, not =, for assignment.","cpo = xmpMetaLearn(makeLearner(""classif.logreg""))","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",409,7,"style","Use <-, not =, for assignment.","split = makeResampleInstance(hout, pid.task)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",410,1,"style","Variable and function name style should be snake_case or symbols.","train.task = subsetTask(pid.task, split$train.inds[[1]])","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",410,12,"style","Use <-, not =, for assignment.","train.task = subsetTask(pid.task, split$train.inds[[1]])","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",411,1,"style","Variable and function name style should be snake_case or symbols.","test.task = subsetTask(pid.task, split$predict.inds[[1]])","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",411,11,"style","Use <-, not =, for assignment.","test.task = subsetTask(pid.task, split$predict.inds[[1]])","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",417,7,"style","Use <-, not =, for assignment.","trafd = train.task %>>% cpo","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",426,7,"style","Use <-, not =, for assignment.","model = train(makeLearner(""classif.logreg"", predict.type = ""prob""), train.task)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",433,6,"style","Use <-, not =, for assignment.","retr = test.task %>>% retrafo(trafd)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",439,1,"style","Variable and function name style should be snake_case or symbols.","retr.df = getTaskData(test.task, target.extra = TRUE)$data %>>% retrafo(trafd)","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",439,9,"style","Use <-, not =, for assignment.","retr.df = getTaskData(test.task, target.extra = TRUE)$data %>>% retrafo(trafd)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",446,1,"style","Variable and function name style should be snake_case or symbols.","ext.model = train(""classif.svm"", trafd)","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",446,11,"style","Use <-, not =, for assignment.","ext.model = train(""classif.svm"", trafd)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",447,1,"style","Variable and function name style should be snake_case or symbols.","ext.pred = predict(ext.model, retr)","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",447,10,"style","Use <-, not =, for assignment.","ext.pred = predict(ext.model, retr)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",448,9,"style","Use <-, not =, for assignment.","newpred = invert(inverter(retr), ext.pred)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",455,1,"style","Variable and function name style should be snake_case or symbols.","cpo.learner = cpo %>>% makeLearner(""classif.svm"")","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",455,13,"style","Use <-, not =, for assignment.","cpo.learner = cpo %>>% makeLearner(""classif.svm"")","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",456,1,"style","Variable and function name style should be snake_case or symbols.","cpo.model = train(cpo.learner, train.task)","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",456,11,"style","Use <-, not =, for assignment.","cpo.model = train(cpo.learner, train.task)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",459,9,"style","Use <-, not =, for assignment.","lrnpred = predict(cpo.model, test.task)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",488,9,"style","Use <-, not =, for assignment."," lrn = setPredictType(lrn, ""prob"")","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",489,11,"style","Use <-, not =, for assignment."," model = train(lrn, data)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",490,5,"style","Variable and function name style should be snake_case or symbols."," cpo.retrafo = function(data, target) {","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",490,17,"style","Use <-, not =, for assignment."," cpo.retrafo = function(data, target) {","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",492,18,"style","Use <-, not =, for assignment."," prediction = predict(model, target)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",493,13,"style","Use <-, not =, for assignment."," tname = getTaskTargetNames(target)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",494,13,"style","Use <-, not =, for assignment."," tdata = getTaskData(target)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",495,22,"style","Use <-, not =, for assignment."," tdata[[tname]] = factor(prediction$data$response == prediction$data$truth)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",499,5,"style","Variable and function name style should be snake_case or symbols."," cpo.train.invert = function(data) {","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",499,22,"style","Use <-, not =, for assignment."," cpo.train.invert = function(data) {","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",501,18,"style","Use <-, not =, for assignment."," prediction = predict(model, newdata = data)$data","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",505,18,"style","Use <-, not =, for assignment."," outmat = as.matrix(prediction[grep(""^prob\\."", names(prediction))])","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",506,18,"style","Use <-, not =, for assignment."," revmat = outmat[, c(2, 1)]","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",511,11,"style","Variable and function name style should be snake_case or symbols."," numeric.prediction = as.numeric(prediction$response)","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",511,30,"style","Use <-, not =, for assignment."," numeric.prediction = as.numeric(prediction$response)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",512,11,"style","Variable and function name style should be snake_case or symbols."," numeric.res = ifelse(target == ""TRUE"",","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",512,23,"style","Use <-, not =, for assignment."," numeric.res = ifelse(target == ""TRUE"",","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",517,10,"style","Trailing whitespace is superfluous."," } ","trailing_whitespace_linter" -"vignettes/a_4_custom_CPOs.Rmd",543,17,"style","Use <-, not =, for assignment."," target[[1]] = target[[1]] - control","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",546,47,"style","Variable and function name style should be snake_case or symbols."," cpo.invert = function(target, predict.type, control.invert) {","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",550,5,"style","Use <-, not =, for assignment.","cpo = xmpRegCenter()","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",555,1,"style","Variable and function name style should be snake_case or symbols.","train.task = subsetTask(bh.task, 150:155)","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",555,12,"style","Use <-, not =, for assignment.","train.task = subsetTask(bh.task, 150:155)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",559,14,"style","Use <-, not =, for assignment.","predict.task = subsetTask(bh.task, 156:160)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",565,7,"style","Use <-, not =, for assignment.","trafd = train.task %>>% cpo","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",574,6,"style","Use <-, not =, for assignment.","retr = retrafo(trafd)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",575,14,"style","Use <-, not =, for assignment.","predict.traf = predict.task %>>% retr","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",581,7,"style","Use <-, not =, for assignment.","model = train(""regr.lm"", trafd)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",582,6,"style","Use <-, not =, for assignment.","pred = predict(model, predict.traf)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",591,7,"style","Use <-, not =, for assignment.","model = train(""regr.lm"", train.task)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",618,17,"style","Use <-, not =, for assignment."," target[[1]] = log(target[[1]])","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",625,5,"style","Use <-, not =, for assignment.","cpo = xmpLogRegr()","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",630,7,"style","Use <-, not =, for assignment.","trafd = train.task %>>% cpo","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",635,6,"style","Use <-, not =, for assignment.","retr = retrafo(trafd)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",636,14,"style","Use <-, not =, for assignment.","predict.traf = predict.task %>>% retr","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",641,7,"style","Use <-, not =, for assignment.","model = train(""regr.lm"", trafd)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",642,6,"style","Use <-, not =, for assignment.","pred = predict(model, predict.traf)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",670,17,"style","Use <-, not =, for assignment."," target[[1]] = target[[1]] + 1","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",671,13,"style","Use <-, not =, for assignment."," control = ""control created in cpo.trafo""","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",672,5,"style","Variable and function name style should be snake_case or symbols."," control.invert = ""control.invert created in cpo.trafo""","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",672,20,"style","Use <-, not =, for assignment."," control.invert = ""control.invert created in cpo.trafo""","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",677,5,"style","Variable and function name style should be snake_case or symbols."," control.invert = ""control.invert created in cpo.retrafo""","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",677,20,"style","Use <-, not =, for assignment."," control.invert = ""control.invert created in cpo.retrafo""","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",680,19,"style","Use <-, not =, for assignment."," target[[1]] = target[[1]] - 1","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",683,81,"style","Lines should not be more than 80 characters."," cat(""target is NULL, no transformation (but control.invert was created)\n"")","line_length_linter" -"vignettes/a_4_custom_CPOs.Rmd",687,33,"style","Variable and function name style should be snake_case or symbols."," cpo.invert = function(target, control.invert, predict.type) {","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",693,5,"style","Use <-, not =, for assignment.","cpo = xmpSynCPO()","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",698,7,"style","Use <-, not =, for assignment.","trafd = train.task %>>% cpo","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",703,9,"style","Use <-, not =, for assignment.","retrafd = train.task %>>% retrafo(trafd)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",711,9,"style","Use <-, not =, for assignment.","retrafd = getTaskData(train.task, target.extra = TRUE)$data %>>% retrafo(trafd)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",717,5,"style","Use <-, not =, for assignment.","inv = invert(inverter(trafd), 1:6)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",720,5,"style","Use <-, not =, for assignment.","inv = invert(inverter(retrafd), 1:6)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",727,9,"style","Use <-, not =, for assignment.","oscipen = options(""scipen"")","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",731,10,"style","Use <-, not =, for assignment.","learners = list(","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",741,7,"style","Use <-, not =, for assignment.","perfs = sapply(learners, function(lrn) {","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",753,7,"style","Use <-, not =, for assignment.","pvals = c(","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",754,75,"style","Trailing whitespace is superfluous."," logreg = t.test(perfs[, ""logreg""], perfs[, ""cpo""], ""greater"")$p.value, ","trailing_whitespace_linter" -"vignettes/z_1_getting_started_terse.Rmd",13,81,"style","Lines should not be more than 80 characters.","cat(knitr::knit_child(""a_1_getting_started.Rmd"", options = list(eval = FALSE)), sep = ""\n"")","line_length_linter" -"vignettes/z_2_mlrCPO_core_terse.Rmd",13,81,"style","Lines should not be more than 80 characters.","cat(knitr::knit_child(""a_2_mlrCPO_core.Rmd"", options = list(eval = FALSE)), sep = ""\n"")","line_length_linter" -"vignettes/z_3_all_CPOs_terse.Rmd",13,81,"style","Lines should not be more than 80 characters.","cat(knitr::knit_child(""a_3_all_CPOs.Rmd"", options = list(eval = FALSE)), sep = ""\n"")","line_length_linter" -"vignettes/z_4_custom_CPOs_terse.Rmd",13,81,"style","Lines should not be more than 80 characters.","cat(knitr::knit_child(""a_4_custom_CPOs.Rmd"", options = list(eval = FALSE)), sep = ""\n"")","line_length_linter" diff --git a/.dev/revdep_emails/mlrCPO/email-body b/.dev/revdep_emails/mlrCPO/email-body deleted file mode 100644 index 2d56f12c3..000000000 --- a/.dev/revdep_emails/mlrCPO/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Martin Binder! Thank you for using {lintr} in your package {mlrCPO}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/mlr-org/mlrCPO using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 178s on CRAN vs. 108s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/modules/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/modules/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index f1e08b6de..000000000 --- a/.dev/revdep_emails/modules/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,12 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/module-helper.R",49,5,"style","Either both or neither branch in `if`/`else` should use curly braces."," else {","brace_linter" -"vignettes/modulesAsObjects.Rmd",63,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/modulesAsObjects.Rmd",83,5,"warning","local variable β€˜fun’ assigned but may not be used"," fun <- function() param","object_usage_linter" -"vignettes/modulesAsObjects.Rmd",95,5,"warning","local variable β€˜fun’ assigned but may not be used"," fun <- function() param","object_usage_linter" -"vignettes/modulesAsObjects.Rmd",122,1,"style","Variable and function name style should be camelCase.","B <- function(a) {","object_name_linter" -"vignettes/modulesAsObjects.Rmd",124,5,"warning","local variable β€˜foo’ assigned but may not be used"," foo <- function() a$foo()","object_usage_linter" -"vignettes/modulesAsObjects.Rmd",194,1,"style","Variable and function name style should be camelCase.","A <- function() {","object_name_linter" -"vignettes/modulesAsObjects.Rmd",196,5,"warning","local variable β€˜foo’ assigned but may not be used"," foo <- function() ""foo""","object_usage_linter" -"vignettes/modulesAsObjects.Rmd",200,1,"style","Variable and function name style should be camelCase.","B <- function(a) {","object_name_linter" -"vignettes/modulesAsObjects.Rmd",203,5,"warning","local variable β€˜bar’ assigned but may not be used"," bar <- function() ""bar""","object_usage_linter" -"vignettes/modulesInR.Rmd",12,91,"style","Lines should not be more than 90 characters.","cat(gsub(""\\n "", """", packageDescription(""modules"", fields = ""Description"", encoding = NA)))","line_length_linter" diff --git a/.dev/revdep_emails/modules/attachments/modules.warnings b/.dev/revdep_emails/modules/attachments/modules.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/modules/attachments/modules.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/modules/email-body b/.dev/revdep_emails/modules/email-body deleted file mode 100644 index 3f277a4cb..000000000 --- a/.dev/revdep_emails/modules/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Sebastian Warnholz! Thank you for using {lintr} in your package {modules}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/wahani/modules using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 16s on CRAN vs. 10s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/nLTT/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/nLTT/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index cb4447ed8..000000000 --- a/.dev/revdep_emails/nLTT/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,2 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"vignettes/nltt_diff.Rmd",84,45,"style","Compound semicolons are discouraged. Replace them by a newline.","nLTT::nltt_plot(phylogeny_1, ylim = c(0, 1)); nLTT::nltt_lines(phylogeny_2)","semicolon_linter" diff --git a/.dev/revdep_emails/nLTT/email-body b/.dev/revdep_emails/nLTT/email-body deleted file mode 100644 index 5a6436b20..000000000 --- a/.dev/revdep_emails/nLTT/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Thijs Janzen! Thank you for using {lintr} in your package {nLTT}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/thijsjanzen/nLTT using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 21s on CRAN vs. 14s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/newsmd/email-body b/.dev/revdep_emails/newsmd/email-body deleted file mode 100644 index a1655f951..000000000 --- a/.dev/revdep_emails/newsmd/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Jakob Gepp! Thank you for using {lintr} in your package {newsmd}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/Dschaykib/newsmd using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 3s on CRAN vs. 1s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/openbankeR/attachments/openbankeR.warnings b/.dev/revdep_emails/openbankeR/attachments/openbankeR.warnings deleted file mode 100644 index 5602e2ffd..000000000 --- a/.dev/revdep_emails/openbankeR/attachments/openbankeR.warnings +++ /dev/null @@ -1,68 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Linter closed_curly_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. -Trying to remove β€˜open_curly_linter’, β€˜undesirable_function_linter’, β€˜undesirable_operator_linter’ and β€˜todo_comment_linter’, which are not in `defaults`. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. diff --git a/.dev/revdep_emails/openbankeR/email-body b/.dev/revdep_emails/openbankeR/email-body deleted file mode 100644 index 5b420857e..000000000 --- a/.dev/revdep_emails/openbankeR/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Nik Lilovski! Thank you for using {lintr} in your package {openbankeR}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/nik01010/openbankeR using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 2s on CRAN vs. 1s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/osfr/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/osfr/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 56b534d6a..000000000 --- a/.dev/revdep_emails/osfr/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,8 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"data-raw/create-test-project.R",40,1,"style","Variable and function name style should be snake_case or symbols.","dev.null <- mapply(","object_name_linter" -"R/osf_tbl-compat.R",9,32,"style","Variable and function name style should be snake_case or symbols.","rbind.osf_tbl <- function(..., deparse.level = 1) {","object_name_linter" -"R/osf_tbl.R",77,23,"style","Any function spanning multiple lines should use curly braces.","as_osf_tbl.default <- function(x, subclass = NULL)","brace_linter" -"R/osf_tbl.R",92,3,"warning","local variable β€˜name_field’ assigned but may not be used"," name_field <- switch(subclass,","object_usage_linter" -"R/utils-file-operations.R",34,15,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (verbose & action == ""move"") message(sprintf(""Moved '%s' to '%s'."", x$name, to$name))","vector_logic_linter" -"R/utils-file-operations.R",35,15,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (verbose & action == ""copy"") message(sprintf(""Copied '%s' to '%s'."", x$name, to$name))","vector_logic_linter" -"R/utils-uploads.R",21,3,"warning","local variable β€˜msg’ assigned but may not be used"," msg <- bullet_msg(","object_usage_linter" diff --git a/.dev/revdep_emails/osfr/attachments/osfr.warnings b/.dev/revdep_emails/osfr/attachments/osfr.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/osfr/attachments/osfr.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/osfr/email-body b/.dev/revdep_emails/osfr/email-body deleted file mode 100644 index 4bd17d723..000000000 --- a/.dev/revdep_emails/osfr/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Aaron Wolen! Thank you for using {lintr} in your package {osfr}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/ropensci/osfr using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 35s on CRAN vs. 21s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/packager/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/packager/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index cda5a9cc8..000000000 --- a/.dev/revdep_emails/packager/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,5 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/templates/zzz.R",1,1,"style","Variable and function name style should be snake_case.",".onLoad <- function(libname, pkgname) {","object_name_linter" -"R/devtools.R",395,7,"style","Variable and function name style should be snake_case."," pkg$Rmd <- TRUE","object_name_linter" -"R/remotes_modified.R",2,1,"style","Variable and function name style should be snake_case.","`%::%` <- function(p, f) get(f, envir = asNamespace(p))","object_name_linter" -"R/zzz.R",1,1,"style","Variable and function name style should be snake_case.",".onLoad <- function(libname, pkgname) {","object_name_linter" diff --git a/.dev/revdep_emails/packager/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/packager/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 5c0411512..000000000 --- a/.dev/revdep_emails/packager/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,29 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/files/An_Introduction_to_packager.Rmd",69,72,"style","Trailing whitespace is superfluous.","if (""myFirstPackage"" %in% .packages()) detach(""package:myFirstPackage"", ","trailing_whitespace_linter" -"inst/files/An_Introduction_to_packager.Rmd",80,76,"style","Trailing whitespace is superfluous.","a <- utils::person(given = ""Your"", family = ""Name"", email = ""some@whe.re"", ","trailing_whitespace_linter" -"inst/files/An_Introduction_to_packager.Rmd",99,71,"style","Trailing whitespace is superfluous.","help_file <- system.file(""man"", paste0(package_title, ""-package.Rd""), ","trailing_whitespace_linter" -"inst/files/An_Introduction_to_packager.Rmd",101,18,"style","Only use double-quotes.","captured <- gsub('_\b', '', capture.output(tools:::Rd2txt(help_file) ))","single_quotes_linter" -"inst/files/An_Introduction_to_packager.Rmd",101,25,"style","Only use double-quotes.","captured <- gsub('_\b', '', capture.output(tools:::Rd2txt(help_file) ))","single_quotes_linter" -"inst/files/An_Introduction_to_packager.Rmd",101,70,"style","Do not place spaces before parentheses.","captured <- gsub('_\b', '', capture.output(tools:::Rd2txt(help_file) ))","spaces_inside_linter" -"inst/files/An_Introduction_to_packager.Rmd",143,39,"style","Trailing whitespace is superfluous.","suppressMessages(withr::with_dir(path, ","trailing_whitespace_linter" -"inst/files/An_Introduction_to_packager.Rmd",144,68,"style","Trailing whitespace is superfluous."," print(fakemake::make(""build"", ml, ","trailing_whitespace_linter" -"inst/files/An_Introduction_to_packager.Rmd",171,39,"style","Trailing whitespace is superfluous.","suppressMessages(withr::with_dir(path, ","trailing_whitespace_linter" -"inst/files/An_Introduction_to_packager.Rmd",172,67,"style","Trailing whitespace is superfluous."," print(fakemake::make(""check"", ml, ","trailing_whitespace_linter" -"inst/files/An_Introduction_to_packager.Rmd",199,81,"style","Lines should not be more than 80 characters.","system.time(withr::with_dir(path, print(fakemake::make(""check"", ml, verbose = FALSE))))","line_length_linter" -"inst/files/An_Introduction_to_packager.Rmd",210,81,"style","Lines should not be more than 80 characters.","withr::with_dir(path, print(fakemake::make(""cran_comments"", ml, verbose = FALSE)))","line_length_linter" -"inst/files/An_Introduction_to_packager.Rmd",223,56,"style","Trailing whitespace is superfluous.","packager::git_add_commit(path = path, untracked = TRUE, ","trailing_whitespace_linter" -"inst/files/An_Introduction_to_packager.Rmd",246,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" -"inst/runit_tests/test_internal.R",51,23,"style","Any function spanning multiple lines should use curly braces.","test_warn_and_stop <- function()","brace_linter" -"inst/templates/README.Rmd",37,20,"style","Only use double-quotes."," captured <- gsub('_\b', '', capture.output(tools:::Rd2txt(help_file) ))","single_quotes_linter" -"inst/templates/README.Rmd",37,27,"style","Only use double-quotes."," captured <- gsub('_\b', '', capture.output(tools:::Rd2txt(help_file) ))","single_quotes_linter" -"inst/templates/README.Rmd",37,72,"style","Do not place spaces before parentheses."," captured <- gsub('_\b', '', capture.output(tools:::Rd2txt(help_file) ))","spaces_inside_linter" -"R/convert_vignette.R",76,24,"style","Any function spanning multiple lines should use curly braces.","convert_code_blocks <- function(lines)","brace_linter" -"R/devtools.R",478,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/devtools.R",532,7,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/devtools.R",536,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/git.R",55,20,"style","Any function spanning multiple lines should use curly braces."," function(x)","brace_linter" -"R/internal.R",110,16,"style","Variable and function name style should be snake_case or symbols."," substr(Rdep, start, stop) <- paste(numeric_version, collapse = ""."")","object_name_linter" -"R/remotes_modified.R",8,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/upload_cran.R",24,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/usethis.R",92,5,"style","`else` should come on the same line as the previous `}`."," else if (delta == 0 && !is.null(min_version)) {","brace_linter" -"R/usethis.R",101,5,"style","`else` should come on the same line as the previous `}`."," else if (delta > 0) {","brace_linter" diff --git a/.dev/revdep_emails/packager/attachments/packager.warnings b/.dev/revdep_emails/packager/attachments/packager.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/packager/attachments/packager.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/packager/email-body b/.dev/revdep_emails/packager/email-body deleted file mode 100644 index 85ffad84e..000000000 --- a/.dev/revdep_emails/packager/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Andreas Dominik Cullmann! Thank you for using {lintr} in your package {packager}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://gitlab.com/fvafrCU/packager using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 40s on CRAN vs. 23s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/physiology/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/physiology/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index e58e63851..000000000 --- a/.dev/revdep_emails/physiology/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,58 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/JOSS/paper.Rmd",14,33,"style","Trailing whitespace is superfluous.","egfr(creatinine_mgdl_to_uM(1.4), ","trailing_whitespace_linter" -"inst/JOSS/paper.Rmd",17,19,"style","Trailing whitespace is superfluous."," male = FALSE, ","trailing_whitespace_linter" -"inst/JOSS/paper.Rmd",25,54,"style","Trailing whitespace is superfluous."," #Height = c(seq.default(1.2, 1.8, by = 0.2)), ","trailing_whitespace_linter" -"inst/JOSS/paper.Rmd",33,57,"style","Trailing whitespace is superfluous."," height_m = as.integer(x[""Height""]), ","trailing_whitespace_linter" -"inst/JOSS/paper.Rmd",35,49,"style","Trailing whitespace is superfluous."," male = x[""Male""] == ""Male"", ","trailing_whitespace_linter" -"inst/JOSS/paper.Rmd",36,52,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," black = x[""Black""] == ""Black"")}","brace_linter" -"inst/JOSS/paper.Rmd",40,38,"style","Trailing whitespace is superfluous.","ggplot(plt, aes(x = Age, y = eGFR)) + ","trailing_whitespace_linter" -"inst/JOSS/paper.Rmd",41,21,"style","Trailing whitespace is superfluous."," geom_col() + ","trailing_whitespace_linter" -"R/bmi.R",30,23,"style","Any function spanning multiple lines should use curly braces.","ideal_weight_adult <- function(height_m, male, ...)","brace_linter" -"R/bmi.R",35,23,"style","Any function spanning multiple lines should use curly braces.","ideal_weight_child <- function(height_m, age_y = NULL, ...)","brace_linter" -"R/bmi.R",79,24,"style","Any function spanning multiple lines should use curly braces.","ideal_weight_Devine <- function(height_m, male, ...)","brace_linter" -"R/bmi.R",89,26,"style","Any function spanning multiple lines should use curly braces.","ideal_weight_Robinson <- function(height_m, male, ...)","brace_linter" -"R/bmi.R",99,24,"style","Any function spanning multiple lines should use curly braces.","ideal_weight_Miller <- function(height_m, male, ...)","brace_linter" -"R/bmi.R",108,23,"style","Any function spanning multiple lines should use curly braces.","ideal_weight_Broca <- function(height_m, male, ...)","brace_linter" -"R/deadspace.R",87,31,"style","Any function spanning multiple lines should use curly braces.","deadspace_intrathoracic_ml <- function(ideal_weight_kg)","brace_linter" -"R/eGFR.R",208,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (any(ret > 60) & warn_ckdepi_preferred)","vector_logic_linter" -"R/eGFR.R",248,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (any(ret < 60) & warn_mdrd_preferred) {","vector_logic_linter" -"R/physics.R",5,16,"style","Any function spanning multiple lines should use curly braces.","temp_c_to_k <- function(temp_c)","brace_linter" -"R/physics.R",12,18,"style","Any function spanning multiple lines should use curly braces.","svp_sea_level <- function(temp_k)","brace_linter" -"R/valid.R",86,20,"style","Any function spanning multiple lines should use curly braces.","valid_age_adult <- function(age_y, age_min = 18, age_max = 150,","brace_linter" -"R/valid.R",106,42,"style","Put spaces around all infix operators."," scr_min_hard=0, scr_max_hard = 4000,","infix_spaces_linter" -"tests/testthat/test-bmi.R",25,54,"style","Use FALSE instead of the symbol F."," expect_equal(ideal_weight_adult(60 / inch, male = F), 45.5)","T_and_F_symbol_linter" -"tests/testthat/test-bmi.R",207,42,"style","Use TRUE instead of the symbol T."," expect_error(do.call(f, list(male = T)), info = f)","T_and_F_symbol_linter" -"tests/testthat/test-bmi.R",213,64,"style","Use TRUE instead of the symbol T."," expect_error(do.call(f, list(height_m = c(1.5, 2), male = T)), info = f)","T_and_F_symbol_linter" -"tests/testthat/test-bmi.R",214,58,"style","Use TRUE instead of the symbol T."," expect_error(do.call(f, list(height_m = 2, male = c(T, F))), info = f)","T_and_F_symbol_linter" -"tests/testthat/test-bmi.R",214,61,"style","Use FALSE instead of the symbol F."," expect_error(do.call(f, list(height_m = 2, male = c(T, F))), info = f)","T_and_F_symbol_linter" -"tests/testthat/test-bmi.R",216,61,"style","Use TRUE instead of the symbol T."," expect_error(do.call(f, list(height_m = NULL, male = c(T, F))), info = f)","T_and_F_symbol_linter" -"tests/testthat/test-bmi.R",216,64,"style","Use FALSE instead of the symbol F."," expect_error(do.call(f, list(height_m = NULL, male = c(T, F))), info = f)","T_and_F_symbol_linter" -"tests/testthat/test-bmi.R",217,65,"style","Use TRUE instead of the symbol T."," expect_error(do.call(f, list(height_m = c(1.5, NA), male = T)), info = f)","T_and_F_symbol_linter" -"tests/testthat/test-bmi.R",218,62,"style","Use TRUE instead of the symbol T."," expect_error(do.call(f, list(height_m = 2, male = c(NA, T))), info = f)","T_and_F_symbol_linter" -"tests/testthat/test-bmi.R",219,59,"style","Use FALSE instead of the symbol F."," expect_error(do.call(f, list(height_m = NULL, male = F)), info = f)","T_and_F_symbol_linter" -"tests/testthat/test-bmi.R",226,46,"style","Use TRUE instead of the symbol T."," do.call(f, list(height_m = -1, male = T, do.stop = TRUE)), info = f)","T_and_F_symbol_linter" -"tests/testthat/test-bmi.R",228,46,"style","Use TRUE instead of the symbol T."," do.call(f, list(height_m = 0, male = T, do.stop = TRUE)), info = f)","T_and_F_symbol_linter" -"tests/testthat/test-bmi.R",236,45,"style","Use TRUE instead of the symbol T."," do.call(f, list(height_m = 8, male = T, do.stop = TRUE)), info = f)","T_and_F_symbol_linter" -"vignettes/Everest.Rmd",37,8,"style","Use <-, not =, for assignment.","temp_k = temp_c_to_k(37)","assignment_linter" -"vignettes/Everest.Rmd",45,18,"style","Use <-, not =, for assignment.","pres_atm_everest = 760 * pres_atm_frac(8850)","assignment_linter" -"vignettes/Everest.Rmd",51,19,"style","Trailing whitespace is superfluous."," PACO2_mmHg = 40, ","trailing_whitespace_linter" -"vignettes/Everest.Rmd",63,35,"style","Trailing whitespace is superfluous."," PACO2_mmHg = PACO2_mmHg_Grocott, ","trailing_whitespace_linter" -"vignettes/Everest.Rmd",76,35,"style","Trailing whitespace is superfluous."," PACO2_mmHg = PACO2_mmHg_Grocott, ","trailing_whitespace_linter" -"vignettes/Everest.Rmd",81,35,"style","Trailing whitespace is superfluous."," PACO2_mmHg = PACO2_mmHg_Grocott, ","trailing_whitespace_linter" -"vignettes/Everest.Rmd",92,43,"style","Trailing whitespace is superfluous.","results <- c(""sea\nlevel"" = PAO2_sealevel, ","trailing_whitespace_linter" -"vignettes/Everest.Rmd",93,54,"style","Trailing whitespace is superfluous."," ""summit\nresting"" = PAO2_summit_resting, ","trailing_whitespace_linter" -"vignettes/Everest.Rmd",94,55,"style","Trailing whitespace is superfluous."," ""summit\nexertion"" = PAO2_summit_exerted, ","trailing_whitespace_linter" -"vignettes/Everest.Rmd",95,56,"style","Trailing whitespace is superfluous."," ""summit\nfatty diet"" = PAO2_summit_lipids, ","trailing_whitespace_linter" -"vignettes/Everest.Rmd",98,17,"style","Trailing whitespace is superfluous.","barplot(results, ","trailing_whitespace_linter" -"vignettes/IdealWeightComparison.Rmd",19,14,"style","Use TRUE instead of the symbol T.","male <- rep(T, times = length(hts))","T_and_F_symbol_linter" -"vignettes/NeonatalVentilation.Rmd",36,23,"style","Trailing whitespace is superfluous."," childsds::who.ref, ","trailing_whitespace_linter" -"vignettes/NeonatalVentilation.Rmd",39,18,"style","Trailing whitespace is superfluous."," stack = TRUE, ","trailing_whitespace_linter" -"vignettes/NeonatalVentilation.Rmd",42,36,"style","Trailing whitespace is superfluous."," dplyr::rename(weight = value) %>% ","trailing_whitespace_linter" -"vignettes/NeonatalVentilation.Rmd",50,40,"style","Trailing whitespace is superfluous."," mutate(tidal_volume = 7 * weight) %>% ","trailing_whitespace_linter" -"vignettes/NeonatalVentilation.Rmd",53,41,"style","Trailing whitespace is superfluous.","plot(dat[c(""weight"", ""error_fraction"")], ","trailing_whitespace_linter" -"vignettes/NeonatalVentilation.Rmd",64,26,"style","Trailing whitespace is superfluous.","cleft_repair_deadspace <- ","trailing_whitespace_linter" -"vignettes/NeonatalVentilation.Rmd",66,40,"style","Trailing whitespace is superfluous."," elbow = FALSE, ","trailing_whitespace_linter" -"vignettes/NeonatalVentilation.Rmd",68,27,"style","Trailing whitespace is superfluous.","cleft_repair_deadspace2 <- ","trailing_whitespace_linter" -"vignettes/NeonatalVentilation.Rmd",70,40,"style","Trailing whitespace is superfluous."," elbow = FALSE, ","trailing_whitespace_linter" -"vignettes/NeonatalVentilation.Rmd",80,37,"style","Trailing whitespace is superfluous.","plot(dat$months, dat$equip_err_frac, ","trailing_whitespace_linter" -"vignettes/NeonatalVentilation.Rmd",93,27,"style","Put spaces around all infix operators.","axis(1, at = seq(0, 12, 12/6), labels = wts, line = 2)","infix_spaces_linter" diff --git a/.dev/revdep_emails/physiology/attachments/physiology.warnings b/.dev/revdep_emails/physiology/attachments/physiology.warnings deleted file mode 100644 index 182961f94..000000000 --- a/.dev/revdep_emails/physiology/attachments/physiology.warnings +++ /dev/null @@ -1,2 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Trying to remove β€˜camel_case_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/physiology/email-body b/.dev/revdep_emails/physiology/email-body deleted file mode 100644 index 3b5c043f3..000000000 --- a/.dev/revdep_emails/physiology/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Jack O. Wasey! Thank you for using {lintr} in your package {physiology}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/jackwasey/physiology using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 19s on CRAN vs. 12s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/precommit/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/precommit/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 858073cfe..000000000 --- a/.dev/revdep_emails/precommit/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,8 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/hooks/exported/style-files.R",77,3,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" -"R/exec.R",207,5,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" -"R/release.R",46,3,"warning","local variable β€˜last_release’ assigned but may not be used"," last_release <- call_and_capture(""git"", ""tag -l --sort=-taggerdate"")$stdout[1]","object_usage_linter" -"R/release.R",49,3,"warning","local variable β€˜msg1’ assigned but may not be used"," msg1 <- glue::glue(""Release {new_version}, see NEWS.md for details."")","object_usage_linter" -"R/setup.R",193,7,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" -"R/zzz.R",1,1,"style","Variable and function name style should be snake_case.",".onLoad <- function(libname, pkgname) {","object_name_linter" -"tests/testthat/test-conda.R",157,7,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" diff --git a/.dev/revdep_emails/precommit/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/precommit/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index f79a2fb4a..000000000 --- a/.dev/revdep_emails/precommit/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,17 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/hooks/exported/deps-in-desc.R",9,3,"style","Use <-, not ->, for assignment.",""" -> doc","assignment_linter" -"inst/hooks/exported/lintr.R",11,3,"style","Use <-, not ->, for assignment.",""" -> doc","assignment_linter" -"inst/hooks/exported/readme-rmd-rendered.R",2,31,"warning","Conditional expressions require scalar logical operators (&& and ||)","if (file.exists(""README.Rmd"") & file.exists(""README.md"")) {","vector_logic_linter" -"inst/hooks/exported/roxygenize.R",22,3,"style","Use <-, not ->, for assignment.",""" -> doc","assignment_linter" -"inst/hooks/exported/spell-check.R",10,3,"style","Use <-, not ->, for assignment.",""" -> doc","assignment_linter" -"inst/hooks/exported/style-files.R",13,3,"style","Use <-, not ->, for assignment.","' -> doc","assignment_linter" -"inst/hooks/local/consistent-release-tag.R",8,3,"style","Use <-, not ->, for assignment.",""" -> doc","assignment_linter" -"R/call.R",13,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(command) != 1 | !inherits(command, ""character"")) {","vector_logic_linter" -"R/config.R",43,49,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!file_exists(fs::path(root, name_target)) | force) {","vector_logic_linter" -"R/install.R",3,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is_installed() | force) {","vector_logic_linter" -"tests/testthat/in/parsable-R-fail.Rmd",7,3,"error","unexpected numeric constant","1 1j1j ΓΆj1 ",NA -"tests/testthat/in/parsable-R-fail.Rmd",7,11,"style","Trailing whitespace is superfluous.","1 1j1j ΓΆj1 ","trailing_whitespace_linter" -"tests/testthat/in/parsable-R-success.Rmd",16,11,"error","unexpected numeric constant"," fas / fk 12 -",NA -"tests/testthat/in/parsable-R-success.Rmd",21,8,"style","Trailing whitespace is superfluous.","this is ","trailing_whitespace_linter" -"tests/testthat/in/parsable-R-success.Rmd",25,8,"style","Trailing whitespace is superfluous.","this is ","trailing_whitespace_linter" -"tests/testthat/in/parsable-R-success.Rmd",29,8,"style","Trailing whitespace is superfluous.","this is ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/precommit/email-body b/.dev/revdep_emails/precommit/email-body deleted file mode 100644 index 2adbbf09d..000000000 --- a/.dev/revdep_emails/precommit/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Lorenz Walthert! Thank you for using {lintr} in your package {precommit}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/lorenzwalthert/precommit using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 30s on CRAN vs. 17s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/prettyB/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/prettyB/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 7bb0db986..000000000 --- a/.dev/revdep_emails/prettyB/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,23 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/barplot.R",33,23,"style","Compound semicolons are discouraged. Replace them by a newline."," args$height = height; args$width = width; args$space = space","semicolon_linter" -"R/barplot.R",33,43,"style","Compound semicolons are discouraged. Replace them by a newline."," args$height = height; args$width = width; args$space = space","semicolon_linter" -"R/barplot.R",34,29,"style","Compound semicolons are discouraged. Replace them by a newline."," args$names.arg = names.arg; args$legend.text = legend.text","semicolon_linter" -"R/barplot.R",35,23,"style","Compound semicolons are discouraged. Replace them by a newline."," args$beside = beside; args$horiz = horiz","semicolon_linter" -"R/barplot.R",36,25,"style","Compound semicolons are discouraged. Replace them by a newline."," args$density = density; args$angle = angle","semicolon_linter" -"R/barplot.R",41,17,"style","Compound semicolons are discouraged. Replace them by a newline."," args$xpd = xpd; args$log = log","semicolon_linter" -"R/barplot.R",42,29,"style","Compound semicolons are discouraged. Replace them by a newline."," args$axisnames = axisnames; args$cex.axis = cex.axis","semicolon_linter" -"R/boxplot.R",44,13,"style","Compound semicolons are discouraged. Replace them by a newline."," args$x = x; args$range = range; args$width = width","semicolon_linter" -"R/boxplot.R",44,33,"style","Compound semicolons are discouraged. Replace them by a newline."," args$x = x; args$range = range; args$width = width","semicolon_linter" -"R/boxplot.R",45,27,"style","Compound semicolons are discouraged. Replace them by a newline."," args$varwidth = varwidth; args$notch = notch; args$outline = outline","semicolon_linter" -"R/boxplot.R",45,47,"style","Compound semicolons are discouraged. Replace them by a newline."," args$varwidth = varwidth; args$notch = notch; args$outline = outline","semicolon_linter" -"R/boxplot.R",47,19,"style","Compound semicolons are discouraged. Replace them by a newline."," args$plot = plot; args$border = border; args$log = log","semicolon_linter" -"R/boxplot.R",47,41,"style","Compound semicolons are discouraged. Replace them by a newline."," args$plot = plot; args$border = border; args$log = log","semicolon_linter" -"R/boxplot.R",48,19,"style","Compound semicolons are discouraged. Replace them by a newline."," args$pars = pars; args$horizontal = horizontal; args$add = add","semicolon_linter" -"R/boxplot.R",48,49,"style","Compound semicolons are discouraged. Replace them by a newline."," args$pars = pars; args$horizontal = horizontal; args$add = add","semicolon_linter" -"R/boxplot.R",52,19,"style","Compound semicolons are discouraged. Replace them by a newline."," main = args$main; sub = args$sub","semicolon_linter" -"R/boxplot.R",97,29,"style","Compound semicolons are discouraged. Replace them by a newline."," args$xlim = name_axis$lim; args$ylim = number_axis$lim","semicolon_linter" -"R/boxplot.R",98,32,"style","Compound semicolons are discouraged. Replace them by a newline."," ticks_names = name_axis$ticks; ticks_numbers = number_axis$ticks","semicolon_linter" -"R/boxplot.R",114,19,"style","Compound semicolons are discouraged. Replace them by a newline."," args$yaxt = NULL; args$add = TRUE","semicolon_linter" -"vignettes/introduction.Rmd",10,52,"style","Do not place spaces before parentheses.","knitr::opts_chunk$set(results = ""hide"", echo = TRUE )","spaces_inside_linter" -"vignettes/introduction.Rmd",51,53,"style","Trailing whitespace is superfluous.","hist(y, main = ""Base Graphics"", sub = ""Sub heading"", ","trailing_whitespace_linter" -"vignettes/introduction.Rmd",121,41,"style","Trailing whitespace is superfluous.","boxplot_p(rnorm(100), horizontal = TRUE, ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/prettyB/attachments/prettyB.warnings b/.dev/revdep_emails/prettyB/attachments/prettyB.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/prettyB/attachments/prettyB.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/prettyB/email-body b/.dev/revdep_emails/prettyB/email-body deleted file mode 100644 index 3ba65ab71..000000000 --- a/.dev/revdep_emails/prettyB/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Colin Gillespie! Thank you for using {lintr} in your package {prettyB}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/jumpingrivers/prettyB using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 5s on CRAN vs. 2s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/rBiasCorrection/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/rBiasCorrection/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 165042a71..000000000 --- a/.dev/revdep_emails/rBiasCorrection/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,110 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"data-raw/devstuffs.R",11,79,"style","Only use double-quotes."," person(""Lorenz A."", ""Kapsner"", email = ""lorenz.kapsner@gmail.com"", role = c('cre', 'aut', 'cph'),","single_quotes_linter" -"data-raw/devstuffs.R",11,81,"style","Lines should not be more than 80 characters."," person(""Lorenz A."", ""Kapsner"", email = ""lorenz.kapsner@gmail.com"", role = c('cre', 'aut', 'cph'),","line_length_linter" -"data-raw/devstuffs.R",11,86,"style","Only use double-quotes."," person(""Lorenz A."", ""Kapsner"", email = ""lorenz.kapsner@gmail.com"", role = c('cre', 'aut', 'cph'),","single_quotes_linter" -"data-raw/devstuffs.R",11,93,"style","Only use double-quotes."," person(""Lorenz A."", ""Kapsner"", email = ""lorenz.kapsner@gmail.com"", role = c('cre', 'aut', 'cph'),","single_quotes_linter" -"data-raw/devstuffs.R",43,2,"style","Commented code should be removed.","#usethis::use_gpl3_license(name=""Lorenz Kapsner"")","commented_code_linter" -"data-raw/devstuffs.R",46,53,"style","Put spaces around all infix operators.","usethis::use_package(""R"", min_version = ""2.10"", type=""Depends"")","infix_spaces_linter" -"data-raw/devstuffs.R",49,81,"style","Lines should not be more than 80 characters.","# https://cran.r-project.org/web/packages/data.table/vignettes/datatable-importing.html","line_length_linter" -"data-raw/devstuffs.R",50,40,"style","Put spaces around all infix operators.","usethis::use_package(""data.table"", type=""Imports"")","infix_spaces_linter" -"data-raw/devstuffs.R",51,37,"style","Put spaces around all infix operators.","usethis::use_package(""ggplot2"", type=""Imports"")","infix_spaces_linter" -"data-raw/devstuffs.R",52,38,"style","Put spaces around all infix operators.","usethis::use_package(""magrittr"", type=""Imports"")","infix_spaces_linter" -"data-raw/devstuffs.R",53,37,"style","Put spaces around all infix operators.","usethis::use_package(""polynom"", type=""Imports"")","infix_spaces_linter" -"data-raw/devstuffs.R",54,34,"style","Put spaces around all infix operators.","usethis::use_package(""nls2"", type=""Imports"")","infix_spaces_linter" -"data-raw/devstuffs.R",55,35,"style","Put spaces around all infix operators.","usethis::use_package(""stats"", type=""Imports"")","infix_spaces_linter" -"data-raw/devstuffs.R",56,42,"style","Put spaces around all infix operators.","usethis::use_package(""future.apply"", type=""Imports"")","infix_spaces_linter" -"data-raw/devstuffs.R",66,36,"style","Put spaces around all infix operators.","usethis::use_package(""ggpubr"", type=""Suggests"")","infix_spaces_linter" -"data-raw/devstuffs.R",70,3,"style","Commented code should be removed.","# tag <- ""master""","commented_code_linter" -"data-raw/devstuffs.R",71,3,"style","Commented code should be removed.","# devtools::install_github(repo = ""r-lib/testthat"", ref = tag, upgrade = ""always"")","commented_code_linter" -"data-raw/devstuffs.R",71,81,"style","Lines should not be more than 80 characters.","# devtools::install_github(repo = ""r-lib/testthat"", ref = tag, upgrade = ""always"")","line_length_linter" -"data-raw/devstuffs.R",72,3,"style","Commented code should be removed.","# # https://cran.r-project.org/web/packages/devtools/vignettes/dependencies.html","commented_code_linter" -"data-raw/devstuffs.R",73,3,"style","Commented code should be removed.","# desc::desc_set_remotes(paste0(""github::r-lib/testthat@"", tag), file = usethis::proj_get())","commented_code_linter" -"data-raw/devstuffs.R",73,81,"style","Lines should not be more than 80 characters.","# desc::desc_set_remotes(paste0(""github::r-lib/testthat@"", tag), file = usethis::proj_get())","line_length_linter" -"data-raw/devstuffs.R",133,3,"style","Commented code should be removed.","# experimental = ""../19_PCR-bias/data/example_data/type1/example_data_type1_experimentaldata.csv""","commented_code_linter" -"data-raw/devstuffs.R",133,81,"style","Lines should not be more than 80 characters.","# experimental = ""../19_PCR-bias/data/example_data/type1/example_data_type1_experimentaldata.csv""","line_length_linter" -"data-raw/devstuffs.R",134,3,"style","Commented code should be removed.","# calibration = ""../19_PCR-bias/data/example_data/type1/example_data_type1_calibrationdata.csv""","commented_code_linter" -"data-raw/devstuffs.R",134,81,"style","Lines should not be more than 80 characters.","# calibration = ""../19_PCR-bias/data/example_data/type1/example_data_type1_calibrationdata.csv""","line_length_linter" -"data-raw/devstuffs.R",136,1,"style","Variable and function name style should be snake_case or symbols.","example.data_experimental <- data.table::fread(""./tests/testthat/testdata/exp_type_1.csv"")","object_name_linter" -"data-raw/devstuffs.R",136,81,"style","Lines should not be more than 80 characters.","example.data_experimental <- data.table::fread(""./tests/testthat/testdata/exp_type_1.csv"")","line_length_linter" -"data-raw/devstuffs.R",137,1,"style","Variable and function name style should be snake_case or symbols.","example.data_calibration <- data.table::fread(""./tests/testthat/testdata/cal_type_1.csv"")","object_name_linter" -"data-raw/devstuffs.R",137,81,"style","Lines should not be more than 80 characters.","example.data_calibration <- data.table::fread(""./tests/testthat/testdata/cal_type_1.csv"")","line_length_linter" -"data-raw/devstuffs.R",139,3,"style","Commented code should be removed.","# vec <- colnames(example.data_experimental)","commented_code_linter" -"data-raw/devstuffs.R",140,3,"style","Commented code should be removed.","# vec <- vec[2:length(vec)]","commented_code_linter" -"data-raw/devstuffs.R",142,5,"style","Commented code should be removed.","# as.numeric(gsub(""\\,"", ""."", x))","commented_code_linter" -"data-raw/devstuffs.R",145,3,"style","Commented code should be removed.","# data.table::fwrite(example.data_experimental, ""./tests/testthat/testdata/exp_type_1.csv"")","commented_code_linter" -"data-raw/devstuffs.R",145,81,"style","Lines should not be more than 80 characters.","# data.table::fwrite(example.data_experimental, ""./tests/testthat/testdata/exp_type_1.csv"")","line_length_linter" -"data-raw/devstuffs.R",147,3,"style","Commented code should be removed.","# vec <- colnames(example.data_calibration)","commented_code_linter" -"data-raw/devstuffs.R",149,5,"style","Commented code should be removed.","# as.numeric(gsub(""\\,"", ""."", x))","commented_code_linter" -"data-raw/devstuffs.R",152,3,"style","Commented code should be removed.","# data.table::fwrite(example.data_calibration, ""./tests/testthat/testdata/cal_type_1.csv"")","commented_code_linter" -"data-raw/devstuffs.R",152,81,"style","Lines should not be more than 80 characters.","# data.table::fwrite(example.data_calibration, ""./tests/testthat/testdata/cal_type_1.csv"")","line_length_linter" -"data-raw/devstuffs.R",154,1,"style","Variable and function name style should be snake_case or symbols.","example.data_experimental <- rBiasCorrection::clean_dt(example.data_experimental,","object_name_linter" -"data-raw/devstuffs.R",154,81,"style","Lines should not be more than 80 characters.","example.data_experimental <- rBiasCorrection::clean_dt(example.data_experimental,","line_length_linter" -"data-raw/devstuffs.R",158,1,"style","Variable and function name style should be snake_case or symbols.","example.data_calibration <- rBiasCorrection::clean_dt(example.data_calibration,","object_name_linter" -"data-raw/devstuffs.R",164,1,"style","Variable and function name style should be snake_case or symbols.","example._plot.df_agg <- rBiasCorrection:::create_agg_df(","object_name_linter" -"data-raw/devstuffs.R",171,31,"style","Use FALSE instead of the symbol F."," internal = F,","T_and_F_symbol_linter" -"data-raw/devstuffs.R",172,32,"style","Use FALSE instead of the symbol F."," overwrite = F)","T_and_F_symbol_linter" -"data-raw/devstuffs.R",175,3,"style","Commented code should be removed.","# BiasCorrection(experimental = ""../19_PCR-bias/data/example_data/type1/example_data_type1_experimentaldata.csv"", calibration = ""../19_PCR-bias/data/example_data/type1/example_data_type1_calibrationdata.csv"", samplelocusname = ""Test"")","commented_code_linter" -"data-raw/devstuffs.R",175,81,"style","Lines should not be more than 80 characters.","# BiasCorrection(experimental = ""../19_PCR-bias/data/example_data/type1/example_data_type1_experimentaldata.csv"", calibration = ""../19_PCR-bias/data/example_data/type1/example_data_type1_calibrationdata.csv"", samplelocusname = ""Test"")","line_length_linter" -"data-raw/devstuffs.R",176,2,"style","Commented code should be removed.","#covr::package_coverage()","commented_code_linter" -"data-raw/devstuffs.R",177,2,"style","Commented code should be removed.","#lintr::lint_package()","commented_code_linter" -"data-raw/devstuffs.R",178,2,"style","Commented code should be removed.","#styler::style_pkg()","commented_code_linter" -"R/better_model.R",106,55,"style","Use FALSE instead of the symbol F."," ""SSE_cubic""), with = F]","T_and_F_symbol_linter" -"R/better_model.R",113,80,"style","Use FALSE instead of the symbol F."," x_dat <- statstable_post_hyperbolic[, c(""Name"", ""relative_error""), with = F]","T_and_F_symbol_linter" -"R/better_model.R",115,75,"style","Use FALSE instead of the symbol F."," y_dat <- statstable_post_cubic[, c(""Name"", ""relative_error""), with = F]","T_and_F_symbol_linter" -"R/better_model.R",119,28,"style","Use TRUE instead of the symbol T."," all = T,","T_and_F_symbol_linter" -"R/biascorrection.R",178,49,"style","Use TRUE instead of the symbol T."," data.table::fread(experimental, header = T),","T_and_F_symbol_linter" -"R/biascorrection.R",188,69,"style","Use TRUE instead of the symbol T."," cal_type_1 <- clean_dt(data.table::fread(calibration, header = T),","T_and_F_symbol_linter" -"R/biascorrection.R",278,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" -"R/biascorrection.R",376,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" -"R/biascorrection.R",485,60,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" -"R/biascorrection.R",490,60,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" -"R/clean_dt.R",125,36,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (description == ""calibration"" & type == ""1"") {","vector_logic_linter" -"R/clean_dt.R",153,60,"style","Use TRUE instead of the symbol T."," datatable <- datatable[rowSums(datatable[, -1], na.rm = T) != 0, ]","T_and_F_symbol_linter" -"R/clean_dt.R",161,34,"style","Use FALSE instead of the symbol F."," datatable[, vec_cal, with = F], na.rm = T","T_and_F_symbol_linter" -"R/clean_dt.R",161,46,"style","Use TRUE instead of the symbol T."," datatable[, vec_cal, with = F], na.rm = T","T_and_F_symbol_linter" -"R/clean_dt.R",173,43,"style","Use FALSE instead of the symbol F."," !is.na(datatable[, vec[-1], with = F])","T_and_F_symbol_linter" -"R/clean_dt.R",193,68,"style","Use TRUE instead of the symbol T."," datatable <- datatable[order(get(""CpG_count""), decreasing = T)]","T_and_F_symbol_linter" -"R/create_agg_df.R",20,59,"style","Use FALSE instead of the symbol F."," df <- datatable[, c(""true_methylation"", index), with = F]","T_and_F_symbol_linter" -"R/create_agg_df.R",32,41,"style","Use TRUE instead of the symbol T."," ""CpG"" = mean(get(""CpG""), na.rm = T),","T_and_F_symbol_linter" -"R/create_agg_df.R",33,45,"style","Use TRUE instead of the symbol T."," ""sd"" = stats::sd(get(""CpG""), na.rm = T)","T_and_F_symbol_linter" -"R/create_agg_df.R",50,54,"style","Use FALSE instead of the symbol F."," df <- datatable[, c(""sample_id"", index), with = F]","T_and_F_symbol_linter" -"R/create_agg_df.R",56,43,"style","Use TRUE instead of the symbol T."," ""CpG"" = mean(get(""CpG""), na.rm = T),","T_and_F_symbol_linter" -"R/create_agg_df.R",57,47,"style","Use TRUE instead of the symbol T."," ""sd"" = stats::sd(get(""CpG""), na.rm = T)","T_and_F_symbol_linter" -"R/create_agg_df.R",62,53,"style","Use FALSE instead of the symbol F."," df <- datatable[, c(""locus_id"", index), with = F]","T_and_F_symbol_linter" -"R/create_agg_df.R",67,43,"style","Use TRUE instead of the symbol T."," ""CpG"" = mean(get(""CpG""), na.rm = T),","T_and_F_symbol_linter" -"R/create_agg_df.R",68,47,"style","Use TRUE instead of the symbol T."," ""sd"" = stats::sd(get(""CpG""), na.rm = T)","T_and_F_symbol_linter" -"R/create_exampleplot.R",90,16,"style","Use FALSE instead of the symbol F."," parse = F","T_and_F_symbol_linter" -"R/createbarerrorplots.R",155,70,"style","Use FALSE instead of the symbol F."," stats_pre <- statstable_pre[, c(""Name"", ""relative_error""), with = F]","T_and_F_symbol_linter" -"R/createbarerrorplots.R",156,72,"style","Use FALSE instead of the symbol F."," stats_post <- statstable_post[, c(""Name"", ""relative_error""), with = F]","T_and_F_symbol_linter" -"R/createbarerrorplots.R",170,13,"style","Use FALSE instead of the symbol F."," sort = F,","T_and_F_symbol_linter" -"R/cubic.R",129,7,"warning","local variable β€˜ret’ assigned but may not be used"," ret <- nls2::nls2(CpG ~ cubic_eq_minmax(","object_usage_linter" -"R/cubic.R",171,62,"style","Use TRUE instead of the symbol T."," sse <- as.numeric(dat[, sum(get(""squared_error""), na.rm = T)])","T_and_F_symbol_linter" -"R/cubic.R",177,66,"style","Use TRUE instead of the symbol T."," tss <- as.numeric(dat[, sum(get(""squared_dist_mean""), na.rm = T)])","T_and_F_symbol_linter" -"R/hyperbolic.R",118,7,"warning","local variable β€˜ret’ assigned but may not be used"," ret <- nls2::nls2(CpG ~ hyperbolic_eq(","object_usage_linter" -"R/hyperbolic.R",231,7,"warning","local variable β€˜ret’ assigned but may not be used"," ret <- nls2::nls2(CpG ~ hyperbolic_eq_minmax(","object_usage_linter" -"R/hyperbolic.R",271,62,"style","Use TRUE instead of the symbol T."," sse <- as.numeric(dat[, sum(get(""squared_error""), na.rm = T)])","T_and_F_symbol_linter" -"R/hyperbolic.R",277,66,"style","Use TRUE instead of the symbol T."," tss <- as.numeric(dat[, sum(get(""squared_dist_mean""), na.rm = T)])","T_and_F_symbol_linter" -"R/hyperbolic.R",282,60,"style","Use TRUE instead of the symbol T."," , mean(get(""relative_error""), na.rm = T)],","T_and_F_symbol_linter" -"R/solving_equations.R",208,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (find_x[[k]] >= 0 & find_x[[k]] <= 100) {","vector_logic_linter" -"R/solving_equations.R",377,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (h_solv >= 0 & h_solv <= 100) {","vector_logic_linter" -"R/solving_equations.R",392,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (h_solv < 0 & h_solv > -10) {","vector_logic_linter" -"R/solving_equations.R",402,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (h_solv > 100 & h_solv < 110) {","vector_logic_linter" -"R/utils.R",118,32,"style","Use TRUE instead of the symbol T."," unlink(plotdir, recursive = T)","T_and_F_symbol_linter" -"R/utils.R",120,31,"style","Use TRUE instead of the symbol T."," unlink(csvdir, recursive = T)","T_and_F_symbol_linter" -"R/utils.R",149,52,"style","Use TRUE instead of the symbol T."," write(message_out, file = logfilename, append = T)","T_and_F_symbol_linter" -"R/utils.R",178,42,"style","Use FALSE instead of the symbol F."," row.names = F,","T_and_F_symbol_linter" -"tests/testthat/test-algorithm_minmax_FALSE_re.R",71,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" -"tests/testthat/test-algorithm_minmax_FALSE_re.R",106,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" -"tests/testthat/test-algorithm_minmax_FALSE.R",194,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" -"tests/testthat/test-algorithm_minmax_FALSE.R",276,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" -"tests/testthat/test-algorithm_minmax_TRUE_re.R",71,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" -"tests/testthat/test-algorithm_minmax_TRUE_re.R",106,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" -"tests/testthat/test-algorithm_minmax_TRUE.R",188,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" -"tests/testthat/test-algorithm_minmax_TRUE.R",265,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" -"tests/testthat/test-clean_dt.R",27,74,"style","Use TRUE instead of the symbol T."," exp_type_1 <- fread(""./testdata/exp_type_1_empty_col.csv"", header = T)","T_and_F_symbol_linter" -"tests/testthat/test-clean_dt.R",75,74,"style","Use TRUE instead of the symbol T."," exp_type_2 <- fread(""./testdata/exp_type_2_empty_col.csv"", header = T)","T_and_F_symbol_linter" -"vignettes/rBiasCorrection_howto.Rmd",55,77,"style","Use FALSE instead of the symbol F.","temp_file <- rBiasCorrection::example.data_experimental$dat[, cols, with = F]","T_and_F_symbol_linter" -"vignettes/rBiasCorrection_howto.Rmd",58,76,"style","Use FALSE instead of the symbol F.","temp_file <- rBiasCorrection::example.data_calibration$dat[, cols, with = F]","T_and_F_symbol_linter" -"vignettes/rBiasCorrection_howto.Rmd",165,81,"style","Lines should not be more than 80 characters.","filename <- list.files(csvdir)[grepl(""regression_stats_[[:digit:]]"", list.files(csvdir))]","line_length_linter" -"vignettes/rBiasCorrection_howto.Rmd",167,25,"style","Commas should always have a space after.","knitr::kable(reg_stats[,1:9])","commas_linter" -"vignettes/rBiasCorrection_howto.Rmd",168,25,"style","Commas should always have a space after.","knitr::kable(reg_stats[,11:16])","commas_linter" diff --git a/.dev/revdep_emails/rBiasCorrection/attachments/rBiasCorrection.warnings b/.dev/revdep_emails/rBiasCorrection/attachments/rBiasCorrection.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/rBiasCorrection/attachments/rBiasCorrection.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/rBiasCorrection/email-body b/.dev/revdep_emails/rBiasCorrection/email-body deleted file mode 100644 index c79925732..000000000 --- a/.dev/revdep_emails/rBiasCorrection/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Lorenz A. Kapsner! Thank you for using {lintr} in your package {rBiasCorrection}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/kapsner/rBiasCorrection using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 28s on CRAN vs. 11s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/rasterpdf/email-body b/.dev/revdep_emails/rasterpdf/email-body deleted file mode 100644 index 707404889..000000000 --- a/.dev/revdep_emails/rasterpdf/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Ilari Scheinin! Thank you for using {lintr} in your package {rasterpdf}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/ilarischeinin/rasterpdf using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 4s on CRAN vs. 2s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/rbokeh/email-body b/.dev/revdep_emails/rbokeh/email-body deleted file mode 100644 index 39d92d48c..000000000 --- a/.dev/revdep_emails/rbokeh/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Ryan Hafen! Thank you for using {lintr} in your package {rbokeh}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/bokeh/rbokeh using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 0s on CRAN vs. 0s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/rde/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/rde/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 04fab8175..000000000 --- a/.dev/revdep_emails/rde/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,12 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/load.R",65,26,"style","Variable and function name style should be snake_case or symbols."," load.fcn,","object_name_linter" -"R/save.R",100,5,"style","`else` should come on the same line as the previous `}`."," else if (length(r1) == 0 && length(r2) == 0) {","brace_linter" -"R/save.R",106,5,"style","`else` should come on the same line as the previous `}`."," else if (length(r2) == 0) {","brace_linter" -"vignettes/rde_tutorial.Rmd",48,1,"style","Variable and function name style should be snake_case or symbols.","pop.data <- read.csv(fname, stringsAsFactors = FALSE)","object_name_linter" -"vignettes/rde_tutorial.Rmd",74,1,"style","Variable and function name style should be snake_case or symbols.","pop.data <- load_rde_var(","object_name_linter" -"vignettes/rde_tutorial.Rmd",109,1,"style","Variable and function name style should be snake_case or symbols.","pop.data <- load_rde_var(","object_name_linter" -"vignettes/rde_tutorial.Rmd",116,81,"style","Lines should not be more than 80 characters."," rde1QlpoOTFBWSZTWQy+/kYAAIB3/v//6EJABRg/WlQv797wYkAAAMQiABBAACAAAZGwANk0RTKejU9T","line_length_linter" -"vignettes/rde_tutorial.Rmd",117,81,"style","Lines should not be more than 80 characters."," RoBoGgGjTRoBoGgaGymE0Kp+qemmkDNQ0YmJk0AA0xNADQNPUaA0JRhDTJoANAAAAAAAAEJx2Eja7QBK","line_length_linter" -"vignettes/rde_tutorial.Rmd",118,81,"style","Lines should not be more than 80 characters."," MKPPkRAx63wSAWt31AABs1zauhwHifs5WlltyIyQKAAAZEAZGQYMIZEA6ZAPHVMEB71jSCqdlsiR/eSY","line_length_linter" -"vignettes/rde_tutorial.Rmd",119,81,"style","Lines should not be more than 80 characters."," kzQkRq5RoXgvNNZnB5RSOvKaTGFtc/SXc74AhzqhMEJvdisEGVfo7UYngc0AwGqTvTHx8CBZTzE9OQZZ","line_length_linter" -"vignettes/rde_tutorial.Rmd",120,81,"style","Lines should not be more than 80 characters."," VY8KAhHAhrG4RCeilM0rXKkdpjGqyNgJwAkmnPQOMYrLlQ4YTIv0WyxfYdkd9WSWUsvggC/i7kinChIB","line_length_linter" diff --git a/.dev/revdep_emails/rde/email-body b/.dev/revdep_emails/rde/email-body deleted file mode 100644 index 80a09e749..000000000 --- a/.dev/revdep_emails/rde/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Stefan Kloppenborg! Thank you for using {lintr} in your package {rde}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/kloppen/rde using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 5s on CRAN vs. 3s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/rnrfa/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/rnrfa/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 24aa9c6d7..000000000 --- a/.dev/revdep_emails/rnrfa/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,65 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/catalogue.R",84,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(column_name) & !is.null(column_value)) {","vector_logic_linter" -"R/catalogue.R",87,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(column_name) & is.null(column_value)) {","vector_logic_linter" -"R/catalogue.R",90,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(column_name) & !is.null(column_value)) {","vector_logic_linter" -"R/catalogue.R",99,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (condition_2 | condition_3 | condition_4) {","vector_logic_linter" -"R/catalogue.R",99,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (condition_2 | condition_3 | condition_4) {","vector_logic_linter" -"R/catalogue.R",101,11,"warning","local variable β€˜threshold’ assigned but may not be used"," threshold <- as.numeric(as.character(substr(column_value, 3,","object_usage_linter" -"R/catalogue.R",108,14,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/catalogue.R",118,12,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/catalogue.R",123,10,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/get_ts.R",71,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/get_ts.R",78,12,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/get_ts.R",79,77,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (type %in% c(""pot-stage"", ""pot-flow"", ""amax-stage"", ""amax-flow"") &","vector_logic_linter" -"R/get_ts.R",83,14,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/get_ts.R",89,10,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/get_ts.R",94,42,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (""SOCKcluster"" %in% class(cl) | ""cluster"" %in% class(cl)) {","vector_logic_linter" -"R/get_ts.R",103,14,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/get_ts.R",107,12,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/internals.R",90,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/internals.R",100,73,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (type %in% c(""pot-stage"", ""pot-flow"", ""amax-stage"", ""amax-flow"") &","vector_logic_linter" -"R/internals.R",143,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/osg_parse.R",67,26,"style","Put spaces around all infix operators."," padz <- function(x, n=max(nchar(x))) gsub("" "", ""0"", formatC(x, width = -n))","infix_spaces_linter" -"R/plot_rain_flow.R",44,55,"style","Use TRUE instead of the symbol T."," proportion <- ceiling((max(converted_flow, na.rm = T) -","T_and_F_symbol_linter" -"R/plot_rain_flow.R",45,57,"style","Use TRUE instead of the symbol T."," min(converted_flow, na.rm = T)) / 3)","T_and_F_symbol_linter" -"R/plot_rain_flow.R",54,35,"style","Use TRUE instead of the symbol T."," graphics::par(bty = ""n"", new = T)","T_and_F_symbol_linter" -"R/plot_rain_flow.R",57,49,"style","Use FALSE instead of the symbol F."," yaxt = ""n"", xaxt = ""n"", ann = F, # do not plot x and y axis","T_and_F_symbol_linter" -"R/plot_rain_flow.R",69,35,"style","Use FALSE instead of the symbol F."," graphics::par(bty = ""o"", new = F)","T_and_F_symbol_linter" -"R/seasonal_averages.R",28,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"tests/testthat.R",7,6,"style","There should be a space before an opening curly brace.","}else{","brace_linter" -"vignettes/rnrfa-vignette.Rmd",32,81,"style","Lines should not be more than 80 characters.","install.packages(c(""cowplot"", ""httr"", ""xts"", ""ggmap"", ""ggplot2"", ""sp"", ""rgdal"", ""parallel"", ""tibble""))","line_length_linter" -"vignettes/rnrfa-vignette.Rmd",70,1,"style","Variable and function name style should be snake_case or symbols.","allIDs <- station_ids()","object_name_linter" -"vignettes/rnrfa-vignette.Rmd",79,1,"style","Variable and function name style should be snake_case or symbols.","allStations <- catalogue()","object_name_linter" -"vignettes/rnrfa-vignette.Rmd",142,22,"style","Put spaces around all infix operators.","catalogue(column_name=""river"", column_value=""Wye"")","infix_spaces_linter" -"vignettes/rnrfa-vignette.Rmd",142,44,"style","Put spaces around all infix operators.","catalogue(column_name=""river"", column_value=""Wye"")","infix_spaces_linter" -"vignettes/rnrfa-vignette.Rmd",145,28,"style","Put spaces around all infix operators.","catalogue(bbox, column_name=""river"", column_value=""Wye"")","infix_spaces_linter" -"vignettes/rnrfa-vignette.Rmd",145,50,"style","Put spaces around all infix operators.","catalogue(bbox, column_name=""river"", column_value=""Wye"")","infix_spaces_linter" -"vignettes/rnrfa-vignette.Rmd",148,28,"style","Put spaces around all infix operators.","catalogue(bbox, column_name=""catchment-area"", column_value="">1"")","infix_spaces_linter" -"vignettes/rnrfa-vignette.Rmd",148,59,"style","Put spaces around all infix operators.","catalogue(bbox, column_name=""catchment-area"", column_value="">1"")","infix_spaces_linter" -"vignettes/rnrfa-vignette.Rmd",154,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/rnrfa-vignette.Rmd",156,22,"style","Put spaces around all infix operators.","catalogue(column_name=""id"", column_value=c(3001,3002,3003))","infix_spaces_linter" -"vignettes/rnrfa-vignette.Rmd",156,41,"style","Put spaces around all infix operators.","catalogue(column_name=""id"", column_value=c(3001,3002,3003))","infix_spaces_linter" -"vignettes/rnrfa-vignette.Rmd",156,49,"style","Commas should always have a space after.","catalogue(column_name=""id"", column_value=c(3001,3002,3003))","commas_linter" -"vignettes/rnrfa-vignette.Rmd",156,54,"style","Commas should always have a space after.","catalogue(column_name=""id"", column_value=c(3001,3002,3003))","commas_linter" -"vignettes/rnrfa-vignette.Rmd",161,1,"style","Variable and function name style should be snake_case or symbols.","someStations <- catalogue(bbox,","object_name_linter" -"vignettes/rnrfa-vignette.Rmd",163,50,"style","Commas should always have a space after."," column_value = c(54022,54090,54091,54092,54097),","commas_linter" -"vignettes/rnrfa-vignette.Rmd",163,56,"style","Commas should always have a space after."," column_value = c(54022,54090,54091,54092,54097),","commas_linter" -"vignettes/rnrfa-vignette.Rmd",163,62,"style","Commas should always have a space after."," column_value = c(54022,54090,54091,54092,54097),","commas_linter" -"vignettes/rnrfa-vignette.Rmd",163,68,"style","Commas should always have a space after."," column_value = c(54022,54090,54091,54092,54097),","commas_linter" -"vignettes/rnrfa-vignette.Rmd",214,21,"style","Put spaces around all infix operators.","plot(info$data, main=paste(""Monthly rainfall data for the"",","infix_spaces_linter" -"vignettes/rnrfa-vignette.Rmd",215,50,"style","Commas should always have a space after."," info$meta$stationName,""catchment""), ","commas_linter" -"vignettes/rnrfa-vignette.Rmd",215,63,"style","Trailing whitespace is superfluous."," info$meta$stationName,""catchment""), ","trailing_whitespace_linter" -"vignettes/rnrfa-vignette.Rmd",216,10,"style","Put spaces around all infix operators."," xlab="""", ylab=info$meta$units)","infix_spaces_linter" -"vignettes/rnrfa-vignette.Rmd",216,19,"style","Put spaces around all infix operators."," xlab="""", ylab=info$meta$units)","infix_spaces_linter" -"vignettes/rnrfa-vignette.Rmd",228,21,"style","Put spaces around all infix operators.","plot(info$data, main=paste0(""Daily flow data for the "",","infix_spaces_linter" -"vignettes/rnrfa-vignette.Rmd",239,17,"style","Commas should always have a space after.","s <- cmr(c(3002,3003), metadata = TRUE)","commas_linter" -"vignettes/rnrfa-vignette.Rmd",242,18,"style","Trailing whitespace is superfluous.","plot(s[[1]]$data, ","trailing_whitespace_linter" -"vignettes/rnrfa-vignette.Rmd",244,23,"style","Put spaces around all infix operators.","lines(s[[2]]$data, col=""green"")","infix_spaces_linter" -"vignettes/rnrfa-vignette.Rmd",261,45,"style","`%>%` should always have a space before it and a new line after it, unless the full pipeline fits on one line.","leaflet(data = someStations) %>% addTiles() %>%","pipe_continuation_linter" -"vignettes/rnrfa-vignette.Rmd",262,68,"style","Commas should always have a space after."," addMarkers(~longitude, ~latitude, popup = ~as.character(paste(id,name)))","commas_linter" -"vignettes/rnrfa-vignette.Rmd",279,1,"style","Variable and function name style should be snake_case or symbols.","someStations <- catalogue(bbox)","object_name_linter" -"vignettes/rnrfa-vignette.Rmd",294,1,"style","Variable and function name style should be snake_case or symbols.","someStations$meangdf <- unlist(lapply(s2, mean))","object_name_linter" -"vignettes/rnrfa-vignette.Rmd",301,49,"style","Commas should always have a space after."," xlab(expression(paste(""Catchment area [Km^2]"",sep=""""))) +","commas_linter" -"vignettes/rnrfa-vignette.Rmd",301,52,"style","Put spaces around all infix operators."," xlab(expression(paste(""Catchment area [Km^2]"",sep=""""))) +","infix_spaces_linter" -"vignettes/rnrfa-vignette.Rmd",302,45,"style","Commas should always have a space after."," ylab(expression(paste(""Mean flow [m^3/s]"",sep="""")))","commas_linter" -"vignettes/rnrfa-vignette.Rmd",302,48,"style","Put spaces around all infix operators."," ylab(expression(paste(""Mean flow [m^3/s]"",sep="""")))","infix_spaces_linter" diff --git a/.dev/revdep_emails/rnrfa/email-body b/.dev/revdep_emails/rnrfa/email-body deleted file mode 100644 index 52b521078..000000000 --- a/.dev/revdep_emails/rnrfa/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Claudia Vitolo! Thank you for using {lintr} in your package {rnrfa}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cvitolo/rnrfa using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 11s on CRAN vs. 8s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/roadoi/email-body b/.dev/revdep_emails/roadoi/email-body deleted file mode 100644 index 6f8f47956..000000000 --- a/.dev/revdep_emails/roadoi/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Najko Jahn! Thank you for using {lintr} in your package {roadoi}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/ropensci/roadoi using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 3s on CRAN vs. 2s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/scriptexec/attachments/scriptexec.warnings b/.dev/revdep_emails/scriptexec/attachments/scriptexec.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/scriptexec/attachments/scriptexec.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/scriptexec/email-body b/.dev/revdep_emails/scriptexec/email-body deleted file mode 100644 index b12228021..000000000 --- a/.dev/revdep_emails/scriptexec/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Sagie Gur-Ari! Thank you for using {lintr} in your package {scriptexec}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/sagiegurari/scriptexec using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 7s on CRAN vs. 4s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/secuTrialR/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/secuTrialR/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 632ca0212..000000000 --- a/.dev/revdep_emails/secuTrialR/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,17 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/completeness.R",28,1,"style","Variable and function names should not be longer than 30 characters.","form_status_counts.secuTrialdata <- function(object, ...) {","object_length_linter" -"R/completeness.R",105,25,"style","Variable and function name style should be snake_case."," spread_summary0$""partly filled"" <- NA","object_name_linter" -"R/completeness.R",108,25,"style","Variable and function name style should be snake_case."," spread_summary0$""completely filled"" <- NA","object_name_linter" -"R/completeness.R",114,25,"style","Variable and function name style should be snake_case."," spread_summary1$""with errors"" <- NA","object_name_linter" -"R/completeness.R",120,25,"style","Variable and function name style should be snake_case."," spread_summary2$""with warnings"" <- NA","object_name_linter" -"R/completeness.R",170,1,"style","Variable and function names should not be longer than 30 characters.","form_status_summary.secuTrialdata <- function(object, ...) {","object_length_linter" -"R/factorize.R",28,1,"style","Variable and function names should not be longer than 30 characters.","factorize_secuTrial.secuTrialdata <- function(object, ...) {","object_length_linter" -"R/factorize.R",68,1,"style","Variable and function name style should be snake_case.","factorize_secuTrial.data.frame <- function(data, cl, form, items, short_names) {","object_name_linter" -"R/labels_secuTrial.R",151,1,"style","Variable and function name style should be snake_case.","label_secuTrial.data.frame <- function(data, it) {","object_name_linter" -"R/labels_secuTrial.R",181,1,"style","Variable and function name style should be snake_case.","""label<-"" <- function(x, value) {","object_name_linter" -"R/labels_secuTrial.R",190,1,"style","Variable and function name style should be snake_case.","""units<-"" <- function(x, value) {","object_name_linter" -"R/read_export_options.R",33,11,"style","Variable and function name style should be snake_case."," files$Name <- as.character(files$Name)","object_name_linter" -"R/visit_structure.R",64,39,"style","Place a space before left parenthesis, except in a function call."," z_input <- !is.na(as.matrix(ro[, -(1:2)]))","spaces_left_parentheses_linter" -"R/visit_structure.R",82,30,"style","Place a space before left parenthesis, except in a function call."," z <- !is.na(as.matrix(x[, -(1:2)]))","spaces_left_parentheses_linter" -"tests/testthat/test-visit_structure.R",73,23,"style","Place a space before left parenthesis, except in a function call."," cs <- colSums(vs[, -(1:2)], na.rm = TRUE)","spaces_left_parentheses_linter" -"tests/testthat/test-visit_structure.R",75,23,"style","Place a space before left parenthesis, except in a function call."," rs <- rowSums(vs[, -(1:2)], na.rm = TRUE)","spaces_left_parentheses_linter" diff --git a/.dev/revdep_emails/secuTrialR/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/secuTrialR/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 335a9f069..000000000 --- a/.dev/revdep_emails/secuTrialR/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,41 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/asdataframe.R",56,13,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!meta & is.null(data.frames)) {","vector_logic_linter" -"R/assess_form_variable_completeness.R",74,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (occ_in_vp > 1 & completeness == ""savedforms"") {","vector_logic_linter" -"R/assess_form_variable_completeness.R",84,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (any(""position"" %in% names(form)) & completeness == ""allforms"") {","vector_logic_linter" -"R/build_secuTrial_url.R",74,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (!is.na(projid) & (is.na(customer) | is.na(instance))) {","vector_logic_linter" -"R/build_secuTrial_url.R",74,48,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (!is.na(projid) & (is.na(customer) | is.na(instance))) {","vector_logic_linter" -"R/build_secuTrial_url.R",76,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (!is.na(customer) & is.na(instance)) {","vector_logic_linter" -"R/diff_secuTrial.R",34,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (class(x) == ""secuTrialdata"" & class(y) == ""secuTrialdata"") {","vector_logic_linter" -"R/diff_secuTrial.R",37,39,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (! x$export_options$proj_setup & y$export_options$proj_setup) {","vector_logic_linter" -"R/factorize.R",92,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (""mnpsubdocid"" %in% names(data) & short_names) {","vector_logic_linter" -"R/factorize.R",140,44,"warning","Conditional expressions require scalar logical operators (&& and ||)"," length(which(is.na(data[, name]))) &","vector_logic_linter" -"R/factorize.R",145,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," ! (grepl(""^mnpfs"", name) | grepl(""^at"", form))) {","vector_logic_linter" -"R/internals.R",15,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(language) & any(grep(""lang"", names(dict)))) {","vector_logic_linter" -"R/internals.R",77,3,"style","`else` should come on the same line as the previous `}`."," else if (new_col_idx == ncol(df)) {","brace_linter" -"R/internals.R",95,43,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (! (col_name_after %in% names(df)) & col_name_after != ""first"") {","vector_logic_linter" -"R/internals.R",246,12,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (warn & length(datevars) == 0) {","vector_logic_linter" -"R/internals.R",249,12,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (warn & length(meta_datevars) == 0) {","vector_logic_linter" -"R/internals.R",252,12,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (warn & length(timevars) == 0) {","vector_logic_linter" -"R/internals.R",255,12,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (warn & length(meta_timevars) == 0) {","vector_logic_linter" -"R/plot_recruitment.R",48,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (return_data & (! show_centres)) {","vector_logic_linter" -"R/read_export_options.R",147,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (rectangular_table & short_names) {","vector_logic_linter" -"R/read_export_table.R",82,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (curr_encoding == ""ISO-8859-1"" | curr_encoding == ""ISO-8859-15"") {","vector_logic_linter" -"R/read_export_table.R",119,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (add_pat_id & (""mnppid"" %in% names(loaded_table))) {","vector_logic_linter" -"R/return_random_participants.R",63,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (percent <= 0 | percent >= 1) {","vector_logic_linter" -"R/subset.R",53,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(participant) & !dat$export_options$add_id) {","vector_logic_linter" -"R/subset.R",56,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(centre) & !dat$export_options$centre_info) {","vector_logic_linter" -"R/subset.R",59,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(centre) & is.null(participant)) {","vector_logic_linter" -"R/subset.R",101,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(centre) & ""centre"" %in% names(new_dat[[tab]])) {","vector_logic_linter" -"tests/testthat/test-subset.R",40,46,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (any(names(dat[[tab]]) %in% ""pat_id"") & nrow(dat[[tab]]) > 0) {","vector_logic_linter" -"tests/testthat/test-subset.R",42,53,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (any(names(dat[[tab]]) %in% ""mnpaid"") & nrow(dat[[tab]]) > 0) {","vector_logic_linter" -"tests/testthat/test-subset.R",44,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"vignettes/secuTrialR-package-vignette.Rmd",44,2,"style","Commented code should be removed.","#rm(list = ls()) # removed this at the request of the CRAN submission","commented_code_linter" -"vignettes/secuTrialR-package-vignette.Rmd",419,81,"style","Lines should not be more than 80 characters.","# randomly retrieve at least 25 percent of participants recorded after March 18th 2019","line_length_linter" -"vignettes/secuTrialR-package-vignette.Rmd",485,81,"style","Lines should not be more than 80 characters.","ctu06_v1 <- read_secuTrial(system.file(""extdata"", ""sT_exports"", ""change_tracking"",","line_length_linter" -"vignettes/secuTrialR-package-vignette.Rmd",489,81,"style","Lines should not be more than 80 characters.","ctu06_v2 <- read_secuTrial(system.file(""extdata"", ""sT_exports"", ""change_tracking"",","line_length_linter" -"vignettes/secuTrialR-package-vignette.Rmd",538,81,"style","Lines should not be more than 80 characters.","ctu05_data_berlin <- subset_secuTrial(ctu05_data, centre = centres, exclude = TRUE)","line_length_linter" -"vignettes/secuTrialR-package-vignette.Rmd",570,81,"style","Lines should not be more than 80 characters.","ctu05_data_bern <- subset_secuTrial(ctu05_data, centre = ""Inselspital Bern (RPACK)"")","line_length_linter" -"vignettes/secuTrialR-package-vignette.Rmd",581,81,"style","Lines should not be more than 80 characters."," centre = c(""Inselspital Bern (RPACK)"",","line_length_linter" -"vignettes/secuTrialR-package-vignette.Rmd",724,81,"style","Lines should not be more than 80 characters.","Likely the label was changed from its original state in the secuTrial project setup.","line_length_linter" -"vignettes/secuTrialR-package-vignette.Rmd",761,81,"style","Lines should not be more than 80 characters.","bl_surg <- merge(x = ctu05_data$baseline, y = ctu05_data$esurgeries, by = ""mnpdocid"")","line_length_linter" -"vignettes/secuTrialR-package-vignette.Rmd",816,81,"style","Lines should not be more than 80 characters.","surg_wide <- pivot_wider(surg, names_from = surgery_organ.factor, values_from = count)","line_length_linter" diff --git a/.dev/revdep_emails/secuTrialR/email-body b/.dev/revdep_emails/secuTrialR/email-body deleted file mode 100644 index 617fda2c5..000000000 --- a/.dev/revdep_emails/secuTrialR/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Alan G. Haynes! Thank you for using {lintr} in your package {secuTrialR}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/SwissClinicalTrialOrganisation/secuTrialR using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 55s on CRAN vs. 34s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/semantic.dashboard/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/semantic.dashboard/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index c987dd1b3..000000000 --- a/.dev/revdep_emails/semantic.dashboard/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,5 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/box.R",44,3,"warning","local variable β€˜icon_selector’ assigned but may not be used"," icon_selector <- glue::glue(""'#{title_id} > .label > .icon'"")","object_usage_linter" -"R/semantic_dashboard.R",135,20,"style","There should be a space between right parenthesis and an opening curly brace.","#' if(interactive()){","paren_brace_linter" -"R/semantic_dashboard.R",202,20,"style","There should be a space between right parenthesis and an opening curly brace.","#' if(interactive()){","paren_brace_linter" -"R/semantic_dashboard.R",249,20,"style","There should be a space between right parenthesis and an opening curly brace.","#' if(interactive()){","paren_brace_linter" diff --git a/.dev/revdep_emails/semantic.dashboard/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/semantic.dashboard/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 2a77caad3..000000000 --- a/.dev/revdep_emails/semantic.dashboard/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,8 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/menu_item.R",51,3,"style","`else` should come on the same line as the previous `}`."," else if (is.null(href)) {","brace_linter" -"R/menu_item.R",54,3,"style","`else` should come on the same line as the previous `}`."," else if (newtab) {","brace_linter" -"vignettes/intro.Rmd",52,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/intro.Rmd",73,81,"style","Lines should not be more than 80 characters."," taskItem(""Project progress..."", 50.777, color = ""red"")))","line_length_linter" -"vignettes/intro.Rmd",128,81,"style","Lines should not be more than 80 characters."," taskItem(""Project progress..."", 50.777, color = ""red""))),","line_length_linter" -"vignettes/intro.Rmd",151,44,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","server <- function(input, output, session) {}","brace_linter" -"vignettes/intro.Rmd",151,45,"style","Closing curly-braces should always be on their own line, unless they are followed by an else.","server <- function(input, output, session) {}","brace_linter" diff --git a/.dev/revdep_emails/semantic.dashboard/email-body b/.dev/revdep_emails/semantic.dashboard/email-body deleted file mode 100644 index 57455e896..000000000 --- a/.dev/revdep_emails/semantic.dashboard/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Developers Appsilon! Thank you for using {lintr} in your package {semantic.dashboard}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/Appsilon/semantic.dashboard using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 14s on CRAN vs. 9s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/shiny.info/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/shiny.info/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 75d413ea2..000000000 --- a/.dev/revdep_emails/shiny.info/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,3 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/display.R",14,3,"warning","local variable β€˜fixed_layout’ assigned but may not be used"," fixed_layout <- ""fixed""","object_usage_linter" -"R/hide.R",73,3,"warning","local variable β€˜shortcut_condition’ assigned but may not be used"," shortcut_condition <- .shortcut_condition(shortcut)","object_usage_linter" diff --git a/.dev/revdep_emails/shiny.info/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/shiny.info/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index e3bd822ee..000000000 --- a/.dev/revdep_emails/shiny.info/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,3 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/display.R",74,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(company_name) & is.null(logo)) {","vector_logic_linter" -"tests/testthat/test_powered_by.R",10,3,"style","Missing terminal newline.","})","trailing_blank_lines_linter" diff --git a/.dev/revdep_emails/shiny.info/email-body b/.dev/revdep_emails/shiny.info/email-body deleted file mode 100644 index b2e09bc21..000000000 --- a/.dev/revdep_emails/shiny.info/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Jakub Nowicki! Thank you for using {lintr} in your package {shiny.info}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/Appsilon/shiny.info using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 6s on CRAN vs. 4s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/shiny.semantic/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/shiny.semantic/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 7a8116241..000000000 --- a/.dev/revdep_emails/shiny.semantic/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,30 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/button.R",11,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/button.R",42,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/button.R",82,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/button.R",155,3,"warning","local variable β€˜big_mark_regex’ assigned but may not be used"," big_mark_regex <- if (big_mark == "" "") ""\\s"" else big_mark","object_usage_linter" -"R/checkbox.R",17,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/dsl.R",12,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/dsl.R",80,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/dsl.R",153,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/dsl.R",206,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/dsl.R",248,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/dsl.R",280,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/dsl.R",323,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/dsl.R",356,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/dsl.R",391,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/dsl.R",443,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/dsl.R",480,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/dsl.R",528,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/dsl.R",673,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/dsl.R",794,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/grid.R",79,7,"warning","local variable β€˜mustache_id’ assigned but may not be used"," mustache_id <- ""{{ grid_id }}""","object_usage_linter" -"R/grid.R",80,7,"warning","local variable β€˜mustache_css’ assigned but may not be used"," mustache_css <- paste0(""{{ "", name, ""_custom_css }}"")","object_usage_linter" -"R/grid.R",81,7,"warning","local variable β€˜mustache_area’ assigned but may not be used"," mustache_area <- paste(""{{"", name, ""}}"")","object_usage_linter" -"R/grid.R",224,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/layouts.R",45,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/layouts.R",86,3,"warning","local variable β€˜sidebar_width’ assigned but may not be used"," sidebar_width <- sidebar_panel$width","object_usage_linter" -"R/layouts.R",87,3,"warning","local variable β€˜main_width’ assigned but may not be used"," main_width <- main_panel$width","object_usage_linter" -"R/menu.R",65,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/tables.R",9,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/toast.R",163,14,"style","Variable and function name style should be snake_case."," toast_tags$closeIcon <- closeButton","object_name_linter" diff --git a/.dev/revdep_emails/shiny.semantic/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/shiny.semantic/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 178637a22..000000000 --- a/.dev/revdep_emails/shiny.semantic/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,24 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/grid.R",290,5,"style","Any function spanning multiple lines should use curly braces."," function(color) glue::glue(","brace_linter" -"R/grid.R",310,23,"style","Use TRUE instead of the symbol T."," launch.browser = T","T_and_F_symbol_linter" -"R/menu.R",14,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/menu.R",80,3,"style","Either both or neither branch in `if`/`else` should use curly braces."," else {","brace_linter" -"R/semanticPage.R",154,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"tests/testthat/test_layouts.R",104,53,"style","Use FALSE instead of the symbol F."," v1 <- vertical_layout(p(""a""), adjusted_to_page = F)","T_and_F_symbol_linter" -"vignettes/basics.Rmd",79,12,"style","Put spaces around all infix operators."," a(class=""ui green ribbon label"", ""Link""),","infix_spaces_linter" -"vignettes/basics.Rmd",90,14,"style","Put spaces around all infix operators."," a(class=""ui green ribbon label"", ""Link""),","infix_spaces_linter" -"vignettes/intro.Rmd",31,81,"style","Lines should not be more than 80 characters."," list(header = ""Item 1"", description = ""My text for item 1"", icon = ""cat""),","line_length_linter" -"vignettes/intro.Rmd",32,81,"style","Lines should not be more than 80 characters."," list(header = ""Item 2"", description = ""My text for item 2"", icon = ""tree""),","line_length_linter" -"vignettes/intro.Rmd",33,81,"style","Lines should not be more than 80 characters."," list(header = ""Item 3"", description = ""My text for item 3"", icon = ""dog"")","line_length_linter" -"vignettes/intro.Rmd",51,44,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","server <- function(input, output, session) {}","brace_linter" -"vignettes/intro.Rmd",51,45,"style","Closing curly-braces should always be on their own line, unless they are followed by an else.","server <- function(input, output, session) {}","brace_linter" -"vignettes/intro.Rmd",73,44,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","server <- function(input, output, session) {}","brace_linter" -"vignettes/intro.Rmd",73,45,"style","Closing curly-braces should always be on their own line, unless they are followed by an else.","server <- function(input, output, session) {}","brace_linter" -"vignettes/intro.Rmd",112,44,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","server <- function(input, output, session) {}","brace_linter" -"vignettes/intro.Rmd",112,45,"style","Closing curly-braces should always be on their own line, unless they are followed by an else.","server <- function(input, output, session) {}","brace_linter" -"vignettes/intro.Rmd",127,81,"style","Lines should not be more than 80 characters."," dropdown_input(""mtcars_dropdown"", c(""mpg"", ""cyl"", ""disp"", ""hp""), value = ""mpg""),","line_length_linter" -"vignettes/intro.Rmd",172,81,"style","Lines should not be more than 80 characters."," dropdown_input(""mtcars_dropdown"", c(""mpg"", ""cyl"", ""disp"", ""hp""), value = ""mpg"")","line_length_linter" -"vignettes/intro.Rmd",237,81,"style","Lines should not be more than 80 characters."," dropdown_input(""mtcars_dropdown"", c(""mpg"", ""cyl"", ""disp"", ""hp""), value = ""mpg"")","line_length_linter" -"vignettes/semantic_integration.Rmd",37,12,"style","Put spaces around all infix operators."," a(class=""ui green ribbon label"", ""Plotly demo""),","infix_spaces_linter" -"vignettes/semantic_integration.Rmd",45,13,"warning","no visible binding for global variable β€˜economics’"," plot_ly(economics, x = ~date, color = I(""black"")) %>%","object_usage_linter" -"vignettes/semantic_integration.Rmd",67,12,"style","Put spaces around all infix operators."," a(class=""ui blue ribbon label"", ""Leaflet demo""),","infix_spaces_linter" diff --git a/.dev/revdep_emails/shiny.semantic/email-body b/.dev/revdep_emails/shiny.semantic/email-body deleted file mode 100644 index 7d754b3a4..000000000 --- a/.dev/revdep_emails/shiny.semantic/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Developers Appsilon! Thank you for using {lintr} in your package {shiny.semantic}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/Appsilon/shiny.semantic using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 65s on CRAN vs. 44s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/smerc/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/smerc/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index a55157e94..000000000 --- a/.dev/revdep_emails/smerc/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,93 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/arg_check_functions.R",6,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(is.matrix(coords) | is.data.frame(coords))) {","vector_logic_linter" -"R/arg_check_functions.R",195,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (min(pvalue) < 0 | max(pvalue) > 1) {","vector_logic_linter" -"R/arg_check_functions.R",204,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nrow(d) != N | ncol(d) != N) {","vector_logic_linter" -"R/arg_check_functions.R",280,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (min(angle_all) < 0 | max(angle_all) >= 360) {","vector_logic_linter" -"R/arg_check_functions.R",312,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.matrix(w) & !is.data.frame(w)) {","vector_logic_linter" -"R/arg_check_functions.R",315,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nrow(w) != N | ncol(w) != N) {","vector_logic_linter" -"R/arg_check_functions.R",530,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.matrix(w) & !is.data.frame(w)) {","vector_logic_linter" -"R/arg_check_functions.R",533,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nrow(w) != N | ncol(w) != N) {","vector_logic_linter" -"R/arg_check_functions.R",606,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(ein) | is.null(eout)) {","vector_logic_linter" -"R/arg_check_functions.R",630,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(popin) | is.null(popout) | is.null(tpop)) {","vector_logic_linter" -"R/arg_check_functions.R",630,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(popin) | is.null(popout) | is.null(tpop)) {","vector_logic_linter" -"R/arg_check_functions.R",669,16,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (ubd <= 0 | ubd > 1) {","vector_logic_linter" -"R/clusters-smerc_cluster.R",4,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (min(idx) < 1 | max(idx) > length(x$clusters)) {","vector_logic_linter" -"R/color.clusters.R",36,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (class(x) != ""scan"" & class(x) != ""smerc_cluster"") {","vector_logic_linter" -"R/color.clusters.R",39,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (min(idx) < 1 | max(idx) > length(x$clusters)) {","vector_logic_linter" -"R/combine.zones.R",18,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.list(z1) | !is.list(z2)) {","vector_logic_linter" -"R/dist.ellipse.R",61,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (angle < 00 | angle >= 360) {","vector_logic_linter" -"R/dmst.zones.R",102,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(progress) != 1 | !is.logical(progress)) {","vector_logic_linter" -"R/elliptic.nn.R",31,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(ubpop) != 1 | ubpop <= 0 | ubpop > 1) {","vector_logic_linter" -"R/elliptic.nn.R",31,39,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(ubpop) != 1 | ubpop <= 0 | ubpop > 1) {","vector_logic_linter" -"R/elliptic.sim.R",50,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(nsim) != 1 | !is.numeric(nsim) | nsim < 1) {","vector_logic_linter" -"R/elliptic.sim.R",50,45,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(nsim) != 1 | !is.numeric(nsim) | nsim < 1) {","vector_logic_linter" -"R/elliptic.test.R",57,22,"style","Variable and function name style should be snake_case or symbols."," min.cases = 2) {","object_name_linter" -"R/fast.zones.R",41,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(ubpop) != 1 | !is.numeric(ubpop)) {","vector_logic_linter" -"R/fast.zones.R",44,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (ubpop <= 0 | ubpop > 1) {","vector_logic_linter" -"R/fast.zones.R",47,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(simple) != 1 | !is.logical(simple)) {","vector_logic_linter" -"R/flex.sim.R",57,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(nsim) != 1 | !is.numeric(nsim) | nsim < 1) {","vector_logic_linter" -"R/flex.sim.R",57,45,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(nsim) != 1 | !is.numeric(nsim) | nsim < 1) {","vector_logic_linter" -"R/flex.sim.R",63,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(type) != 1 | !is.element(type, c(""poisson"", ""binomial""))) {","vector_logic_linter" -"R/flex.sim.R",67,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(ein) | is.null(eout)) {","vector_logic_linter" -"R/flex.sim.R",78,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(popin) | is.null(popout) | is.null(tpop)) {","vector_logic_linter" -"R/flex.sim.R",78,42,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(popin) | is.null(popout) | is.null(tpop)) {","vector_logic_linter" -"R/knn.R",33,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(longlat) != 1 | !is.logical(longlat)) {","vector_logic_linter" -"R/knn.R",37,13,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (k < 1 | k > n) {","vector_logic_linter" -"R/knn.R",41,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nrow(d) != n | ncol(d) != n) {","vector_logic_linter" -"R/morancr.stat.R",62,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.matrix(w) & !is.data.frame(w)) {","vector_logic_linter" -"R/morancr.stat.R",65,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nrow(w) != N | ncol(w) != N) {","vector_logic_linter" -"R/mst.seq.R",120,16,"warning","Conditional expressions require scalar logical operators (&& and ||)"," while (!stop & i < length(neighbors)) {","vector_logic_linter" -"R/mst.seq.R",133,16,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (i == 1 | nlinks == ""one"") {","vector_logic_linter" -"R/mst.seq.R",164,17,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (early & (stat_cand[max_idx] <= loglikrat[i])) {","vector_logic_linter" -"R/nndist.R",29,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(ubd) != 1 | !is.numeric(ubd) | ubd <= 0) {","vector_logic_linter" -"R/nndist.R",29,43,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(ubd) != 1 | !is.numeric(ubd) | ubd <= 0) {","vector_logic_linter" -"R/noz.R",40,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/optimal_ubpop.R",43,22,"style","Variable and function name style should be snake_case or symbols."," min.cases = 0,","object_name_linter" -"R/optimal_ubpop.R",195,36,"style","Variable and function name style should be snake_case or symbols."," min.cases) {","object_name_linter" -"R/rflex_zones.R",142,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(alpha1) != 1 | alpha1 <= 0) {","vector_logic_linter" -"R/rflex_zones.R",153,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(loop) != 1 | !is.logical(loop)) {","vector_logic_linter" -"R/rflex_zones.R",156,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(pfreq) != 1 | pfreq < 1) {","vector_logic_linter" -"R/rflex_zones.R",159,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(verbose) != 1 | !is.logical(verbose)) {","vector_logic_linter" -"R/rflex.midp.R",43,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.numeric(cases) | !is.numeric(ex)) {","vector_logic_linter" -"R/rflex.midp.R",46,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(type) != 1 |","vector_logic_linter" -"R/rflex.midp.R",50,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (type == ""binomial"" & is.null(pop)) {","vector_logic_linter" -"R/rflex.sim.R",32,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(nsim) != 1 | !is.numeric(nsim) | nsim < 1) {","vector_logic_linter" -"R/rflex.sim.R",32,45,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(nsim) != 1 | !is.numeric(nsim) | nsim < 1) {","vector_logic_linter" -"R/rflex.zones.R",149,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(alpha1) != 1 | alpha1 <= 0) {","vector_logic_linter" -"R/rflex.zones.R",160,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(loop) != 1 | !is.logical(loop)) {","vector_logic_linter" -"R/rflex.zones.R",163,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(pfreq) != 1 | pfreq < 1) {","vector_logic_linter" -"R/rflex.zones.R",166,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(verbose) != 1 | !is.logical(verbose)) {","vector_logic_linter" -"R/scan_stat.R",90,15,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (a > 0 & length(shape) == 1) {","vector_logic_linter" -"R/scan_stat.R",120,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(ein) & is.null(popin)) {","vector_logic_linter" -"R/scan_stat.R",133,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(type) != 1 | !is.element(type, c(""poisson"", ""binomial""))) {","vector_logic_linter" -"R/scan_stat.R",136,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(a) != 1 | a < 0 | a > 1) {","vector_logic_linter" -"R/scan_stat.R",136,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(a) != 1 | a < 0 | a > 1) {","vector_logic_linter" -"R/scan_stat.R",139,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(shape) != 1 & length(shape) != length(yin)) {","vector_logic_linter" -"R/scan_stat.R",142,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (type == ""binomial"" & is.null(tpop)) {","vector_logic_linter" -"R/scan.sim.R",121,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (simdist == ""binomial"" & is.null(pop)) {","vector_logic_linter" -"R/scan.stat.R",140,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(ein) & is.null(popin)) {","vector_logic_linter" -"R/scan.stat.R",153,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(type) != 1 | !is.element(type, c(""poisson"", ""binomial""))) {","vector_logic_linter" -"R/scan.stat.R",156,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(a) != 1 | a < 0 | a > 1) {","vector_logic_linter" -"R/scan.stat.R",156,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(a) != 1 | a < 0 | a > 1) {","vector_logic_linter" -"R/scan.stat.R",159,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(shape) != 1 & length(shape) != length(yin)) {","vector_logic_linter" -"R/scan.stat.R",162,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (type == ""binomial"" & is.null(tpop)) {","vector_logic_linter" -"R/scan.test.R",96,22,"style","Variable and function name style should be snake_case or symbols."," min.cases = 2,","object_name_linter" -"R/scan.test.R",215,28,"style","Variable and function name style should be snake_case or symbols."," simdist = NULL, min.cases = NULL) {","object_name_linter" -"R/seq_scan_sim.R",25,21,"style","Variable and function name style should be snake_case or symbols."," min.cases = 0,","object_name_linter" -"R/seq_scan_sim.R",132,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (simdist == ""binomial"" & is.null(pop)) {","vector_logic_linter" -"R/seq_scan_test.R",21,22,"style","Variable and function name style should be snake_case or symbols."," min.cases = 0,","object_name_linter" -"R/seq_scan_test.R",140,36,"style","Variable and function name style should be snake_case or symbols."," min.cases) {","object_name_linter" -"R/smerc_cluster-plot.R",53,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (min(idx) < 1 | max(idx) > length(x$clusters)) {","vector_logic_linter" -"R/smerc_cluster-print.R",19,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(extra) != 1 | !is.logical(extra)) {","vector_logic_linter" -"R/smerc_cluster-summary.R",37,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (min(idx) < 1 | max(idx) > length(object$clusters)) {","vector_logic_linter" -"R/tango.weights.R",83,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (type == ""rogerson"" & is.null(pop)) {","vector_logic_linter" -"vignettes/smerc_demo.Rmd",43,8,"style","Use <-, not =, for assignment.","coords = nydf[,c(""x"", ""y"")] # extract coordinates","assignment_linter" -"vignettes/smerc_demo.Rmd",43,16,"style","Commas should always have a space after.","coords = nydf[,c(""x"", ""y"")] # extract coordinates","commas_linter" -"vignettes/smerc_demo.Rmd",44,7,"style","Use <-, not =, for assignment.","cases = nydf$cases # extract cases","assignment_linter" -"vignettes/smerc_demo.Rmd",45,5,"style","Use <-, not =, for assignment.","pop = nydf$population # extract population","assignment_linter" -"vignettes/smerc_demo.Rmd",46,10,"style","Use <-, not =, for assignment.","scan_out = scan.test(coords, cases, pop, nsim = 99) # perform scan test","assignment_linter" -"vignettes/smerc_demo.Rmd",106,8,"style","Use <-, not =, for assignment.","bn_out = bn.test(coords = coords, cases = cases, pop = pop, cstar = 20,","assignment_linter" -"vignettes/smerc_demo.Rmd",117,10,"style","Use <-, not =, for assignment.","cepp_out = cepp.test(coords = coords, cases = cases, pop = pop,","assignment_linter" -"vignettes/smerc_demo.Rmd",129,3,"style","Use <-, not =, for assignment.","w = dweights(coords, kappa = 1) # construct weights matrix","assignment_linter" -"vignettes/smerc_demo.Rmd",130,11,"style","Use <-, not =, for assignment.","tango_out = tango.test(cases, pop, w, nsim = 49) # perform tango's test","assignment_linter" -"vignettes/smerc_demo.Rmd",143,8,"style","Use <-, not =, for assignment.","ezones = elliptic.zones(coords, pop, ubpop = 0.1)","assignment_linter" diff --git a/.dev/revdep_emails/smerc/email-body b/.dev/revdep_emails/smerc/email-body deleted file mode 100644 index 5c65ed869..000000000 --- a/.dev/revdep_emails/smerc/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Joshua French! Thank you for using {lintr} in your package {smerc}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/jfrench/smerc using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 105s on CRAN vs. 67s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/stencilaschema/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/stencilaschema/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 4fdc22035..000000000 --- a/.dev/revdep_emails/stencilaschema/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,3 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/typing.R",196,3,"style","`else` should come on the same line as the previous `}`."," else if (is_class(type, ""Array"")) {","brace_linter" -"R/typing.R",205,5,"style","`else` should come on the same line as the previous `}`."," else if (","brace_linter" diff --git a/.dev/revdep_emails/stencilaschema/attachments/stencilaschema.warnings b/.dev/revdep_emails/stencilaschema/attachments/stencilaschema.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/stencilaschema/attachments/stencilaschema.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/stencilaschema/email-body b/.dev/revdep_emails/stencilaschema/email-body deleted file mode 100644 index 1ccd1c303..000000000 --- a/.dev/revdep_emails/stencilaschema/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Nokome Bentley! Thank you for using {lintr} in your package {stencilaschema}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/stencila/schema using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 3s on CRAN vs. 2s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/supernova/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/supernova/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 0faf4ad8c..000000000 --- a/.dev/revdep_emails/supernova/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,4 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"data-raw/class_data.R",18,3,"warning","local variable β€˜number_of_teachers’ assigned but may not be used"," number_of_teachers <- 3","object_usage_linter" -"R/equation.R",9,3,"warning","local variable β€˜format_term’ assigned but may not be used"," format_term <- function(value, name, digits) {","object_usage_linter" -"R/supernova.R",436,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," bar_col <- if (!is_lmer_model & is_verbose) ""description"" else ""term""","vector_logic_linter" diff --git a/.dev/revdep_emails/supernova/attachments/supernova.warnings b/.dev/revdep_emails/supernova/attachments/supernova.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/supernova/attachments/supernova.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/supernova/email-body b/.dev/revdep_emails/supernova/email-body deleted file mode 100644 index 60621a90c..000000000 --- a/.dev/revdep_emails/supernova/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Adam Blake! Thank you for using {lintr} in your package {supernova}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/UCLATALL/supernova using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 29s on CRAN vs. 16s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/tsviz/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/tsviz/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 7c641185a..000000000 --- a/.dev/revdep_emails/tsviz/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,2 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/tsviz.R",12,20,"style","There should be a space between right parenthesis and an opening curly brace.","#' if(interactive()){","paren_brace_linter" diff --git a/.dev/revdep_emails/tsviz/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/tsviz/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index a4bc7c8e8..000000000 --- a/.dev/revdep_emails/tsviz/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,2 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"data-raw/rhub_check.R",3,3,"style","Commented code should be removed.","# validate_email()","commented_code_linter" diff --git a/.dev/revdep_emails/tsviz/attachments/tsviz.warnings b/.dev/revdep_emails/tsviz/attachments/tsviz.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/tsviz/attachments/tsviz.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/tsviz/email-body b/.dev/revdep_emails/tsviz/email-body deleted file mode 100644 index 556167403..000000000 --- a/.dev/revdep_emails/tsviz/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Emanuele Fabbiani! Thank you for using {lintr} in your package {tsviz}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/donlelef/tsviz using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 3s on CRAN vs. 2s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/tuber/attachments/tuber.failure b/.dev/revdep_emails/tuber/attachments/tuber.failure deleted file mode 100644 index 08edf6748..000000000 --- a/.dev/revdep_emails/tuber/attachments/tuber.failure +++ /dev/null @@ -1 +0,0 @@ -`defaults` must be a named list. diff --git a/.dev/revdep_emails/tuber/attachments/tuber.warnings b/.dev/revdep_emails/tuber/attachments/tuber.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/tuber/attachments/tuber.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/tuber/email-body b/.dev/revdep_emails/tuber/email-body deleted file mode 100644 index 2bdcb9e90..000000000 --- a/.dev/revdep_emails/tuber/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Gaurav Sood! Thank you for using {lintr} in your package {tuber}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at http://github.com/soodoku/tuber using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 3s on CRAN vs. 0s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/unifir/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/unifir/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index c3a23e34e..000000000 --- a/.dev/revdep_emails/unifir/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,5 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/associate_coordinates.R",52,33,"style","Place a space before left parenthesis, except in a function call."," stopifnot(side_length %in% (2^(5:12) + 1))","spaces_left_parentheses_linter" -"R/associate_coordinates.R",68,10,"style","Variable and function name style should be snake_case."," coords$X <- (side_length *","object_name_linter" -"R/associate_coordinates.R",71,10,"style","Variable and function name style should be snake_case."," coords$Y <- bounds[[4]] - coords$Y","object_name_linter" -"tests/testthat/test-find_unity.R",68,5,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" diff --git a/.dev/revdep_emails/unifir/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/unifir/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 69b35ea5c..000000000 --- a/.dev/revdep_emails/unifir/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,8 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"vignettes/unifir-asset-guide.Rmd",108,63,"style","Trailing whitespace is superfluous."," prefab_path = file.path(""Assets"", ","trailing_whitespace_linter" -"vignettes/unifir-dev-guide.Rmd",127,41,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," build = function(script, prop, debug) {},","brace_linter" -"vignettes/unifir-user-guide.Rmd",232,45,"style","Trailing whitespace is superfluous."," terrainr::transform_elevation(raster_file, ","trailing_whitespace_linter" -"vignettes/unifir-user-guide.Rmd",247,59,"style","Trailing whitespace is superfluous."," # Where should the ""top-left"" corner of the terrain sit? ","trailing_whitespace_linter" -"vignettes/unifir-user-guide.Rmd",248,62,"style","Trailing whitespace is superfluous."," # Note that Unity uses a left-handed Y-up coordinate system ","trailing_whitespace_linter" -"vignettes/unifir-user-guide.Rmd",256,81,"style","Lines should not be more than 80 characters."," height = as.numeric(terra::global(r, max)), # Max height of the terrain (Y axis)","line_length_linter" -"vignettes/unifir-user-guide.Rmd",258,38,"style","Trailing whitespace is superfluous."," heightmap_resolution = terrain_size ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/unifir/email-body b/.dev/revdep_emails/unifir/email-body deleted file mode 100644 index 5127a3e71..000000000 --- a/.dev/revdep_emails/unifir/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Michael Mahoney! Thank you for using {lintr} in your package {unifir}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/ropensci/unifir using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 23s on CRAN vs. 15s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/virustotal/email-body b/.dev/revdep_emails/virustotal/email-body deleted file mode 100644 index 9f3c4ed44..000000000 --- a/.dev/revdep_emails/virustotal/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Gaurav Sood! Thank you for using {lintr} in your package {virustotal}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/themains/virustotal using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 0s on CRAN vs. 0s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/wavefunction/email-body b/.dev/revdep_emails/wavefunction/email-body deleted file mode 100644 index a4f90ad7d..000000000 --- a/.dev/revdep_emails/wavefunction/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Madeleine B. Thompson! Thank you for using {lintr} in your package {wavefunction}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cran/wavefunction using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took NAs on CRAN vs. NAs in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/xgboost/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/xgboost/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index f4e629123..000000000 --- a/.dev/revdep_emails/xgboost/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,29 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/callbacks.R",753,1,"style","Variable and function name style should be snake_case.","format.eval.string <- function(iter, eval_res, eval_err = NULL) {","object_name_linter" -"R/xgb.Booster.R",471,1,"style","Variable and function name style should be snake_case.","predict.xgb.Booster.handle <- function(object, ...) {","object_name_linter" -"R/xgb.cv.R",278,1,"style","Variable and function name style should be snake_case.","print.xgb.cv.synchronous <- function(x, verbose = FALSE, ...) {","object_name_linter" -"R/xgb.DMatrix.R",117,1,"style","Variable and function name style should be snake_case.","dim.xgb.DMatrix <- function(x) {","object_name_linter" -"R/xgb.DMatrix.R",146,1,"style","Variable and function name style should be snake_case.","dimnames.xgb.DMatrix <- function(x) {","object_name_linter" -"R/xgb.DMatrix.R",152,1,"style","Variable and function name style should be snake_case.","`dimnames<-.xgb.DMatrix` <- function(x, value) {","object_name_linter" -"R/xgb.DMatrix.R",204,1,"style","Variable and function name style should be snake_case.","getinfo.xgb.DMatrix <- function(object, name, ...) {","object_name_linter" -"R/xgb.DMatrix.R",329,1,"style","Variable and function name style should be snake_case.","slice.xgb.DMatrix <- function(object, idxset, ...) {","object_name_linter" -"R/xgb.DMatrix.R",355,1,"style","Variable and function name style should be snake_case.","`[.xgb.DMatrix` <- function(object, idxset, colset = NULL) {","object_name_linter" -"R/xgb.DMatrix.R",378,1,"style","Variable and function name style should be snake_case.","print.xgb.DMatrix <- function(x, verbose = FALSE, ...) {","object_name_linter" -"R/xgb.ggplot.R",21,23,"style","Variable and function name style should be snake_case."," importance_matrix[, Cluster := as.character(clusters$cluster)]","object_name_linter" -"R/xgb.model.dt.tree.R",101,16,"style","Variable and function name style should be snake_case."," td[position, Tree := 1L]","object_name_linter" -"R/xgb.model.dt.tree.R",102,8,"style","Variable and function name style should be snake_case."," td[, Tree := cumsum(ifelse(is.na(Tree), 0L, Tree)) - 1L]","object_name_linter" -"R/xgb.model.dt.tree.R",111,8,"style","Variable and function name style should be snake_case."," td[, Node := as.integer(sub(""^([0-9]+):.*"", ""\\1"", t))]","object_name_linter" -"R/xgb.model.dt.tree.R",112,25,"style","Variable and function name style should be snake_case."," if (!use_int_id) td[, ID := add.tree.id(Node, Tree)]","object_name_linter" -"R/xgb.model.dt.tree.R",113,8,"style","Variable and function name style should be snake_case."," td[, isLeaf := grepl(""leaf"", t, fixed = TRUE)]","object_name_linter" -"R/xgb.model.dt.tree.R",143,25,"style","Variable and function name style should be snake_case."," td[isLeaf == FALSE, Feature := feature_names[as.numeric(Feature) + 1]]","object_name_linter" -"R/xgb.model.dt.tree.R",171,8,"style","Variable and function name style should be snake_case."," td[, isLeaf := NULL]","object_name_linter" -"R/xgb.plot.deepness.R",130,25,"style","Variable and function name style should be snake_case."," dt_edges[is.na(Leaf), Leaf := FALSE]","object_name_linter" -"R/xgb.plot.importance.R",95,25,"style","Variable and function name style should be snake_case."," importance_matrix[, Importance := Importance / max(abs(Importance))]","object_name_linter" -"R/xgb.plot.multi.trees.R",71,35,"style","Variable and function name style should be snake_case."," tree.matrix[ID %in% root.nodes, abs.node.position := root.nodes]","object_name_linter" -"R/xgb.plot.multi.trees.R",86,28,"style","Variable and function name style should be snake_case."," tree.matrix[!is.na(Yes), Yes := paste0(abs.node.position, ""_0"")]","object_name_linter" -"R/xgb.plot.multi.trees.R",87,27,"style","Variable and function name style should be snake_case."," tree.matrix[!is.na(No), No := paste0(abs.node.position, ""_1"")]","object_name_linter" -"R/xgb.plot.multi.trees.R",116,14,"style","Variable and function name style should be snake_case."," edges.dt[, N := NULL]","object_name_linter" -"tests/testthat/test_callbacks.R",262,11,"style","Variable and function name style should be snake_case."," titanic$Pclass <- as.factor(titanic$Pclass)","object_name_linter" -"tests/testthat/test_helpers.R",17,6,"style","Variable and function name style should be snake_case.","df[, AgeDiscret := as.factor(round(Age / 10, 0))]","object_name_linter" -"tests/testthat/test_helpers.R",18,6,"style","Variable and function name style should be snake_case.","df[, AgeCat := as.factor(ifelse(Age > 30, ""Old"", ""Young""))]","object_name_linter" -"tests/testthat/test_helpers.R",19,6,"style","Variable and function name style should be snake_case.","df[, ID := NULL]","object_name_linter" diff --git a/.dev/revdep_emails/xgboost/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/xgboost/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index d660a746d..000000000 --- a/.dev/revdep_emails/xgboost/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,367 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"demo/basic_walkthrough.R",6,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" -"demo/basic_walkthrough.R",7,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" -"demo/basic_walkthrough.R",10,81,"style","Lines should not be more than 80 characters.","# the loaded data is stored in sparseMatrix, and label is a numeric vector in {0,1}","line_length_linter" -"demo/basic_walkthrough.R",16,81,"style","Lines should not be more than 80 characters.","# note: we are putting in sparse matrix here, xgboost naturally handles sparse input","line_length_linter" -"demo/basic_walkthrough.R",17,81,"style","Lines should not be more than 80 characters.","# use sparse matrix when your feature is sparse(e.g. when you are using one-hot encoding vector)","line_length_linter" -"demo/basic_walkthrough.R",19,81,"style","Lines should not be more than 80 characters.","bst <- xgboost(data = train$data, label = train$label, max_depth = 2, eta = 1, nrounds = 2,","line_length_linter" -"demo/basic_walkthrough.R",23,81,"style","Lines should not be more than 80 characters.","bst <- xgboost(data = as.matrix(train$data), label = train$label, max_depth = 2, eta = 1, nrounds = 2,","line_length_linter" -"demo/basic_walkthrough.R",26,81,"style","Lines should not be more than 80 characters.","# you can also put in xgb.DMatrix object, which stores label, data and other meta datas needed for advanced features","line_length_linter" -"demo/basic_walkthrough.R",44,81,"style","Lines should not be more than 80 characters.","# since we do not have this file with us, the following line is just for illustration","line_length_linter" -"demo/basic_walkthrough.R",45,3,"style","Commented code should be removed.","# bst <- xgboost(data = 'agaricus.train.svm', max_depth = 2, eta = 1, nrounds = 2,objective = ""binary:logistic"")","commented_code_linter" -"demo/basic_walkthrough.R",45,81,"style","Lines should not be more than 80 characters.","# bst <- xgboost(data = 'agaricus.train.svm', max_depth = 2, eta = 1, nrounds = 2,objective = ""binary:logistic"")","line_length_linter" -"demo/basic_walkthrough.R",81,81,"style","Lines should not be more than 80 characters.","bst <- xgb.train(data = dtrain, max_depth = 2, eta = 1, nrounds = 2, watchlist = watchlist,","line_length_linter" -"demo/basic_walkthrough.R",85,81,"style","Lines should not be more than 80 characters.","bst <- xgb.train(data = dtrain, max_depth = 2, eta = 1, nrounds = 2, watchlist = watchlist,","line_length_linter" -"demo/basic_walkthrough.R",93,81,"style","Lines should not be more than 80 characters.","bst <- xgb.train(data = dtrain2, max_depth = 2, eta = 1, nrounds = 2, watchlist = watchlist,","line_length_linter" -"demo/basic_walkthrough.R",102,35,"style","Only use double-quotes.","dump_path <- file.path(tempdir(), 'dump.raw.txt')","single_quotes_linter" -"demo/boost_from_prediction.R",3,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" -"demo/boost_from_prediction.R",4,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" -"demo/boost_from_prediction.R",12,7,"style","Only use double-quotes.","print('start running example to start from a initial prediction')","single_quotes_linter" -"demo/boost_from_prediction.R",14,64,"style","Only use double-quotes.","param <- list(max_depth = 2, eta = 1, nthread = 2, objective = 'binary:logistic')","single_quotes_linter" -"demo/boost_from_prediction.R",14,81,"style","Lines should not be more than 80 characters.","param <- list(max_depth = 2, eta = 1, nthread = 2, objective = 'binary:logistic')","line_length_linter" -"demo/boost_from_prediction.R",16,81,"style","Lines should not be more than 80 characters.","# Note: we need the margin value instead of transformed prediction in set_base_margin","line_length_linter" -"demo/boost_from_prediction.R",17,81,"style","Lines should not be more than 80 characters.","# do predict with output_margin=TRUE, will always give you margin values before logistic transformation","line_length_linter" -"demo/boost_from_prediction.R",25,7,"style","Only use double-quotes.","print('this is result of boost from initial prediction')","single_quotes_linter" -"demo/boost_from_prediction.R",26,81,"style","Lines should not be more than 80 characters.","bst <- xgb.train(params = param, data = dtrain, nrounds = 1, watchlist = watchlist)","line_length_linter" -"demo/caret_wrapper.R",11,81,"style","Lines should not be more than 80 characters.","# Create a copy of the dataset with data.table package (data.table is 100% compliant with R dataframe but its syntax is a lot more consistent and its performance are really good).","line_length_linter" -"demo/caret_wrapper.R",14,81,"style","Lines should not be more than 80 characters.","# Let's add some new categorical features to see if it helps. Of course these feature are highly correlated to the Age feature. Usually it's not a good thing in ML, but Tree algorithms (including boosted trees) are able to select the best features, even in case of highly correlated features.","line_length_linter" -"demo/caret_wrapper.R",15,81,"style","Lines should not be more than 80 characters.","# For the first feature we create groups of age by rounding the real age. Note that we transform it to factor (categorical data) so the algorithm treat them as independant values.","line_length_linter" -"demo/caret_wrapper.R",18,81,"style","Lines should not be more than 80 characters.","# Here is an even stronger simplification of the real age with an arbitrary split at 30 years old. I choose this value based on nothing. We will see later if simplifying the information based on arbitrary values is a good strategy (I am sure you already have an idea of how well it will work!).","line_length_linter" -"demo/caret_wrapper.R",21,81,"style","Lines should not be more than 80 characters.","# We remove ID as there is nothing to learn from this feature (it will just add some noise as the dataset is small).","line_length_linter" -"demo/caret_wrapper.R",26,81,"style","Lines should not be more than 80 characters.","# Here we use 10-fold cross-validation, repeating twice, and using random search for tuning hyper-parameters.","line_length_linter" -"demo/caret_wrapper.R",27,1,"style","Variable and function name style should be snake_case or symbols.","fitControl <- trainControl(method = ""repeatedcv"", number = 10, repeats = 2, search = ""random"")","object_name_linter" -"demo/caret_wrapper.R",27,81,"style","Lines should not be more than 80 characters.","fitControl <- trainControl(method = ""repeatedcv"", number = 10, repeats = 2, search = ""random"")","line_length_linter" -"demo/caret_wrapper.R",29,32,"style","Put spaces around all infix operators.","model <- train(factor(Improved)~., data = df, method = ""xgbTree"", trControl = fitControl)","infix_spaces_linter" -"demo/caret_wrapper.R",29,81,"style","Lines should not be more than 80 characters.","model <- train(factor(Improved)~., data = df, method = ""xgbTree"", trControl = fitControl)","line_length_linter" -"demo/caret_wrapper.R",31,81,"style","Lines should not be more than 80 characters.","# Instead of tree for our boosters, you can also fit a linear regression or logistic regression model using xgbLinear","line_length_linter" -"demo/caret_wrapper.R",32,3,"style","Commented code should be removed.","# model <- train(factor(Improved)~., data = df, method = ""xgbLinear"", trControl = fitControl)","commented_code_linter" -"demo/caret_wrapper.R",32,81,"style","Lines should not be more than 80 characters.","# model <- train(factor(Improved)~., data = df, method = ""xgbLinear"", trControl = fitControl)","line_length_linter" -"demo/create_sparse_matrix.R",5,20,"style","Only use double-quotes."," install.packages('vcd') #Available in CRAN. Used for its dataset with categorical values.","single_quotes_linter" -"demo/create_sparse_matrix.R",5,81,"style","Lines should not be more than 80 characters."," install.packages('vcd') #Available in CRAN. Used for its dataset with categorical values.","line_length_linter" -"demo/create_sparse_matrix.R",10,81,"style","Lines should not be more than 80 characters.","# A categorical variable is one which have a fixed number of values. By example, if for each observation a variable called ""Colour"" can have only ""red"", ""blue"" or ""green"" as value, it is a categorical variable.","line_length_linter" -"demo/create_sparse_matrix.R",15,81,"style","Lines should not be more than 80 characters.","# In this demo we will see how to transform a dense dataframe with categorical variables to a sparse matrix before analyzing it in XGBoost.","line_length_linter" -"demo/create_sparse_matrix.R",21,81,"style","Lines should not be more than 80 characters.","# create a copy of the dataset with data.table package (data.table is 100% compliant with R dataframe but its syntax is a lot more consistent and its performance are really good).","line_length_linter" -"demo/create_sparse_matrix.R",28,81,"style","Lines should not be more than 80 characters.","# 2 columns have factor type, one has ordinal type (ordinal variable is a categorical variable with values which can be ordered, here: None > Some > Marked).","line_length_linter" -"demo/create_sparse_matrix.R",32,81,"style","Lines should not be more than 80 characters.","# Let's add some new categorical features to see if it helps. Of course these feature are highly correlated to the Age feature. Usually it's not a good thing in ML, but Tree algorithms (including boosted trees) are able to select the best features, even in case of highly correlated features.","line_length_linter" -"demo/create_sparse_matrix.R",34,81,"style","Lines should not be more than 80 characters.","# For the first feature we create groups of age by rounding the real age. Note that we transform it to factor (categorical data) so the algorithm treat them as independent values.","line_length_linter" -"demo/create_sparse_matrix.R",37,81,"style","Lines should not be more than 80 characters.","# Here is an even stronger simplification of the real age with an arbitrary split at 30 years old. I choose this value based on nothing. We will see later if simplifying the information based on arbitrary values is a good strategy (I am sure you already have an idea of how well it will work!).","line_length_linter" -"demo/create_sparse_matrix.R",40,81,"style","Lines should not be more than 80 characters.","# We remove ID as there is nothing to learn from this feature (it will just add some noise as the dataset is small).","line_length_linter" -"demo/create_sparse_matrix.R",49,81,"style","Lines should not be more than 80 characters.","# The purpose is to transform each value of each categorical feature in one binary feature.","line_length_linter" -"demo/create_sparse_matrix.R",51,81,"style","Lines should not be more than 80 characters.","# Let's take, the column Treatment will be replaced by two columns, Placebo, and Treated. Each of them will be binary. For example an observation which had the value Placebo in column Treatment before the transformation will have, after the transformation, the value 1 in the new column Placebo and the value 0 in the new column Treated.","line_length_linter" -"demo/create_sparse_matrix.R",53,81,"style","Lines should not be more than 80 characters.","# Formulae Improved~.-1 used below means transform all categorical features but column Improved to binary values.","line_length_linter" -"demo/create_sparse_matrix.R",54,81,"style","Lines should not be more than 80 characters.","# Column Improved is excluded because it will be our output column, the one we want to predict.","line_length_linter" -"demo/create_sparse_matrix.R",69,81,"style","Lines should not be more than 80 characters."," eta = 1, nthread = 2, nrounds = 10, objective = ""binary:logistic"")","line_length_linter" -"demo/create_sparse_matrix.R",71,81,"style","Lines should not be more than 80 characters.","importance <- xgb.importance(feature_names = colnames(sparse_matrix), model = bst)","line_length_linter" -"demo/create_sparse_matrix.R",73,81,"style","Lines should not be more than 80 characters.","# According to the matrix below, the most important feature in this dataset to predict if the treatment will work is the Age. The second most important feature is having received a placebo or not. The sex is third. Then we see our generated features (AgeDiscret). We can see that their contribution is very low (Gain column).","line_length_linter" -"demo/create_sparse_matrix.R",85,81,"style","Lines should not be more than 80 characters.","# The perfectly random split I did between young and old at 30 years old have a low correlation of 2. It's a result we may expect as may be in my mind > 30 years is being old (I am 32 and starting feeling old, this may explain that), but for the illness we are studying, the age to be vulnerable is not the same. Don't let your ""gut"" lower the quality of your model. In ""data science"", there is science :-)","line_length_linter" -"demo/create_sparse_matrix.R",87,81,"style","Lines should not be more than 80 characters.","# As you can see, in general destroying information by simplifying it won't improve your model. Chi2 just demonstrates that. But in more complex cases, creating a new feature based on existing one which makes link with the outcome more obvious may help the algorithm and improve the model. The case studied here is not enough complex to show that. Check Kaggle forum for some challenging datasets.","line_length_linter" -"demo/create_sparse_matrix.R",89,81,"style","Lines should not be more than 80 characters.","# Moreover, you can notice that even if we have added some not useful new features highly correlated with other features, the boosting tree algorithm have been able to choose the best one, which in this case is the Age. Linear model may not be that strong in these scenario.","line_length_linter" -"demo/cross_validation.R",3,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" -"demo/cross_validation.R",4,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" -"demo/cross_validation.R",9,64,"style","Only use double-quotes.","param <- list(max_depth = 2, eta = 1, nthread = 2, objective = 'binary:logistic')","single_quotes_linter" -"demo/cross_validation.R",9,81,"style","Lines should not be more than 80 characters.","param <- list(max_depth = 2, eta = 1, nthread = 2, objective = 'binary:logistic')","line_length_linter" -"demo/cross_validation.R",11,5,"style","Only use double-quotes.","cat('running cross validation\n')","single_quotes_linter" -"demo/cross_validation.R",15,53,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","xgb.cv(param, dtrain, nrounds, nfold = 5, metrics = {'error'})","brace_linter" -"demo/cross_validation.R",15,54,"style","Only use double-quotes.","xgb.cv(param, dtrain, nrounds, nfold = 5, metrics = {'error'})","single_quotes_linter" -"demo/cross_validation.R",17,5,"style","Only use double-quotes.","cat('running cross validation, disable standard deviation display\n')","single_quotes_linter" -"demo/cross_validation.R",22,18,"style","Only use double-quotes."," metrics = 'error', showsd = FALSE)","single_quotes_linter" -"demo/cross_validation.R",28,6,"style","Remove spaces before the left parenthesis in a function call.","print ('running cross validation, with customized loss function')","function_left_parentheses_linter" -"demo/cross_validation.R",28,8,"style","Only use double-quotes.","print ('running cross validation, with customized loss function')","single_quotes_linter" -"demo/cross_validation.R",49,81,"style","Lines should not be more than 80 characters.","res <- xgb.cv(params = param, data = dtrain, nrounds = nrounds, nfold = 5, prediction = TRUE)","line_length_linter" -"demo/custom_objective.R",3,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" -"demo/custom_objective.R",4,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" -"demo/custom_objective.R",14,81,"style","Lines should not be more than 80 characters.","# user define objective function, given prediction, return gradient and second order gradient","line_length_linter" -"demo/custom_objective.R",25,81,"style","Lines should not be more than 80 characters.","# NOTE: when you do customized loss function, the default prediction value is margin","line_length_linter" -"demo/custom_objective.R",27,81,"style","Lines should not be more than 80 characters.","# for example, we are doing logistic loss, the prediction is score before logistic transformation","line_length_linter" -"demo/custom_objective.R",29,81,"style","Lines should not be more than 80 characters.","# Take this in mind when you use the customization, and maybe you need write customized evaluation function","line_length_linter" -"demo/custom_objective.R",38,6,"style","Remove spaces before the left parenthesis in a function call.","print ('start training with user customized objective')","function_left_parentheses_linter" -"demo/custom_objective.R",38,8,"style","Only use double-quotes.","print ('start training with user customized objective')","single_quotes_linter" -"demo/custom_objective.R",48,81,"style","Lines should not be more than 80 characters.","# set label attribute of dtrain to be label, we use label as an example, it can be anything","line_length_linter" -"demo/custom_objective.R",49,14,"style","Only use double-quotes.","attr(dtrain, 'label') <- getinfo(dtrain, 'label')","single_quotes_linter" -"demo/custom_objective.R",49,42,"style","Only use double-quotes.","attr(dtrain, 'label') <- getinfo(dtrain, 'label')","single_quotes_linter" -"demo/custom_objective.R",54,26,"style","Only use double-quotes."," labels <- attr(dtrain, 'label')","single_quotes_linter" -"demo/custom_objective.R",62,6,"style","Remove spaces before the left parenthesis in a function call.","print ('start training with user customized objective, with additional attributes in DMatrix')","function_left_parentheses_linter" -"demo/custom_objective.R",62,8,"style","Only use double-quotes.","print ('start training with user customized objective, with additional attributes in DMatrix')","single_quotes_linter" -"demo/custom_objective.R",62,81,"style","Lines should not be more than 80 characters.","print ('start training with user customized objective, with additional attributes in DMatrix')","line_length_linter" -"demo/early_stopping.R",3,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" -"demo/early_stopping.R",4,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" -"demo/early_stopping.R",13,81,"style","Lines should not be more than 80 characters.","# user define objective function, given prediction, return gradient and second order gradient","line_length_linter" -"demo/early_stopping.R",23,81,"style","Lines should not be more than 80 characters.","# NOTE: when you do customized loss function, the default prediction value is margin","line_length_linter" -"demo/early_stopping.R",25,81,"style","Lines should not be more than 80 characters.","# for example, we are doing logistic loss, the prediction is score before logistic transformation","line_length_linter" -"demo/early_stopping.R",27,81,"style","Lines should not be more than 80 characters.","# Take this in mind when you use the customization, and maybe you need write customized evaluation function","line_length_linter" -"demo/early_stopping.R",33,6,"style","Remove spaces before the left parenthesis in a function call.","print ('start training with early Stopping setting')","function_left_parentheses_linter" -"demo/early_stopping.R",33,8,"style","Only use double-quotes.","print ('start training with early Stopping setting')","single_quotes_linter" -"demo/early_stopping.R",36,81,"style","Lines should not be more than 80 characters."," objective = logregobj, eval_metric = evalerror, maximize = FALSE,","line_length_linter" -"demo/generalized_linear_model.R",3,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" -"demo/generalized_linear_model.R",4,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" -"demo/generalized_linear_model.R",32,26,"style","Only use double-quotes.","labels <- getinfo(dtest, 'label')","single_quotes_linter" -"demo/generalized_linear_model.R",33,5,"style","Only use double-quotes.","cat('error of preds=', mean(as.numeric(ypred > 0.5) != labels), '\n')","single_quotes_linter" -"demo/generalized_linear_model.R",33,65,"style","Only use double-quotes.","cat('error of preds=', mean(as.numeric(ypred > 0.5) != labels), '\n')","single_quotes_linter" -"demo/gpu_accelerated.R",10,9,"style","Only use double-quotes.","library('xgboost')","single_quotes_linter" -"demo/gpu_accelerated.R",12,81,"style","Lines should not be more than 80 characters.","# Simulate N x p random matrix with some binomial response dependent on pp columns","line_length_linter" -"demo/gpu_accelerated.R",14,1,"style","Variable and function name style should be snake_case or symbols.","N <- 1000000","object_name_linter" -"demo/gpu_accelerated.R",17,1,"style","Variable and function name style should be snake_case or symbols.","X <- matrix(runif(N * p), ncol = p)","object_name_linter" -"demo/gpu_accelerated.R",35,27,"style","Only use double-quotes.","param <- list(objective = 'reg:logistic', eval_metric = 'auc', subsample = 0.5, nthread = 4,","single_quotes_linter" -"demo/gpu_accelerated.R",35,57,"style","Only use double-quotes.","param <- list(objective = 'reg:logistic', eval_metric = 'auc', subsample = 0.5, nthread = 4,","single_quotes_linter" -"demo/gpu_accelerated.R",35,81,"style","Lines should not be more than 80 characters.","param <- list(objective = 'reg:logistic', eval_metric = 'auc', subsample = 0.5, nthread = 4,","line_length_linter" -"demo/gpu_accelerated.R",36,43,"style","Only use double-quotes."," max_bin = 64, tree_method = 'gpu_hist')","single_quotes_linter" -"demo/gpu_accelerated.R",42,22,"style","Only use double-quotes.","param$tree_method <- 'hist'","single_quotes_linter" -"demo/interaction_constraints.R",6,81,"style","Lines should not be more than 80 characters.","# Function to obtain a list of interactions fitted in trees, requires input of maximum depth","line_length_linter" -"demo/interaction_constraints.R",7,1,"style","Variable and function name style should be snake_case or symbols.","treeInteractions <- function(input_tree, input_max_depth) {","object_name_linter" -"demo/interaction_constraints.R",8,3,"style","Variable and function name style should be snake_case or symbols."," ID_merge <- i.id <- i.feature <- NULL # Suppress warning ""no visible binding for global variable""","object_name_linter" -"demo/interaction_constraints.R",8,15,"style","Variable and function name style should be snake_case or symbols."," ID_merge <- i.id <- i.feature <- NULL # Suppress warning ""no visible binding for global variable""","object_name_linter" -"demo/interaction_constraints.R",8,23,"style","Variable and function name style should be snake_case or symbols."," ID_merge <- i.id <- i.feature <- NULL # Suppress warning ""no visible binding for global variable""","object_name_linter" -"demo/interaction_constraints.R",8,81,"style","Lines should not be more than 80 characters."," ID_merge <- i.id <- i.feature <- NULL # Suppress warning ""no visible binding for global variable""","line_length_linter" -"demo/interaction_constraints.R",10,81,"style","Lines should not be more than 80 characters."," trees <- data.table::copy(input_tree) # copy tree input to prevent overwriting","line_length_linter" -"demo/interaction_constraints.R",16,77,"style","Only use double-quotes."," if (i == 2) trees[, ID_merge := ID] else trees[, ID_merge := get(paste0('parent_', i - 2))]","single_quotes_linter" -"demo/interaction_constraints.R",16,81,"style","Lines should not be more than 80 characters."," if (i == 2) trees[, ID_merge := ID] else trees[, ID_merge := get(paste0('parent_', i - 2))]","line_length_linter" -"demo/interaction_constraints.R",17,81,"style","Lines should not be more than 80 characters."," parents_left <- trees[!is.na(Split), list(i.id = ID, i.feature = Feature, ID_merge = Yes)]","line_length_linter" -"demo/interaction_constraints.R",18,81,"style","Lines should not be more than 80 characters."," parents_right <- trees[!is.na(Split), list(i.id = ID, i.feature = Feature, ID_merge = No)]","line_length_linter" -"demo/interaction_constraints.R",20,34,"style","Only use double-quotes."," data.table::setorderv(trees, 'ID_merge')","single_quotes_linter" -"demo/interaction_constraints.R",21,41,"style","Only use double-quotes."," data.table::setorderv(parents_left, 'ID_merge')","single_quotes_linter" -"demo/interaction_constraints.R",22,42,"style","Only use double-quotes."," data.table::setorderv(parents_right, 'ID_merge')","single_quotes_linter" -"demo/interaction_constraints.R",24,46,"style","Only use double-quotes."," trees <- merge(trees, parents_left, by = 'ID_merge', all.x = TRUE)","single_quotes_linter" -"demo/interaction_constraints.R",25,34,"style","Only use double-quotes."," trees[!is.na(i.id), c(paste0('parent_', i - 1), paste0('parent_feat_', i - 1))","single_quotes_linter" -"demo/interaction_constraints.R",25,60,"style","Only use double-quotes."," trees[!is.na(i.id), c(paste0('parent_', i - 1), paste0('parent_feat_', i - 1))","single_quotes_linter" -"demo/interaction_constraints.R",25,81,"style","Lines should not be more than 80 characters."," trees[!is.na(i.id), c(paste0('parent_', i - 1), paste0('parent_feat_', i - 1))","line_length_linter" -"demo/interaction_constraints.R",27,15,"style","Only use double-quotes."," trees[, c('i.id', 'i.feature') := NULL]","single_quotes_linter" -"demo/interaction_constraints.R",27,23,"style","Only use double-quotes."," trees[, c('i.id', 'i.feature') := NULL]","single_quotes_linter" -"demo/interaction_constraints.R",29,47,"style","Only use double-quotes."," trees <- merge(trees, parents_right, by = 'ID_merge', all.x = TRUE)","single_quotes_linter" -"demo/interaction_constraints.R",30,34,"style","Only use double-quotes."," trees[!is.na(i.id), c(paste0('parent_', i - 1), paste0('parent_feat_', i - 1))","single_quotes_linter" -"demo/interaction_constraints.R",30,60,"style","Only use double-quotes."," trees[!is.na(i.id), c(paste0('parent_', i - 1), paste0('parent_feat_', i - 1))","single_quotes_linter" -"demo/interaction_constraints.R",30,81,"style","Lines should not be more than 80 characters."," trees[!is.na(i.id), c(paste0('parent_', i - 1), paste0('parent_feat_', i - 1))","line_length_linter" -"demo/interaction_constraints.R",32,15,"style","Only use double-quotes."," trees[, c('i.id', 'i.feature') := NULL]","single_quotes_linter" -"demo/interaction_constraints.R",32,23,"style","Only use double-quotes."," trees[, c('i.id', 'i.feature') := NULL]","single_quotes_linter" -"demo/interaction_constraints.R",36,53,"warning","no visible binding for global variable β€˜parent_1’"," interaction_trees <- trees[!is.na(Split) & !is.na(parent_1),","object_usage_linter" -"demo/interaction_constraints.R",37,32,"style","Only use double-quotes."," c('Feature', paste0('parent_feat_', 1:(input_max_depth - 1))),","single_quotes_linter" -"demo/interaction_constraints.R",37,50,"style","Only use double-quotes."," c('Feature', paste0('parent_feat_', 1:(input_max_depth - 1))),","single_quotes_linter" -"demo/interaction_constraints.R",37,81,"style","Lines should not be more than 80 characters."," c('Feature', paste0('parent_feat_', 1:(input_max_depth - 1))),","line_length_linter" -"demo/interaction_constraints.R",39,81,"style","Lines should not be more than 80 characters."," interaction_trees_split <- split(interaction_trees, seq_len(nrow(interaction_trees)))","line_length_linter" -"demo/interaction_constraints.R",60,34,"style","Only use double-quotes.","y <- -1 * x[, rowSums(.SD)] + x[['V1']] * x[['V2']] + x[['V3']] * x[['V4']] * x[['V5']]","single_quotes_linter" -"demo/interaction_constraints.R",60,46,"style","Only use double-quotes.","y <- -1 * x[, rowSums(.SD)] + x[['V1']] * x[['V2']] + x[['V3']] * x[['V4']] * x[['V5']]","single_quotes_linter" -"demo/interaction_constraints.R",60,58,"style","Only use double-quotes.","y <- -1 * x[, rowSums(.SD)] + x[['V1']] * x[['V2']] + x[['V3']] * x[['V4']] * x[['V5']]","single_quotes_linter" -"demo/interaction_constraints.R",60,70,"style","Only use double-quotes.","y <- -1 * x[, rowSums(.SD)] + x[['V1']] * x[['V2']] + x[['V3']] * x[['V4']] * x[['V5']]","single_quotes_linter" -"demo/interaction_constraints.R",60,81,"style","Lines should not be more than 80 characters.","y <- -1 * x[, rowSums(.SD)] + x[['V1']] * x[['V2']] + x[['V3']] * x[['V4']] * x[['V5']]","line_length_linter" -"demo/interaction_constraints.R",60,82,"style","Only use double-quotes.","y <- -1 * x[, rowSums(.SD)] + x[['V1']] * x[['V2']] + x[['V3']] * x[['V4']] * x[['V5']]","single_quotes_linter" -"demo/interaction_constraints.R",61,40,"style","Only use double-quotes."," + rnorm(1000, 0.001) + 3 * sin(x[['V7']])","single_quotes_linter" -"demo/interaction_constraints.R",66,28,"style","Only use double-quotes.","interaction_list <- list(c('V1', 'V2'), c('V3', 'V4', 'V5'))","single_quotes_linter" -"demo/interaction_constraints.R",66,34,"style","Only use double-quotes.","interaction_list <- list(c('V1', 'V2'), c('V3', 'V4', 'V5'))","single_quotes_linter" -"demo/interaction_constraints.R",66,43,"style","Only use double-quotes.","interaction_list <- list(c('V1', 'V2'), c('V3', 'V4', 'V5'))","single_quotes_linter" -"demo/interaction_constraints.R",66,49,"style","Only use double-quotes.","interaction_list <- list(c('V1', 'V2'), c('V3', 'V4', 'V5'))","single_quotes_linter" -"demo/interaction_constraints.R",66,55,"style","Only use double-quotes.","interaction_list <- list(c('V1', 'V2'), c('V3', 'V4', 'V5'))","single_quotes_linter" -"demo/interaction_constraints.R",70,3,"style","Variable and function name style should be snake_case or symbols."," LUT <- seq_along(col_names) - 1","object_name_linter" -"demo/interaction_constraints.R",71,9,"style","Variable and function name style should be snake_case or symbols."," names(LUT) <- col_names","object_name_linter" -"demo/interaction_constraints.R",102,81,"style","Lines should not be more than 80 characters.","# Show monotonic constraints still apply by checking scores after incrementing V1","line_length_linter" -"demo/interaction_constraints.R",103,22,"style","Only use double-quotes.","x1 <- sort(unique(x[['V1']]))","single_quotes_linter" -"demo/interaction_constraints.R",105,27,"style","Only use double-quotes."," testdata <- copy(x[, - ('V1')])","single_quotes_linter" -"demo/interaction_constraints.R",106,13,"style","Only use double-quotes."," testdata[['V1']] <- x1[i]","single_quotes_linter" -"demo/interaction_constraints.R",107,33,"style","Only use double-quotes."," testdata <- testdata[, paste0('V', 1:10), with = FALSE]","single_quotes_linter" -"demo/poisson_regression.R",4,28,"style","Only use double-quotes."," objective = 'count:poisson', nrounds = 5)","single_quotes_linter" -"demo/predict_first_ntree.R",3,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" -"demo/predict_first_ntree.R",4,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" -"demo/predict_first_ntree.R",8,51,"style","Only use double-quotes.","param <- list(max_depth = 2, eta = 1, objective = 'binary:logistic')","single_quotes_linter" -"demo/predict_first_ntree.R",14,5,"style","Only use double-quotes.","cat('start testing prediction from first n trees\n')","single_quotes_linter" -"demo/predict_first_ntree.R",15,26,"style","Only use double-quotes.","labels <- getinfo(dtest, 'label')","single_quotes_linter" -"demo/predict_first_ntree.R",22,5,"style","Only use double-quotes.","cat('error of ypred1=', mean(as.numeric(ypred1 > 0.5) != labels), '\n')","single_quotes_linter" -"demo/predict_first_ntree.R",22,67,"style","Only use double-quotes.","cat('error of ypred1=', mean(as.numeric(ypred1 > 0.5) != labels), '\n')","single_quotes_linter" -"demo/predict_first_ntree.R",23,5,"style","Only use double-quotes.","cat('error of ypred2=', mean(as.numeric(ypred2 > 0.5) != labels), '\n')","single_quotes_linter" -"demo/predict_first_ntree.R",23,67,"style","Only use double-quotes.","cat('error of ypred2=', mean(as.numeric(ypred2 > 0.5) != labels), '\n')","single_quotes_linter" -"demo/predict_leaf_indices.R",8,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" -"demo/predict_leaf_indices.R",9,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" -"demo/predict_leaf_indices.R",13,51,"style","Only use double-quotes.","param <- list(max_depth = 2, eta = 1, objective = 'binary:logistic')","single_quotes_linter" -"demo/predict_leaf_indices.R",20,1,"style","Variable and function name style should be snake_case or symbols.","accuracy.before <- (sum((predict(bst, agaricus.test$data) >= 0.5) == agaricus.test$label)","object_name_linter" -"demo/predict_leaf_indices.R",20,81,"style","Lines should not be more than 80 characters.","accuracy.before <- (sum((predict(bst, agaricus.test$data) >= 0.5) == agaricus.test$label)","line_length_linter" -"demo/predict_leaf_indices.R",27,1,"style","Variable and function name style should be snake_case or symbols.","create.new.tree.features <- function(model, original.features){","object_name_linter" -"demo/predict_leaf_indices.R",27,45,"style","Variable and function name style should be snake_case or symbols.","create.new.tree.features <- function(model, original.features){","object_name_linter" -"demo/predict_leaf_indices.R",27,63,"style","There should be a space before an opening curly brace.","create.new.tree.features <- function(model, original.features){","brace_linter" -"demo/predict_leaf_indices.R",27,63,"style","There should be a space between a right parenthesis and a body expression.","create.new.tree.features <- function(model, original.features){","paren_body_linter" -"demo/predict_leaf_indices.R",31,81,"style","Lines should not be more than 80 characters."," # max is not the real max but it s not important for the purpose of adding features","line_length_linter" -"demo/predict_leaf_indices.R",32,5,"style","Variable and function name style should be snake_case or symbols."," leaf.id <- sort(unique(pred_with_leaf[, i]))","object_name_linter" -"demo/predict_leaf_indices.R",39,1,"style","Variable and function name style should be snake_case or symbols.","new.features.train <- create.new.tree.features(bst, agaricus.train$data)","object_name_linter" -"demo/predict_leaf_indices.R",40,1,"style","Variable and function name style should be snake_case or symbols.","new.features.test <- create.new.tree.features(bst, agaricus.test$data)","object_name_linter" -"demo/predict_leaf_indices.R",41,10,"style","Variable and function name style should be snake_case or symbols.","colnames(new.features.test) <- colnames(new.features.train)","object_name_linter" -"demo/predict_leaf_indices.R",44,1,"style","Variable and function name style should be snake_case or symbols.","new.dtrain <- xgb.DMatrix(data = new.features.train, label = agaricus.train$label)","object_name_linter" -"demo/predict_leaf_indices.R",44,81,"style","Lines should not be more than 80 characters.","new.dtrain <- xgb.DMatrix(data = new.features.train, label = agaricus.train$label)","line_length_linter" -"demo/predict_leaf_indices.R",45,1,"style","Variable and function name style should be snake_case or symbols.","new.dtest <- xgb.DMatrix(data = new.features.test, label = agaricus.test$label)","object_name_linter" -"demo/predict_leaf_indices.R",47,81,"style","Lines should not be more than 80 characters.","bst <- xgb.train(params = param, data = new.dtrain, nrounds = nrounds, nthread = 2)","line_length_linter" -"demo/predict_leaf_indices.R",50,1,"style","Variable and function name style should be snake_case or symbols.","accuracy.after <- (sum((predict(bst, new.dtest) >= 0.5) == agaricus.test$label)","object_name_linter" -"demo/predict_leaf_indices.R",54,81,"style","Lines should not be more than 80 characters.","cat(paste(""The accuracy was"", accuracy.before, ""before adding leaf features and it is now"",","line_length_linter" -"demo/runall.R",2,35,"style","Only use double-quotes.","demo(basic_walkthrough, package = 'xgboost')","single_quotes_linter" -"demo/runall.R",3,34,"style","Only use double-quotes.","demo(custom_objective, package = 'xgboost')","single_quotes_linter" -"demo/runall.R",4,39,"style","Only use double-quotes.","demo(boost_from_prediction, package = 'xgboost')","single_quotes_linter" -"demo/runall.R",5,37,"style","Only use double-quotes.","demo(predict_first_ntree, package = 'xgboost')","single_quotes_linter" -"demo/runall.R",6,42,"style","Only use double-quotes.","demo(generalized_linear_model, package = 'xgboost')","single_quotes_linter" -"demo/runall.R",7,34,"style","Only use double-quotes.","demo(cross_validation, package = 'xgboost')","single_quotes_linter" -"demo/runall.R",8,38,"style","Only use double-quotes.","demo(create_sparse_matrix, package = 'xgboost')","single_quotes_linter" -"demo/runall.R",9,38,"style","Only use double-quotes.","demo(predict_leaf_indices, package = 'xgboost')","single_quotes_linter" -"demo/runall.R",10,32,"style","Only use double-quotes.","demo(early_stopping, package = 'xgboost')","single_quotes_linter" -"demo/runall.R",11,36,"style","Only use double-quotes.","demo(poisson_regression, package = 'xgboost')","single_quotes_linter" -"demo/runall.R",12,31,"style","Only use double-quotes.","demo(caret_wrapper, package = 'xgboost')","single_quotes_linter" -"demo/runall.R",13,36,"style","Only use double-quotes.","demo(tweedie_regression, package = 'xgboost')","single_quotes_linter" -"demo/runall.R",14,2,"style","Commented code should be removed.","#demo(gpu_accelerated, package = 'xgboost') # can only run when built with GPU support","commented_code_linter" -"demo/runall.R",14,81,"style","Lines should not be more than 80 characters.","#demo(gpu_accelerated, package = 'xgboost') # can only run when built with GPU support","line_length_linter" -"demo/tweedie_regression.R",11,14,"style","Only use double-quotes.","exclude <- c('POLICYNO', 'PLCYDATE', 'CLM_FREQ5', 'CLM_AMT5', 'CLM_FLAG', 'IN_YY')","single_quotes_linter" -"demo/tweedie_regression.R",11,26,"style","Only use double-quotes.","exclude <- c('POLICYNO', 'PLCYDATE', 'CLM_FREQ5', 'CLM_AMT5', 'CLM_FLAG', 'IN_YY')","single_quotes_linter" -"demo/tweedie_regression.R",11,38,"style","Only use double-quotes.","exclude <- c('POLICYNO', 'PLCYDATE', 'CLM_FREQ5', 'CLM_AMT5', 'CLM_FLAG', 'IN_YY')","single_quotes_linter" -"demo/tweedie_regression.R",11,51,"style","Only use double-quotes.","exclude <- c('POLICYNO', 'PLCYDATE', 'CLM_FREQ5', 'CLM_AMT5', 'CLM_FLAG', 'IN_YY')","single_quotes_linter" -"demo/tweedie_regression.R",11,63,"style","Only use double-quotes.","exclude <- c('POLICYNO', 'PLCYDATE', 'CLM_FREQ5', 'CLM_AMT5', 'CLM_FLAG', 'IN_YY')","single_quotes_linter" -"demo/tweedie_regression.R",11,75,"style","Only use double-quotes.","exclude <- c('POLICYNO', 'PLCYDATE', 'CLM_FREQ5', 'CLM_AMT5', 'CLM_FLAG', 'IN_YY')","single_quotes_linter" -"demo/tweedie_regression.R",11,81,"style","Lines should not be more than 80 characters.","exclude <- c('POLICYNO', 'PLCYDATE', 'CLM_FREQ5', 'CLM_AMT5', 'CLM_FLAG', 'IN_YY')","line_length_linter" -"demo/tweedie_regression.R",15,21,"style","Only use double-quotes.","options(na.action = 'na.pass')","single_quotes_linter" -"demo/tweedie_regression.R",17,21,"style","Only use double-quotes.","options(na.action = 'na.omit')","single_quotes_linter" -"demo/tweedie_regression.R",32,15,"style","Only use double-quotes."," objective = 'reg:tweedie',","single_quotes_linter" -"demo/tweedie_regression.R",33,17,"style","Only use double-quotes."," eval_metric = 'rmse',","single_quotes_linter" -"demo/tweedie_regression.R",45,35,"style","Only use double-quotes.","var_imp <- xgb.importance(attr(x, 'Dimnames')[[2]], model = bst)","single_quotes_linter" -"R/callbacks.R",617,12,"style","Either both or neither branch in `if`/`else` should use curly braces."," } else if (!is.null(env$bst_folds)) { # xgb.cv:","brace_linter" -"R/xgb.Booster.R",55,1,"style","Variable and function name style should be snake_case or symbols.","is.null.handle <- function(handle) {","object_name_linter" -"R/xgb.Booster.R",632,43,"style","Trailing semicolons are not needed."," .Call(XGBoosterSaveJsonConfig_R, handle);","semicolon_linter" -"R/xgb.cv.R",121,62,"style","Put spaces around all infix operators."," prediction = FALSE, showsd = TRUE, metrics=list(),","infix_spaces_linter" -"R/xgb.cv.R",123,49,"style","Put spaces around all infix operators."," verbose = TRUE, print_every_n=1L,","infix_spaces_linter" -"R/xgb.DMatrix.R",388,15,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (verbose & !is.null(cnames)) {","vector_logic_linter" -"R/xgb.plot.multi.trees.R",97,25,"warning","1:min(...) is likely to be wrong in the empty edge case. Use seq_len() instead."," Feature[1:min(length(Feature), features_keep)],","seq_linter" -"R/xgb.plot.shap.R",276,29,"warning","1:min(...) is likely to be wrong in the empty edge case. Use seq_len() instead."," features <- imp$Feature[1:min(top_n, NROW(imp))]","seq_linter" -"tests/testthat/test_basic.R",407,40,"style","Trailing semicolons are not needed."," expect_equal(config, reloaded_config);","semicolon_linter" -"tests/testthat/test_helpers.R",95,12,"style","Variable and function name style should be snake_case or symbols."," colnames(X) <- NULL","object_name_linter" -"tests/testthat/test_helpers.R",173,11,"style","Any function spanning multiple lines should use curly braces."," pr <- function(...)","brace_linter" -"tests/testthat/test_helpers.R",191,3,"style","Variable and function name style should be snake_case or symbols."," list.ch <- list.val[order(names(list.val))]","object_name_linter" -"tests/testthat/test_helpers.R",192,3,"style","Variable and function name style should be snake_case or symbols."," list.ch <- lapply(list.ch, as.character)","object_name_linter" -"tests/testthat/test_helpers.R",194,3,"style","Variable and function name style should be snake_case or symbols."," list.default <- list(niter = as.character(nrounds - 1))","object_name_linter" -"tests/testthat/test_helpers.R",195,3,"style","Variable and function name style should be snake_case or symbols."," list.ch <- c(list.ch, list.default)","object_name_linter" -"tests/testthat/test_helpers.R",202,12,"style","Variable and function name style should be snake_case or symbols."," xgb.attr(bst.Tree, ""my_attr"") <- val","object_name_linter" -"tests/testthat/test_helpers.R",204,18,"style","Variable and function name style should be snake_case or symbols."," xgb.attributes(bst.Tree) <- list.val","object_name_linter" -"tests/testthat/test_helpers.R",235,18,"style","Variable and function name style should be snake_case or symbols."," xgb.attr(bst.Tree, ""x"") <- x","object_name_linter" -"tests/testthat/test_helpers.R",237,24,"style","Variable and function name style should be snake_case or symbols."," xgb.attributes(bst.Tree) <- list(a = ""A"", b = x)","object_name_linter" -"tests/testthat/test_helpers.R",274,3,"style","Variable and function name style should be snake_case or symbols."," bst.Tree.x$feature_names <- NULL","object_name_linter" -"tests/testthat/test_helpers.R",302,3,"style","Variable and function name style should be snake_case or symbols."," bst.Tree.x$feature_names <- NULL","object_name_linter" -"vignettes/discoverYourData.Rmd",31,14,"style","Only use double-quotes.","if (!require('vcd')) install.packages('vcd')","single_quotes_linter" -"vignettes/discoverYourData.Rmd",31,39,"style","Only use double-quotes.","if (!require('vcd')) install.packages('vcd')","single_quotes_linter" -"vignettes/discoverYourData.Rmd",103,10,"style","Commas should always have a space after.","head(df[,AgeDiscret := as.factor(round(Age/10,0))])","commas_linter" -"vignettes/discoverYourData.Rmd",103,43,"style","Put spaces around all infix operators.","head(df[,AgeDiscret := as.factor(round(Age/10,0))])","infix_spaces_linter" -"vignettes/discoverYourData.Rmd",103,47,"style","Commas should always have a space after.","head(df[,AgeDiscret := as.factor(round(Age/10,0))])","commas_linter" -"vignettes/discoverYourData.Rmd",111,10,"style","Commas should always have a space after.","head(df[,AgeCat:= as.factor(ifelse(Age > 30, ""Old"", ""Young""))])","commas_linter" -"vignettes/discoverYourData.Rmd",111,16,"style","Put spaces around all infix operators.","head(df[,AgeCat:= as.factor(ifelse(Age > 30, ""Old"", ""Young""))])","infix_spaces_linter" -"vignettes/discoverYourData.Rmd",127,5,"style","Commas should always have a space after.","df[,ID:=NULL]","commas_linter" -"vignettes/discoverYourData.Rmd",127,7,"style","Put spaces around all infix operators.","df[,ID:=NULL]","infix_spaces_linter" -"vignettes/discoverYourData.Rmd",133,12,"style","Commas should always have a space after.","levels(df[,Treatment])","commas_linter" -"vignettes/discoverYourData.Rmd",150,64,"style","Commas should always have a space after.","sparse_matrix <- sparse.model.matrix(Improved ~ ., data = df)[,-1]","commas_linter" -"vignettes/discoverYourData.Rmd",159,15,"style","Use <-, not =, for assignment.","output_vector = df[,Improved] == ""Marked""","assignment_linter" -"vignettes/discoverYourData.Rmd",159,21,"style","Commas should always have a space after.","output_vector = df[,Improved] == ""Marked""","commas_linter" -"vignettes/discoverYourData.Rmd",173,51,"style","Commas should always have a space after."," eta = 1, nthread = 2, nrounds = 10,objective = ""binary:logistic"")","commas_linter" -"vignettes/discoverYourData.Rmd",196,81,"style","Lines should not be more than 80 characters.","importance <- xgb.importance(feature_names = colnames(sparse_matrix), model = bst)","line_length_linter" -"vignettes/discoverYourData.Rmd",219,1,"style","Variable and function name style should be snake_case or symbols.","importanceRaw <- xgb.importance(feature_names = colnames(sparse_matrix), model = bst, data = sparse_matrix, label = output_vector)","object_name_linter" -"vignettes/discoverYourData.Rmd",219,81,"style","Lines should not be more than 80 characters.","importanceRaw <- xgb.importance(feature_names = colnames(sparse_matrix), model = bst, data = sparse_matrix, label = output_vector)","line_length_linter" -"vignettes/discoverYourData.Rmd",222,1,"style","Variable and function name style should be snake_case or symbols.","importanceClean <- importanceRaw[,`:=`(Cover=NULL, Frequency=NULL)]","object_name_linter" -"vignettes/discoverYourData.Rmd",222,35,"style","Commas should always have a space after.","importanceClean <- importanceRaw[,`:=`(Cover=NULL, Frequency=NULL)]","commas_linter" -"vignettes/discoverYourData.Rmd",222,45,"style","Put spaces around all infix operators.","importanceClean <- importanceRaw[,`:=`(Cover=NULL, Frequency=NULL)]","infix_spaces_linter" -"vignettes/discoverYourData.Rmd",222,61,"style","Put spaces around all infix operators.","importanceClean <- importanceRaw[,`:=`(Cover=NULL, Frequency=NULL)]","infix_spaces_linter" -"vignettes/discoverYourData.Rmd",324,29,"style","Put spaces around all infix operators.","data(agaricus.train, package='xgboost')","infix_spaces_linter" -"vignettes/discoverYourData.Rmd",324,30,"style","Only use double-quotes.","data(agaricus.train, package='xgboost')","single_quotes_linter" -"vignettes/discoverYourData.Rmd",325,28,"style","Put spaces around all infix operators.","data(agaricus.test, package='xgboost')","infix_spaces_linter" -"vignettes/discoverYourData.Rmd",325,29,"style","Only use double-quotes.","data(agaricus.test, package='xgboost')","single_quotes_linter" -"vignettes/discoverYourData.Rmd",330,81,"style","Lines should not be more than 80 characters.","bst <- xgboost(data = train$data, label = train$label, max_depth = 4, num_parallel_tree = 1000, subsample = 0.5, colsample_bytree =0.5, nrounds = 1, objective = ""binary:logistic"")","line_length_linter" -"vignettes/discoverYourData.Rmd",330,131,"style","Put spaces around all infix operators.","bst <- xgboost(data = train$data, label = train$label, max_depth = 4, num_parallel_tree = 1000, subsample = 0.5, colsample_bytree =0.5, nrounds = 1, objective = ""binary:logistic"")","infix_spaces_linter" -"vignettes/discoverYourData.Rmd",333,81,"style","Lines should not be more than 80 characters.","bst <- xgboost(data = train$data, label = train$label, max_depth = 4, nrounds = 3, objective = ""binary:logistic"")","line_length_linter" -"vignettes/xgboost.Rnw",19,13,"style","Only use double-quotes.","if (require('knitr')) opts_chunk$set(fig.width = 5, fig.height = 5, fig.align = 'center', tidy = FALSE, warning = FALSE, cache = TRUE)","single_quotes_linter" -"vignettes/xgboost.Rnw",19,81,"style","Lines should not be more than 80 characters.","if (require('knitr')) opts_chunk$set(fig.width = 5, fig.height = 5, fig.align = 'center', tidy = FALSE, warning = FALSE, cache = TRUE)","line_length_linter" -"vignettes/xgboost.Rnw",19,81,"style","Only use double-quotes.","if (require('knitr')) opts_chunk$set(fig.width = 5, fig.height = 5, fig.align = 'center', tidy = FALSE, warning = FALSE, cache = TRUE)","single_quotes_linter" -"vignettes/xgboost.Rnw",24,1,"style","Variable and function name style should be snake_case or symbols.","xgboost.version <- packageDescription(""xgboost"")$Version","object_name_linter" -"vignettes/xgboost.Rnw",84,29,"style","Put spaces around all infix operators.","data(agaricus.train, package='xgboost')","infix_spaces_linter" -"vignettes/xgboost.Rnw",84,30,"style","Only use double-quotes.","data(agaricus.train, package='xgboost')","single_quotes_linter" -"vignettes/xgboost.Rnw",85,28,"style","Put spaces around all infix operators.","data(agaricus.test, package='xgboost')","infix_spaces_linter" -"vignettes/xgboost.Rnw",85,29,"style","Only use double-quotes.","data(agaricus.test, package='xgboost')","single_quotes_linter" -"vignettes/xgboost.Rnw",90,15,"style","Only use double-quotes.","xgb.save(bst, 'model.save')","single_quotes_linter" -"vignettes/xgboost.Rnw",91,5,"style","Use <-, not =, for assignment.","bst = xgb.load('model.save')","assignment_linter" -"vignettes/xgboost.Rnw",91,16,"style","Only use double-quotes.","bst = xgb.load('model.save')","single_quotes_linter" -"vignettes/xgboost.Rnw",102,15,"style","Only use double-quotes.","xgb.dump(bst, 'model.dump')","single_quotes_linter" -"vignettes/xgboost.Rnw",132,21,"style","Commas should always have a space after.","head(getinfo(dtrain,'label'))","commas_linter" -"vignettes/xgboost.Rnw",132,21,"style","Only use double-quotes.","head(getinfo(dtrain,'label'))","single_quotes_linter" -"vignettes/xgboost.Rnw",138,26,"style","Only use double-quotes.","xgb.DMatrix.save(dtrain, 'xgb.DMatrix')","single_quotes_linter" -"vignettes/xgboost.Rnw",139,8,"style","Use <-, not =, for assignment.","dtrain = xgb.DMatrix('xgb.DMatrix')","assignment_linter" -"vignettes/xgboost.Rnw",139,22,"style","Only use double-quotes.","dtrain = xgb.DMatrix('xgb.DMatrix')","single_quotes_linter" -"vignettes/xgboost.Rnw",152,14,"style","Put spaces around all infix operators."," preds <- 1/(1 + exp(-preds))","infix_spaces_linter" -"vignettes/xgboost.Rnw",152,15,"style","Place a space before left parenthesis, except in a function call."," preds <- 1/(1 + exp(-preds))","spaces_left_parentheses_linter" -"vignettes/xgboost.Rnw",160,26,"style","Put spaces around all infix operators."," err <- sqrt(mean((preds-labels)^2))","infix_spaces_linter" -"vignettes/xgboost.Rnw",168,81,"style","Lines should not be more than 80 characters.","bst <- xgb.train(param, dtrain, nrounds = 2, watchlist, logregobj, evalerror, maximize = FALSE)","line_length_linter" -"vignettes/xgboostfromJSON.Rmd",33,15,"style","Put spaces around all infix operators.","options(digits=22)","infix_spaces_linter" -"vignettes/xgboostfromJSON.Rmd",53,41,"style","Put spaces around all infix operators.","data <- data.frame(dates = dates, labels=labels)","infix_spaces_linter" -"vignettes/xgboostfromJSON.Rmd",56,32,"style","Trailing whitespace is superfluous."," data = as.matrix(data$dates), ","trailing_whitespace_linter" -"vignettes/xgboostfromJSON.Rmd",72,58,"style","Put spaces around all infix operators.","bst_json <- xgb.dump(bst, with_stats = FALSE, dump_format='json')","infix_spaces_linter" -"vignettes/xgboostfromJSON.Rmd",72,59,"style","Only use double-quotes.","bst_json <- xgb.dump(bst, with_stats = FALSE, dump_format='json')","single_quotes_linter" -"vignettes/xgboostfromJSON.Rmd",81,34,"style","Commas should always have a space after.","bst_preds_logodds <- predict(bst,as.matrix(data$dates), outputmargin = TRUE)","commas_linter" -"vignettes/xgboostfromJSON.Rmd",84,43,"style","Put spaces around all infix operators.","bst_from_json_logodds <- ifelse(data$dates 0.5) != label))/length(label)","infix_spaces_linter" -"vignettes/xgboostPresentation.Rmd",399,51,"style","Put spaces around all infix operators.","print(paste(""sum(abs(pred2-pred))="", sum(abs(pred2-pred))))","infix_spaces_linter" -"vignettes/xgboostPresentation.Rmd",413,1,"style","Variable and function name style should be snake_case or symbols.","rawVec <- xgb.serialize(bst)","object_name_linter" -"vignettes/xgboostPresentation.Rmd",423,51,"style","Put spaces around all infix operators.","print(paste(""sum(abs(pred3-pred))="", sum(abs(pred2-pred))))","infix_spaces_linter" diff --git a/.dev/revdep_emails/xgboost/email-body b/.dev/revdep_emails/xgboost/email-body deleted file mode 100644 index 76282c6d5..000000000 --- a/.dev/revdep_emails/xgboost/email-body +++ /dev/null @@ -1,27 +0,0 @@ -Hello Jiaming Yuan! Thank you for using {lintr} in your package {xgboost}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/dmlc/xgboost using -the CRAN version v2.0.1 and the current version in development (commit hash e4e908158d7f5be8f1cbe16c780a19f42cd3efe2). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 69s on CRAN vs. 50s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes: any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes: any warnings generated from lint_package() using the latest version, if none existed using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - From 0c355440d7d2cbb4be4f15ed767ee7a749f201e7 Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Sun, 5 Jun 2022 14:13:40 -0700 Subject: [PATCH 38/49] must supply repos= in batch mode --- .dev/revdep_get_repos.R | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/.dev/revdep_get_repos.R b/.dev/revdep_get_repos.R index ef5a46cd2..3c1bf4107 100755 --- a/.dev/revdep_get_repos.R +++ b/.dev/revdep_get_repos.R @@ -2,7 +2,7 @@ # Script to get URL keys from CRAN # of packags that Suggest or Import lintr -cran_db <- as.data.frame(available.packages(), stringsAsFactors = FALSE) +cran_db <- as.data.frame(available.packages(repos = "https://cran.r-project.org"), stringsAsFactors = FALSE) lintr_re <- "\\blintr\\b" lintr_pkg <- cran_db[ with(cran_db, grepl(lintr_re, Suggests) | grepl(lintr_re, Imports)), From a7d682a4c4c355300619f5d0428e3c592a1ab80a Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Sun, 5 Jun 2022 14:34:50 -0700 Subject: [PATCH 39/49] fresh run --- .dev/revdep-no-repos | 17 ++++++++ .dev/revdep-repos | 91 +++++++++++++++++++++++++++++++++++++++++ .dev/revdep_get_repos.R | 2 +- 3 files changed, 109 insertions(+), 1 deletion(-) create mode 100644 .dev/revdep-no-repos create mode 100644 .dev/revdep-repos diff --git a/.dev/revdep-no-repos b/.dev/revdep-no-repos new file mode 100644 index 000000000..087d97f2e --- /dev/null +++ b/.dev/revdep-no-repos @@ -0,0 +1,17 @@ +package,repo +adaptalint,https://github.com/cran/adaptalint +autoharp,https://github.com/cran/autoharp +aws.alexa,https://github.com/cran/aws.alexa +biolink,https://github.com/cran/biolink +ConNEcT,https://github.com/cran/ConNEcT +DataFakeR,https://github.com/cran/DataFakeR +datarobot,https://github.com/cran/datarobot +DominoDataCapture,https://github.com/cran/DominoDataCapture +INSPECTumours,https://github.com/cran/INSPECTumours +NHSRplotthedots,https://github.com/cran/NHSRplotthedots +Plasmidprofiler,https://github.com/cran/Plasmidprofiler +rdomains,https://github.com/cran/rdomains +SamplerCompare,https://github.com/cran/SamplerCompare +shiny.react,https://github.com/cran/shiny.react +TDA,https://github.com/cran/TDA +wavefunction,https://github.com/cran/wavefunction diff --git a/.dev/revdep-repos b/.dev/revdep-repos new file mode 100644 index 000000000..4f1f348be --- /dev/null +++ b/.dev/revdep-repos @@ -0,0 +1,91 @@ +package,repo +abbyyR,http://github.com/soodoku/abbyyR +admiral,https://github.com/pharmaverse/admiral +babette,https://github.com/ropensci/babette +beautier,https://github.com/ropensci/beautier +BiasCorrector,https://github.com/kapsner/BiasCorrector +BTYDplus,https://github.com/mplatzer/BTYDplus +caretEnsemble,https://github.com/zachmayer/caretEnsemble +cattonum,https://github.com/bfgray3/cattonum +cleaR,https://github.com/joundso/cleaR +cloudos,https://github.com/lifebit-ai/cloudos +cmstatr,https://github.com/cmstatr/cmstatr +connectwidgets,https://github.com/rstudio/connectwidgets +crunch,https://github.com/Crunch-io/rcrunch +dampack,https://github.com/DARTH-git/dampack +dashboardthemes,https://github.com/nik01010/dashboardthemes +dat,https://github.com/wahani/dat +datastructures,https://github.com/dirmeier/datastructures +DBItest,https://github.com/r-dbi/DBItest +DepthProc,https://github.com/zzawadz/DepthProc +describer,https://github.com/paulhendricks/describer +devtools,https://github.com/r-lib/devtools +diffusr,https://github.com/dirmeier/diffusr +dittodb,https://github.com/ropensci/dittodb +DIZtools,https://github.com/miracum/misc-diztools +DIZutils,https://github.com/miracum/misc-dizutils +DQAgui,https://github.com/miracum/dqa-dqagui +dupree,https://github.com/russHyde/dupree +dyn.log,https://github.com/bmoretz/dyn.log +edgarWebR,https://github.com/mwaldstein/edgarWebR +emayili,https://github.com/datawookie/emayili +epigraphdb,https://github.com/MRCIEU/epigraphdb-r +fakemake,https://gitlab.com/fvafrcu/fakemake +fixtuRes,https://github.com/jakubnowicki/fixtuRes +FSelectorRcpp,https://github.com/mi2-warsaw/FSelectorRcpp +fst,https://github.com/fstpackage/fst +fstcore,https://github.com/fstpackage/fst +geofacet,https://github.com/hafen/geofacet +geogrid,https://github.com/jbaileyh/geogrid +ggcharts,https://github.com/thomas-neitmann/ggcharts +ggfortify,https://github.com/sinhrks/ggfortify +ggRandomForests,https://github.com/ehrlinger/ggRandomForests +ggthemes,https://github.com/jrnold/ggthemes +healthcareai,https://github.com/HealthCatalyst/healthcareai-r +i18n,https://github.com/rich-iannone/i18n +jpmesh,https://github.com/uribo/jpmesh +languageserver,https://github.com/REditorSupport/languageserver +latrend,https://github.com/philips-software/latrend +lifecycle,https://github.com/r-lib/lifecycle +mlflow,https://github.com/mlflow/mlflow +mlr,https://github.com/mlr-org/mlr +mlrCPO,https://github.com/mlr-org/mlrCPO +modules,https://github.com/wahani/modules +newsmd,https://github.com/Dschaykib/newsmd +nLTT,https://github.com/thijsjanzen/nLTT +openbankeR,https://github.com/nik01010/openbankeR +OpenML,https://github.com/openml/openml-r +osfr,https://github.com/ropensci/osfr +packager,https://gitlab.com/fvafrCU/packager +physiology,https://github.com/jackwasey/physiology +PosteriorBootstrap,https://github.com/alan-turing-institute/PosteriorBootstrap +precommit,https://github.com/lorenzwalthert/precommit +prettyB,https://github.com/jumpingrivers/prettyB +PWFSLSmoke,https://github.com/MazamaScience/PWFSLSmoke +rasterpdf,https://github.com/ilarischeinin/rasterpdf +rBiasCorrection,https://github.com/kapsner/rBiasCorrection +rbokeh,https://github.com/bokeh/rbokeh +rde,https://github.com/kloppen/rde +requiRements,https://github.com/joundso/requirements +RestRserve,https://github.com/rexyai/RestRserve +rhino,https://github.com/Appsilon/rhino +rnrfa,https://github.com/cvitolo/rnrfa +roadoi,https://github.com/ropensci/roadoi +RSQL,https://github.com/rOpenStats/RSQL +scriptexec,https://github.com/sagiegurari/scriptexec +secuTrialR,https://github.com/SwissClinicalTrialOrganisation/secuTrialR +semantic.dashboard,https://github.com/Appsilon/semantic.dashboard +shiny.info,https://github.com/Appsilon/shiny.info +shiny.semantic,https://github.com/Appsilon/shiny.semantic +smerc,https://github.com/jfrench/smerc +stencilaschema,https://github.com/stencila/schema +supernova,https://github.com/UCLATALL/supernova +tsviz,https://github.com/donlelef/tsviz +tuber,http://github.com/soodoku/tuber +unifir,https://github.com/ropensci/unifir +upsetjs,https://github.com/upsetjs/upsetjs_r +urlshorteneR,https://github.com/dmpe/urlshorteneR +virustotal,https://github.com/themains/virustotal +WikidataQueryServiceR,https://github.com/bearloga/WikidataQueryServiceR +WoodburyMatrix,https://github.com/mbertolacci/WoodburyMatrix +xgboost,https://github.com/dmlc/xgboost diff --git a/.dev/revdep_get_repos.R b/.dev/revdep_get_repos.R index 3c1bf4107..04a3e91a5 100755 --- a/.dev/revdep_get_repos.R +++ b/.dev/revdep_get_repos.R @@ -56,6 +56,6 @@ utils::write.csv( ) utils::write.csv( data.frame(package = lintr_pkg[matched], repo = git_urls[matched]), - "revdep-no-repos", + "revdep-repos", row.names = FALSE, quote = FALSE ) From 0685bb4b2799e86a40d577ce14b3f29d2b653930 Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Sun, 5 Jun 2022 16:51:28 -0700 Subject: [PATCH 40/49] improve display --- .dev/revdep_compare_releases.R | 8 +++++--- 1 file changed, 5 insertions(+), 3 deletions(-) diff --git a/.dev/revdep_compare_releases.R b/.dev/revdep_compare_releases.R index 68b71e25a..44316af66 100755 --- a/.dev/revdep_compare_releases.R +++ b/.dev/revdep_compare_releases.R @@ -175,7 +175,7 @@ summarize_lint_delta <- function(new, old) { sample(.N), head(.SD, 10L), by = linter - ][, .(line, linter, location = paste0(package, ":", filename)) + ][, .(line = sprintf("%s [%s]", line, linter), location = paste0(package, ":", filename)) ][, print(.SD)] message("Count of lints found on ", old_version, " but not on ", new_version, ": ", nrow(old_only)) @@ -186,8 +186,10 @@ summarize_lint_delta <- function(new, old) { sample(.N), head(.SD, 10L), by = linter - ][, .(line, linter, location = paste0(package, ":", filename)) + ][, .(line = sprintf("%s [%s]", line, linter), location = paste0(package, ":", filename)) ][, print(.SD)] + + NULL } # ---- Main linting execution ---- @@ -252,7 +254,7 @@ repo_data[, delta_pct := 100 * delta / elapsed_old] message("Comparison of time to run lint_package() on each repo (new - old; negative -> faster)") repo_data[ order(delta), - { print(.SD); quantile(delta, 0:10/10) } + { print(.SD, nrows = Inf); quantile(delta, 0:10/10) } ] # ---- Prepare e-mails for maintainers ---- From cafdd9e920f264f2d0b98ac573eb04a8d35dde9a Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Sun, 5 Jun 2022 16:51:41 -0700 Subject: [PATCH 41/49] adding back template e-mails after a fresh run --- .../BTYDplus/attachments/BTYDplus.warnings | 2 + .../attachments/lints_in_cran_not_devel.csv | 11 + .../attachments/lints_in_devel_not_cran.csv | 227 + .dev/revdep_emails/BTYDplus/email-body | 29 + .../attachments/BiasCorrector.warnings | 1 + .../attachments/lints_in_devel_not_cran.csv | 33 + .dev/revdep_emails/BiasCorrector/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 14 + .../attachments/lints_in_devel_not_cran.csv | 20 + .dev/revdep_emails/ConNEcT/email-body | 29 + .dev/revdep_emails/DBItest/email-body | 29 + .../DIZtools/attachments/DIZtools.warnings | 1 + .../attachments/lints_in_devel_not_cran.csv | 47 + .dev/revdep_emails/DIZtools/email-body | 29 + .../DIZutils/attachments/DIZutils.warnings | 1 + .../attachments/lints_in_devel_not_cran.csv | 62 + .dev/revdep_emails/DIZutils/email-body | 29 + .../DQAgui/attachments/DQAgui.warnings | 1 + .../attachments/lints_in_devel_not_cran.csv | 82 + .dev/revdep_emails/DQAgui/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 7 + .../attachments/lints_in_devel_not_cran.csv | 107 + .dev/revdep_emails/DataFakeR/email-body | 29 + .../DepthProc/attachments/DepthProc.failure | 1 + .dev/revdep_emails/DepthProc/email-body | 29 + .../DominoDataCapture/email-body | 29 + .../attachments/FSelectorRcpp.warnings | 1 + .../attachments/lints_in_cran_not_devel.csv | 5 + .../attachments/lints_in_devel_not_cran.csv | 68 + .dev/revdep_emails/FSelectorRcpp/email-body | 29 + .../attachments/lints_in_devel_not_cran.csv | 12 + .dev/revdep_emails/INSPECTumours/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 3 + .../attachments/lints_in_devel_not_cran.csv | 41 + .dev/revdep_emails/NHSRplotthedots/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 3 + .../attachments/lints_in_devel_not_cran.csv | 82 + .dev/revdep_emails/OpenML/email-body | 29 + .../attachments/PWFSLSmoke.warnings | 2 + .../attachments/lints_in_cran_not_devel.csv | 3 + .../attachments/lints_in_devel_not_cran.csv | 219 + .dev/revdep_emails/PWFSLSmoke/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 19 + .../attachments/lints_in_devel_not_cran.csv | 22 + .dev/revdep_emails/Plasmidprofiler/email-body | 29 + .../attachments/lints_in_devel_not_cran.csv | 24 + .../PosteriorBootstrap/email-body | 29 + .../RSQL/attachments/RSQL.warnings | 2 + .../attachments/lints_in_devel_not_cran.csv | 25 + .dev/revdep_emails/RSQL/email-body | 29 + .../RestRserve/attachments/RestRserve.failure | 1 + .../attachments/RestRserve.warnings | 1 + .dev/revdep_emails/RestRserve/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 15 + .../attachments/lints_in_devel_not_cran.csv | 91 + .dev/revdep_emails/SamplerCompare/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 5 + .../attachments/lints_in_devel_not_cran.csv | 262 + .dev/revdep_emails/TDA/email-body | 29 + .../WikidataQueryServiceR.warnings | 2 + .../WikidataQueryServiceR/email-body | 29 + .../attachments/WoodburyMatrix.warnings | 1 + .dev/revdep_emails/WoodburyMatrix/email-body | 29 + .dev/revdep_emails/abbyyR/email-body | 29 + .dev/revdep_emails/adaptalint/email-body | 29 + .../admiral/attachments/admiral.warnings | 1 + .../attachments/lints_in_devel_not_cran.csv | 37 + .dev/revdep_emails/admiral/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 11 + .../attachments/lints_in_devel_not_cran.csv | 54 + .dev/revdep_emails/autoharp/email-body | 29 + .../attachments/lints_in_devel_not_cran.csv | 23 + .dev/revdep_emails/aws.alexa/email-body | 29 + .../attachments/lints_in_devel_not_cran.csv | 5 + .dev/revdep_emails/babette/email-body | 29 + .../attachments/lints_in_devel_not_cran.csv | 3 + .dev/revdep_emails/beautier/email-body | 29 + .../attachments/lints_in_devel_not_cran.csv | 3 + .dev/revdep_emails/biolink/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 8 + .../attachments/lints_in_devel_not_cran.csv | 114 + .dev/revdep_emails/caretEnsemble/email-body | 29 + .../cattonum/attachments/cattonum.warnings | 1 + .../attachments/lints_in_cran_not_devel.csv | 2 + .dev/revdep_emails/cattonum/email-body | 29 + .../cleaR/attachments/cleaR.warnings | 1 + .../attachments/lints_in_devel_not_cran.csv | 29 + .dev/revdep_emails/cleaR/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 19 + .../attachments/lints_in_devel_not_cran.csv | 25 + .dev/revdep_emails/cloudos/email-body | 29 + .../attachments/lints_in_devel_not_cran.csv | 97 + .dev/revdep_emails/cmstatr/email-body | 29 + .../attachments/lints_in_devel_not_cran.csv | 9 + .dev/revdep_emails/connectwidgets/email-body | 29 + .../crunch/attachments/crunch.warnings | 2 + .../attachments/lints_in_cran_not_devel.csv | 2 + .../attachments/lints_in_devel_not_cran.csv | 765 + .dev/revdep_emails/crunch/email-body | 29 + .../dampack/attachments/dampack.warnings | 2 + .../attachments/lints_in_devel_not_cran.csv | 331 + .dev/revdep_emails/dampack/email-body | 29 + .../attachments/dashboardthemes.warnings | 263 + .../attachments/lints_in_devel_not_cran.csv | 3 + .dev/revdep_emails/dashboardthemes/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 7 + .../attachments/lints_in_devel_not_cran.csv | 44 + .dev/revdep_emails/dat/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 104 + .../attachments/lints_in_devel_not_cran.csv | 967 + .dev/revdep_emails/datarobot/email-body | 29 + .../attachments/datastructures.failure | 1 + .dev/revdep_emails/datastructures/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 2 + .dev/revdep_emails/describer/email-body | 29 + .dev/revdep_emails/devtools/email-body | 29 + .../diffusr/attachments/diffusr.failure | 1 + .dev/revdep_emails/diffusr/email-body | 29 + .../dittodb/attachments/dittodb.warnings | 1 + .../attachments/lints_in_devel_not_cran.csv | 728 + .dev/revdep_emails/dittodb/email-body | 29 + .../dupree/attachments/dupree.warnings | 1 + .dev/revdep_emails/dupree/email-body | 29 + .../dyn.log/attachments/dyn.log.warnings | 68 + .../attachments/lints_in_cran_not_devel.csv | 2 + .../attachments/lints_in_devel_not_cran.csv | 69 + .dev/revdep_emails/dyn.log/email-body | 29 + .../edgarWebR/attachments/edgarWebR.warnings | 2 + .../attachments/lints_in_devel_not_cran.csv | 19916 ++++++++++++++++ .dev/revdep_emails/edgarWebR/email-body | 29 + .../emayili/attachments/emayili.warnings | 1 + .../attachments/lints_in_devel_not_cran.csv | 7 + .dev/revdep_emails/emayili/email-body | 29 + .../attachments/epigraphdb.warnings | 1 + .dev/revdep_emails/epigraphdb/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 2 + .../attachments/lints_in_devel_not_cran.csv | 2 + .dev/revdep_emails/fakemake/email-body | 29 + .../fixtuRes/attachments/fixtuRes.warnings | 1 + .../attachments/lints_in_devel_not_cran.csv | 3 + .dev/revdep_emails/fixtuRes/email-body | 29 + .../attachments/lints_in_devel_not_cran.csv | 12 + .dev/revdep_emails/fst/email-body | 29 + .dev/revdep_emails/fstcore/email-body | 29 + .dev/revdep_emails/geofacet/email-body | 29 + .dev/revdep_emails/geogrid/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 12 + .../attachments/lints_in_devel_not_cran.csv | 357 + .dev/revdep_emails/ggRandomForests/email-body | 29 + .../ggcharts/attachments/ggcharts.warnings | 1 + .../attachments/lints_in_cran_not_devel.csv | 3 + .../attachments/lints_in_devel_not_cran.csv | 5 + .dev/revdep_emails/ggcharts/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 118 + .../attachments/lints_in_devel_not_cran.csv | 190 + .dev/revdep_emails/ggfortify/email-body | 29 + .../ggthemes/attachments/ggthemes.warnings | 2 + .../attachments/lints_in_cran_not_devel.csv | 2 + .../attachments/lints_in_devel_not_cran.csv | 48 + .dev/revdep_emails/ggthemes/email-body | 29 + .../attachments/healthcareai.warnings | 2 + .../attachments/lints_in_devel_not_cran.csv | 149 + .dev/revdep_emails/healthcareai/email-body | 29 + .../attachments/lints_in_devel_not_cran.csv | 345 + .dev/revdep_emails/i18n/email-body | 29 + .../jpmesh/attachments/jpmesh.warnings | 1 + .../attachments/lints_in_devel_not_cran.csv | 3 + .dev/revdep_emails/jpmesh/email-body | 29 + .../attachments/languageserver.warnings | 2 + .dev/revdep_emails/languageserver/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 35 + .../attachments/lints_in_devel_not_cran.csv | 331 + .dev/revdep_emails/latrend/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 5 + .../attachments/lints_in_devel_not_cran.csv | 24 + .dev/revdep_emails/lifecycle/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 14 + .../attachments/lints_in_devel_not_cran.csv | 67 + .dev/revdep_emails/lightgbm/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 3 + .../attachments/lints_in_devel_not_cran.csv | 12 + .../mlflow/attachments/mlflow.warnings | 2 + .dev/revdep_emails/mlflow/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 152 + .../attachments/lints_in_devel_not_cran.csv | 791 + .../mlr/attachments/mlr.warnings | 2 + .dev/revdep_emails/mlr/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 4 + .../attachments/lints_in_devel_not_cran.csv | 441 + .dev/revdep_emails/mlrCPO/email-body | 29 + .../attachments/lints_in_devel_not_cran.csv | 12 + .../modules/attachments/modules.warnings | 1 + .dev/revdep_emails/modules/email-body | 29 + .../attachments/lints_in_devel_not_cran.csv | 2 + .dev/revdep_emails/nLTT/email-body | 29 + .dev/revdep_emails/newsmd/email-body | 29 + .../attachments/openbankeR.warnings | 68 + .dev/revdep_emails/openbankeR/email-body | 29 + .../attachments/lints_in_devel_not_cran.csv | 8 + .../osfr/attachments/osfr.warnings | 1 + .dev/revdep_emails/osfr/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 5 + .../attachments/lints_in_devel_not_cran.csv | 29 + .../packager/attachments/packager.warnings | 1 + .dev/revdep_emails/packager/email-body | 29 + .../attachments/lints_in_devel_not_cran.csv | 58 + .../attachments/physiology.warnings | 2 + .dev/revdep_emails/physiology/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 8 + .../attachments/lints_in_devel_not_cran.csv | 17 + .dev/revdep_emails/precommit/email-body | 29 + .../attachments/lints_in_devel_not_cran.csv | 23 + .../prettyB/attachments/prettyB.warnings | 1 + .dev/revdep_emails/prettyB/email-body | 29 + .../attachments/lints_in_devel_not_cran.csv | 110 + .../attachments/rBiasCorrection.warnings | 1 + .dev/revdep_emails/rBiasCorrection/email-body | 29 + .dev/revdep_emails/rasterpdf/email-body | 29 + .dev/revdep_emails/rbokeh/email-body | 29 + .../attachments/lints_in_devel_not_cran.csv | 12 + .dev/revdep_emails/rde/email-body | 29 + .../attachments/lints_in_devel_not_cran.csv | 13 + .dev/revdep_emails/rdomains/email-body | 29 + .../attachments/lints_in_devel_not_cran.csv | 20 + .../attachments/requiRements.warnings | 1 + .dev/revdep_emails/requiRements/email-body | 29 + .../attachments/lints_in_devel_not_cran.csv | 2 + .../rhino/attachments/rhino.warnings | 1 + .dev/revdep_emails/rhino/email-body | 29 + .../attachments/lints_in_devel_not_cran.csv | 65 + .dev/revdep_emails/rnrfa/email-body | 29 + .dev/revdep_emails/roadoi/email-body | 29 + .../attachments/scriptexec.warnings | 1 + .dev/revdep_emails/scriptexec/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 17 + .../attachments/lints_in_devel_not_cran.csv | 41 + .dev/revdep_emails/secuTrialR/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 5 + .../attachments/lints_in_devel_not_cran.csv | 8 + .../semantic.dashboard/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 3 + .../attachments/lints_in_devel_not_cran.csv | 3 + .dev/revdep_emails/shiny.info/email-body | 29 + .../attachments/lints_in_devel_not_cran.csv | 6 + .dev/revdep_emails/shiny.react/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 30 + .../attachments/lints_in_devel_not_cran.csv | 24 + .dev/revdep_emails/shiny.semantic/email-body | 29 + .../attachments/lints_in_devel_not_cran.csv | 93 + .dev/revdep_emails/smerc/email-body | 29 + .../attachments/lints_in_devel_not_cran.csv | 3 + .../attachments/stencilaschema.warnings | 1 + .dev/revdep_emails/stencilaschema/email-body | 29 + .../attachments/lints_in_devel_not_cran.csv | 4 + .../supernova/attachments/supernova.warnings | 1 + .dev/revdep_emails/supernova/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 2 + .../attachments/lints_in_devel_not_cran.csv | 2 + .../tsviz/attachments/tsviz.warnings | 1 + .dev/revdep_emails/tsviz/email-body | 29 + .../tuber/attachments/tuber.failure | 1 + .../tuber/attachments/tuber.warnings | 1 + .dev/revdep_emails/tuber/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 5 + .../attachments/lints_in_devel_not_cran.csv | 8 + .dev/revdep_emails/unifir/email-body | 29 + .../attachments/lints_in_devel_not_cran.csv | 189 + .../upsetjs/attachments/upsetjs.warnings | 1 + .dev/revdep_emails/upsetjs/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 2 + .../attachments/lints_in_devel_not_cran.csv | 23 + .dev/revdep_emails/urlshorteneR/email-body | 29 + .dev/revdep_emails/virustotal/email-body | 29 + .../attachments/lints_in_devel_not_cran.csv | 4 + .dev/revdep_emails/wavefunction/email-body | 29 + .../attachments/lints_in_cran_not_devel.csv | 29 + .../attachments/lints_in_devel_not_cran.csv | 367 + .dev/revdep_emails/xgboost/email-body | 29 + 278 files changed, 32840 insertions(+) create mode 100644 .dev/revdep_emails/BTYDplus/attachments/BTYDplus.warnings create mode 100644 .dev/revdep_emails/BTYDplus/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/BTYDplus/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/BTYDplus/email-body create mode 100644 .dev/revdep_emails/BiasCorrector/attachments/BiasCorrector.warnings create mode 100644 .dev/revdep_emails/BiasCorrector/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/BiasCorrector/email-body create mode 100644 .dev/revdep_emails/ConNEcT/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/ConNEcT/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/ConNEcT/email-body create mode 100644 .dev/revdep_emails/DBItest/email-body create mode 100644 .dev/revdep_emails/DIZtools/attachments/DIZtools.warnings create mode 100644 .dev/revdep_emails/DIZtools/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/DIZtools/email-body create mode 100644 .dev/revdep_emails/DIZutils/attachments/DIZutils.warnings create mode 100644 .dev/revdep_emails/DIZutils/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/DIZutils/email-body create mode 100644 .dev/revdep_emails/DQAgui/attachments/DQAgui.warnings create mode 100644 .dev/revdep_emails/DQAgui/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/DQAgui/email-body create mode 100644 .dev/revdep_emails/DataFakeR/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/DataFakeR/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/DataFakeR/email-body create mode 100644 .dev/revdep_emails/DepthProc/attachments/DepthProc.failure create mode 100644 .dev/revdep_emails/DepthProc/email-body create mode 100644 .dev/revdep_emails/DominoDataCapture/email-body create mode 100644 .dev/revdep_emails/FSelectorRcpp/attachments/FSelectorRcpp.warnings create mode 100644 .dev/revdep_emails/FSelectorRcpp/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/FSelectorRcpp/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/FSelectorRcpp/email-body create mode 100644 .dev/revdep_emails/INSPECTumours/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/INSPECTumours/email-body create mode 100644 .dev/revdep_emails/NHSRplotthedots/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/NHSRplotthedots/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/NHSRplotthedots/email-body create mode 100644 .dev/revdep_emails/OpenML/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/OpenML/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/OpenML/email-body create mode 100644 .dev/revdep_emails/PWFSLSmoke/attachments/PWFSLSmoke.warnings create mode 100644 .dev/revdep_emails/PWFSLSmoke/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/PWFSLSmoke/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/PWFSLSmoke/email-body create mode 100644 .dev/revdep_emails/Plasmidprofiler/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/Plasmidprofiler/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/Plasmidprofiler/email-body create mode 100644 .dev/revdep_emails/PosteriorBootstrap/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/PosteriorBootstrap/email-body create mode 100644 .dev/revdep_emails/RSQL/attachments/RSQL.warnings create mode 100644 .dev/revdep_emails/RSQL/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/RSQL/email-body create mode 100644 .dev/revdep_emails/RestRserve/attachments/RestRserve.failure create mode 100644 .dev/revdep_emails/RestRserve/attachments/RestRserve.warnings create mode 100644 .dev/revdep_emails/RestRserve/email-body create mode 100644 .dev/revdep_emails/SamplerCompare/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/SamplerCompare/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/SamplerCompare/email-body create mode 100644 .dev/revdep_emails/TDA/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/TDA/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/TDA/email-body create mode 100644 .dev/revdep_emails/WikidataQueryServiceR/attachments/WikidataQueryServiceR.warnings create mode 100644 .dev/revdep_emails/WikidataQueryServiceR/email-body create mode 100644 .dev/revdep_emails/WoodburyMatrix/attachments/WoodburyMatrix.warnings create mode 100644 .dev/revdep_emails/WoodburyMatrix/email-body create mode 100644 .dev/revdep_emails/abbyyR/email-body create mode 100644 .dev/revdep_emails/adaptalint/email-body create mode 100644 .dev/revdep_emails/admiral/attachments/admiral.warnings create mode 100644 .dev/revdep_emails/admiral/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/admiral/email-body create mode 100644 .dev/revdep_emails/autoharp/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/autoharp/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/autoharp/email-body create mode 100644 .dev/revdep_emails/aws.alexa/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/aws.alexa/email-body create mode 100644 .dev/revdep_emails/babette/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/babette/email-body create mode 100644 .dev/revdep_emails/beautier/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/beautier/email-body create mode 100644 .dev/revdep_emails/biolink/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/biolink/email-body create mode 100644 .dev/revdep_emails/caretEnsemble/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/caretEnsemble/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/caretEnsemble/email-body create mode 100644 .dev/revdep_emails/cattonum/attachments/cattonum.warnings create mode 100644 .dev/revdep_emails/cattonum/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/cattonum/email-body create mode 100644 .dev/revdep_emails/cleaR/attachments/cleaR.warnings create mode 100644 .dev/revdep_emails/cleaR/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/cleaR/email-body create mode 100644 .dev/revdep_emails/cloudos/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/cloudos/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/cloudos/email-body create mode 100644 .dev/revdep_emails/cmstatr/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/cmstatr/email-body create mode 100644 .dev/revdep_emails/connectwidgets/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/connectwidgets/email-body create mode 100644 .dev/revdep_emails/crunch/attachments/crunch.warnings create mode 100644 .dev/revdep_emails/crunch/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/crunch/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/crunch/email-body create mode 100644 .dev/revdep_emails/dampack/attachments/dampack.warnings create mode 100644 .dev/revdep_emails/dampack/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/dampack/email-body create mode 100644 .dev/revdep_emails/dashboardthemes/attachments/dashboardthemes.warnings create mode 100644 .dev/revdep_emails/dashboardthemes/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/dashboardthemes/email-body create mode 100644 .dev/revdep_emails/dat/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/dat/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/dat/email-body create mode 100644 .dev/revdep_emails/datarobot/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/datarobot/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/datarobot/email-body create mode 100644 .dev/revdep_emails/datastructures/attachments/datastructures.failure create mode 100644 .dev/revdep_emails/datastructures/email-body create mode 100644 .dev/revdep_emails/describer/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/describer/email-body create mode 100644 .dev/revdep_emails/devtools/email-body create mode 100644 .dev/revdep_emails/diffusr/attachments/diffusr.failure create mode 100644 .dev/revdep_emails/diffusr/email-body create mode 100644 .dev/revdep_emails/dittodb/attachments/dittodb.warnings create mode 100644 .dev/revdep_emails/dittodb/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/dittodb/email-body create mode 100644 .dev/revdep_emails/dupree/attachments/dupree.warnings create mode 100644 .dev/revdep_emails/dupree/email-body create mode 100644 .dev/revdep_emails/dyn.log/attachments/dyn.log.warnings create mode 100644 .dev/revdep_emails/dyn.log/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/dyn.log/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/dyn.log/email-body create mode 100644 .dev/revdep_emails/edgarWebR/attachments/edgarWebR.warnings create mode 100644 .dev/revdep_emails/edgarWebR/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/edgarWebR/email-body create mode 100644 .dev/revdep_emails/emayili/attachments/emayili.warnings create mode 100644 .dev/revdep_emails/emayili/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/emayili/email-body create mode 100644 .dev/revdep_emails/epigraphdb/attachments/epigraphdb.warnings create mode 100644 .dev/revdep_emails/epigraphdb/email-body create mode 100644 .dev/revdep_emails/fakemake/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/fakemake/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/fakemake/email-body create mode 100644 .dev/revdep_emails/fixtuRes/attachments/fixtuRes.warnings create mode 100644 .dev/revdep_emails/fixtuRes/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/fixtuRes/email-body create mode 100644 .dev/revdep_emails/fst/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/fst/email-body create mode 100644 .dev/revdep_emails/fstcore/email-body create mode 100644 .dev/revdep_emails/geofacet/email-body create mode 100644 .dev/revdep_emails/geogrid/email-body create mode 100644 .dev/revdep_emails/ggRandomForests/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/ggRandomForests/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/ggRandomForests/email-body create mode 100644 .dev/revdep_emails/ggcharts/attachments/ggcharts.warnings create mode 100644 .dev/revdep_emails/ggcharts/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/ggcharts/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/ggcharts/email-body create mode 100644 .dev/revdep_emails/ggfortify/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/ggfortify/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/ggfortify/email-body create mode 100644 .dev/revdep_emails/ggthemes/attachments/ggthemes.warnings create mode 100644 .dev/revdep_emails/ggthemes/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/ggthemes/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/ggthemes/email-body create mode 100644 .dev/revdep_emails/healthcareai/attachments/healthcareai.warnings create mode 100644 .dev/revdep_emails/healthcareai/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/healthcareai/email-body create mode 100644 .dev/revdep_emails/i18n/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/i18n/email-body create mode 100644 .dev/revdep_emails/jpmesh/attachments/jpmesh.warnings create mode 100644 .dev/revdep_emails/jpmesh/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/jpmesh/email-body create mode 100644 .dev/revdep_emails/languageserver/attachments/languageserver.warnings create mode 100644 .dev/revdep_emails/languageserver/email-body create mode 100644 .dev/revdep_emails/latrend/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/latrend/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/latrend/email-body create mode 100644 .dev/revdep_emails/lifecycle/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/lifecycle/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/lifecycle/email-body create mode 100644 .dev/revdep_emails/lightgbm/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/lightgbm/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/lightgbm/email-body create mode 100644 .dev/revdep_emails/mlflow/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/mlflow/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/mlflow/attachments/mlflow.warnings create mode 100644 .dev/revdep_emails/mlflow/email-body create mode 100644 .dev/revdep_emails/mlr/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/mlr/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/mlr/attachments/mlr.warnings create mode 100644 .dev/revdep_emails/mlr/email-body create mode 100644 .dev/revdep_emails/mlrCPO/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/mlrCPO/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/mlrCPO/email-body create mode 100644 .dev/revdep_emails/modules/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/modules/attachments/modules.warnings create mode 100644 .dev/revdep_emails/modules/email-body create mode 100644 .dev/revdep_emails/nLTT/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/nLTT/email-body create mode 100644 .dev/revdep_emails/newsmd/email-body create mode 100644 .dev/revdep_emails/openbankeR/attachments/openbankeR.warnings create mode 100644 .dev/revdep_emails/openbankeR/email-body create mode 100644 .dev/revdep_emails/osfr/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/osfr/attachments/osfr.warnings create mode 100644 .dev/revdep_emails/osfr/email-body create mode 100644 .dev/revdep_emails/packager/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/packager/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/packager/attachments/packager.warnings create mode 100644 .dev/revdep_emails/packager/email-body create mode 100644 .dev/revdep_emails/physiology/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/physiology/attachments/physiology.warnings create mode 100644 .dev/revdep_emails/physiology/email-body create mode 100644 .dev/revdep_emails/precommit/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/precommit/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/precommit/email-body create mode 100644 .dev/revdep_emails/prettyB/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/prettyB/attachments/prettyB.warnings create mode 100644 .dev/revdep_emails/prettyB/email-body create mode 100644 .dev/revdep_emails/rBiasCorrection/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/rBiasCorrection/attachments/rBiasCorrection.warnings create mode 100644 .dev/revdep_emails/rBiasCorrection/email-body create mode 100644 .dev/revdep_emails/rasterpdf/email-body create mode 100644 .dev/revdep_emails/rbokeh/email-body create mode 100644 .dev/revdep_emails/rde/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/rde/email-body create mode 100644 .dev/revdep_emails/rdomains/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/rdomains/email-body create mode 100644 .dev/revdep_emails/requiRements/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/requiRements/attachments/requiRements.warnings create mode 100644 .dev/revdep_emails/requiRements/email-body create mode 100644 .dev/revdep_emails/rhino/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/rhino/attachments/rhino.warnings create mode 100644 .dev/revdep_emails/rhino/email-body create mode 100644 .dev/revdep_emails/rnrfa/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/rnrfa/email-body create mode 100644 .dev/revdep_emails/roadoi/email-body create mode 100644 .dev/revdep_emails/scriptexec/attachments/scriptexec.warnings create mode 100644 .dev/revdep_emails/scriptexec/email-body create mode 100644 .dev/revdep_emails/secuTrialR/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/secuTrialR/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/secuTrialR/email-body create mode 100644 .dev/revdep_emails/semantic.dashboard/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/semantic.dashboard/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/semantic.dashboard/email-body create mode 100644 .dev/revdep_emails/shiny.info/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/shiny.info/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/shiny.info/email-body create mode 100644 .dev/revdep_emails/shiny.react/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/shiny.react/email-body create mode 100644 .dev/revdep_emails/shiny.semantic/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/shiny.semantic/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/shiny.semantic/email-body create mode 100644 .dev/revdep_emails/smerc/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/smerc/email-body create mode 100644 .dev/revdep_emails/stencilaschema/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/stencilaschema/attachments/stencilaschema.warnings create mode 100644 .dev/revdep_emails/stencilaschema/email-body create mode 100644 .dev/revdep_emails/supernova/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/supernova/attachments/supernova.warnings create mode 100644 .dev/revdep_emails/supernova/email-body create mode 100644 .dev/revdep_emails/tsviz/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/tsviz/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/tsviz/attachments/tsviz.warnings create mode 100644 .dev/revdep_emails/tsviz/email-body create mode 100644 .dev/revdep_emails/tuber/attachments/tuber.failure create mode 100644 .dev/revdep_emails/tuber/attachments/tuber.warnings create mode 100644 .dev/revdep_emails/tuber/email-body create mode 100644 .dev/revdep_emails/unifir/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/unifir/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/unifir/email-body create mode 100644 .dev/revdep_emails/upsetjs/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/upsetjs/attachments/upsetjs.warnings create mode 100644 .dev/revdep_emails/upsetjs/email-body create mode 100644 .dev/revdep_emails/urlshorteneR/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/urlshorteneR/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/urlshorteneR/email-body create mode 100644 .dev/revdep_emails/virustotal/email-body create mode 100644 .dev/revdep_emails/wavefunction/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/wavefunction/email-body create mode 100644 .dev/revdep_emails/xgboost/attachments/lints_in_cran_not_devel.csv create mode 100644 .dev/revdep_emails/xgboost/attachments/lints_in_devel_not_cran.csv create mode 100644 .dev/revdep_emails/xgboost/email-body diff --git a/.dev/revdep_emails/BTYDplus/attachments/BTYDplus.warnings b/.dev/revdep_emails/BTYDplus/attachments/BTYDplus.warnings new file mode 100644 index 000000000..2043731ef --- /dev/null +++ b/.dev/revdep_emails/BTYDplus/attachments/BTYDplus.warnings @@ -0,0 +1,2 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Trying to remove β€˜multiple_dots_linter’ and β€˜camel_case_linter’, which are not in `defaults`. diff --git a/.dev/revdep_emails/BTYDplus/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/BTYDplus/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..ec2a8edb8 --- /dev/null +++ b/.dev/revdep_emails/BTYDplus/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,11 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/helpers.R",72,13,"style","Variable and function name style should be snake_case."," elog_dt[, N := .N, by = ""cust""]","object_name_linter" +"R/helpers.R",399,26,"style","Variable and function name style should be snake_case."," grid <- grid[is.na(N), N := 0L]","object_name_linter" +"tests/testthat/test-bg-cnbd-k.R",76,7,"style","Variable and function name style should be snake_case."," cbs$x.est32 <- bgcnbd.ConditionalExpectedTransactions(params, 32, cbs$x, cbs$t.x, cbs$T.cal)","object_name_linter" +"tests/testthat/test-bg-cnbd-k.R",77,7,"style","Variable and function name style should be snake_case."," cbs$x.est64 <- bgcnbd.ConditionalExpectedTransactions(params, 64, cbs$x, cbs$t.x, cbs$T.cal)","object_name_linter" +"tests/testthat/test-mbg-cnbd-k.R",28,7,"style","Variable and function name style should be snake_case."," cbs$x.est <- mbgcnbd.ConditionalExpectedTransactions(params, cbs$T.star, cbs$x, cbs$t.x, cbs$T.cal)","object_name_linter" +"tests/testthat/test-mbg-cnbd-k.R",67,9,"style","Variable and function name style should be snake_case."," cbs$x.est <- mbgcnbd.ConditionalExpectedTransactions(params, cbs$T.star, cbs$x, cbs$t.x, cbs$T.cal)","object_name_linter" +"tests/testthat/test-nbd.R",18,7,"style","Variable and function name style should be snake_case."," cbs$x.est <- nbd.ConditionalExpectedTransactions(params, cbs$T.star, cbs$x, cbs$T.cal)","object_name_linter" +"tests/testthat/test-pareto-ggg-mcmc.R",49,7,"style","Variable and function name style should be snake_case."," cbs$x.est <- apply(xstar, 2, mean)","object_name_linter" +"tests/testthat/test-pareto-nbd-abe.R",76,7,"style","Variable and function name style should be snake_case."," cbs$x.est <- apply(xstar, 2, mean)","object_name_linter" +"tests/testthat/test-pareto-nbd-mcmc.R",79,7,"style","Variable and function name style should be snake_case."," cbs$x.est <- apply(xstar, 2, mean)","object_name_linter" diff --git a/.dev/revdep_emails/BTYDplus/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/BTYDplus/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..fb5385eb6 --- /dev/null +++ b/.dev/revdep_emails/BTYDplus/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,227 @@ +"filename","line_number","column_number","type","message","line","linter" +"demo/cdnow.R",3,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog <- read.csv(system.file(""data/cdnowElog.csv"", package = ""BTYD""),","object_name_linter" +"demo/cdnow.R",6,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog$date <- as.Date(as.character(cdnowElog$date), format = ""%Y%m%d"")","object_name_linter" +"demo/cdnow.R",22,2,"style","Variable and function name style should be snake_case or symbols.","(params.nbd <- nbd.EstimateParameters(cbs))","object_name_linter" +"demo/cdnow.R",38,2,"style","Variable and function name style should be snake_case or symbols.","(params.mbgcnbd <- mbgcnbd.EstimateParameters(cbs))","object_name_linter" +"demo/cdnow.R",65,1,"style","Variable and function name style should be snake_case or symbols.","params.pnbd <- BTYD::pnbd.EstimateParameters(cbs) # estimate Pareto/NBD","object_name_linter" +"demo/cdnow.R",66,1,"style","Variable and function name style should be snake_case or symbols.","params.bgcnbd <- bgcnbd.EstimateParameters(cbs) # estimate BG/CNBD-k","object_name_linter" +"demo/cdnow.R",111,33,"style","Put spaces around all infix operators."," ""BIAS"" = function(a, f) sum(f)/sum(a) - 1)","infix_spaces_linter" +"demo/cdnow.R",137,1,"style","Variable and function name style should be snake_case or symbols.","spend.params <- BTYD::spend.EstimateParameters(cbs$sales.avg, cbs$x + 1)","object_name_linter" +"demo/mbg-cnbd-k.R",14,2,"style","Variable and function name style should be snake_case or symbols.","(k.est <- estimateRegularity(groceryElog))","object_name_linter" +"demo/mbg-cnbd-k.R",24,2,"style","Variable and function name style should be snake_case or symbols.","(params.mbgcnbd <- mbgcnbd.EstimateParameters(cbs))","object_name_linter" +"demo/mbg-cnbd-k.R",51,1,"style","Variable and function name style should be snake_case or symbols.","params.nbd <- nbd.EstimateParameters(cbs) # estimate NBD","object_name_linter" +"demo/mbg-cnbd-k.R",52,1,"style","Variable and function name style should be snake_case or symbols.","params.pnbd <- BTYD::pnbd.EstimateParameters(cbs) # estimate Pareto/NBD","object_name_linter" +"demo/mbg-cnbd-k.R",53,1,"style","Variable and function name style should be snake_case or symbols.","params.bgnbd <- BTYD::bgnbd.EstimateParameters(cbs) # estimate BG/NBD","object_name_linter" +"demo/mbg-cnbd-k.R",54,1,"style","Variable and function name style should be snake_case or symbols.","params.mbgnbd <- mbgnbd.EstimateParameters(cbs) # estimate MBG/NBD","object_name_linter" +"demo/mbg-cnbd-k.R",79,33,"style","Put spaces around all infix operators."," ""BIAS"" = function(a, f) sum(f)/sum(a) - 1)","infix_spaces_linter" +"demo/mbg-cnbd-k.R",107,1,"style","Variable and function name style should be snake_case or symbols.","T.tot <- max(cbs$T.cal+cbs$T.star)","object_name_linter" +"demo/mbg-cnbd-k.R",107,23,"style","Put spaces around all infix operators.","T.tot <- max(cbs$T.cal+cbs$T.star)","infix_spaces_linter" +"demo/pareto-abe.R",3,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog <- read.csv(system.file(""data/cdnowElog.csv"", package = ""BTYD""),","object_name_linter" +"demo/pareto-abe.R",6,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog$date <- as.Date(as.character(cdnowElog$date), format = ""%Y%m%d"")","object_name_linter" +"demo/pareto-abe.R",18,1,"style","Variable and function name style should be snake_case or symbols.","draws.m1 <- abe.mcmc.DrawParameters(","object_name_linter" +"demo/pareto-abe.R",34,1,"style","Variable and function name style should be snake_case or symbols.","draws.m2 <- abe.mcmc.DrawParameters(","object_name_linter" +"demo/pareto-abe.R",52,1,"style","Variable and function name style should be snake_case or symbols.","xstar.m1.draws <- mcmc.DrawFutureTransactions(cbs, draws.m1, T.star = cbs$T.star)","object_name_linter" +"demo/pareto-abe.R",53,1,"style","Variable and function name style should be snake_case or symbols.","xstar.m2.draws <- mcmc.DrawFutureTransactions(cbs, draws.m2, T.star = cbs$T.star)","object_name_linter" +"demo/pareto-ggg.R",16,1,"style","Variable and function name style should be snake_case or symbols.","pnbd.draws <- pnbd.mcmc.DrawParameters(cal.cbs = cbs, mc.cores = 1)","object_name_linter" +"demo/pareto-ggg.R",20,1,"style","Variable and function name style should be snake_case or symbols.","pggg.draws <- pggg.mcmc.DrawParameters(cal.cbs = cbs,","object_name_linter" +"demo/pareto-ggg.R",24,25,"style","Put spaces around all infix operators.","round(rbind(`Pareto/GGG`= summary(pggg.draws$level_2)$quantiles[, ""50%""],","infix_spaces_linter" +"demo/pareto-ggg.R",41,1,"style","Variable and function name style should be snake_case or symbols.","xstar.pnbd.draws <- mcmc.DrawFutureTransactions(cbs, pnbd.draws, T.star = cbs$T.star, sample_size = 400)","object_name_linter" +"demo/pareto-ggg.R",42,1,"style","Variable and function name style should be snake_case or symbols.","xstar.pggg.draws <- mcmc.DrawFutureTransactions(cbs, pggg.draws, T.star = cbs$T.star, sample_size = 400)","object_name_linter" +"demo/pareto-ggg.R",59,20,"style","Put spaces around all infix operators.","(lift <- 1 - mae[1]/mae[2])","infix_spaces_linter" +"R/helpers.R",58,32,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!""date"" %in% names(elog) & !""t"" %in% names(elog))","vector_logic_linter" +"R/helpers.R",179,3,"style","Variable and function name style should be snake_case or symbols."," T.0 <- min(elog_dt$t)","object_name_linter" +"R/helpers.R",181,5,"style","Variable and function name style should be snake_case or symbols."," T.cal <- max(elog_dt$t)","object_name_linter" +"R/helpers.R",183,5,"style","Variable and function name style should be snake_case or symbols."," T.cal <- as.numeric(as.Date(T.cal))","object_name_linter" +"R/helpers.R",186,5,"style","Variable and function name style should be snake_case or symbols."," T.tot <- max(elog_dt$t)","object_name_linter" +"R/helpers.R",188,5,"style","Variable and function name style should be snake_case or symbols."," T.tot <- as.numeric(as.Date(T.tot))","object_name_linter" +"R/helpers.R",293,32,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (""sales"" %in% names(elog) & !is.numeric(elog$sales)) stop(""`sales` field must be numeric"")","vector_logic_linter" +"R/helpers.R",295,23,"style","Variable and function name style should be snake_case or symbols."," if (is.null(T.cal)) T.cal <- max(elog$date)","object_name_linter" +"R/helpers.R",296,23,"style","Variable and function name style should be snake_case or symbols."," if (is.null(T.tot)) T.tot <- max(elog$date)","object_name_linter" +"R/helpers.R",297,28,"style","Variable and function name style should be snake_case or symbols."," if (is.character(T.cal)) T.cal <- if (class(elog$date)[1] == ""Date"") as.Date(T.cal) else as.POSIXct(T.cal)","object_name_linter" +"R/helpers.R",298,28,"style","Variable and function name style should be snake_case or symbols."," if (is.character(T.tot)) T.tot <- if (class(elog$date)[1] == ""Date"") as.Date(T.tot) else as.POSIXct(T.tot)","object_name_linter" +"R/helpers.R",299,22,"style","Variable and function name style should be snake_case or symbols."," if (T.tot < T.cal) T.tot <- T.cal","object_name_linter" +"R/helpers.R",460,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(legend) & length(legend) == 2) {","vector_logic_linter" +"R/helpers.R",475,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(x) != length(actual) | length(x) != length(expected) |","vector_logic_linter" +"R/helpers.R",475,67,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(x) != length(actual) | length(x) != length(expected) |","vector_logic_linter" +"R/helpers.R",476,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !is.numeric(x) | !is.numeric(actual) | !is.numeric(expected) |","vector_logic_linter" +"R/helpers.R",476,44,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !is.numeric(x) | !is.numeric(actual) | !is.numeric(expected) |","vector_logic_linter" +"R/helpers.R",476,68,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !is.numeric(x) | !is.numeric(actual) | !is.numeric(expected) |","vector_logic_linter" +"R/helpers.R",477,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," any(x < 0) | any(actual < 0) | any(expected < 0))","vector_logic_linter" +"R/helpers.R",477,36,"warning","Conditional expressions require scalar logical operators (&& and ||)"," any(x < 0) | any(actual < 0) | any(expected < 0))","vector_logic_linter" +"R/helpers.R",488,3,"style","Variable and function name style should be snake_case or symbols."," col.names <- paste(rep(""freq"", length(censor + 1)), (0:censor), sep = ""."")","object_name_linter" +"R/helpers.R",489,3,"style","Variable and function name style should be snake_case or symbols."," col.names[censor + 1] <- paste0(col.names[censor + 1], ""+"")","object_name_linter" +"R/helpers.R",496,7,"style","Variable and function name style should be snake_case or symbols."," x.labels[censor + 1] <- paste0(censor, ""+"")","object_name_linter" +"R/helpers.R",518,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(t.x) != length(actual) | length(t.x) != length(expected) |","vector_logic_linter" +"R/helpers.R",518,71,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(t.x) != length(actual) | length(t.x) != length(expected) |","vector_logic_linter" +"R/helpers.R",519,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !is.numeric(t.x) | !is.numeric(actual) | !is.numeric(expected) |","vector_logic_linter" +"R/helpers.R",519,46,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !is.numeric(t.x) | !is.numeric(actual) | !is.numeric(expected) |","vector_logic_linter" +"R/helpers.R",519,70,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !is.numeric(t.x) | !is.numeric(actual) | !is.numeric(expected) |","vector_logic_linter" +"R/helpers.R",520,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," any(t.x < 0) | any(actual < 0) | any(expected < 0))","vector_logic_linter" +"R/helpers.R",520,38,"warning","Conditional expressions require scalar logical operators (&& and ||)"," any(t.x < 0) | any(actual < 0) | any(expected < 0))","vector_logic_linter" +"R/mbg-cnbd-k.R",78,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(k) & !""litt"" %in% colnames(cal.cbs))","vector_logic_linter" +"R/mbg-cnbd-k.R",96,7,"style","Variable and function name style should be snake_case or symbols."," LL[k] <- xbgcnbd.cbs.LL(params = params[[k]], cal.cbs = cal.cbs, dropout_at_zero = dropout_at_zero)","object_name_linter" +"R/mbg-cnbd-k.R",107,5,"style","Variable and function name style should be snake_case or symbols."," cal.cbs[, ""litt""] <- 0","object_name_linter" +"R/mbg-cnbd-k.R",116,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (trace > 0 & count %% trace == 0) {","vector_logic_linter" +"R/mbg-cnbd-k.R",129,3,"style","Variable and function name style should be snake_case or symbols."," estimated.params[estimated.params > max.param.value] <- max.param.value","object_name_linter" +"R/mbg-cnbd-k.R",131,9,"style","Variable and function name style should be snake_case or symbols."," names(estimated.params) <- c(""k"", ""r"", ""alpha"", ""a"", ""b"")","object_name_linter" +"R/mbg-cnbd-k.R",191,12,"style","Variable and function name style should be snake_case or symbols."," tryCatch(T.cal <- cal.cbs$T.cal,","object_name_linter" +"R/mbg-cnbd-k.R",194,13,"style","Any function spanning multiple lines should use curly braces."," error = function(e) stop(""cal.cbs must have a column for "",","brace_linter" +"R/mbg-cnbd-k.R",204,3,"style","Variable and function name style should be snake_case or symbols."," max.length <- max(length(x), length(t.x), length(T.cal))","object_name_linter" +"R/mbg-cnbd-k.R",214,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (params[1] != floor(params[1]) | params[1] < 1)","vector_logic_linter" +"R/mbg-cnbd-k.R",224,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = max.length)","object_name_linter" +"R/mbg-cnbd-k.R",293,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (params[1] != floor(params[1]) | params[1] < 1)","vector_logic_linter" +"R/mbg-cnbd-k.R",412,3,"style","Variable and function name style should be snake_case or symbols."," max.length <- max(length(x), length(t.x), length(T.cal))","object_name_linter" +"R/mbg-cnbd-k.R",420,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (params[1] != floor(params[1]) | params[1] < 1)","vector_logic_linter" +"R/mbg-cnbd-k.R",430,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = max.length)","object_name_linter" +"R/mbg-cnbd-k.R",501,3,"style","Variable and function name style should be snake_case or symbols."," max.length <- max(length(T.star), length(x), length(t.x), length(T.cal))","object_name_linter" +"R/mbg-cnbd-k.R",511,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (params[1] != floor(params[1]) | params[1] < 1)","vector_logic_linter" +"R/mbg-cnbd-k.R",523,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = max.length)","object_name_linter" +"R/mbg-cnbd-k.R",524,3,"style","Variable and function name style should be snake_case or symbols."," T.star <- rep(T.star, length.out = max.length)","object_name_linter" +"R/mbg-cnbd-k.R",565,5,"style","Variable and function name style should be snake_case or symbols."," sum.cal <- sum(xbgcnbd.Expectation(params = params, t = T.cal, dropout_at_zero = dropout_at_zero))","object_name_linter" +"R/mbg-cnbd-k.R",566,5,"style","Variable and function name style should be snake_case or symbols."," sum.tot <- sum(xbgcnbd.Expectation(params = params, t = T.cal + T.star, dropout_at_zero = dropout_at_zero))","object_name_linter" +"R/mbg-cnbd-k.R",628,12,"style","Variable and function name style should be snake_case or symbols."," tryCatch(T.cal <- cal.cbs$T.cal,","object_name_linter" +"R/mbg-cnbd-k.R",1016,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (params[1] != floor(params[1]) | params[1] < 1)","vector_logic_linter" +"R/mbg-cnbd-k.R",1027,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = n)","object_name_linter" +"R/mbg-cnbd-k.R",1028,3,"style","Variable and function name style should be snake_case or symbols."," T.zero <- T.cal.fix - T.cal","object_name_linter" +"R/mbg-cnbd-k.R",1029,3,"style","Variable and function name style should be snake_case or symbols."," date.zero <- as.POSIXct(date.zero)","object_name_linter" +"R/mbg-cnbd-k.R",1058,3,"style","Variable and function name style should be snake_case or symbols."," date.cal <- date.zero + T.cal.fix * 3600 * 24 * 7","object_name_linter" +"R/mbg-cnbd-k.R",1059,3,"style","Variable and function name style should be snake_case or symbols."," date.tot <- date.cal + T.star * 3600 * 24 * 7","object_name_linter" +"R/mcmc.R",67,5,"style","Variable and function name style should be snake_case or symbols."," T.star <- rep(T.star, nr_of_cust)","object_name_linter" +"R/mcmc.R",109,7,"style","Variable and function name style should be snake_case or symbols."," x.stars[draw, cust] <- sum(cumsum(itts) < minT)","object_name_linter" +"R/mcmc.R",114,7,"style","Variable and function name style should be snake_case or symbols."," x.stars[!alive, cust] <- 0","object_name_linter" +"R/mcmc.R",154,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (burnin < start(draws$level_2) | burnin > end(draws$level_2))","vector_logic_linter" +"R/mcmc.R",183,86,"style","Use FALSE instead of the symbol F."," plot(spls.x, spls.y, typ = ""b"", xlim = c(0, 1), ylim = c(0, 1), frame = 0, axes = F,","T_and_F_symbol_linter" +"R/mcmc.R",364,11,"style","Variable and function name style should be snake_case or symbols."," names(uEs) <- unique(t)","object_name_linter" +"R/nbd.R",30,3,"style","Variable and function name style should be snake_case or symbols."," estimated.params[estimated.params > max.param.value] <- max.param.value","object_name_linter" +"R/nbd.R",31,9,"style","Variable and function name style should be snake_case or symbols."," names(estimated.params) <- c(""r"", ""alpha"")","object_name_linter" +"R/nbd.R",53,12,"style","Variable and function name style should be snake_case or symbols."," tryCatch(T.cal <- cal.cbs$T.cal,","object_name_linter" +"R/nbd.R",70,3,"style","Variable and function name style should be snake_case or symbols."," max.length <- max(length(x), length(T.cal))","object_name_linter" +"R/nbd.R",81,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = max.length)","object_name_linter" +"R/nbd.R",116,3,"style","Variable and function name style should be snake_case or symbols."," max.length <- max(length(T.star), length(x), length(T.cal))","object_name_linter" +"R/nbd.R",130,3,"style","Variable and function name style should be snake_case or symbols."," T.star <- rep(T.star, length.out = max.length)","object_name_linter" +"R/nbd.R",132,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = max.length)","object_name_linter" +"R/nbd.R",164,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = n)","object_name_linter" +"R/nbd.R",165,3,"style","Variable and function name style should be snake_case or symbols."," T.zero <- T.cal.fix - T.cal","object_name_linter" +"R/nbd.R",166,3,"style","Variable and function name style should be snake_case or symbols."," date.zero <- as.POSIXct(date.zero)","object_name_linter" +"R/nbd.R",188,3,"style","Variable and function name style should be snake_case or symbols."," date.cal <- date.zero + T.cal.fix * 3600 * 24 * 7","object_name_linter" +"R/nbd.R",189,3,"style","Variable and function name style should be snake_case or symbols."," date.tot <- date.cal + T.star * 3600 * 24 * 7","object_name_linter" +"R/pareto-ggg-mcmc.R",300,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = n)","object_name_linter" +"R/pareto-ggg-mcmc.R",301,3,"style","Variable and function name style should be snake_case or symbols."," T.zero <- T.cal.fix - T.cal","object_name_linter" +"R/pareto-ggg-mcmc.R",302,3,"style","Variable and function name style should be snake_case or symbols."," date.zero <- as.POSIXct(date.zero)","object_name_linter" +"R/pareto-ggg-mcmc.R",348,3,"style","Variable and function name style should be snake_case or symbols."," date.cal <- date.zero + T.cal.fix * 3600 * 24 * 7","object_name_linter" +"R/pareto-ggg-mcmc.R",349,3,"style","Variable and function name style should be snake_case or symbols."," date.tot <- date.cal + T.star * 3600 * 24 * 7","object_name_linter" +"R/pareto-nbd-abe.R",228,3,"style","Variable and function name style should be snake_case or symbols."," cal.cbs[, ""intercept""] <- 1","object_name_linter" +"R/pareto-nbd-abe.R",283,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = n)","object_name_linter" +"R/pareto-nbd-abe.R",284,3,"style","Variable and function name style should be snake_case or symbols."," T.zero <- T.cal.fix - T.cal","object_name_linter" +"R/pareto-nbd-abe.R",285,3,"style","Variable and function name style should be snake_case or symbols."," date.zero <- as.POSIXct(date.zero)","object_name_linter" +"R/pareto-nbd-abe.R",297,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(colnames(covars)) & ncol(covars) > 1)","vector_logic_linter" +"R/pareto-nbd-abe.R",340,3,"style","Variable and function name style should be snake_case or symbols."," date.cal <- date.zero + T.cal.fix * 3600 * 24 * 7","object_name_linter" +"R/pareto-nbd-abe.R",341,3,"style","Variable and function name style should be snake_case or symbols."," date.tot <- date.cal + T.star * 3600 * 24 * 7","object_name_linter" +"R/pareto-nbd-mcmc.R",74,5,"style","Variable and function name style should be snake_case or symbols."," T.cal <- data$T.cal","object_name_linter" +"tests/testthat/test-bg-cnbd-k.R",9,3,"style","Variable and function name style should be snake_case or symbols."," date.zero <- ""2010-01-01""","object_name_linter" +"tests/testthat/test-elog2cbs.R",11,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- Sys.Date() + 21","object_name_linter" +"tests/testthat/test-elog2cbs.R",12,3,"style","Variable and function name style should be snake_case or symbols."," T.tot <- Sys.Date() + 30","object_name_linter" +"tests/testthat/test-pareto-nbd-abe.R",67,52,"style","Use TRUE instead of the symbol T."," expect_equal(matrix(est[1:6], ncol = 2, byrow = T), params$beta, tolerance = 0.05)","T_and_F_symbol_linter" +"tests/testthat/test-pareto-nbd-mcmc.R",8,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- c(26, 26, 28.5, 52, 52)","object_name_linter" +"tests/testthat/test-pareto-nbd-mcmc.R",9,3,"style","Variable and function name style should be snake_case or symbols."," T.star <- 52","object_name_linter" +"tests/testthat/test-pareto-nbd-mcmc.R",10,3,"style","Variable and function name style should be snake_case or symbols."," date.zero <- ""2010-01-01""","object_name_linter" +"tests/testthat/test-pareto-nbd-mcmc.R",24,3,"style","Variable and function name style should be snake_case or symbols."," date.zero <- min(sim_elog$date)","object_name_linter" +"tests/testthat/test-pareto-nbd-mcmc.R",40,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(52, n)","object_name_linter" +"tests/testthat/test-pareto-nbd-mcmc.R",43,3,"style","Variable and function name style should be snake_case or symbols."," T.cal[n] <- 52","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",76,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog <- read.csv(system.file(""data/cdnowElog.csv"", package = ""BTYD""),","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",79,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog$date <- as.Date(as.character(cdnowElog$date), format = ""%Y%m%d"")","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",132,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS <- elog2cbs(groceryElog, T.cal = ""2006-12-31"")","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",145,2,"style","Variable and function name style should be snake_case or symbols.","(k.wheat <- estimateRegularity(groceryElog, method = ""wheat"", ","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",145,62,"style","Trailing whitespace is superfluous.","(k.wheat <- estimateRegularity(groceryElog, method = ""wheat"", ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",147,2,"style","Variable and function name style should be snake_case or symbols.","(k.mle <- estimateRegularity(groceryElog, method = ""mle"", ","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",147,58,"style","Trailing whitespace is superfluous.","(k.mle <- estimateRegularity(groceryElog, method = ""mle"", ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",168,3,"style","Variable and function name style should be snake_case or symbols."," groceryCBS <- elog2cbs(groceryElog, T.cal = ""2006-12-31"")","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",171,7,"style","Variable and function name style should be snake_case or symbols.","round(params.nbd <- nbd.EstimateParameters(groceryCBS), 3)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",181,62,"style","Trailing whitespace is superfluous.","# calculate expected future transactions for customers who've ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",183,1,"style","Variable and function name style should be snake_case or symbols.","est5.nbd <- nbd.ConditionalExpectedTransactions(params.nbd, ","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",183,60,"style","Trailing whitespace is superfluous.","est5.nbd <- nbd.ConditionalExpectedTransactions(params.nbd, ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",192,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$xstar.nbd <- nbd.ConditionalExpectedTransactions(","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",193,54,"style","Trailing whitespace is superfluous."," params = params.nbd, T.star = 52, ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",196,57,"style","Trailing whitespace is superfluous.","rbind(`Actuals` = c(`Holdout` = sum(groceryCBS$x.star)), ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",212,3,"style","Variable and function name style should be snake_case or symbols."," groceryCBS <- elog2cbs(groceryElog, T.cal = ""2006-12-31"")","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",215,1,"style","Variable and function name style should be snake_case or symbols.","params.pnbd <- BTYD::pnbd.EstimateParameters(groceryCBS[, c(""x"", ""t.x"", ""T.cal"")])","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",216,7,"style","Variable and function name style should be snake_case or symbols.","names(params.pnbd) <- c(""r"", ""alpha"", ""s"", ""beta"")","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",227,62,"style","Trailing whitespace is superfluous.","# calculate expected future transactions for customers who've ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",230,1,"style","Variable and function name style should be snake_case or symbols.","est5.pnbd <- BTYD::pnbd.ConditionalExpectedTransactions(params.pnbd, ","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",230,69,"style","Trailing whitespace is superfluous.","est5.pnbd <- BTYD::pnbd.ConditionalExpectedTransactions(params.pnbd, ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",239,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$xstar.pnbd <- BTYD::pnbd.ConditionalExpectedTransactions(","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",240,56,"style","Trailing whitespace is superfluous."," params = params.pnbd, T.star = 52, ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",244,60,"style","Trailing whitespace is superfluous.","rbind(`Actuals` = c(`Holdout` = sum(groceryCBS$x.star)), ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",251,65,"style","Trailing whitespace is superfluous.","# P(alive) for customers who've had 1 to 5 transactions in first ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",253,1,"style","Variable and function name style should be snake_case or symbols.","palive.pnbd <- BTYD::pnbd.PAlive(params.pnbd, ","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",253,46,"style","Trailing whitespace is superfluous.","palive.pnbd <- BTYD::pnbd.PAlive(params.pnbd, ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",256,45,"style","Put spaces around all infix operators."," cat(""x ="", i, "":"", sprintf(""%5.2f %%"", 100*palive.pnbd[i]), ""\n"")","infix_spaces_linter" +"vignettes/BTYDplus-HowTo.Rmd",270,3,"style","Variable and function name style should be snake_case or symbols."," groceryCBS <- elog2cbs(groceryElog, T.cal = ""2006-12-31"")","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",273,1,"style","Variable and function name style should be snake_case or symbols.","params.bgnbd <- BTYD::bgnbd.EstimateParameters(groceryCBS) # BG/NBD","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",273,64,"style","Commented code should be removed.","params.bgnbd <- BTYD::bgnbd.EstimateParameters(groceryCBS) # BG/NBD","commented_code_linter" +"vignettes/BTYDplus-HowTo.Rmd",274,1,"style","Variable and function name style should be snake_case or symbols.","params.bgcnbd <- bgcnbd.EstimateParameters(groceryCBS) # BG/CNBD-k","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",274,64,"style","Commented code should be removed.","params.bgcnbd <- bgcnbd.EstimateParameters(groceryCBS) # BG/CNBD-k","commented_code_linter" +"vignettes/BTYDplus-HowTo.Rmd",275,1,"style","Variable and function name style should be snake_case or symbols.","params.mbgnbd <- mbgnbd.EstimateParameters(groceryCBS) # MBG/NBD","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",275,64,"style","Commented code should be removed.","params.mbgnbd <- mbgnbd.EstimateParameters(groceryCBS) # MBG/NBD","commented_code_linter" +"vignettes/BTYDplus-HowTo.Rmd",276,1,"style","Variable and function name style should be snake_case or symbols.","params.mbgcnbd <- mbgcnbd.EstimateParameters(groceryCBS) # MBG/CNBD-k","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",276,64,"style","Commented code should be removed.","params.mbgcnbd <- mbgcnbd.EstimateParameters(groceryCBS) # MBG/CNBD-k","commented_code_linter" +"vignettes/BTYDplus-HowTo.Rmd",277,25,"style","Variable and function name style should be snake_case or symbols.","row <- function(params, LL) { ","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",277,30,"style","Trailing whitespace is superfluous.","row <- function(params, LL) { ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",281,45,"style","Trailing whitespace is superfluous.","rbind(`BG/NBD` = row(c(1, params.bgnbd), ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",283,40,"style","Trailing whitespace is superfluous."," `BG/CNBD-k` = row(params.bgcnbd, ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",285,40,"style","Trailing whitespace is superfluous."," `MBG/NBD` = row(params.mbgnbd, ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",287,41,"style","Trailing whitespace is superfluous."," `MBG/CNBD-k` = row(params.mbgcnbd, ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",294,62,"style","Trailing whitespace is superfluous.","# calculate expected future transactions for customers who've ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",297,1,"style","Variable and function name style should be snake_case or symbols.","est5.mbgcnbd <- mbgcnbd.ConditionalExpectedTransactions(params.mbgcnbd,","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",305,65,"style","Trailing whitespace is superfluous.","# P(alive) for customers who've had 1 to 5 transactions in first ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",307,1,"style","Variable and function name style should be snake_case or symbols.","palive.mbgcnbd <- mbgcnbd.PAlive(params.mbgcnbd, ","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",307,49,"style","Trailing whitespace is superfluous.","palive.mbgcnbd <- mbgcnbd.PAlive(params.mbgcnbd, ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",310,45,"style","Put spaces around all infix operators."," cat(""x ="", i, "":"", sprintf(""%5.2f %%"", 100*palive.mbgcnbd[i]), ""\n"")","infix_spaces_linter" +"vignettes/BTYDplus-HowTo.Rmd",318,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$xstar.mbgcnbd <- mbgcnbd.ConditionalExpectedTransactions(","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",320,64,"style","Trailing whitespace is superfluous."," x = groceryCBS$x, t.x = groceryCBS$t.x, ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",342,24,"style","Put spaces around all infix operators."," stopifnot(length(act)==length(est))","infix_spaces_linter" +"vignettes/BTYDplus-HowTo.Rmd",343,14,"style","Put spaces around all infix operators."," sum(abs(act-est)) / length(act)","infix_spaces_linter" +"vignettes/BTYDplus-HowTo.Rmd",345,1,"style","Variable and function name style should be snake_case or symbols.","mae.nbd <- mae(groceryCBS$x.star, groceryCBS$xstar.nbd)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",346,1,"style","Variable and function name style should be snake_case or symbols.","mae.pnbd <- mae(groceryCBS$x.star, groceryCBS$xstar.pnbd)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",347,1,"style","Variable and function name style should be snake_case or symbols.","mae.mbgcnbd <- mae(groceryCBS$x.star, groceryCBS$xstar.mbgcnbd)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",352,60,"style","Put spaces around all infix operators.","cat(""Lift in MAE for MBG/CNBD-k vs. Pareto/NBD:"", round(100*lift, 1), ""%"")","infix_spaces_linter" +"vignettes/BTYDplus-HowTo.Rmd",372,3,"style","Variable and function name style should be snake_case or symbols."," groceryCBS <- elog2cbs(groceryElog, T.cal = ""2006-12-31"")","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",375,1,"style","Variable and function name style should be snake_case or symbols.","pnbd.draws <- pnbd.mcmc.DrawParameters(groceryCBS)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",377,1,"style","Variable and function name style should be snake_case or symbols.","pnbd.xstar.draws <- mcmc.DrawFutureTransactions(groceryCBS, pnbd.draws)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",379,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$xstar.pnbd.hb <- apply(pnbd.xstar.draws, 2, mean)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",380,3,"style","Commented code should be removed.","# P(active)","commented_code_linter" +"vignettes/BTYDplus-HowTo.Rmd",381,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$pactive.pnbd.hb <- mcmc.PActive(pnbd.xstar.draws)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",382,3,"style","Commented code should be removed.","# P(alive)","commented_code_linter" +"vignettes/BTYDplus-HowTo.Rmd",383,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$palive.pnbd.hb <- mcmc.PAlive(pnbd.draws)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",397,68,"style","Trailing whitespace is superfluous.","# convert cohort-level draws from coda::mcmc.list to a matrix, with ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",399,1,"style","Variable and function name style should be snake_case or symbols.","cohort.draws <- pnbd.draws$level_2","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",428,1,"style","Variable and function name style should be snake_case or symbols.","customer4.draws <- pnbd.draws$level_1[[customer4]]","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",463,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog <- read.csv(","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",467,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog$date <- as.Date(as.character(cdnowElog$date), ","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",467,56,"style","Trailing whitespace is superfluous.","cdnowElog$date <- as.Date(as.character(cdnowElog$date), ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",470,1,"style","Variable and function name style should be snake_case or symbols.","cdnowCbs <- elog2cbs(cdnowElog, ","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",470,32,"style","Trailing whitespace is superfluous.","cdnowCbs <- elog2cbs(cdnowElog, ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",474,1,"style","Variable and function name style should be snake_case or symbols.","draws.m1 <- abe.mcmc.DrawParameters(cdnowCbs, ","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",474,46,"style","Trailing whitespace is superfluous.","draws.m1 <- abe.mcmc.DrawParameters(cdnowCbs, ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",488,1,"style","Variable and function name style should be snake_case or symbols.","cdnowCbs <- merge(cdnowCbs, first, by = ""cust"")","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",491,1,"style","Variable and function name style should be snake_case or symbols.","draws.m2 <- abe.mcmc.DrawParameters(cdnowCbs, ","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",491,46,"style","Trailing whitespace is superfluous.","draws.m2 <- abe.mcmc.DrawParameters(cdnowCbs, ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",518,3,"style","Variable and function name style should be snake_case or symbols."," groceryCBS <- elog2cbs(groceryElog, T.cal = ""2006-12-31"")","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",521,1,"style","Variable and function name style should be snake_case or symbols.","pggg.draws <- pggg.mcmc.DrawParameters(groceryCBS) # ~2mins on 2015 MacBook Pro","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",523,1,"style","Variable and function name style should be snake_case or symbols.","pggg.xstar.draws <- mcmc.DrawFutureTransactions(groceryCBS, pggg.draws)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",525,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$xstar.pggg <- apply(pggg.xstar.draws, 2, mean)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",526,3,"style","Commented code should be removed.","# P(active)","commented_code_linter" +"vignettes/BTYDplus-HowTo.Rmd",527,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$pactive.pggg <- mcmc.PActive(pggg.xstar.draws)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",528,3,"style","Commented code should be removed.","# P(alive)","commented_code_linter" +"vignettes/BTYDplus-HowTo.Rmd",529,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$palive.pggg <- mcmc.PAlive(pggg.draws)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",531,42,"style","Trailing whitespace is superfluous.","head(groceryCBS[, c(""x"", ""t.x"", ""x.star"", ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",543,39,"style","Trailing whitespace is superfluous.","#> t gamma r alpha s beta ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",544,39,"style","Trailing whitespace is superfluous.","#> 1.695 0.373 0.948 5.243 0.432 4.348 ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",550,36,"style","Trailing whitespace is superfluous.","#> k lambda mu tau z ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",551,37,"style","Trailing whitespace is superfluous.","#> 3.892 0.160 0.065 69.546 0.316 ","trailing_whitespace_linter" +"vignettes/BTYDplus-HowTo.Rmd",572,24,"style","Put spaces around all infix operators."," stopifnot(length(act)==length(est))","infix_spaces_linter" +"vignettes/BTYDplus-HowTo.Rmd",573,14,"style","Put spaces around all infix operators."," sum(abs(act-est)) / length(act)","infix_spaces_linter" +"vignettes/BTYDplus-HowTo.Rmd",575,1,"style","Variable and function name style should be snake_case or symbols.","mae.pggg <- mae(groceryCBS$x.star, groceryCBS$xstar.pggg)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",576,1,"style","Variable and function name style should be snake_case or symbols.","mae.mbgcnbd <- mae(groceryCBS$x.star, groceryCBS$xstar.mbgcnbd)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",577,1,"style","Variable and function name style should be snake_case or symbols.","mae.pnbd.hb <- mae(groceryCBS$x.star, groceryCBS$xstar.pnbd.hb)","object_name_linter" +"vignettes/BTYDplus-HowTo.Rmd",587,30,"style","Put spaces around all infix operators.","cat(""Lift in MAE:"", round(100*lift, 1), ""%"")","infix_spaces_linter" diff --git a/.dev/revdep_emails/BTYDplus/email-body b/.dev/revdep_emails/BTYDplus/email-body new file mode 100644 index 000000000..a51b1f653 --- /dev/null +++ b/.dev/revdep_emails/BTYDplus/email-body @@ -0,0 +1,29 @@ +Hello Michael Platzer! Thank you for using {lintr} in your package {BTYDplus}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/mplatzer/BTYDplus (hash: 7e8331f7e4a3ae5377b1da97feae7931d95d1705) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 40s on CRAN vs. 29s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/BiasCorrector/attachments/BiasCorrector.warnings b/.dev/revdep_emails/BiasCorrector/attachments/BiasCorrector.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/BiasCorrector/attachments/BiasCorrector.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/BiasCorrector/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/BiasCorrector/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..85c6be2eb --- /dev/null +++ b/.dev/revdep_emails/BiasCorrector/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,33 @@ +"filename","line_number","column_number","type","message","line","linter" +"data-raw/devstuffs.R",11,81,"style","Lines should not be more than 80 characters."," person(""Lorenz A."", ""Kapsner"", email = ""lorenz.kapsner@gmail.com"", role = c(""cre"", ""aut"", ""cph""),","line_length_linter" +"data-raw/devstuffs.R",21,81,"style","Lines should not be more than 80 characters.","my_desc$set(Title = ""A GUI to Correct Measurement Bias in DNA Methylation Analyses"")","line_length_linter" +"data-raw/devstuffs.R",24,81,"style","Lines should not be more than 80 characters."," ""A GUI to correct measurement bias in DNA methylation analyses. The 'BiasCorrector' package "",","line_length_linter" +"data-raw/devstuffs.R",25,81,"style","Lines should not be more than 80 characters."," ""just wraps the functions implemented in the 'R' package 'rBiasCorrection' into a "",","line_length_linter" +"data-raw/devstuffs.R",43,2,"style","Commented code should be removed.","#usethis::use_gpl3_license(name = ""Lorenz Kapsner"")","commented_code_linter" +"data-raw/devstuffs.R",49,81,"style","Lines should not be more than 80 characters.","# https://cran.r-project.org/web/packages/data.table/vignettes/datatable-importing.html","line_length_linter" +"data-raw/devstuffs.R",63,3,"style","Commented code should be removed.","# tag <- ""development""","commented_code_linter" +"data-raw/devstuffs.R",64,3,"style","Commented code should be removed.","# devtools::install_github(repo = ""kapsner/rBiasCorrection"", ref = tag, upgrade = ""always"")","commented_code_linter" +"data-raw/devstuffs.R",64,81,"style","Lines should not be more than 80 characters.","# devtools::install_github(repo = ""kapsner/rBiasCorrection"", ref = tag, upgrade = ""always"")","line_length_linter" +"data-raw/devstuffs.R",65,3,"style","Commented code should be removed.","# # https://cran.r-project.org/web/packages/devtools/vignettes/dependencies.html","commented_code_linter" +"data-raw/devstuffs.R",66,3,"style","Commented code should be removed.","# desc::desc_set_remotes(paste0(""github::kapsner/rBiasCorrection@"", tag), file = usethis::proj_get())","commented_code_linter" +"data-raw/devstuffs.R",66,81,"style","Lines should not be more than 80 characters.","# desc::desc_set_remotes(paste0(""github::kapsner/rBiasCorrection@"", tag), file = usethis::proj_get())","line_length_linter" +"data-raw/devstuffs.R",100,3,"style","Commented code should be removed.","# BiasCorrection(experimental = ""../19_PCR-bias/data/example_data/type1/example_data_type1_experimentaldata.csv"", calibration = ""../19_PCR-bias/data/example_data/type1/example_data_type1_calibrationdata.csv"", samplelocusname = ""Test"")","commented_code_linter" +"data-raw/devstuffs.R",100,81,"style","Lines should not be more than 80 characters.","# BiasCorrection(experimental = ""../19_PCR-bias/data/example_data/type1/example_data_type1_experimentaldata.csv"", calibration = ""../19_PCR-bias/data/example_data/type1/example_data_type1_calibrationdata.csv"", samplelocusname = ""Test"")","line_length_linter" +"data-raw/devstuffs.R",101,3,"style","Commented code should be removed.","# covr::package_coverage()","commented_code_linter" +"data-raw/devstuffs.R",102,3,"style","Commented code should be removed.","# lintr::lint_package()","commented_code_linter" +"inst/application/server.R",20,20,"style","Use FALSE instead of the symbol F."," exp_filereq = F,","T_and_F_symbol_linter" +"inst/application/server.R",28,21,"style","Use TRUE instead of the symbol T."," modal_closed = T,","T_and_F_symbol_linter" +"inst/application/server.R",104,25,"style","Use TRUE instead of the symbol T."," rv$modal_closed <- T","T_and_F_symbol_linter" +"inst/application/server.R",250,30,"style","Use TRUE instead of the symbol T."," startExpanded = T,","T_and_F_symbol_linter" +"inst/application/server.R",255,27,"style","Use TRUE instead of the symbol T."," selected = T","T_and_F_symbol_linter" +"inst/application/server.R",316,30,"style","Use FALSE instead of the symbol F."," startExpanded = F,","T_and_F_symbol_linter" +"inst/application/server.R",321,27,"style","Use TRUE instead of the symbol T."," selected = T","T_and_F_symbol_linter" +"inst/application/server.R",372,30,"style","Use FALSE instead of the symbol F."," startExpanded = F,","T_and_F_symbol_linter" +"inst/application/server.R",377,27,"style","Use TRUE instead of the symbol T."," selected = T","T_and_F_symbol_linter" +"inst/application/server.R",451,30,"style","Use FALSE instead of the symbol F."," startExpanded = F,","T_and_F_symbol_linter" +"inst/application/server.R",502,30,"style","Use FALSE instead of the symbol F."," startExpanded = F,","T_and_F_symbol_linter" +"R/app_utils.R",19,23,"style","Use FALSE instead of the symbol F."," rv$modal_closed <- F","T_and_F_symbol_linter" +"R/moduleFileupload.R",71,24,"style","Use TRUE instead of the symbol T."," rv$exp_filereq <- T","T_and_F_symbol_linter" +"R/moduleFileupload.R",134,30,"style","Use TRUE instead of the symbol T."," rv$exp_filereq <- T","T_and_F_symbol_linter" +"R/moduleFileupload.R",165,30,"style","Use TRUE instead of the symbol T."," rv$exp_filereq <- T","T_and_F_symbol_linter" +"R/type2Files.R",33,47,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (rv$calibr_steps[, min(get(""step""))] < 0 |","vector_logic_linter" diff --git a/.dev/revdep_emails/BiasCorrector/email-body b/.dev/revdep_emails/BiasCorrector/email-body new file mode 100644 index 000000000..3f22ea8ba --- /dev/null +++ b/.dev/revdep_emails/BiasCorrector/email-body @@ -0,0 +1,29 @@ +Hello Lorenz A. Kapsner! Thank you for using {lintr} in your package {BiasCorrector}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/kapsner/BiasCorrector (hash: c359f65c2d50dd03b3edaff7bff083b35dd05215) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 28s on CRAN vs. 9s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/ConNEcT/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/ConNEcT/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..01e42b5a0 --- /dev/null +++ b/.dev/revdep_emails/ConNEcT/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,14 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/barplot.conData.R",36,1,"style","Variable and function name style should be snake_case.","barplot.conData <- function(height,","object_name_linter" +"R/conProf.R",28,23,"style","There should be a space between right parenthesis and an opening curly brace."," for (lag in 1:maxlag){","paren_brace_linter" +"R/conTest.R",45,23,"style","There should be a space between right parenthesis and an opening curly brace."," for (v in 1: nVars){","paren_brace_linter" +"R/conTest.R",49,24,"style","There should be a space between right parenthesis and an opening curly brace."," for (va in 1: nVars){","paren_brace_linter" +"R/conTest.R",56,29,"style","There should be a space between right parenthesis and an opening curly brace."," for (tp in 2:nPoints){","paren_brace_linter" +"R/conTest.R",67,24,"style","There should be a space between right parenthesis and an opening curly brace."," for (va in 1: nVars){","paren_brace_linter" +"R/conTest.R",86,23,"style","There should be a space between right parenthesis and an opening curly brace."," for (var1 in 1:nVars){","paren_brace_linter" +"R/conTest.R",108,20,"style","There should be a space between right parenthesis and an opening curly brace."," for (j in 1:nVars){","paren_brace_linter" +"R/hist.conTest.R",26,22,"style","There should be a space between right parenthesis and an opening curly brace."," for (var1 in 1:nVar){","paren_brace_linter" +"R/lagthemats.R",14,20,"style","There should be a space between right parenthesis and an opening curly brace."," for (i in 1:lag){","paren_brace_linter" +"R/modelAD.R",28,25,"style","There should be a space between right parenthesis and an opening curly brace."," for (tim in 2:nTpoints){","paren_brace_linter" +"R/plot.conProf.R",27,19,"style","There should be a space between right parenthesis and an opening curly brace."," for (i in 1:nVar){","paren_brace_linter" +"R/plot.conProf.R",28,21,"style","There should be a space between right parenthesis and an opening curly brace."," for (j in 1:nVar){","paren_brace_linter" diff --git a/.dev/revdep_emails/ConNEcT/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/ConNEcT/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..9a4eecdf9 --- /dev/null +++ b/.dev/revdep_emails/ConNEcT/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,20 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/barplot.conData.R",38,34,"style","Put spaces around all infix operators."," color=NULL,","infix_spaces_linter" +"R/conMx.R",25,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/conMx.R",50,12,"style","Variable and function name style should be snake_case or symbols."," rownames(obsMax) <- colnames(data1)","object_name_linter" +"R/conMx.R",51,12,"style","Variable and function name style should be snake_case or symbols."," colnames(obsMax) <- colnames(data2)","object_name_linter" +"R/conNEcT.R",43,12,"style","Variable and function name style should be snake_case or symbols."," colnames(allLinks) <- varNames","object_name_linter" +"R/conNEcT.R",44,12,"style","Variable and function name style should be snake_case or symbols."," rownames(allLinks) <- varNames","object_name_linter" +"R/conNEcT.R",48,12,"style","Variable and function name style should be snake_case or symbols."," colnames(signLinks) <- varNames","object_name_linter" +"R/conNEcT.R",49,12,"style","Variable and function name style should be snake_case or symbols."," rownames(signLinks) <- varNames","object_name_linter" +"R/conNEcT.R",50,12,"style","Variable and function name style should be snake_case or symbols."," colnames(pValue) <- varNames","object_name_linter" +"R/conNEcT.R",51,12,"style","Variable and function name style should be snake_case or symbols."," rownames(pValue) <- varNames","object_name_linter" +"R/conProf.R",34,12,"style","Variable and function name style should be snake_case or symbols."," colnames(CM) <- varNames","object_name_linter" +"R/conProf.R",35,12,"style","Variable and function name style should be snake_case or symbols."," rownames(CM) <- varNames","object_name_linter" +"R/conTest.R",54,12,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/conTest.R",72,12,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/conTest.R",103,12,"style","Variable and function name style should be snake_case or symbols."," rownames(obsLinks) <- colnames(obsLinks) <- varNames","object_name_linter" +"R/conTest.R",103,34,"style","Variable and function name style should be snake_case or symbols."," rownames(obsLinks) <- colnames(obsLinks) <- varNames","object_name_linter" +"R/modelAD.R",31,10,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/qgraph.conNEcT.R",24,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/qgraph.conNEcT.R",41,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" diff --git a/.dev/revdep_emails/ConNEcT/email-body b/.dev/revdep_emails/ConNEcT/email-body new file mode 100644 index 000000000..faa900646 --- /dev/null +++ b/.dev/revdep_emails/ConNEcT/email-body @@ -0,0 +1,29 @@ +Hello Nadja Bodner! Thank you for using {lintr} in your package {ConNEcT}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cran/ConNEcT (hash: ee8427c4e5c4d4720a58ec2eae2c33731736d021) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 14s on CRAN vs. 9s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/DBItest/email-body b/.dev/revdep_emails/DBItest/email-body new file mode 100644 index 000000000..fb6e70a10 --- /dev/null +++ b/.dev/revdep_emails/DBItest/email-body @@ -0,0 +1,29 @@ +Hello Kirill MΓΌller! Thank you for using {lintr} in your package {DBItest}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/r-dbi/DBItest (hash: 08291d07504dce1b6c6907bd0b61323741720e3e) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 0s on CRAN vs. 0s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/DIZtools/attachments/DIZtools.warnings b/.dev/revdep_emails/DIZtools/attachments/DIZtools.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/DIZtools/attachments/DIZtools.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/DIZtools/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/DIZtools/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..d3e8fb766 --- /dev/null +++ b/.dev/revdep_emails/DIZtools/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,47 @@ +"filename","line_number","column_number","type","message","line","linter" +"data-raw/debugging.R",11,13,"style","Use <-, not =, for assignment.","system_name = ""i2b2""","assignment_linter" +"data-raw/debugging.R",12,13,"style","Use <-, not =, for assignment.","logfile_dir = tempdir()","assignment_linter" +"data-raw/debugging.R",13,10,"style","Use <-, not =, for assignment.","headless = TRUE","assignment_linter" +"data-raw/debugging.R",14,16,"style","Use <-, not =, for assignment.","ignore_presets = FALSE","assignment_linter" +"data-raw/debugging.R",15,18,"style","Use <-, not =, for assignment.","uppercase_system = TRUE","assignment_linter" +"data-raw/debugging.R",27,17,"style","Use TRUE instead of the symbol T.","}, USE.NAMES = T, simplify = F)","T_and_F_symbol_linter" +"data-raw/debugging.R",27,31,"style","Use FALSE instead of the symbol F.","}, USE.NAMES = T, simplify = F)","T_and_F_symbol_linter" +"data-raw/debugging.R",35,14,"warning","no visible global function definition for β€˜get_display_name’"," return(get_display_name(settings[[i]], name = name))","object_usage_linter" +"data-raw/debugging.R",53,40,"style","There should be a space before an opening curly brace.","get_display_name2 <- function(settings){","brace_linter" +"data-raw/debugging.R",53,40,"style","There should be a space between a right parenthesis and a body expression.","get_display_name2 <- function(settings){","paren_body_linter" +"data-raw/debugging.R",55,57,"style","There should be a space before an opening curly brace."," lapply(names(tmp), function(system, names, settings){","brace_linter" +"data-raw/debugging.R",55,57,"style","There should be a space between a right parenthesis and a body expression."," lapply(names(tmp), function(system, names, settings){","paren_body_linter" +"data-raw/debugging.R",59,16,"warning","no visible global function definition for β€˜get_display_name’"," return(get_display_name(name = system, settings = settings_tmp))","object_usage_linter" +"data-raw/debugging.R",59,59,"warning","no visible binding for global variable β€˜settings_tmp’"," return(get_display_name(name = system, settings = settings_tmp))","object_usage_linter" +"data-raw/debugging.R",65,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" +"data-raw/devstuffs.R",66,2,"style","Commented code should be removed.","#usethis::use_gpl3_license(name = ""UniversitΓ€tsklinikum Erlangen"")","commented_code_linter" +"data-raw/devstuffs.R",70,81,"style","Lines should not be more than 80 characters.","# Listing a package in either Depends or Imports ensures that it’s installed when needed","line_length_linter" +"data-raw/devstuffs.R",72,81,"style","Lines should not be more than 80 characters.","# Loading will load code, data and any DLLs; register S3 and S4 methods; and run the .onLoad() function.","line_length_linter" +"data-raw/devstuffs.R",73,81,"style","Lines should not be more than 80 characters.","## After loading, the package is available in memory, but because it’s not in the search path,","line_length_linter" +"data-raw/devstuffs.R",75,81,"style","Lines should not be more than 80 characters.","## Confusingly, :: will also load a package automatically if it isn’t already loaded.","line_length_linter" +"data-raw/devstuffs.R",76,81,"style","Lines should not be more than 80 characters.","## It’s rare to load a package explicitly, but you can do so with requireNamespace() or loadNamespace().","line_length_linter" +"data-raw/devstuffs.R",77,81,"style","Lines should not be more than 80 characters.","# Attaching puts the package in the search path. You can’t attach a package without first loading it,","line_length_linter" +"data-raw/devstuffs.R",92,3,"style","Commented code should be removed.","# usethis::use_package(""Hmisc"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",96,3,"style","Commented code should be removed.","# usethis::use_package(""psych"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",98,3,"style","Commented code should be removed.","# usethis::use_package(""RJSONIO"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",99,3,"style","Commented code should be removed.","# usethis::use_package(""shiny"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",100,3,"style","Commented code should be removed.","# usethis::use_package(""shinyjs"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",102,3,"style","Commented code should be removed.","# usethis::use_package(""xml2"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",122,81,"style","Lines should not be more than 80 characters.","usethis::use_build_ignore(""## Please apply changes in `./data-raw/devstuffs.R`!"")","line_length_linter" +"data-raw/devstuffs.R",182,3,"style","Commented code should be removed.","# covr::package_coverage()","commented_code_linter" +"data-raw/devstuffs.R",185,3,"style","Commented code should be removed.","# lintr::lint_package()","commented_code_linter" +"data-raw/devstuffs.R",188,3,"style","Commented code should be removed.","# devtools::test()","commented_code_linter" +"data-raw/devstuffs.R",191,3,"style","Commented code should be removed.","# rcmdcheck::rcmdcheck()","commented_code_linter" +"data-raw/devstuffs.R",192,3,"style","Commented code should be removed.","# rcmdcheck::rcmdcheck(args = ""--no-vignettes"", build_args = ""--no-build-vignettes"")","commented_code_linter" +"data-raw/devstuffs.R",192,81,"style","Lines should not be more than 80 characters.","# rcmdcheck::rcmdcheck(args = ""--no-vignettes"", build_args = ""--no-build-vignettes"")","line_length_linter" +"data-raw/devstuffs.R",200,3,"style","Commented code should be removed.","# build|ci|docs|feat|fix|perf|refactor|test","commented_code_linter" +"data-raw/devstuffs.R",202,81,"style","Lines should not be more than 80 characters.","# https://github.com/gitpython-developers/GitPython/issues/1016#issuecomment-1104114129","line_length_linter" +"data-raw/devstuffs.R",219,3,"style","Commented code should be removed.","# imgurl <- path.expand(""~/development/Rpackages/bg1.jpeg"")","commented_code_linter" +"data-raw/devstuffs.R",236,5,"style","Commented code should be removed.","# #l_width = 6,","commented_code_linter" +"data-raw/devstuffs.R",237,5,"style","Commented code should be removed.","# #l_height = 6,","commented_code_linter" +"data-raw/devstuffs.R",239,5,"style","Commented code should be removed.","# asp = 1","commented_code_linter" +"R/clean_path_name.R",35,39,"style","Variable and function name style should be snake_case or symbols.","clean_path_name <- function(pathname, remove.slash = FALSE) {","object_name_linter" +"R/feedback.R",257,5,"warning","local variable β€˜catch_msg’ assigned but may not be used"," catch_msg <- paste0(""Something went wrong while trying"",","object_usage_linter" +"R/feedback.R",635,3,"warning","local variable β€˜new_defaults’ assigned but may not be used"," new_defaults <- list(","object_usage_linter" +"R/is.empty.R",74,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/setenv_file.R",50,19,"style","Use FALSE instead of the symbol F."," }, USE.NAMES = F)","T_and_F_symbol_linter" diff --git a/.dev/revdep_emails/DIZtools/email-body b/.dev/revdep_emails/DIZtools/email-body new file mode 100644 index 000000000..1727ef470 --- /dev/null +++ b/.dev/revdep_emails/DIZtools/email-body @@ -0,0 +1,29 @@ +Hello Jonathan M. Mang! Thank you for using {lintr} in your package {DIZtools}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/miracum/misc-diztools (hash: 0aa2060d445db21e559d825c039705f2dd0c27ab) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 15s on CRAN vs. 8s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/DIZutils/attachments/DIZutils.warnings b/.dev/revdep_emails/DIZutils/attachments/DIZutils.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/DIZutils/attachments/DIZutils.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/DIZutils/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/DIZutils/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..8db58ff62 --- /dev/null +++ b/.dev/revdep_emails/DIZutils/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,62 @@ +"filename","line_number","column_number","type","message","line","linter" +"data-raw/debug_sql.R",5,13,"style","Use <-, not =, for assignment.","system_name = ""fhir_gw""","assignment_linter" +"data-raw/debug_sql.R",7,81,"style","Lines should not be more than 80 characters.","sql_statement <- ""SELECT r1.pid AS \""Person.PatientIn.Patienten-Identifikator.Patienten-Identifikator\"", r2.jsonbdata2 ->> 'gender' AS \""Person.Demographie.AdministrativesGeschlecht\""","line_length_linter" +"data-raw/debug_sql.R",9,81,"style","Lines should not be more than 80 characters.","( SELECT * FROM ( SELECT REPLACE(jsonb_path_query(DATA, '$.subject') ->> 'reference', 'Patient/', '') AS pid, to_timestamp(jsonb_path_query(DATA, '$.period') ->> 'start', 'YYYY-MM-DDTHH:MI:SS') AS fhir_start_date","line_length_linter" +"data-raw/debug_sql.R",11,81,"style","Lines should not be more than 80 characters.","WHERE r_intermediate.fhir_start_date >= '2021-02-28' AND r_intermediate.fhir_start_date <= '2021-03-01 23:59:59' ) r1,","line_length_linter" +"data-raw/debug_sql.R",12,81,"style","Lines should not be more than 80 characters.","LATERAL ( SELECT DATA AS jsonbdata2 FROM resources WHERE TYPE = 'Patient' AND ( (DATA ->> 'id') = r1.pid) ) r2;""","line_length_linter" +"data-raw/debug_sql.R",24,81,"style","Lines should not be more than 80 characters.","to_timestamp(jsonb_path_query(DATA, '$.period') ->> 'start', 'YYYY-MM-DDTHH:MI:SS') AS fhir_start_date,","line_length_linter" +"data-raw/debug_sql.R",28,81,"style","Lines should not be more than 80 characters.","WHERE TYPE = 'Encounter') AS r_intermediate WHERE r_intermediate.fhir_start_date = '2020-01-01') r1","line_length_linter" +"data-raw/debug_sql.R",53,81,"style","Lines should not be more than 80 characters.","to_timestamp(jsonb_path_query(DATA, '$.period') ->> 'start', 'YYYY-MM-DDTHH:MI:SS') AS fhir_start_date","line_length_linter" +"data-raw/debug_sql.R",64,2,"style","Commented code should be removed.","#dat2 <- query_database(db_con, sql_statement = very_long_query)","commented_code_linter" +"data-raw/debug_sql.R",65,81,"style","Lines should not be more than 80 characters.","# Error while executing SQL-query: Error: Failed to fetch row: SSL SYSCALL error: EOF detected","line_length_linter" +"data-raw/debug_sql.R",73,81,"style","Lines should not be more than 80 characters.","SELECT * FROM ( SELECT REPLACE(jsonb_path_query(DATA, '$.subject') ->> 'reference', 'Patient/', '') AS pid, to_timestamp(jsonb_path_query(DATA, '$.period') ->> 'start', 'YYYY-MM-DDTHH:MI:SS') AS fhir_start_date","line_length_linter" +"data-raw/debug_sql.R",75,81,"style","Lines should not be more than 80 characters.","WHERE r_intermediate.fhir_start_date >= '2021-02-28' AND r_intermediate.fhir_start_date <= '2021-03-01 23:59:59'","line_length_linter" +"data-raw/debug_sql.R",79,5,"style","Commented code should be removed.","# Sys.time() |> print()","commented_code_linter" +"data-raw/debug_sql.R",80,5,"style","Commented code should be removed.","# res <- RPostgres::dbSendQuery(conn = db_con, statement = sql_statement, statement_timeout = 0)","commented_code_linter" +"data-raw/debug_sql.R",80,81,"style","Lines should not be more than 80 characters.","# res <- RPostgres::dbSendQuery(conn = db_con, statement = sql_statement, statement_timeout = 0)","line_length_linter" +"data-raw/debug_sql.R",81,5,"style","Commented code should be removed.","# Sys.time() |> print()","commented_code_linter" +"data-raw/debug_sql.R",86,3,"style","Commented code should be removed.","# RPostgres::dbFetch(res, n = 1000)","commented_code_linter" +"data-raw/debug_sql.R",89,5,"style","Commented code should be removed.","# data.table::data.table(stringsAsFactors = FALSE)","commented_code_linter" +"data-raw/debug_sql.R",91,3,"style","Commented code should be removed.","# RPostgres::dbClearResult(res)","commented_code_linter" +"data-raw/debugging.R",11,13,"style","Use <-, not =, for assignment.","system_name = ""i2b2""","assignment_linter" +"data-raw/debugging.R",12,13,"style","Use <-, not =, for assignment.","logfile_dir = tempdir()","assignment_linter" +"data-raw/debugging.R",13,10,"style","Use <-, not =, for assignment.","headless = TRUE","assignment_linter" +"data-raw/debugging.R",14,16,"style","Use <-, not =, for assignment.","ignore_presets = FALSE","assignment_linter" +"data-raw/debugging.R",15,18,"style","Use <-, not =, for assignment.","uppercase_system = TRUE","assignment_linter" +"data-raw/debugging.R",27,17,"style","Use TRUE instead of the symbol T.","}, USE.NAMES = T, simplify = F)","T_and_F_symbol_linter" +"data-raw/debugging.R",27,31,"style","Use FALSE instead of the symbol F.","}, USE.NAMES = T, simplify = F)","T_and_F_symbol_linter" +"data-raw/debugging.R",35,14,"warning","no visible global function definition for β€˜get_display_name’"," return(get_display_name(settings[[i]], name = name))","object_usage_linter" +"data-raw/debugging.R",53,40,"style","There should be a space before an opening curly brace.","get_display_name2 <- function(settings){","brace_linter" +"data-raw/debugging.R",53,40,"style","There should be a space between a right parenthesis and a body expression.","get_display_name2 <- function(settings){","paren_body_linter" +"data-raw/debugging.R",55,57,"style","There should be a space before an opening curly brace."," lapply(names(tmp), function(system, names, settings){","brace_linter" +"data-raw/debugging.R",55,57,"style","There should be a space between a right parenthesis and a body expression."," lapply(names(tmp), function(system, names, settings){","paren_body_linter" +"data-raw/debugging.R",59,16,"warning","no visible global function definition for β€˜get_display_name’"," return(get_display_name(name = system, settings = settings_tmp))","object_usage_linter" +"data-raw/debugging.R",59,59,"warning","no visible binding for global variable β€˜settings_tmp’"," return(get_display_name(name = system, settings = settings_tmp))","object_usage_linter" +"data-raw/debugging.R",65,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" +"data-raw/devstuffs.R",70,3,"style","Commented code should be removed.","# my_desc$set(""VignetteBuilder"" = ""knitr"")","commented_code_linter" +"data-raw/devstuffs.R",83,2,"style","Commented code should be removed.","#usethis::use_gpl3_license(name = ""UniversitΓ€tsklinikum Erlangen, Germany"")","commented_code_linter" +"data-raw/devstuffs.R",87,81,"style","Lines should not be more than 80 characters.","# Listing a package in either Depends or Imports ensures that it’s installed when needed","line_length_linter" +"data-raw/devstuffs.R",89,81,"style","Lines should not be more than 80 characters.","# Loading will load code, data and any DLLs; register S3 and S4 methods; and run the .onLoad() function.","line_length_linter" +"data-raw/devstuffs.R",90,81,"style","Lines should not be more than 80 characters.","## After loading, the package is available in memory, but because it’s not in the search path,","line_length_linter" +"data-raw/devstuffs.R",92,81,"style","Lines should not be more than 80 characters.","## Confusingly, :: will also load a package automatically if it isn’t already loaded.","line_length_linter" +"data-raw/devstuffs.R",93,81,"style","Lines should not be more than 80 characters.","## It’s rare to load a package explicitly, but you can do so with requireNamespace() or loadNamespace().","line_length_linter" +"data-raw/devstuffs.R",94,81,"style","Lines should not be more than 80 characters.","# Attaching puts the package in the search path. You can’t attach a package without first loading it,","line_length_linter" +"data-raw/devstuffs.R",127,7,"style","There should be a space before an opening curly brace.","} else{","brace_linter" +"data-raw/devstuffs.R",135,81,"style","Lines should not be more than 80 characters."," ""url::https://gitlab.miracum.org/miracum/misc/diztools/-/archive/"", tools_tag, ""/diztools-"", tools_tag, "".zip""","line_length_linter" +"data-raw/devstuffs.R",157,3,"style","Commented code should be removed.","# usethis::use_build_ignore(""NEWS.md"")","commented_code_linter" +"data-raw/devstuffs.R",188,3,"style","Commented code should be removed.","# covr::package_coverage()","commented_code_linter" +"data-raw/devstuffs.R",191,3,"style","Commented code should be removed.","# lintr::lint_package()","commented_code_linter" +"data-raw/devstuffs.R",194,3,"style","Commented code should be removed.","# devtools::test()","commented_code_linter" +"data-raw/devstuffs.R",197,3,"style","Commented code should be removed.","# rcmdcheck::rcmdcheck()","commented_code_linter" +"data-raw/devstuffs.R",198,3,"style","Commented code should be removed.","# rcmdcheck::rcmdcheck(args = ""--no-vignettes"", build_args = ""--no-build-vignettes"")","commented_code_linter" +"data-raw/devstuffs.R",198,81,"style","Lines should not be more than 80 characters.","# rcmdcheck::rcmdcheck(args = ""--no-vignettes"", build_args = ""--no-build-vignettes"")","line_length_linter" +"data-raw/devstuffs.R",205,3,"style","Commented code should be removed.","# build|ci|docs|feat|fix|perf|refactor|test","commented_code_linter" +"data-raw/devstuffs.R",207,81,"style","Lines should not be more than 80 characters.","# https://github.com/gitpython-developers/GitPython/issues/1016#issuecomment-1104114129","line_length_linter" +"data-raw/devstuffs.R",223,3,"style","Commented code should be removed.","# imgurl <- path.expand(""~/development/Rpackages/bg2.jpeg"")","commented_code_linter" +"data-raw/devstuffs.R",236,5,"style","Commented code should be removed.","# #p_color = ""#5c87ff"", # ""#b4f2e9"",","commented_code_linter" +"data-raw/devstuffs.R",238,5,"style","Commented code should be removed.","# #h_fill = ""#b4e7f2"",","commented_code_linter" +"data-raw/devstuffs.R",241,5,"style","Commented code should be removed.","# #l_width = 6,","commented_code_linter" +"data-raw/devstuffs.R",242,5,"style","Commented code should be removed.","# #l_height = 6,","commented_code_linter" +"data-raw/devstuffs.R",244,5,"style","Commented code should be removed.","# asp = 1","commented_code_linter" +"R/combine_stats.R",95,57,"style","Use TRUE instead of the symbol T."," min(x = summaries[[""Min""]], na.rm = T)),","T_and_F_symbol_linter" +"R/combine_stats.R",140,45,"style","Use TRUE instead of the symbol T."," no = max(summaries[[""Max""]], na.rm = T)","T_and_F_symbol_linter" diff --git a/.dev/revdep_emails/DIZutils/email-body b/.dev/revdep_emails/DIZutils/email-body new file mode 100644 index 000000000..03a72208f --- /dev/null +++ b/.dev/revdep_emails/DIZutils/email-body @@ -0,0 +1,29 @@ +Hello Jonathan M. Mang! Thank you for using {lintr} in your package {DIZutils}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/miracum/misc-dizutils (hash: cfad461ba87fc78d7d60d36d42c1ef096ca457c1) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 6s on CRAN vs. 4s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/DQAgui/attachments/DQAgui.warnings b/.dev/revdep_emails/DQAgui/attachments/DQAgui.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/DQAgui/attachments/DQAgui.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/DQAgui/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/DQAgui/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..f5e9f3be2 --- /dev/null +++ b/.dev/revdep_emails/DQAgui/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,82 @@ +"filename","line_number","column_number","type","message","line","linter" +"data-raw/debugging_info.R",1,3,"style","Commented code should be removed.","# install.packages(""DIZtools"")","commented_code_linter" +"data-raw/debugging_info.R",2,3,"style","Commented code should be removed.","# install.packages(""DIZutils"")","commented_code_linter" +"data-raw/debugging_info.R",3,3,"style","Commented code should be removed.","# install.packages(""DQAstats"")","commented_code_linter" +"data-raw/debugging_info.R",4,3,"style","Commented code should be removed.","# install.packages(""DQAgui"")","commented_code_linter" +"data-raw/debugging_info.R",9,6,"style","Use <-, not =, for assignment.","port = 3838","assignment_linter" +"data-raw/debugging_info.R",10,12,"style","Use <-, not =, for assignment.","output_dir = ""output/""","assignment_linter" +"data-raw/debugging_info.R",16,3,"style","Commented code should be removed.","# mdr_filename = ""mdr.csv""","commented_code_linter" +"data-raw/debugging_info.R",17,3,"style","Commented code should be removed.","# logfile_dir = ""~/share/logfiles/""","commented_code_linter" +"data-raw/debugging_info.R",23,12,"style","Use <-, not =, for assignment.","utils_path = DIZtools::clean_path_name(system.file(""application/_utilities"",","assignment_linter" +"data-raw/debugging_info.R",25,14,"style","Use <-, not =, for assignment.","mdr_filename = ""mdr.csv""","assignment_linter" +"data-raw/debugging_info.R",34,3,"style","Commented code should be removed.","# mdr_filename = ""mdr_example_data.csv""","commented_code_linter" +"data-raw/debugging_info.R",35,3,"style","Commented code should be removed.","# logfile_dir <- tempdir()","commented_code_linter" +"data-raw/debugging_info.R",40,13,"style","Use <-, not =, for assignment.","logfile_dir = tempdir()","assignment_linter" +"data-raw/debugging_info.R",41,10,"style","Use <-, not =, for assignment.","parallel = TRUE","assignment_linter" +"data-raw/debugging_info.R",42,8,"style","Use <-, not =, for assignment.","ncores = 8","assignment_linter" +"data-raw/debugging_info.R",44,3,"style","Commented code should be removed.","# utils_path = ""/home/user/development/Rpackages/dqa/miracumdqa/inst/application/_utilities/""","commented_code_linter" +"data-raw/debugging_info.R",44,81,"style","Lines should not be more than 80 characters.","# utils_path = ""/home/user/development/Rpackages/dqa/miracumdqa/inst/application/_utilities/""","line_length_linter" +"data-raw/debugging_info.R",50,3,"style","Commented code should be removed.","# utils_path = ""~/git-local/miracum/ume_dqatool/inst/application/_utilities/""","commented_code_linter" +"data-raw/debugging_info.R",52,3,"style","Commented code should be removed.","# mdr_filename = ""mdr_combined.csv""","commented_code_linter" +"data-raw/debugging_info.R",58,6,"style","Commented code should be removed."," #list.files(path = ""../"", pattern = ""dev.env"")","commented_code_linter" +"data-raw/debugging_info.R",61,3,"style","Commented code should be removed.","# shiny::shinyAppDir(""inst/application/"")","commented_code_linter" +"data-raw/debugging_info.R",75,5,"style","Commented code should be removed.","# OMOP_PASSWORD = ""admin1""","commented_code_linter" +"data-raw/debugging_info.R",81,5,"style","Commented code should be removed.","# mdr_filename = mdr_filename","commented_code_linter" +"data-raw/debugging_testdata.R",1,3,"style","Commented code should be removed.","# remotes::install_git(url = ""https://gitlab.miracum.org/miracum/misc/diztools"", ref = ""dev"")","commented_code_linter" +"data-raw/debugging_testdata.R",1,81,"style","Lines should not be more than 80 characters.","# remotes::install_git(url = ""https://gitlab.miracum.org/miracum/misc/diztools"", ref = ""dev"")","line_length_linter" +"data-raw/debugging_testdata.R",2,3,"style","Commented code should be removed.","# remotes::install_git(url = ""https://gitlab.miracum.org/miracum/misc/dizutils"", ref = ""development"")","commented_code_linter" +"data-raw/debugging_testdata.R",2,81,"style","Lines should not be more than 80 characters.","# remotes::install_git(url = ""https://gitlab.miracum.org/miracum/misc/dizutils"", ref = ""development"")","line_length_linter" +"data-raw/debugging_testdata.R",3,3,"style","Commented code should be removed.","# remotes::install_git(url = ""https://gitlab.miracum.org/miracum/dqa/dqastats"", ref = ""development"")","commented_code_linter" +"data-raw/debugging_testdata.R",3,81,"style","Lines should not be more than 80 characters.","# remotes::install_git(url = ""https://gitlab.miracum.org/miracum/dqa/dqastats"", ref = ""development"")","line_length_linter" +"data-raw/debugging_testdata.R",4,3,"style","Commented code should be removed.","# remotes::install_git(url = ""https://gitlab.miracum.org/miracum/dqa/dqagui"", ref = ""development"")","commented_code_linter" +"data-raw/debugging_testdata.R",4,81,"style","Lines should not be more than 80 characters.","# remotes::install_git(url = ""https://gitlab.miracum.org/miracum/dqa/dqagui"", ref = ""development"")","line_length_linter" +"data-raw/debugging_testdata.R",6,3,"style","Commented code should be removed.","# install.packages(""DIZtools"")","commented_code_linter" +"data-raw/debugging_testdata.R",7,3,"style","Commented code should be removed.","# install.packages(""DIZutils"")","commented_code_linter" +"data-raw/debugging_testdata.R",8,3,"style","Commented code should be removed.","# install.packages(""DQAstats"")","commented_code_linter" +"data-raw/debugging_testdata.R",9,3,"style","Commented code should be removed.","# install.packages(""DQAgui"")","commented_code_linter" +"data-raw/debugging_testdata.R",11,6,"style","Use <-, not =, for assignment.","port = 3838","assignment_linter" +"data-raw/debugging_testdata.R",14,81,"style","Lines should not be more than 80 characters.","Sys.setenv(""CSV_SOURCE_BASEPATH"" = system.file(""demo_data"", package = ""DQAstats""))","line_length_linter" +"data-raw/debugging_testdata.R",15,81,"style","Lines should not be more than 80 characters.","Sys.setenv(""CSV_TARGET_BASEPATH"" = system.file(""demo_data"", package = ""DQAstats""))","line_length_linter" +"data-raw/debugging_testdata.R",19,2,"style","Commented code should be removed.","#Sys.setenv(""CSV_SOURCE_BASEPATH"" = ""~/development/Rpackages"")","commented_code_linter" +"data-raw/debugging_testdata.R",20,2,"style","Commented code should be removed.","#Sys.setenv(""CSV_TARGET_BASEPATH"" = ""~/development/Rpackages"")","commented_code_linter" +"data-raw/debugging_testdata.R",24,12,"style","Use <-, not =, for assignment.","utils_path = system.file(""demo_data/utilities"",","assignment_linter" +"data-raw/debugging_testdata.R",26,14,"style","Use <-, not =, for assignment.","mdr_filename = ""mdr_example_data.csv""","assignment_linter" +"data-raw/debugging_testdata.R",31,13,"style","Use <-, not =, for assignment.","logfile_dir = tempdir()","assignment_linter" +"data-raw/debugging_testdata.R",32,10,"style","Use <-, not =, for assignment.","parallel = FALSE","assignment_linter" +"data-raw/debugging_testdata.R",33,8,"style","Use <-, not =, for assignment.","ncores = 4","assignment_linter" +"data-raw/devstuffs.R",24,81,"style","Lines should not be more than 80 characters."," person(""MIRACUM - Medical Informatics in Research and Care in University Medicine"", role = ""fnd""),","line_length_linter" +"data-raw/devstuffs.R",35,81,"style","Lines should not be more than 80 characters.","my_desc$set(Description = ""A graphical user interface (GUI) to the functions implemented in the R package 'DQAstats'."")","line_length_linter" +"data-raw/devstuffs.R",48,2,"style","Commented code should be removed.","#usethis::use_gpl3_license(name=""UniversitΓ€tsklinikum Erlangen"")","commented_code_linter" +"data-raw/devstuffs.R",52,81,"style","Lines should not be more than 80 characters.","# Listing a package in either Depends or Imports ensures that it’s installed when needed","line_length_linter" +"data-raw/devstuffs.R",54,81,"style","Lines should not be more than 80 characters.","# Loading will load code, data and any DLLs; register S3 and S4 methods; and run the .onLoad() function.","line_length_linter" +"data-raw/devstuffs.R",55,81,"style","Lines should not be more than 80 characters.","## After loading, the package is available in memory, but because it’s not in the search path,","line_length_linter" +"data-raw/devstuffs.R",57,81,"style","Lines should not be more than 80 characters.","## Confusingly, :: will also load a package automatically if it isn’t already loaded.","line_length_linter" +"data-raw/devstuffs.R",58,81,"style","Lines should not be more than 80 characters.","## It’s rare to load a package explicitly, but you can do so with requireNamespace() or loadNamespace().","line_length_linter" +"data-raw/devstuffs.R",59,81,"style","Lines should not be more than 80 characters.","# Attaching puts the package in the search path. You can’t attach a package without first loading it,","line_length_linter" +"data-raw/devstuffs.R",100,7,"style","There should be a space before an opening curly brace.","} else{","brace_linter" +"data-raw/devstuffs.R",108,81,"style","Lines should not be more than 80 characters."," ""url::https://gitlab.miracum.org/miracum/misc/diztools/-/archive/"", tools_tag, ""/diztools-"", tools_tag, "".zip""","line_length_linter" +"data-raw/devstuffs.R",119,7,"style","There should be a space before an opening curly brace.","} else{","brace_linter" +"data-raw/devstuffs.R",127,81,"style","Lines should not be more than 80 characters."," ""url::https://gitlab.miracum.org/miracum/misc/dizutils/-/archive/"", utils_tag, ""/dizutils-"", utils_tag, "".zip""","line_length_linter" +"data-raw/devstuffs.R",139,7,"style","There should be a space before an opening curly brace.","} else{","brace_linter" +"data-raw/devstuffs.R",147,81,"style","Lines should not be more than 80 characters."," ""url::https://gitlab.miracum.org/miracum/dqa/dqastats/-/archive/"", stats_tag, ""/dqastats-"", stats_tag, "".zip""","line_length_linter" +"data-raw/devstuffs.R",220,2,"style","Commented code should be removed.","#usethis::use_git_ignore(""/inst/demo_data/utilities/MDR/.~lock.mdr_example_data.csv#"")","commented_code_linter" +"data-raw/devstuffs.R",220,81,"style","Lines should not be more than 80 characters.","#usethis::use_git_ignore(""/inst/demo_data/utilities/MDR/.~lock.mdr_example_data.csv#"")","line_length_linter" +"data-raw/devstuffs.R",236,3,"style","Commented code should be removed.","# build|ci|docs|feat|fix|perf|refactor|test","commented_code_linter" +"data-raw/devstuffs.R",238,81,"style","Lines should not be more than 80 characters.","# https://github.com/gitpython-developers/GitPython/issues/1016#issuecomment-1104114129","line_length_linter" +"data-raw/devstuffs.R",252,3,"style","Commented code should be removed.","# imgurl <- path.expand(""~/development/Rpackages/bg4.jpeg"")","commented_code_linter" +"data-raw/devstuffs.R",269,5,"style","Commented code should be removed.","# #l_width = 6,","commented_code_linter" +"data-raw/devstuffs.R",270,5,"style","Commented code should be removed.","# #l_height = 6,","commented_code_linter" +"data-raw/devstuffs.R",272,5,"style","Commented code should be removed.","# asp = 1","commented_code_linter" +"inst/application/server.R",221,52,"style","Use TRUE instead of the symbol T."," rv$end_time <- format(Sys.time(), usetz = T, tz = ""CET"")","T_and_F_symbol_linter" +"R/app_utils.R",149,19,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/app_utils.R",213,19,"style","Use TRUE instead of the symbol T."," ui = T,","T_and_F_symbol_linter" +"R/app_utils.R",226,13,"style","Use TRUE instead of the symbol T."," ui = T,","T_and_F_symbol_linter" +"R/app_utils.R",463,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/moduleAtempPlausibility.R",205,36,"style","Use FALSE instead of the symbol F."," ""distinct""), with = F]","T_and_F_symbol_linter" +"R/moduleConfig.R",391,17,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/moduleConfig.R",446,17,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/moduleConfig.R",585,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/moduleConfig.R",658,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/moduleConfig.R",733,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/moduleConfig.R",806,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/moduleLog.R",65,27,"style","Use TRUE instead of the symbol T."," decreasing = T","T_and_F_symbol_linter" diff --git a/.dev/revdep_emails/DQAgui/email-body b/.dev/revdep_emails/DQAgui/email-body new file mode 100644 index 000000000..22c05ab58 --- /dev/null +++ b/.dev/revdep_emails/DQAgui/email-body @@ -0,0 +1,29 @@ +Hello Lorenz A. Kapsner! Thank you for using {lintr} in your package {DQAgui}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/miracum/dqa-dqagui (hash: 6c88c5bfce7caa2cfd51fee7001ac17eb29e7bc0) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 31s on CRAN vs. 10s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/DataFakeR/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/DataFakeR/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..2280153bd --- /dev/null +++ b/.dev/revdep_emails/DataFakeR/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,7 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/schema_deps.R",52,3,"warning","local variable β€˜plur’ assigned but may not be used"," plur <- """"","object_usage_linter" +"R/schema_deps.R",53,3,"warning","local variable β€˜plur_do’ assigned but may not be used"," plur_do <- ""doesn't""","object_usage_linter" +"R/schema_deps.R",54,3,"warning","local variable β€˜plur_them’ assigned but may not be used"," plur_them <- ""it""","object_usage_linter" +"R/schema_utils.R",44,5,"warning","local variable β€˜indent’ assigned but may not be used"," indent <- paste0(c(rep("" "", ind), rep(""="", 5 - ind)), collapse = """")","object_usage_linter" +"R/simulate_num_col.R",51,18,"style","Place a space before left parenthesis, except in a function call."," round(10^(precision - scale) * stats::runif(n), scale),","spaces_left_parentheses_linter" +"R/simulate_num_col.R",64,16,"style","Place a space before left parenthesis, except in a function call."," round(10^(precision - scale) * stats::runif(n), scale),","spaces_left_parentheses_linter" diff --git a/.dev/revdep_emails/DataFakeR/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/DataFakeR/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..0988b16a7 --- /dev/null +++ b/.dev/revdep_emails/DataFakeR/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,107 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/doc/datafaker_workflow.Rmd",16,15,"style","Trailing whitespace is superfluous."," eval = TRUE, ","trailing_whitespace_linter" +"inst/doc/datafaker_workflow.Rmd",25,44,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set() # Figure alignment ","trailing_whitespace_linter" +"inst/doc/datafaker_workflow.Rmd",26,9,"style","Variable and function name style should be snake_case or symbols.","library(DataFakeR)","object_name_linter" +"inst/doc/datafaker_workflow.Rmd",41,12,"error","unexpected '<'"," source = , ",NA +"inst/doc/datafaker_workflow.Rmd",41,35,"style","Trailing whitespace is superfluous."," source = , ","trailing_whitespace_linter" +"inst/doc/datafaker_workflow.Rmd",51,35,"style","Trailing whitespace is superfluous."," source = , ","trailing_whitespace_linter" +"inst/doc/datafaker_workflow.Rmd",131,10,"style","Trailing whitespace is superfluous."," schema, ","trailing_whitespace_linter" +"inst/doc/datafaker_workflow.Rmd",132,36,"style","Trailing whitespace is superfluous."," file = , ","trailing_whitespace_linter" +"inst/doc/extra_parameters.Rmd",16,15,"style","Trailing whitespace is superfluous."," eval = TRUE, ","trailing_whitespace_linter" +"inst/doc/extra_parameters.Rmd",25,44,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set() # Figure alignment ","trailing_whitespace_linter" +"inst/doc/extra_parameters.Rmd",68,81,"style","Lines should not be more than 80 characters.","sch <- schema_source(system.file(""extdata"", ""schema-patient.yml"", package = ""DataFakeR""))","line_length_linter" +"inst/doc/extra_parameters.Rmd",109,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, file = system.file(""extdata"", ""schema-patient_2.yml"", package = ""DataFakeR""))","line_length_linter" +"inst/doc/extra_parameters.Rmd",154,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, file = system.file(""extdata"", ""schema-patient_3.yml"", package = ""DataFakeR""))","line_length_linter" +"inst/doc/extra_parameters.Rmd",220,9,"style","Use <-, not =, for assignment.","my_opts = set_faker_opts(","assignment_linter" +"inst/doc/extra_parameters.Rmd",231,7,"style","Trailing whitespace is superfluous."," sch, ","trailing_whitespace_linter" +"inst/doc/extra_parameters.Rmd",298,9,"style","Use <-, not =, for assignment.","my_opts = set_faker_opts(","assignment_linter" +"inst/doc/extra_parameters.Rmd",309,7,"style","Trailing whitespace is superfluous."," sch, ","trailing_whitespace_linter" +"inst/doc/extra_parameters.Rmd",310,80,"style","Trailing whitespace is superfluous."," file = system.file(""extdata"", ""schema-patient_5.yml"", package = ""DataFakeR""), ","trailing_whitespace_linter" +"inst/doc/extra_parameters.Rmd",315,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" +"inst/doc/main.Rmd",17,15,"style","Trailing whitespace is superfluous."," eval = TRUE, ","trailing_whitespace_linter" +"inst/doc/main.Rmd",26,44,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set() # Figure alignment ","trailing_whitespace_linter" +"inst/doc/schema_structure.Rmd",14,15,"style","Trailing whitespace is superfluous."," eval = TRUE, ","trailing_whitespace_linter" +"inst/doc/schema_structure.Rmd",23,44,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set() # Figure alignment ","trailing_whitespace_linter" +"inst/doc/simulation_methods.Rmd",16,15,"style","Trailing whitespace is superfluous."," eval = TRUE, ","trailing_whitespace_linter" +"inst/doc/simulation_methods.Rmd",25,44,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set() # Figure alignment ","trailing_whitespace_linter" +"inst/doc/simulation_methods.Rmd",79,81,"style","Lines should not be more than 80 characters.","sch <- schema_source(system.file(""extdata"", ""schema-books.yml"", package = ""DataFakeR""))","line_length_linter" +"inst/doc/simulation_methods.Rmd",124,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, file = system.file(""extdata"", ""schema-books_2.yml"", package = ""DataFakeR""))","line_length_linter" +"inst/doc/simulation_methods.Rmd",178,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, file = system.file(""extdata"", ""schema-books_3.yml"", package = ""DataFakeR""))","line_length_linter" +"inst/doc/simulation_methods.Rmd",241,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, file = system.file(""extdata"", ""schema-books_4.yml"", package = ""DataFakeR""))","line_length_linter" +"inst/doc/simulation_methods.Rmd",278,81,"style","Lines should not be more than 80 characters."," paste(sample(first, n), sample(second, n), sample(third, n), sample(fourth, n))","line_length_linter" +"inst/doc/simulation_methods.Rmd",302,50,"style","Trailing whitespace is superfluous."," sample(first, n, replace = TRUE), second_res, ","trailing_whitespace_linter" +"inst/doc/simulation_methods.Rmd",319,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"inst/doc/simulation_methods.Rmd",321,33,"style","Trailing whitespace is superfluous."," do.call(books, spec_params), ","trailing_whitespace_linter" +"inst/doc/simulation_methods.Rmd",349,42,"style","Trailing whitespace is superfluous."," sim_expr = do.call(books, spec_params), ","trailing_whitespace_linter" +"inst/doc/simulation_methods.Rmd",391,81,"style","Lines should not be more than 80 characters."," opt_simul_spec_character = opt_simul_spec_character(book = simul_spec_character_book)","line_length_linter" +"inst/doc/simulation_methods.Rmd",394,71,"style","Trailing whitespace is superfluous."," system.file(""extdata"", ""schema-books_5.yml"", package = ""DataFakeR""), ","trailing_whitespace_linter" +"inst/doc/simulation_methods.Rmd",460,31,"style","Put spaces around all infix operators."," opt_simul_restricted_ = opt_simul_restricted_(my_method = method, ...)","infix_spaces_linter" +"inst/doc/simulation_methods.Rmd",460,36,"error","unexpected '>'"," opt_simul_restricted_ = opt_simul_restricted_(my_method = method, ...)",NA +"inst/doc/simulation_methods.Rmd",460,81,"style","Lines should not be more than 80 characters."," opt_simul_restricted_ = opt_simul_restricted_(my_method = method, ...)","line_length_linter" +"inst/doc/simulation_methods.Rmd",503,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, system.file(""extdata"", ""schema-books_6.yml"", package = ""DataFakeR""))","line_length_linter" +"inst/doc/simulation_methods.Rmd",554,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, system.file(""extdata"", ""schema-books_7.yml"", package = ""DataFakeR""))","line_length_linter" +"inst/doc/simulation_methods.Rmd",597,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, system.file(""extdata"", ""schema-books_8.yml"", package = ""DataFakeR""))","line_length_linter" +"inst/doc/simulation_methods.Rmd",664,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, system.file(""extdata"", ""schema-books_9.yml"", package = ""DataFakeR""))","line_length_linter" +"inst/doc/simulation_options.Rmd",16,15,"style","Trailing whitespace is superfluous."," eval = TRUE, ","trailing_whitespace_linter" +"inst/doc/simulation_options.Rmd",25,44,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set() # Figure alignment ","trailing_whitespace_linter" +"inst/doc/simulation_options.Rmd",133,81,"style","Lines should not be more than 80 characters.","set_faker_opts(opt_default_table = opt_default_table(nrows = nrows_simul_constant(10)))","line_length_linter" +"inst/doc/simulation_options.Rmd",164,25,"style","Put spaces around all infix operators."," opt_simul_spec_ = opt_simul_spec_(","infix_spaces_linter" +"inst/doc/simulation_options.Rmd",164,30,"error","unexpected '>'"," opt_simul_spec_ = opt_simul_spec_(",NA +"inst/doc/structure_from_db.Rmd",16,15,"style","Trailing whitespace is superfluous."," eval = TRUE, ","trailing_whitespace_linter" +"inst/doc/structure_from_db.Rmd",25,44,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set() # Figure alignment ","trailing_whitespace_linter" +"inst/doc/structure_from_db.Rmd",60,30,"error","unexpected '>'","set_faker_opts(opt_pull_ = opt_pull_(...))",NA +"R/schema_source.R",51,24,"style","Variable and function name style should be snake_case or symbols."," attr(self$def, ""schema-graph"") <- value","object_name_linter" +"R/schema_source.R",125,16,"style","Variable and function name style should be snake_case or symbols."," attr(schema, ""schema-graph"") <- schema_graph","object_name_linter" +"tests/testthat/test-simulate_cols.R",14,16,"style","Variable and function name style should be snake_case or symbols."," attr(schema, ""schema-graph"") <- attr(schema, ""schema-graph"") %>%","object_name_linter" +"tests/testthat/test-simulate_cols.R",32,16,"style","Variable and function name style should be snake_case or symbols."," attr(schema, ""schema-graph"") <- attr(schema, ""schema-graph"") %>%","object_name_linter" +"vignettes/datafaker_workflow.Rmd",16,15,"style","Trailing whitespace is superfluous."," eval = TRUE, ","trailing_whitespace_linter" +"vignettes/datafaker_workflow.Rmd",25,44,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set() # Figure alignment ","trailing_whitespace_linter" +"vignettes/datafaker_workflow.Rmd",26,9,"style","Variable and function name style should be snake_case or symbols.","library(DataFakeR)","object_name_linter" +"vignettes/datafaker_workflow.Rmd",41,12,"error","unexpected '<'"," source = , ",NA +"vignettes/datafaker_workflow.Rmd",41,35,"style","Trailing whitespace is superfluous."," source = , ","trailing_whitespace_linter" +"vignettes/datafaker_workflow.Rmd",51,35,"style","Trailing whitespace is superfluous."," source = , ","trailing_whitespace_linter" +"vignettes/datafaker_workflow.Rmd",131,10,"style","Trailing whitespace is superfluous."," schema, ","trailing_whitespace_linter" +"vignettes/datafaker_workflow.Rmd",132,36,"style","Trailing whitespace is superfluous."," file = , ","trailing_whitespace_linter" +"vignettes/extra_parameters.Rmd",16,15,"style","Trailing whitespace is superfluous."," eval = TRUE, ","trailing_whitespace_linter" +"vignettes/extra_parameters.Rmd",25,44,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set() # Figure alignment ","trailing_whitespace_linter" +"vignettes/extra_parameters.Rmd",68,81,"style","Lines should not be more than 80 characters.","sch <- schema_source(system.file(""extdata"", ""schema-patient.yml"", package = ""DataFakeR""))","line_length_linter" +"vignettes/extra_parameters.Rmd",109,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, file = system.file(""extdata"", ""schema-patient_2.yml"", package = ""DataFakeR""))","line_length_linter" +"vignettes/extra_parameters.Rmd",154,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, file = system.file(""extdata"", ""schema-patient_3.yml"", package = ""DataFakeR""))","line_length_linter" +"vignettes/extra_parameters.Rmd",220,9,"style","Use <-, not =, for assignment.","my_opts = set_faker_opts(","assignment_linter" +"vignettes/extra_parameters.Rmd",231,7,"style","Trailing whitespace is superfluous."," sch, ","trailing_whitespace_linter" +"vignettes/extra_parameters.Rmd",298,9,"style","Use <-, not =, for assignment.","my_opts = set_faker_opts(","assignment_linter" +"vignettes/extra_parameters.Rmd",309,7,"style","Trailing whitespace is superfluous."," sch, ","trailing_whitespace_linter" +"vignettes/extra_parameters.Rmd",310,80,"style","Trailing whitespace is superfluous."," file = system.file(""extdata"", ""schema-patient_5.yml"", package = ""DataFakeR""), ","trailing_whitespace_linter" +"vignettes/extra_parameters.Rmd",315,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" +"vignettes/main.Rmd",17,15,"style","Trailing whitespace is superfluous."," eval = TRUE, ","trailing_whitespace_linter" +"vignettes/main.Rmd",26,44,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set() # Figure alignment ","trailing_whitespace_linter" +"vignettes/schema_structure.Rmd",14,15,"style","Trailing whitespace is superfluous."," eval = TRUE, ","trailing_whitespace_linter" +"vignettes/schema_structure.Rmd",23,44,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set() # Figure alignment ","trailing_whitespace_linter" +"vignettes/simulation_methods.Rmd",16,15,"style","Trailing whitespace is superfluous."," eval = TRUE, ","trailing_whitespace_linter" +"vignettes/simulation_methods.Rmd",25,44,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set() # Figure alignment ","trailing_whitespace_linter" +"vignettes/simulation_methods.Rmd",79,81,"style","Lines should not be more than 80 characters.","sch <- schema_source(system.file(""extdata"", ""schema-books.yml"", package = ""DataFakeR""))","line_length_linter" +"vignettes/simulation_methods.Rmd",124,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, file = system.file(""extdata"", ""schema-books_2.yml"", package = ""DataFakeR""))","line_length_linter" +"vignettes/simulation_methods.Rmd",178,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, file = system.file(""extdata"", ""schema-books_3.yml"", package = ""DataFakeR""))","line_length_linter" +"vignettes/simulation_methods.Rmd",241,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, file = system.file(""extdata"", ""schema-books_4.yml"", package = ""DataFakeR""))","line_length_linter" +"vignettes/simulation_methods.Rmd",278,81,"style","Lines should not be more than 80 characters."," paste(sample(first, n), sample(second, n), sample(third, n), sample(fourth, n))","line_length_linter" +"vignettes/simulation_methods.Rmd",302,50,"style","Trailing whitespace is superfluous."," sample(first, n, replace = TRUE), second_res, ","trailing_whitespace_linter" +"vignettes/simulation_methods.Rmd",319,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/simulation_methods.Rmd",321,33,"style","Trailing whitespace is superfluous."," do.call(books, spec_params), ","trailing_whitespace_linter" +"vignettes/simulation_methods.Rmd",349,42,"style","Trailing whitespace is superfluous."," sim_expr = do.call(books, spec_params), ","trailing_whitespace_linter" +"vignettes/simulation_methods.Rmd",391,81,"style","Lines should not be more than 80 characters."," opt_simul_spec_character = opt_simul_spec_character(book = simul_spec_character_book)","line_length_linter" +"vignettes/simulation_methods.Rmd",394,71,"style","Trailing whitespace is superfluous."," system.file(""extdata"", ""schema-books_5.yml"", package = ""DataFakeR""), ","trailing_whitespace_linter" +"vignettes/simulation_methods.Rmd",460,31,"style","Put spaces around all infix operators."," opt_simul_restricted_ = opt_simul_restricted_(my_method = method, ...)","infix_spaces_linter" +"vignettes/simulation_methods.Rmd",460,36,"error","unexpected '>'"," opt_simul_restricted_ = opt_simul_restricted_(my_method = method, ...)",NA +"vignettes/simulation_methods.Rmd",460,81,"style","Lines should not be more than 80 characters."," opt_simul_restricted_ = opt_simul_restricted_(my_method = method, ...)","line_length_linter" +"vignettes/simulation_methods.Rmd",503,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, system.file(""extdata"", ""schema-books_6.yml"", package = ""DataFakeR""))","line_length_linter" +"vignettes/simulation_methods.Rmd",554,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, system.file(""extdata"", ""schema-books_7.yml"", package = ""DataFakeR""))","line_length_linter" +"vignettes/simulation_methods.Rmd",597,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, system.file(""extdata"", ""schema-books_8.yml"", package = ""DataFakeR""))","line_length_linter" +"vignettes/simulation_methods.Rmd",664,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, system.file(""extdata"", ""schema-books_9.yml"", package = ""DataFakeR""))","line_length_linter" +"vignettes/simulation_options.Rmd",16,15,"style","Trailing whitespace is superfluous."," eval = TRUE, ","trailing_whitespace_linter" +"vignettes/simulation_options.Rmd",25,44,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set() # Figure alignment ","trailing_whitespace_linter" +"vignettes/simulation_options.Rmd",133,81,"style","Lines should not be more than 80 characters.","set_faker_opts(opt_default_table = opt_default_table(nrows = nrows_simul_constant(10)))","line_length_linter" +"vignettes/simulation_options.Rmd",164,25,"style","Put spaces around all infix operators."," opt_simul_spec_ = opt_simul_spec_(","infix_spaces_linter" +"vignettes/simulation_options.Rmd",164,30,"error","unexpected '>'"," opt_simul_spec_ = opt_simul_spec_(",NA +"vignettes/structure_from_db.Rmd",16,15,"style","Trailing whitespace is superfluous."," eval = TRUE, ","trailing_whitespace_linter" +"vignettes/structure_from_db.Rmd",25,44,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set() # Figure alignment ","trailing_whitespace_linter" +"vignettes/structure_from_db.Rmd",60,30,"error","unexpected '>'","set_faker_opts(opt_pull_ = opt_pull_(...))",NA diff --git a/.dev/revdep_emails/DataFakeR/email-body b/.dev/revdep_emails/DataFakeR/email-body new file mode 100644 index 000000000..d5448b999 --- /dev/null +++ b/.dev/revdep_emails/DataFakeR/email-body @@ -0,0 +1,29 @@ +Hello Krystian Igras! Thank you for using {lintr} in your package {DataFakeR}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cran/DataFakeR (hash: ff174573fda51498f41b5fa6e22b807e32c70aa4) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 29s on CRAN vs. 19s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/DepthProc/attachments/DepthProc.failure b/.dev/revdep_emails/DepthProc/attachments/DepthProc.failure new file mode 100644 index 000000000..c3d4a1db0 --- /dev/null +++ b/.dev/revdep_emails/DepthProc/attachments/DepthProc.failure @@ -0,0 +1 @@ +object 'absolute_paths_linter' not found diff --git a/.dev/revdep_emails/DepthProc/email-body b/.dev/revdep_emails/DepthProc/email-body new file mode 100644 index 000000000..417bad26d --- /dev/null +++ b/.dev/revdep_emails/DepthProc/email-body @@ -0,0 +1,29 @@ +Hello Zygmunt Zawadzki! Thank you for using {lintr} in your package {DepthProc}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/zzawadz/DepthProc (hash: 63b5120c9d9cf3a603516d8f04880b48bceda2bc) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 13s on CRAN vs. 0s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/DominoDataCapture/email-body b/.dev/revdep_emails/DominoDataCapture/email-body new file mode 100644 index 000000000..04091d02f --- /dev/null +++ b/.dev/revdep_emails/DominoDataCapture/email-body @@ -0,0 +1,29 @@ +Hello Vivekananda Tadala! Thank you for using {lintr} in your package {DominoDataCapture}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cran/DominoDataCapture (hash: c66c6dd748d0e0b1a2fcb74f7354ec8ef0bbd325) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 4s on CRAN vs. 2s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/FSelectorRcpp/attachments/FSelectorRcpp.warnings b/.dev/revdep_emails/FSelectorRcpp/attachments/FSelectorRcpp.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/FSelectorRcpp/attachments/FSelectorRcpp.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/FSelectorRcpp/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/FSelectorRcpp/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..4269c64e0 --- /dev/null +++ b/.dev/revdep_emails/FSelectorRcpp/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,5 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/discretize_transform.R",47,1,"style","Variable and function names should not be longer than 30 characters.","discretize_transform.FsDiscretizeTransformer <-","object_length_linter" +"R/discretize.R",183,1,"style","Variable and function name style should be snake_case.","discretize.data.frame <- function(x, y,","object_name_linter" +"R/relief.R",82,13,"style","Place a space before left parenthesis, except in a function call."," next()","spaces_left_parentheses_linter" +"R/relief.R",85,13,"style","Place a space before left parenthesis, except in a function call."," next()","spaces_left_parentheses_linter" diff --git a/.dev/revdep_emails/FSelectorRcpp/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/FSelectorRcpp/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..1c3604445 --- /dev/null +++ b/.dev/revdep_emails/FSelectorRcpp/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,68 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/benchmarks/bench-cutOff.R",18,10,"style","Variable and function name style should be snake_case or symbols.","rownames(testDataFrame) <- paste0(""row_"", 1:100000)","object_name_linter" +"inst/benchmarks/bench-discretise.R",16,25,"style","Put spaces around all infix operators.","system.time(Discretize(y~x))","infix_spaces_linter" +"inst/benchmarks/bench-discretise.R",19,55,"style","Put spaces around all infix operators.","all(fs_discretize(x, y) + 1 == as.numeric(Discretize(y~x)[, 1]))","infix_spaces_linter" +"inst/benchmarks/bench-discretise.R",21,44,"style","Put spaces around all infix operators.","microbenchmark::microbenchmark(Discretize(y~x), fs_discretize(x, y))","infix_spaces_linter" +"R/discretize_transform.R",71,14,"style","Variable and function name style should be snake_case or symbols."," attr(data, ""fsSplitPointsList"") <- splitPoints","object_name_linter" +"R/discretize_transform.R",99,7,"style","Any function spanning multiple lines should use curly braces."," function(x, y)","brace_linter" +"R/discretize.R",136,17,"style","Variable and function name style should be snake_case or symbols."," attr(res, ""SplitValues"") <- control$breaks","object_name_linter" +"R/discretize.R",155,7,"style","Variable and function name style should be snake_case or symbols."," splitPointsList[[col]] <- splitVals","object_name_linter" +"R/discretize.R",164,7,"style","Variable and function name style should be snake_case or symbols."," splitPointsList[[col]] <- NA","object_name_linter" +"R/discretize.R",174,14,"style","Variable and function name style should be snake_case or symbols."," attr(data, ""fsSplitPointsList"") <- c(","object_name_linter" +"R/utils.R",154,5,"style","Variable and function name style should be snake_case or symbols."," toSub[withBrackets] <- gsub(pattern = ""]]"", replacement = """",","object_name_linter" +"R/utils.R",156,5,"style","Variable and function name style should be snake_case or symbols."," toSub[withBrackets] <- strsplit(x = toSub[withBrackets], split = ""[["",","object_name_linter" +"R/utils.R",158,5,"style","Variable and function name style should be snake_case or symbols."," toSub[withBrackets] <- lapply(toSub[withBrackets], get_colname)","object_name_linter" +"R/utils.R",159,5,"style","Variable and function name style should be snake_case or symbols."," toSub[-withBrackets] <- gsub(pattern = "".*\\$"", replacement = """",","object_name_linter" +"tests/testthat/test-cutoff.R",9,14,"style","Variable and function name style should be snake_case or symbols."," rownames(testDataFrame) <- testDataFrame[[1]]","object_name_linter" +"tests/testthat/test-discretize.R",264,28,"style","Put spaces around all infix operators."," expect_error(discretize(y~., dt, discIntegers = FALSE))","infix_spaces_linter" +"tests/testthat/test-na.R",11,5,"style","Variable and function name style should be snake_case or symbols."," dtIris[1, 1] <- NA","object_name_linter" +"tests/testthat/test-na.R",12,5,"style","Variable and function name style should be snake_case or symbols."," dtIris[2, 2] <- NA","object_name_linter" +"tests/testthat/test-na.R",13,5,"style","Variable and function name style should be snake_case or symbols."," dtIris[3, 5] <- NA","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",18,1,"style","Variable and function name style should be snake_case or symbols.","is.pkg <- all(c(""RTCGA.rnaseq"", ""microbenchmark"", ""RWeka"", ""pkgdown"") %in% rownames(installed.packages()))","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",19,3,"style","Place a space before left parenthesis, except in a function call.","if(!is.pkg) {","spaces_left_parentheses_linter" +"vignettes/benchmarks_discretize.Rmd",23,3,"style","Place a space before left parenthesis, except in a function call.","if(is.pkg && !pkgdown::in_pkgdown()) {","spaces_left_parentheses_linter" +"vignettes/benchmarks_discretize.Rmd",24,3,"style","Variable and function name style should be snake_case or symbols."," is.pkg <- FALSE","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",28,20,"style","Trailing whitespace is superfluous."," paste(sep = """", ","trailing_whitespace_linter" +"vignettes/benchmarks_discretize.Rmd",39,1,"style","Variable and function name style should be snake_case or symbols.","fig.path <- if(pkgdown::in_pkgdown()) {","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",39,15,"style","Place a space before left parenthesis, except in a function call.","fig.path <- if(pkgdown::in_pkgdown()) {","spaces_left_parentheses_linter" +"vignettes/benchmarks_discretize.Rmd",47,19,"style","Trailing whitespace is superfluous."," fig.width = 8, ","trailing_whitespace_linter" +"vignettes/benchmarks_discretize.Rmd",102,1,"style","Variable and function name style should be snake_case or symbols.","BRCA.rnaseq <- RTCGA.rnaseq::BRCA.rnaseq","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",103,1,"style","Variable and function name style should be snake_case or symbols.","BRCA.rnaseq$bcr_patient_barcode <- ","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",103,35,"style","Trailing whitespace is superfluous.","BRCA.rnaseq$bcr_patient_barcode <- ","trailing_whitespace_linter" +"vignettes/benchmarks_discretize.Rmd",105,7,"style","Variable and function name style should be snake_case or symbols.","names(BRCA.rnaseq) <- gsub(pattern = ""?"", replacement = ""q"",","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",107,7,"style","Variable and function name style should be snake_case or symbols.","names(BRCA.rnaseq) <- gsub(pattern = ""[[:punct:]]"", replacement = ""_"",","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",122,22,"style","Variable and function name style should be snake_case or symbols.","names_by <- function(nameBy, vecBy) {","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",122,30,"style","Variable and function name style should be snake_case or symbols.","names_by <- function(nameBy, vecBy) {","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",127,22,"style","Trailing whitespace is superfluous."," }), ","trailing_whitespace_linter" +"vignettes/benchmarks_discretize.Rmd",131,28,"style","Variable and function name style should be snake_case or symbols.","get_times <- function(fun, vecRows, vecCols, nTimes) {","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",131,37,"style","Variable and function name style should be snake_case or symbols.","get_times <- function(fun, vecRows, vecCols, nTimes) {","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",131,46,"style","Variable and function name style should be snake_case or symbols.","get_times <- function(fun, vecRows, vecCols, nTimes) {","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",132,3,"style","Variable and function name style should be snake_case or symbols."," forRows <- pblapply(vecRows, function(nRows) {","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",132,41,"style","Variable and function name style should be snake_case or symbols."," forRows <- pblapply(vecRows, function(nRows) {","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",133,5,"style","Variable and function name style should be snake_case or symbols."," forCols <- pblapply(vecCols + 1, function(nCols) {","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",133,47,"style","Variable and function name style should be snake_case or symbols."," forCols <- pblapply(vecCols + 1, function(nCols) {","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",138,5,"style","Variable and function name style should be snake_case or symbols."," colsNames <- names_by(nameBy = ""columns_"", vecBy = vecCols)","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",141,3,"style","Variable and function name style should be snake_case or symbols."," rowsNames <- names_by(nameBy = ""rows_"", vecBy = vecRows)","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",167,18,"style","Variable and function name style should be snake_case or symbols."," function(setOfCols) {","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",195,3,"style","Variable and function name style should be snake_case or symbols."," yUnit <- gsub(pattern = ""time"",","object_name_linter" +"vignettes/benchmarks_discretize.Rmd",198,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/get_started.Rmd",38,18,"style","Only use double-quotes.","install.packages('FSelectorRcpp') # stable release version on CRAN","single_quotes_linter" +"vignettes/get_started.Rmd",39,26,"style","Only use double-quotes.","devtools::install_github('mi2-warsaw/FSelectorRcpp') # dev version","single_quotes_linter" +"vignettes/get_started.Rmd",70,8,"style","Trailing whitespace is superfluous."," ) %>% ","trailing_whitespace_linter" +"vignettes/get_started.Rmd",73,8,"style","Trailing whitespace is superfluous."," ) %>% ","trailing_whitespace_linter" +"vignettes/get_started.Rmd",74,67,"style","Trailing whitespace is superfluous."," to_formula( # Create a new formula object with ","trailing_whitespace_linter" +"vignettes/get_started.Rmd",76,22,"style","Trailing whitespace is superfluous."," class = ""Species"" ","trailing_whitespace_linter" +"vignettes/get_started.Rmd",80,17,"style","Trailing whitespace is superfluous."," data = iris, ","trailing_whitespace_linter" +"vignettes/get_started.Rmd",81,24,"style","Trailing whitespace is superfluous."," family = ""binomial"" ","trailing_whitespace_linter" +"vignettes/get_started.Rmd",83,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/get_started.Rmd",89,1,"style","Variable and function name style should be snake_case or symbols.","evaluator_R2_lm <- # Create a scorer function.","object_name_linter" +"vignettes/get_started.Rmd",93,16,"style","Trailing whitespace is superfluous."," dependent = ","trailing_whitespace_linter" +"vignettes/get_started.Rmd",98,78,"style","Trailing whitespace is superfluous."," to_formula( # This is the score to use to choose between considered ","trailing_whitespace_linter" +"vignettes/get_started.Rmd",107,15,"style","Trailing whitespace is superfluous."," attributes = ","trailing_whitespace_linter" +"vignettes/get_started.Rmd",109,87,"style","Trailing whitespace is superfluous."," fun = evaluator_R2_lm, # And it calculates the score of a subset that depends on the ","trailing_whitespace_linter" +"vignettes/get_started.Rmd",111,68,"style","Trailing whitespace is superfluous."," mode = ""exhaustive"", # exhaustive - means to check all possible ","trailing_whitespace_linter" +"vignettes/get_started.Rmd",112,59,"style","Trailing whitespace is superfluous."," sizes = # attributes' subset combinations ","trailing_whitespace_linter" +"vignettes/get_started.Rmd",113,5,"warning","1:length(...) is likely to be wrong in the empty edge case. Use seq_along() instead."," 1:length(attributes) # of sizes passed in sizes.","seq_linter" +"vignettes/integer-variables.Rmd",63,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/integer-variables.Rmd",70,35,"style","Commas should always have a space after.","can_discretize(as.integer(c(rep(1,10), rep(2, 10))))","commas_linter" +"vignettes/integer-variables.Rmd",78,26,"style","Commas should always have a space after."," z = as.integer(c(rep(1,10), rep(2, 10)))","commas_linter" diff --git a/.dev/revdep_emails/FSelectorRcpp/email-body b/.dev/revdep_emails/FSelectorRcpp/email-body new file mode 100644 index 000000000..ed95598ad --- /dev/null +++ b/.dev/revdep_emails/FSelectorRcpp/email-body @@ -0,0 +1,29 @@ +Hello Zygmunt Zawadzki! Thank you for using {lintr} in your package {FSelectorRcpp}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/mi2-warsaw/FSelectorRcpp (hash: 1326a5075b976b2a946b6e0fa41dfd6ae0773ebc) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 22s on CRAN vs. 13s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/INSPECTumours/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/INSPECTumours/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..9c57528ab --- /dev/null +++ b/.dev/revdep_emails/INSPECTumours/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,12 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/report.rmd",12,1,"style","Use spaces to indent, not tabs."," echo = FALSE, ","no_tab_linter" +"inst/report.rmd",12,16,"style","Trailing whitespace is superfluous."," echo = FALSE, ","trailing_whitespace_linter" +"inst/report.rmd",13,1,"style","Use spaces to indent, not tabs."," message = FALSE,","no_tab_linter" +"inst/report.rmd",14,1,"style","Use spaces to indent, not tabs."," warning = FALSE,","no_tab_linter" +"inst/report.rmd",15,1,"style","Use spaces to indent, not tabs."," results = ""asis""","no_tab_linter" +"inst/report.rmd",52,81,"style","Lines should not be more than 80 characters."," df_grouped <- dplyr::group_by(params$r$excluded_data, study, treatment, animal_id, reason)","line_length_linter" +"inst/report.rmd",53,81,"style","Lines should not be more than 80 characters."," df_sum <- dplyr::summarise(df_grouped, days = paste(unique(day), collapse = "", "")) ","line_length_linter" +"inst/report.rmd",53,84,"style","Trailing whitespace is superfluous."," df_sum <- dplyr::summarise(df_grouped, days = paste(unique(day), collapse = "", "")) ","trailing_whitespace_linter" +"inst/report.rmd",160,81,"style","Lines should not be more than 80 characters.","cat(""Asterisks indicate that the drug was considered significantly effective by comparing to the control."")","line_length_linter" +"R/fct-exclude.R",16,3,"style","`else` should come on the same line as the previous `}`."," else if (day_ex == ""All"") {","brace_linter" +"R/mod-load-file.R",109,46,"style","Any function spanning multiple lines should use curly braces."," lapply(seq_len(length(guesses)), function(i)","brace_linter" diff --git a/.dev/revdep_emails/INSPECTumours/email-body b/.dev/revdep_emails/INSPECTumours/email-body new file mode 100644 index 000000000..a7491dd29 --- /dev/null +++ b/.dev/revdep_emails/INSPECTumours/email-body @@ -0,0 +1,29 @@ +Hello Bairu Zhang! Thank you for using {lintr} in your package {INSPECTumours}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cran/INSPECTumours (hash: eed636aa77e2fd29b8ca75c8b20424223cfa2f93) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 19s on CRAN vs. 11s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/NHSRplotthedots/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/NHSRplotthedots/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..000d628cf --- /dev/null +++ b/.dev/revdep_emails/NHSRplotthedots/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,3 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/ptd_calculate_point_type.R",60,26,"style","Place a space before left parenthesis, except in a function call."," vapply(seq_along(y)[-(1:6)], function(i) { # Exclude Linting","spaces_left_parentheses_linter" +"R/ZZZ.R",18,1,"style","Variable and function name style should be snake_case.","`%||%` <- function(a, b) {","object_name_linter" diff --git a/.dev/revdep_emails/NHSRplotthedots/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/NHSRplotthedots/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..c273ca659 --- /dev/null +++ b/.dev/revdep_emails/NHSRplotthedots/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,41 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/doc/deviations.Rmd",12,12,"style","Put spaces around all infix operators."," fig.width=7, fig.height=5,","infix_spaces_linter" +"inst/doc/deviations.Rmd",12,26,"style","Put spaces around all infix operators."," fig.width=7, fig.height=5,","infix_spaces_linter" +"inst/doc/deviations.Rmd",67,11,"style","Trailing whitespace is superfluous."," plot() + ","trailing_whitespace_linter" +"inst/doc/deviations.Rmd",81,81,"style","Lines should not be more than 80 characters.","spc_data <- ptd_spc(df, value_field = data, date_field = date, screen_outliers = FALSE)","line_length_linter" +"inst/doc/deviations.Rmd",83,11,"style","Trailing whitespace is superfluous."," plot() + ","trailing_whitespace_linter" +"inst/doc/intro.Rmd",12,12,"style","Put spaces around all infix operators."," fig.width=7, fig.height=5,","infix_spaces_linter" +"inst/doc/intro.Rmd",12,26,"style","Put spaces around all infix operators."," fig.width=7, fig.height=5,","infix_spaces_linter" +"inst/doc/intro.Rmd",39,19,"style","Trailing whitespace is superfluous.","ae_attendances %>% ","trailing_whitespace_linter" +"inst/doc/intro.Rmd",40,43,"style","Trailing whitespace is superfluous."," filter(org_code == ""RRK"", type == 1) %>% ","trailing_whitespace_linter" +"inst/doc/intro.Rmd",57,33,"style","Trailing whitespace is superfluous.","stable_set <- ae_attendances %>% ","trailing_whitespace_linter" +"inst/doc/intro.Rmd",59,15,"style","Put spaces around all infix operators."," type ==1,","infix_spaces_linter" +"inst/doc/intro.Rmd",62,81,"style","Lines should not be more than 80 characters.","ptd_spc(stable_set, value_field = breaches, date_field = period, improvement_direction = ""decrease"")","line_length_linter" +"inst/doc/intro.Rmd",73,33,"style","Trailing whitespace is superfluous.","change_set <- ae_attendances %>% ","trailing_whitespace_linter" +"inst/doc/intro.Rmd",93,13,"style","Trailing whitespace is superfluous.","facet_set <- ","trailing_whitespace_linter" +"inst/doc/intro.Rmd",94,21,"style","Trailing whitespace is superfluous."," ae_attendances %>% ","trailing_whitespace_linter" +"inst/doc/intro.Rmd",110,32,"style","Trailing whitespace is superfluous.","facet_set <- ae_attendances %>% ","trailing_whitespace_linter" +"inst/doc/intro.Rmd",118,32,"style","Trailing whitespace is superfluous."," facet_field = org_code, ","trailing_whitespace_linter" +"inst/doc/intro.Rmd",129,32,"style","Trailing whitespace is superfluous.","facet_set <- ae_attendances %>% ","trailing_whitespace_linter" +"inst/doc/intro.Rmd",144,42,"style","Put spaces around all infix operators.","a + theme(axis.text.x = element_text(size=6, angle=45))","infix_spaces_linter" +"inst/doc/intro.Rmd",144,51,"style","Put spaces around all infix operators.","a + theme(axis.text.x = element_text(size=6, angle=45))","infix_spaces_linter" +"vignettes/deviations.Rmd",12,12,"style","Put spaces around all infix operators."," fig.width=7, fig.height=5,","infix_spaces_linter" +"vignettes/deviations.Rmd",12,26,"style","Put spaces around all infix operators."," fig.width=7, fig.height=5,","infix_spaces_linter" +"vignettes/deviations.Rmd",67,11,"style","Trailing whitespace is superfluous."," plot() + ","trailing_whitespace_linter" +"vignettes/deviations.Rmd",81,81,"style","Lines should not be more than 80 characters.","spc_data <- ptd_spc(df, value_field = data, date_field = date, screen_outliers = FALSE)","line_length_linter" +"vignettes/deviations.Rmd",83,11,"style","Trailing whitespace is superfluous."," plot() + ","trailing_whitespace_linter" +"vignettes/intro.Rmd",12,12,"style","Put spaces around all infix operators."," fig.width=7, fig.height=5,","infix_spaces_linter" +"vignettes/intro.Rmd",12,26,"style","Put spaces around all infix operators."," fig.width=7, fig.height=5,","infix_spaces_linter" +"vignettes/intro.Rmd",39,19,"style","Trailing whitespace is superfluous.","ae_attendances %>% ","trailing_whitespace_linter" +"vignettes/intro.Rmd",40,43,"style","Trailing whitespace is superfluous."," filter(org_code == ""RRK"", type == 1) %>% ","trailing_whitespace_linter" +"vignettes/intro.Rmd",57,33,"style","Trailing whitespace is superfluous.","stable_set <- ae_attendances %>% ","trailing_whitespace_linter" +"vignettes/intro.Rmd",59,15,"style","Put spaces around all infix operators."," type ==1,","infix_spaces_linter" +"vignettes/intro.Rmd",62,81,"style","Lines should not be more than 80 characters.","ptd_spc(stable_set, value_field = breaches, date_field = period, improvement_direction = ""decrease"")","line_length_linter" +"vignettes/intro.Rmd",73,33,"style","Trailing whitespace is superfluous.","change_set <- ae_attendances %>% ","trailing_whitespace_linter" +"vignettes/intro.Rmd",93,13,"style","Trailing whitespace is superfluous.","facet_set <- ","trailing_whitespace_linter" +"vignettes/intro.Rmd",94,21,"style","Trailing whitespace is superfluous."," ae_attendances %>% ","trailing_whitespace_linter" +"vignettes/intro.Rmd",110,32,"style","Trailing whitespace is superfluous.","facet_set <- ae_attendances %>% ","trailing_whitespace_linter" +"vignettes/intro.Rmd",118,32,"style","Trailing whitespace is superfluous."," facet_field = org_code, ","trailing_whitespace_linter" +"vignettes/intro.Rmd",129,32,"style","Trailing whitespace is superfluous.","facet_set <- ae_attendances %>% ","trailing_whitespace_linter" +"vignettes/intro.Rmd",144,42,"style","Put spaces around all infix operators.","a + theme(axis.text.x = element_text(size=6, angle=45))","infix_spaces_linter" +"vignettes/intro.Rmd",144,51,"style","Put spaces around all infix operators.","a + theme(axis.text.x = element_text(size=6, angle=45))","infix_spaces_linter" diff --git a/.dev/revdep_emails/NHSRplotthedots/email-body b/.dev/revdep_emails/NHSRplotthedots/email-body new file mode 100644 index 000000000..6eab782cc --- /dev/null +++ b/.dev/revdep_emails/NHSRplotthedots/email-body @@ -0,0 +1,29 @@ +Hello Christopher Reading! Thank you for using {lintr} in your package {NHSRplotthedots}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cran/NHSRplotthedots (hash: 1d1fe989dcd6aa3de89a71bf29a466db70c2c29d) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 24s on CRAN vs. 13s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/OpenML/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/OpenML/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..848f53f4a --- /dev/null +++ b/.dev/revdep_emails/OpenML/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,3 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/uploadOMLFlow.R",79,52,"style","There should be a space between right parenthesis and an opening curly brace.","# if (!(is.null(sourcefile) || is.na(sourcefile))){","paren_brace_linter" +"R/uploadOMLFlow.R",110,39,"style","There should be a space between right parenthesis and an opening curly brace.","# createLearnerSourcefile = function(x){","paren_brace_linter" diff --git a/.dev/revdep_emails/OpenML/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/OpenML/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..f9a790b5d --- /dev/null +++ b/.dev/revdep_emails/OpenML/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,82 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/chunkOMLlist.R",21,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(args$limit) | !is.null(args$offset))","vector_logic_linter" +"R/config_helpers.R",45,32,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nchar(conf$apikey) != 32 & conf$apikey %nin% c("""", ""PLEASE CHANGE ME""))","vector_logic_linter" +"R/convertOMLDataSetToMlr.R",44,3,"style","Variable and function name style should be snake_case or symbols."," drop.levels = TRUE,","object_name_linter" +"R/convertOMLDataSetToMlr.R",62,42,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (any(!is.na(desc$ignore.attribute)) & ignore.flagged.attributes) {","vector_logic_linter" +"R/convertOMLDataSetToMlr.R",114,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.factor(target) | is.logical(target))","vector_logic_linter" +"R/convertOMLRunToBMR.R",62,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (all(!conf.cols.intergish) & pred.class == ""PredictionClassif"") {","vector_logic_linter" +"R/convertOMLTaskToMlr.R",32,3,"style","Variable and function name style should be snake_case or symbols."," drop.levels = TRUE,","object_name_linter" +"R/downloadOMLObject.R",40,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (f[[xml.ind]]$found & !overwrite) {","vector_logic_linter" +"R/downloadOMLObject.R",72,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(source.url) & !is.null(binary.url)) {","vector_logic_linter" +"R/downloadOMLObject.R",102,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(url) & length(url) != 0) {","vector_logic_linter" +"R/downloadOMLObject.R",103,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (f[[file.ind]]$found & !overwrite) {","vector_logic_linter" +"R/getCachedOMLDataSetStatus.R",31,51,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (any(cached.ds$status == ""deactivated"") > 0L & show.warnings) {","vector_logic_linter" +"R/OMLFlow_Class.R",99,3,"style","Variable and function name style should be snake_case or symbols."," source.url = NA_character_,","object_name_linter" +"R/OMLFlow_Class.R",101,3,"style","Variable and function name style should be snake_case or symbols."," source.format = NA_character_,","object_name_linter" +"R/OMLFlow_Class.R",103,3,"style","Variable and function name style should be snake_case or symbols."," source.md5 = NA_character_,","object_name_linter" +"R/OMLFlow_Class.R",105,3,"style","Variable and function name style should be snake_case or symbols."," source.path = NA_character_,","object_name_linter" +"R/OMLStudy_Class.R",41,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(flow.id) | !is.null(run.id))","vector_logic_linter" +"R/tagOMLObject.R",18,15,"style","Any function spanning multiple lines should use curly braces."," lapply(ids, function(id)","brace_linter" +"R/tagOMLObject.R",26,15,"style","Any function spanning multiple lines should use curly braces."," lapply(ids, function(id)","brace_linter" +"R/uploadOMLFlow.R",61,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(x$object) & !testFile(binaryfile)) {","vector_logic_linter" +"R/uploadOMLFlow.R",66,3,"style","Either both or neither branch in `if`/`else` should use curly braces."," if (testFile(binaryfile)) {","brace_linter" +"R/uploadOMLRun.R",60,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(flow$object) & !is.null(bmr)) {","vector_logic_linter" +"tests/testthat/helper_testthat.R",17,18,"warning","no visible global function definition for β€˜getBMRMeasures’"," expect_equal(getBMRMeasures(bmr)[[j]], bmr$measures[[j]])","object_usage_linter" +"tests/testthat/helper_testthat.R",18,18,"warning","no visible global function definition for β€˜getBMRMeasureIds’"," expect_equal(getBMRMeasureIds(bmr)[[j]], bmr$measures[[j]]$id)","object_usage_linter" +"tests/testthat/helper_with.r",11,3,"warning","no visible global function definition for β€˜with_reset_config’"," with_reset_config({","object_usage_linter" +"tests/testthat/helper_with.r",19,3,"warning","no visible global function definition for β€˜with_reset_config’"," with_reset_config({","object_usage_linter" +"tests/testthat/helper_with.r",29,3,"warning","no visible global function definition for β€˜with_reset_config’"," with_reset_config({","object_usage_linter" +"tests/testthat/helper_with.r",36,3,"warning","no visible global function definition for β€˜with_reset_config’"," with_reset_config({","object_usage_linter" +"vignettes/OpenML.Rmd",16,3,"style","Commented code should be removed.","# library(""knitr"")","commented_code_linter" +"vignettes/OpenML.Rmd",17,3,"style","Commented code should be removed.","# opts_chunk$set(cache = TRUE)","commented_code_linter" +"vignettes/OpenML.Rmd",19,58,"style","Trailing whitespace is superfluous.","setOMLConfig(apikey = ""c1994bdb7ecb3c6f3c8f3b35f4b47f1f"", ","trailing_whitespace_linter" +"vignettes/OpenML.Rmd",82,6,"style","Use <-, not =, for assignment.","task = getOMLTask(task.id = 1L)","assignment_linter" +"vignettes/OpenML.Rmd",99,5,"style","Use <-, not =, for assignment.","lrn = makeLearner(""classif.randomForest"")","assignment_linter" +"vignettes/OpenML.Rmd",103,1,"style","Variable and function name style should be snake_case or symbols.","flow.id = uploadOMLFlow(lrn)","object_name_linter" +"vignettes/OpenML.Rmd",103,9,"style","Use <-, not =, for assignment.","flow.id = uploadOMLFlow(lrn)","assignment_linter" +"vignettes/OpenML.Rmd",105,1,"style","Variable and function name style should be snake_case or symbols.","run.mlr = runTaskMlr(task, lrn)","object_name_linter" +"vignettes/OpenML.Rmd",105,9,"style","Use <-, not =, for assignment.","run.mlr = runTaskMlr(task, lrn)","assignment_linter" +"vignettes/OpenML.Rmd",106,1,"style","Variable and function name style should be snake_case or symbols.","run.id = uploadOMLRun(run.mlr)","object_name_linter" +"vignettes/OpenML.Rmd",106,8,"style","Use <-, not =, for assignment.","run.id = uploadOMLRun(run.mlr)","assignment_linter" +"vignettes/OpenML.Rmd",136,7,"style","Use <-, not =, for assignment.","apikey=c1994bdb7ecb3c6f3c8f3b35f4b47f1f","assignment_linter" +"vignettes/OpenML.Rmd",136,7,"style","Put spaces around all infix operators.","apikey=c1994bdb7ecb3c6f3c8f3b35f4b47f1f","infix_spaces_linter" +"vignettes/OpenML.Rmd",188,10,"style","Use <-, not =, for assignment.","datasets = listOMLDataSets() # returns active data sets","assignment_linter" +"vignettes/OpenML.Rmd",226,7,"style","Use <-, not =, for assignment.","tasks = listOMLTasks()","assignment_linter" +"vignettes/OpenML.Rmd",246,81,"style","Lines should not be more than 80 characters.","head(subset(tasks, task.type == ""Supervised Classification"" & data.id == 61L)[, 1:5])","line_length_linter" +"vignettes/OpenML.Rmd",252,7,"style","Use <-, not =, for assignment.","flows = listOMLFlows()","assignment_linter" +"vignettes/OpenML.Rmd",263,6,"style","Use <-, not =, for assignment.","runs = listOMLRuns(task.id = 59L) # must be specified with the task, setup and/or implementation ID","assignment_linter" +"vignettes/OpenML.Rmd",263,81,"style","Lines should not be more than 80 characters.","runs = listOMLRuns(task.id = 59L) # must be specified with the task, setup and/or implementation ID","line_length_linter" +"vignettes/OpenML.Rmd",266,1,"style","Variable and function name style should be snake_case or symbols.","run.results = listOMLRunEvaluations(task.id = 59L)","object_name_linter" +"vignettes/OpenML.Rmd",266,13,"style","Use <-, not =, for assignment.","run.results = listOMLRunEvaluations(task.id = 59L)","assignment_linter" +"vignettes/OpenML.Rmd",287,1,"style","Variable and function name style should be snake_case or symbols.","iris.data = getOMLDataSet(data.id = 61L) # the iris data set has the data set ID 61","object_name_linter" +"vignettes/OpenML.Rmd",287,11,"style","Use <-, not =, for assignment.","iris.data = getOMLDataSet(data.id = 61L) # the iris data set has the data set ID 61","assignment_linter" +"vignettes/OpenML.Rmd",287,81,"style","Lines should not be more than 80 characters.","iris.data = getOMLDataSet(data.id = 61L) # the iris data set has the data set ID 61","line_length_linter" +"vignettes/OpenML.Rmd",293,6,"style","Use <-, not =, for assignment.","task = getOMLTask(task.id = 59L)","assignment_linter" +"vignettes/OpenML.Rmd",309,1,"style","Variable and function name style should be snake_case or symbols.","iris.data = task$input$data.set$data","object_name_linter" +"vignettes/OpenML.Rmd",309,11,"style","Use <-, not =, for assignment.","iris.data = task$input$data.set$data","assignment_linter" +"vignettes/OpenML.Rmd",316,6,"style","Use <-, not =, for assignment.","flow = getOMLFlow(flow.id = 2700L)","assignment_linter" +"vignettes/OpenML.Rmd",325,1,"style","Variable and function name style should be snake_case or symbols.","task.list = listOMLRuns(task.id = 59L)","object_name_linter" +"vignettes/OpenML.Rmd",325,11,"style","Use <-, not =, for assignment.","task.list = listOMLRuns(task.id = 59L)","assignment_linter" +"vignettes/OpenML.Rmd",327,5,"style","Use <-, not =, for assignment.","run = getOMLRun(run.id = 524027L)","assignment_linter" +"vignettes/OpenML.Rmd",355,6,"style","Use <-, not =, for assignment.","task = getOMLTask(task.id = 59L)","assignment_linter" +"vignettes/OpenML.Rmd",357,5,"style","Use <-, not =, for assignment.","lrn = makeLearner(""classif.rpart"")","assignment_linter" +"vignettes/OpenML.Rmd",358,1,"style","Variable and function name style should be snake_case or symbols.","run.mlr = runTaskMlr(task, lrn)","object_name_linter" +"vignettes/OpenML.Rmd",358,9,"style","Use <-, not =, for assignment.","run.mlr = runTaskMlr(task, lrn)","assignment_linter" +"vignettes/OpenML.Rmd",380,5,"style","Use <-, not =, for assignment.","dsc = ""Daily air quality measurements in New York, May to September 1973.","assignment_linter" +"vignettes/OpenML.Rmd",382,5,"style","Use <-, not =, for assignment.","cit = ""Chambers, J. M., Cleveland, W. S., Kleiner, B. and Tukey, P. A. (1983)","assignment_linter" +"vignettes/OpenML.Rmd",385,6,"style","Use <-, not =, for assignment.","desc = makeOMLDataSetDescription(name = ""airquality"",","assignment_linter" +"vignettes/OpenML.Rmd",387,81,"style","Lines should not be more than 80 characters."," creator = ""New York State Department of Conservation (ozone data) and the National","line_length_linter" +"vignettes/OpenML.Rmd",392,81,"style","Lines should not be more than 80 characters."," url = ""https://stat.ethz.ch/R-manual/R-devel/library/datasets/html/00Index.html"",","line_length_linter" +"vignettes/OpenML.Rmd",397,1,"style","Variable and function name style should be snake_case or symbols.","air.data = makeOMLDataSet(desc = desc,","object_name_linter" +"vignettes/OpenML.Rmd",397,10,"style","Use <-, not =, for assignment.","air.data = makeOMLDataSet(desc = desc,","assignment_linter" +"vignettes/OpenML.Rmd",406,2,"style","Commented code should be removed.","#dataset.id = uploadOMLDataSet(air.data)","commented_code_linter" +"vignettes/OpenML.Rmd",420,5,"style","Use <-, not =, for assignment.","lrn = makeLearner(""classif.randomForest"")","assignment_linter" +"vignettes/OpenML.Rmd",421,1,"style","Variable and function name style should be snake_case or symbols.","flow.id = uploadOMLFlow(lrn)","object_name_linter" +"vignettes/OpenML.Rmd",421,9,"style","Use <-, not =, for assignment.","flow.id = uploadOMLFlow(lrn)","assignment_linter" +"vignettes/OpenML.Rmd",432,10,"style","Use <-, not =, for assignment.","learners = list(","assignment_linter" +"vignettes/OpenML.Rmd",437,1,"style","Variable and function name style should be snake_case or symbols.","task.ids = c(57, 59, 2382)","object_name_linter" +"vignettes/OpenML.Rmd",437,10,"style","Use <-, not =, for assignment.","task.ids = c(57, 59, 2382)","assignment_linter" +"vignettes/OpenML.Rmd",440,10,"style","Use <-, not =, for assignment."," task = getOMLTask(id)","assignment_linter" +"vignettes/OpenML.Rmd",441,9,"style","Use <-, not =, for assignment."," res = runTaskMlr(task, lrn)$run","assignment_linter" +"vignettes/OpenML.Rmd",442,5,"style","Variable and function name style should be snake_case or symbols."," run.id = uploadOMLRun(res) # upload results","object_name_linter" +"vignettes/OpenML.Rmd",442,12,"style","Use <-, not =, for assignment."," run.id = uploadOMLRun(res) # upload results","assignment_linter" diff --git a/.dev/revdep_emails/OpenML/email-body b/.dev/revdep_emails/OpenML/email-body new file mode 100644 index 000000000..e38efa444 --- /dev/null +++ b/.dev/revdep_emails/OpenML/email-body @@ -0,0 +1,29 @@ +Hello Giuseppe Casalicchio! Thank you for using {lintr} in your package {OpenML}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/openml/openml-r (hash: a50c40474739c9d6e43e39f42a26c78fb7fb979a) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 74s on CRAN vs. 45s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/PWFSLSmoke/attachments/PWFSLSmoke.warnings b/.dev/revdep_emails/PWFSLSmoke/attachments/PWFSLSmoke.warnings new file mode 100644 index 000000000..be09e01a7 --- /dev/null +++ b/.dev/revdep_emails/PWFSLSmoke/attachments/PWFSLSmoke.warnings @@ -0,0 +1,2 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Trying to remove β€˜todo_comment_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/PWFSLSmoke/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/PWFSLSmoke/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..13c26c4df --- /dev/null +++ b/.dev/revdep_emails/PWFSLSmoke/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,3 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/addMarker.R",91,24,"style","Place a space before left parenthesis, except in a function call."," top <- newXY$newY[-(seq_along(latitude))]","spaces_left_parentheses_linter" +"R/addMarker.R",93,26,"style","Place a space before left parenthesis, except in a function call."," right <- newXY$newX[-(seq_along(longitude))]","spaces_left_parentheses_linter" diff --git a/.dev/revdep_emails/PWFSLSmoke/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/PWFSLSmoke/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..7ee01cd92 --- /dev/null +++ b/.dev/revdep_emails/PWFSLSmoke/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,219 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/addShadedBackground.R",21,39,"style","Put spaces around all infix operators."," breaks=stats::quantile(param, na.rm = TRUE),","infix_spaces_linter" +"R/airsis_load.R",10,29,"style","Put spaces around all infix operators.","airsis_load <- function(year=2017,","infix_spaces_linter" +"R/createEmptyMetaDataframe.R",26,42,"style","Put spaces around all infix operators.","createEmptyMetaDataframe <- function(rows=0) {","infix_spaces_linter" +"R/epa_load.R",12,7,"style","Put spaces around all infix operators."," year=strftime(lubridate::now(tzone = ""UTC""), ""%Y"", tz = ""UTC""),","infix_spaces_linter" +"R/monitor_aqi.R",81,46,"style","Put spaces around all infix operators.",".assignBreakpointsTable <- function(parameter=""pm25"") {","infix_spaces_linter" +"R/monitor_asDataframe.R",54,42,"style","Put spaces around all infix operators."," monitorID=NULL,","infix_spaces_linter" +"R/monitor_asDataframe.R",55,45,"style","Put spaces around all infix operators."," extraColumns=NULL,","infix_spaces_linter" +"R/monitor_asDataframe.R",56,44,"style","Put spaces around all infix operators."," metaColumns=NULL,","infix_spaces_linter" +"R/monitor_asDataframe.R",57,37,"style","Put spaces around all infix operators."," tlim=NULL) {","infix_spaces_linter" +"R/monitor_collapse.R",111,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ( !is.null(longitude) & !is.null(latitude) ) {","vector_logic_linter" +"R/monitor_dailyStatistic.R",98,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (hoursAfter > 0 & hoursAfter <= 1) dayNum <- dayNum + 1","vector_logic_linter" +"R/monitor_dailyStatistic.R",103,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (hoursAfter > 0 & hoursAfter <= 1) dayNum <- dayNum + 1","vector_logic_linter" +"R/monitor_dailyThreshold.R",68,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (hoursAfter > 0 & hoursAfter <= 1) dayNum <- dayNum + 1","vector_logic_linter" +"R/monitor_dailyThreshold.R",71,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (hoursAfter > 0 & hoursAfter <= 1) dayNum <- dayNum + 1","vector_logic_linter" +"R/monitor_getCurrentStatus.R",367,3,"warning","local variable β€˜get_nAvg’ assigned but may not be used"," get_nAvg <- function(monitorDataColumn, timeIndex, n) {","object_usage_linter" +"R/monitor_getCurrentStatus.R",437,3,"warning","local variable β€˜get_previousDayAvg’ assigned but may not be used"," get_previousDayAvg <- function(ws_data, timezone, endTimeUTC) {","object_usage_linter" +"R/monitor_loadAnnual.R",128,7,"warning","local variable β€˜result’ assigned but may not be used"," result <- try({","object_usage_linter" +"R/monitor_performance.R",58,9,"style","Put spaces around all infix operators."," metric=NULL,","infix_spaces_linter" +"R/monitor_performanceMap.R",190,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ( showLegend & !is.null(colorBy) ) {","vector_logic_linter" +"R/monitor_print.R",111,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/monitor_writeCurrentStatusGeoJSON.R",106,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(propertyNames) & length(propertyNames) == length(properties))","vector_logic_linter" +"R/PWFSLSmoke-deprecated.R",96,12,"style","Put spaces around all infix operators."," monitorID=NULL,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",97,7,"style","Put spaces around all infix operators."," tlim=NULL,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",98,7,"style","Put spaces around all infix operators."," ylim=NULL,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",99,11,"style","Put spaces around all infix operators."," aqiLines=TRUE,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",100,14,"style","Put spaces around all infix operators."," shadedNight=TRUE,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",101,8,"style","Put spaces around all infix operators."," title=NULL,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",233,12,"style","Put spaces around all infix operators."," monitorID=NULL,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",234,7,"style","Put spaces around all infix operators."," tlim=NULL,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",235,11,"style","Put spaces around all infix operators."," minHours=18,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",238,10,"style","Put spaces around all infix operators."," gridLwd=0.5,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",240,17,"style","Put spaces around all infix operators."," labels_x_nudge=0,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",241,17,"style","Put spaces around all infix operators."," labels_y_nudge=0,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",286,53,"style","Put spaces around all infix operators.","monitorPlot_noData <- function(ws_monitor, monitorID=NULL, cex=2.5) {","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",286,63,"style","Put spaces around all infix operators.","monitorPlot_noData <- function(ws_monitor, monitorID=NULL, cex=2.5) {","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",294,12,"style","Put spaces around all infix operators."," monitorID=NULL,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",295,8,"style","Put spaces around all infix operators."," width=3,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",296,8,"style","Put spaces around all infix operators."," align=""center"",","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",297,14,"style","Put spaces around all infix operators."," data.thresh=75,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",298,7,"style","Put spaces around all infix operators."," tlim=NULL,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",299,7,"style","Put spaces around all infix operators."," ylim=NULL,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",300,12,"style","Put spaces around all infix operators."," localTime=TRUE,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",301,14,"style","Put spaces around all infix operators."," shadedNight=FALSE,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",302,11,"style","Put spaces around all infix operators."," aqiLines=TRUE,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",303,17,"style","Put spaces around all infix operators."," gridHorizontal=FALSE,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",304,11,"style","Put spaces around all infix operators."," grid24hr=FALSE,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",305,10,"style","Put spaces around all infix operators."," grid3hr=FALSE,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",306,13,"style","Put spaces around all infix operators."," showLegend=TRUE","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",318,12,"style","Put spaces around all infix operators."," monitorID=NULL,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",319,7,"style","Put spaces around all infix operators."," tlim=NULL,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",320,12,"style","Put spaces around all infix operators."," localTime=TRUE,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",321,8,"style","Put spaces around all infix operators."," style=NULL,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",322,14,"style","Put spaces around all infix operators."," shadedNight=FALSE,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",323,6,"style","Put spaces around all infix operators."," add=FALSE,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",326,10,"style","Put spaces around all infix operators."," gridLwd=1,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",328,9,"style","Put spaces around all infix operators."," dayLwd=0,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",329,10,"style","Put spaces around all infix operators."," hourLwd=0,","infix_spaces_linter" +"R/PWFSLSmoke-deprecated.R",330,15,"style","Put spaces around all infix operators."," hourInterval=6,","infix_spaces_linter" +"R/skill_confusionMatrix.R",69,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ( !is.logical(predicted) | !is.logical(observed) ) {","vector_logic_linter" +"R/wrcc_load.R",10,27,"style","Put spaces around all infix operators.","wrcc_load <- function(year=2017,","infix_spaces_linter" +"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",56,80,"style","Trailing whitespace is superfluous.","monitorIDs <- c(""080310002_01"", ""080131001_01"", ""080130003_01"", ""081230006_01"", ","trailing_whitespace_linter" +"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",63,15,"style","Trailing whitespace is superfluous.","my_monitors <- ","trailing_whitespace_linter" +"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",81,15,"style","Trailing whitespace is superfluous."," my_monitors, ","trailing_whitespace_linter" +"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",82,50,"style","Trailing whitespace is superfluous."," title = ""Front Range AQIs - Feb 15 - 18, 2021"", ","trailing_whitespace_linter" +"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",102,44,"style","Only use double-quotes.","monitor_timeseriesPlot(my_monitors, type = 'l')","single_quotes_linter" +"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",103,45,"style","Only use double-quotes.","monitor_timeseriesPlot(my_monitors, style = 'aqidots', pch=16, cex = 1, add = TRUE)","single_quotes_linter" +"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",103,59,"style","Put spaces around all infix operators.","monitor_timeseriesPlot(my_monitors, style = 'aqidots', pch=16, cex = 1, add = TRUE)","infix_spaces_linter" +"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",125,75,"style","Trailing whitespace is superfluous.","# After looking at my_monitors$meta$siteName, help ggplot out by assigning ","trailing_whitespace_linter" +"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",135,6,"style","Trailing whitespace is superfluous.","gg <- ","trailing_whitespace_linter" +"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",143,32,"style","Trailing whitespace is superfluous."," stat_AQCategory(color = NA) + ","trailing_whitespace_linter" +"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",144,37,"style","Trailing whitespace is superfluous."," facet_grid(rows = vars(shortName)) ","trailing_whitespace_linter" +"vignettes/articles/Example_Save_Data_as_CSV.Rmd",40,13,"style","Trailing whitespace is superfluous.","airsis_ca <- ","trailing_whitespace_linter" +"vignettes/articles/Example_Save_Data_as_CSV.Rmd",69,12,"style","Trailing whitespace is superfluous.","Mariposa <- ","trailing_whitespace_linter" +"vignettes/articles/Example_Save_Data_as_CSV.Rmd",82,12,"style","Trailing whitespace is superfluous."," Mariposa, ","trailing_whitespace_linter" +"vignettes/articles/Example_Save_Data_as_CSV.Rmd",98,13,"style","Trailing whitespace is superfluous."," airsis_ca, ","trailing_whitespace_linter" +"vignettes/articles/Example_Save_Data_as_CSV.Rmd",107,13,"style","Trailing whitespace is superfluous."," airsis_ca, ","trailing_whitespace_linter" +"vignettes/articles/Example_Save_Data_as_CSV.Rmd",136,47,"style","Trailing whitespace is superfluous."," monitor_nowcast(includeShortTerm = TRUE) %>% ","trailing_whitespace_linter" +"vignettes/articles/Loading_Monitoring_Data.Rmd",144,101,"style","Lines should not be more than 100 characters.","AirNow_hourly <- get(load(url(""https://haze.airfire.org/monitoring/latest/RData/airnow_PM2.5_latest10.RData"")))","line_length_linter" +"vignettes/articles/Loading_Monitoring_Data.Rmd",158,13,"style","Only use double-quotes.","parameter = 'PM2.5',","single_quotes_linter" +"vignettes/articles/Loading_Monitoring_Data.Rmd",160,16,"style","Trailing whitespace is superfluous.","dataDir = NULL) ","trailing_whitespace_linter" +"vignettes/articles/Loading_Monitoring_Data.Rmd",167,13,"style","Only use double-quotes.","parameter = 'PM2.5',","single_quotes_linter" +"vignettes/articles/Loading_Monitoring_Data.Rmd",169,16,"style","Trailing whitespace is superfluous.","dataDir = NULL) ","trailing_whitespace_linter" +"vignettes/articles/Loading_Monitoring_Data.Rmd",177,13,"style","Only use double-quotes.","parameter = 'PM2.5',","single_quotes_linter" +"vignettes/articles/Loading_Monitoring_Data.Rmd",179,16,"style","Trailing whitespace is superfluous.","dataDir = NULL) ","trailing_whitespace_linter" +"vignettes/articles/Loading_Monitoring_Data.Rmd",239,28,"style","Put spaces around all infix operators."," monitor_subset(stateCodes= 'WA')","infix_spaces_linter" +"vignettes/articles/Loading_Monitoring_Data.Rmd",239,30,"style","Only use double-quotes."," monitor_subset(stateCodes= 'WA')","single_quotes_linter" +"vignettes/articles/Loading_Monitoring_Data.Rmd",242,43,"style","Only use double-quotes.","monitor_timeseriesPlot(airnow_wa, style = 'gnats')","single_quotes_linter" +"vignettes/articles/Loading_Monitoring_Data.Rmd",273,37,"style","Only use double-quotes.","monitor_timeseriesPlot(pnw, style = 'gnats')","single_quotes_linter" +"vignettes/Data_Model.Rmd",90,67,"style","Trailing whitespace is superfluous.","# NOTE: 'tlim' is interpreted as UTC unless we specify 'timezone' ","trailing_whitespace_linter" +"vignettes/Data_Model.Rmd",94,40,"style","Only use double-quotes.","WA <- monitor_subset(N_M, stateCodes = 'WA')","single_quotes_linter" +"vignettes/Data_Model.Rmd",109,44,"style","Commas should always have a space after.","all(rownames(WA$meta) == colnames(WA$data[,-1]))","commas_linter" +"vignettes/Data_Model.Rmd",140,12,"style","Only use double-quotes.","TwispID <- '530470009_01'","single_quotes_linter" +"vignettes/Data_Model.Rmd",141,15,"style","Only use double-quotes.","WinthropID <- '530470010_01'","single_quotes_linter" +"vignettes/Data_Model.Rmd",142,27,"style","Trailing whitespace is superfluous.","Methow_Valley_JulyMeans <- ","trailing_whitespace_linter" +"vignettes/Data_Model.Rmd",144,41,"style","Commas should always have a space after."," monitor_subset(monitorIDs = c(TwispID,WinthropID)) %>%","commas_linter" +"vignettes/Data_Model.Rmd",145,32,"style","Only use double-quotes."," monitor_collapse(monitorID = 'MethowValley') %>%","single_quotes_linter" +"vignettes/Data_Model.Rmd",146,22,"style","Put spaces around all infix operators."," monitor_subset(tlim=c(20150701, 20150731), timezone = 'America/Los_Angeles') %>%","infix_spaces_linter" +"vignettes/Data_Model.Rmd",146,57,"style","Only use double-quotes."," monitor_subset(tlim=c(20150701, 20150731), timezone = 'America/Los_Angeles') %>%","single_quotes_linter" +"vignettes/Data_Model.Rmd",149,34,"style","Commas should always have a space after.","Methow_Valley_JulyMeans$data[1:7,]","commas_linter" +"vignettes/Data_Model.Rmd",164,27,"style","Commas should always have a space after.","Spokane_3hr_squared$data[,-1] <- (Spokane_3hr$data[,-1])^2 # exclude the 'datetime' column","commas_linter" +"vignettes/Data_Model.Rmd",164,53,"style","Commas should always have a space after.","Spokane_3hr_squared$data[,-1] <- (Spokane_3hr$data[,-1])^2 # exclude the 'datetime' column","commas_linter" +"vignettes/Data_Model.Rmd",172,33,"style","Commas should always have a space after.","data <- Spokane_daily_3hr$data[,-1] # exclude the 'datetime' column","commas_linter" +"vignettes/Data_Model.Rmd",173,17,"style","Only use double-quotes.","cor(data, use = 'complete.obs')","single_quotes_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",54,2,"style","Commented code should be removed.","#monitor_leaflet(PacNW_24, slice = max)","commented_code_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",67,42,"style","Only use double-quotes.","monitor_timeseriesPlot(NezPerce, style = 'gnats')","single_quotes_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",90,23,"style","Commas should always have a space after.","opar <- par(mar = c(1,1,1,1))","commas_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",90,25,"style","Commas should always have a space after.","opar <- par(mar = c(1,1,1,1))","commas_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",90,27,"style","Commas should always have a space after.","opar <- par(mar = c(1,1,1,1))","commas_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",93,40,"style","Only use double-quotes."," siteName <- NezPerce$meta[monitorID, 'siteName']","single_quotes_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",95,14,"style","Trailing whitespace is superfluous."," NezPerce, ","trailing_whitespace_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",96,27,"style","Trailing whitespace is superfluous."," monitorID = monitorID, ","trailing_whitespace_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",97,21,"style","Trailing whitespace is superfluous."," main = siteName, ","trailing_whitespace_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",99,4,"style","Trailing whitespace is superfluous."," ) ","trailing_whitespace_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",110,21,"style","Commas should always have a space after.","data <- PacNW$data[,-1] # omit 'datetime' column","commas_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",112,101,"style","Lines should not be more than 100 characters.","worstAcute <- names(sort(maxPM25, decreasing = TRUE))[1:6] # monitorIDs for the six worst sites in PacNW","line_length_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",114,26,"style","Commas should always have a space after.","PacNW$meta[worstAcute[1],c('siteName','countyName','stateCode')]","commas_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",114,28,"style","Only use double-quotes.","PacNW$meta[worstAcute[1],c('siteName','countyName','stateCode')]","single_quotes_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",114,39,"style","Commas should always have a space after.","PacNW$meta[worstAcute[1],c('siteName','countyName','stateCode')]","commas_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",114,39,"style","Only use double-quotes.","PacNW$meta[worstAcute[1],c('siteName','countyName','stateCode')]","single_quotes_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",114,52,"style","Commas should always have a space after.","PacNW$meta[worstAcute[1],c('siteName','countyName','stateCode')]","commas_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",114,52,"style","Only use double-quotes.","PacNW$meta[worstAcute[1],c('siteName','countyName','stateCode')]","single_quotes_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",127,30,"style","Commas should always have a space after.","data <- PacNW_dailyAvg$data[,-1]","commas_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",128,45,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","unhealthyDays <- apply(data, 2, function(x) { sum(x >= AQI$breaks_24[4], na.rm = TRUE) })","brace_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",131,28,"style","Commas should always have a space after.","PacNW$meta[worstChronic[1],c('siteName','countyName','stateCode')]","commas_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",131,30,"style","Only use double-quotes.","PacNW$meta[worstChronic[1],c('siteName','countyName','stateCode')]","single_quotes_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",131,41,"style","Commas should always have a space after.","PacNW$meta[worstChronic[1],c('siteName','countyName','stateCode')]","commas_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",131,41,"style","Only use double-quotes.","PacNW$meta[worstChronic[1],c('siteName','countyName','stateCode')]","single_quotes_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",131,54,"style","Commas should always have a space after.","PacNW$meta[worstChronic[1],c('siteName','countyName','stateCode')]","commas_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",131,54,"style","Only use double-quotes.","PacNW$meta[worstChronic[1],c('siteName','countyName','stateCode')]","single_quotes_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",156,18,"style","Trailing whitespace is superfluous."," PacNW_dailyAvg, ","trailing_whitespace_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",158,13,"style","Only use double-quotes."," maptype = 'terrain',","single_quotes_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",159,20,"style","Trailing whitespace is superfluous."," centerLon = -118, ","trailing_whitespace_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",160,18,"style","Trailing whitespace is superfluous."," centerLat = 47, ","trailing_whitespace_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",161,11,"style","Trailing whitespace is superfluous."," zoom = 7 ","trailing_whitespace_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",163,9,"style","Only use double-quotes.","addIcon('redFlame', fireLons, fireLats, expansion = .002)","single_quotes_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",182,8,"style","Trailing whitespace is superfluous."," Omak, ","trailing_whitespace_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",184,24,"style","Trailing whitespace is superfluous."," labels_x_nudge = 0.8, ","trailing_whitespace_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",188,10,"style","Trailing whitespace is superfluous."," Kamiah, ","trailing_whitespace_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",189,7,"style","Put spaces around all infix operators."," main=""August Daily AQI -- Kamiah, ID"",","infix_spaces_linter" +"vignettes/Maps_and_Timeseries_Plots.Rmd",190,24,"style","Trailing whitespace is superfluous."," labels_x_nudge = 0.8, ","trailing_whitespace_linter" +"vignettes/NowCast.Rmd",306,48,"style","Put spaces around all infix operators.","N_M <- monitor_subset(Northwest_Megafires, tlim=c(20150801,20150831),","infix_spaces_linter" +"vignettes/NowCast.Rmd",306,60,"style","Commas should always have a space after.","N_M <- monitor_subset(Northwest_Megafires, tlim=c(20150801,20150831),","commas_linter" +"vignettes/NowCast.Rmd",307,31,"style","Put spaces around all infix operators."," timezone=""America/Los_Angeles"")","infix_spaces_linter" +"vignettes/NowCast.Rmd",308,39,"style","Put spaces around all infix operators.","Omak <- monitor_subset(N_M, monitorIDs='530470013_01')","infix_spaces_linter" +"vignettes/NowCast.Rmd",308,40,"style","Only use double-quotes.","Omak <- monitor_subset(N_M, monitorIDs='530470013_01')","single_quotes_linter" +"vignettes/NowCast.Rmd",313,34,"style","Put spaces around all infix operators.","monitor_timeseriesPlot(Omak, type='l', lwd=2)","infix_spaces_linter" +"vignettes/NowCast.Rmd",313,35,"style","Only use double-quotes.","monitor_timeseriesPlot(Omak, type='l', lwd=2)","single_quotes_linter" +"vignettes/NowCast.Rmd",313,43,"style","Put spaces around all infix operators.","monitor_timeseriesPlot(Omak, type='l', lwd=2)","infix_spaces_linter" +"vignettes/NowCast.Rmd",314,41,"style","Put spaces around all infix operators.","monitor_timeseriesPlot(Omak_nowcast, add=TRUE, type='l', col='purple', lwd=2)","infix_spaces_linter" +"vignettes/NowCast.Rmd",314,52,"style","Put spaces around all infix operators.","monitor_timeseriesPlot(Omak_nowcast, add=TRUE, type='l', col='purple', lwd=2)","infix_spaces_linter" +"vignettes/NowCast.Rmd",314,53,"style","Only use double-quotes.","monitor_timeseriesPlot(Omak_nowcast, add=TRUE, type='l', col='purple', lwd=2)","single_quotes_linter" +"vignettes/NowCast.Rmd",314,61,"style","Put spaces around all infix operators.","monitor_timeseriesPlot(Omak_nowcast, add=TRUE, type='l', col='purple', lwd=2)","infix_spaces_linter" +"vignettes/NowCast.Rmd",314,62,"style","Only use double-quotes.","monitor_timeseriesPlot(Omak_nowcast, add=TRUE, type='l', col='purple', lwd=2)","single_quotes_linter" +"vignettes/NowCast.Rmd",314,75,"style","Put spaces around all infix operators.","monitor_timeseriesPlot(Omak_nowcast, add=TRUE, type='l', col='purple', lwd=2)","infix_spaces_linter" +"vignettes/NowCast.Rmd",316,17,"style","Put spaces around all infix operators.","addAQILegend(lwd=1, pch=NULL, 'topleft')","infix_spaces_linter" +"vignettes/NowCast.Rmd",316,24,"style","Put spaces around all infix operators.","addAQILegend(lwd=1, pch=NULL, 'topleft')","infix_spaces_linter" +"vignettes/NowCast.Rmd",316,31,"style","Only use double-quotes.","addAQILegend(lwd=1, pch=NULL, 'topleft')","single_quotes_linter" +"vignettes/NowCast.Rmd",317,23,"style","Put spaces around all infix operators.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","infix_spaces_linter" +"vignettes/NowCast.Rmd",317,30,"style","Put spaces around all infix operators.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","infix_spaces_linter" +"vignettes/NowCast.Rmd",317,33,"style","Only use double-quotes.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","single_quotes_linter" +"vignettes/NowCast.Rmd",317,41,"style","Commas should always have a space after.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","commas_linter" +"vignettes/NowCast.Rmd",317,41,"style","Only use double-quotes.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","single_quotes_linter" +"vignettes/NowCast.Rmd",317,58,"style","Put spaces around all infix operators.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","infix_spaces_linter" +"vignettes/NowCast.Rmd",317,61,"style","Only use double-quotes.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","single_quotes_linter" +"vignettes/NowCast.Rmd",317,70,"style","Commas should always have a space after.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","commas_linter" +"vignettes/NowCast.Rmd",317,70,"style","Only use double-quotes.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","single_quotes_linter" +"vignettes/NowCast.Rmd",332,45,"style","Put spaces around all infix operators.","Omak_2015_08_21 <- monitor_subset(Omak, tlim=c(2015082100, 2015082111))","infix_spaces_linter" +"vignettes/NowCast.Rmd",346,32,"style","Put spaces around all infix operators.","(w_star <- min(example1_values)/max(example1_values))","infix_spaces_linter" +"vignettes/NowCast.Rmd",353,12,"style","Put spaces around all infix operators.","(w <- max(1/2, w_star))","infix_spaces_linter" +"vignettes/NowCast.Rmd",370,23,"style","Put spaces around all infix operators.","(numer <- sum(w^(0:11)*example1_values))","infix_spaces_linter" +"vignettes/NowCast.Rmd",392,6,"style","Put spaces around all infix operators.","numer/denom","infix_spaces_linter" +"vignettes/NowCast.Rmd",401,34,"style","Put spaces around all infix operators.","monitor_subset(Omak_nowcast, tlim=rep(2015082111, 2))$data","infix_spaces_linter" +"vignettes/NowCast.Rmd",413,45,"style","Put spaces around all infix operators.","Omak_2015_08_24 <- monitor_subset(Omak, tlim=c(2015082412, 2015082423))","infix_spaces_linter" +"vignettes/NowCast.Rmd",436,37,"style","Put spaces around all infix operators.","w_star <- min(example2_values, na.rm=TRUE)/max(example2_values, na.rm=TRUE)","infix_spaces_linter" +"vignettes/NowCast.Rmd",436,43,"style","Put spaces around all infix operators.","w_star <- min(example2_values, na.rm=TRUE)/max(example2_values, na.rm=TRUE)","infix_spaces_linter" +"vignettes/NowCast.Rmd",436,70,"style","Put spaces around all infix operators.","w_star <- min(example2_values, na.rm=TRUE)/max(example2_values, na.rm=TRUE)","infix_spaces_linter" +"vignettes/NowCast.Rmd",437,12,"style","Put spaces around all infix operators.","(w <- max(1/2, w_star))","infix_spaces_linter" +"vignettes/NowCast.Rmd",445,29,"style","Put spaces around all infix operators.","numer <- sum(w^(validIndexes-1)*example2_values[validIndexes])","infix_spaces_linter" +"vignettes/NowCast.Rmd",445,32,"style","Put spaces around all infix operators.","numer <- sum(w^(validIndexes-1)*example2_values[validIndexes])","infix_spaces_linter" +"vignettes/NowCast.Rmd",446,29,"style","Put spaces around all infix operators.","denom <- sum(w^(validIndexes-1))","infix_spaces_linter" +"vignettes/NowCast.Rmd",447,6,"style","Put spaces around all infix operators.","numer/denom","infix_spaces_linter" +"vignettes/NowCast.Rmd",456,34,"style","Put spaces around all infix operators.","monitor_subset(Omak_nowcast, tlim=rep(2015082423, 2))$data","infix_spaces_linter" +"vignettes/NowCast.Rmd",468,57,"style","Put spaces around all infix operators.","example2_df$nowcast <- monitor_subset(Omak_nowcast, tlim=c(2015082412, 2015082423))$data$`530470013_01`","infix_spaces_linter" +"vignettes/NowCast.Rmd",468,101,"style","Lines should not be more than 100 characters.","example2_df$nowcast <- monitor_subset(Omak_nowcast, tlim=c(2015082412, 2015082423))$data$`530470013_01`","line_length_linter" +"vignettes/NowCast.Rmd",478,45,"style","Put spaces around all infix operators.","Omak_2015_08_23 <- monitor_subset(Omak, tlim=c(2015082312, 2015082323))","infix_spaces_linter" +"vignettes/NowCast.Rmd",501,37,"style","Put spaces around all infix operators.","w_star <- min(example3_values, na.rm=TRUE)/max(example3_values, na.rm=TRUE)","infix_spaces_linter" +"vignettes/NowCast.Rmd",501,43,"style","Put spaces around all infix operators.","w_star <- min(example3_values, na.rm=TRUE)/max(example3_values, na.rm=TRUE)","infix_spaces_linter" +"vignettes/NowCast.Rmd",501,70,"style","Put spaces around all infix operators.","w_star <- min(example3_values, na.rm=TRUE)/max(example3_values, na.rm=TRUE)","infix_spaces_linter" +"vignettes/NowCast.Rmd",502,12,"style","Put spaces around all infix operators.","(w <- max(1/2, w_star))","infix_spaces_linter" +"vignettes/NowCast.Rmd",510,29,"style","Put spaces around all infix operators.","numer <- sum(w^(validIndexes-1)*example3_values[validIndexes])","infix_spaces_linter" +"vignettes/NowCast.Rmd",510,32,"style","Put spaces around all infix operators.","numer <- sum(w^(validIndexes-1)*example3_values[validIndexes])","infix_spaces_linter" +"vignettes/NowCast.Rmd",511,29,"style","Put spaces around all infix operators.","denom <- sum(w^(validIndexes-1))","infix_spaces_linter" +"vignettes/NowCast.Rmd",512,6,"style","Put spaces around all infix operators.","numer/denom","infix_spaces_linter" +"vignettes/NowCast.Rmd",521,34,"style","Put spaces around all infix operators.","monitor_subset(Omak_nowcast, tlim=rep(2015082323, 2))$data","infix_spaces_linter" +"vignettes/NowCast.Rmd",532,57,"style","Put spaces around all infix operators.","example3_df$nowcast <- monitor_subset(Omak_nowcast, tlim=c(2015082312, 2015082323))$data$`530470013_01`","infix_spaces_linter" +"vignettes/NowCast.Rmd",532,101,"style","Lines should not be more than 100 characters.","example3_df$nowcast <- monitor_subset(Omak_nowcast, tlim=c(2015082312, 2015082323))$data$`530470013_01`","line_length_linter" +"vignettes/NowCast.Rmd",618,22,"style","Commas should always have a space after.","tlim <- c(2015082500,2015082523)","commas_linter" +"vignettes/NowCast.Rmd",619,50,"style","Put spaces around all infix operators.","Omak2 <- monitor_subset(Northwest_Megafires, tlim=tlim, monitorIDs = '530470013_01')","infix_spaces_linter" +"vignettes/NowCast.Rmd",619,70,"style","Only use double-quotes.","Omak2 <- monitor_subset(Northwest_Megafires, tlim=tlim, monitorIDs = '530470013_01')","single_quotes_linter" +"vignettes/NowCast.Rmd",644,49,"style","Put spaces around all infix operators.","example4_df <- monitor_subset(Omak_nowcast, tlim=tlim)$data","infix_spaces_linter" +"vignettes/NowCast.Rmd",668,37,"style","Put spaces around all infix operators.","example5_df <- data.frame(""datetime""=Omak$data$datetime,","infix_spaces_linter" +"vignettes/NowCast.Rmd",669,38,"style","Put spaces around all infix operators."," ""monitored""=Omak$data$`530470013_01`,","infix_spaces_linter" +"vignettes/NowCast.Rmd",670,32,"style","Put spaces around all infix operators."," ""aqi""=aqi$data$`530470013_01`)","infix_spaces_linter" +"vignettes/NowCast.Rmd",671,36,"style","Commas should always have a space after.","example5_df <- example5_df[500:650,]","commas_linter" +"vignettes/NowCast.Rmd",672,55,"style","Put spaces around all infix operators.","plot(example5_df$datetime, example5_df$monitored, xlab='Date', ylab='')","infix_spaces_linter" +"vignettes/NowCast.Rmd",672,56,"style","Only use double-quotes.","plot(example5_df$datetime, example5_df$monitored, xlab='Date', ylab='')","single_quotes_linter" +"vignettes/NowCast.Rmd",672,68,"style","Put spaces around all infix operators.","plot(example5_df$datetime, example5_df$monitored, xlab='Date', ylab='')","infix_spaces_linter" +"vignettes/NowCast.Rmd",672,69,"style","Only use double-quotes.","plot(example5_df$datetime, example5_df$monitored, xlab='Date', ylab='')","single_quotes_linter" +"vignettes/NowCast.Rmd",673,49,"style","Put spaces around all infix operators.","lines(example5_df$datetime, example5_df$aqi, col=""blue"")","infix_spaces_linter" +"vignettes/PWFSLSmoke.Rmd",139,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/PWFSLSmoke.Rmd",172,31,"style","Only use double-quotes."," monitor_subset(monitorIDs = '060670010_01')","single_quotes_linter" +"vignettes/PWFSLSmoke.Rmd",176,8,"style","Put spaces around all infix operators."," style='aqidots',","infix_spaces_linter" +"vignettes/PWFSLSmoke.Rmd",176,9,"style","Only use double-quotes."," style='aqidots',","single_quotes_linter" +"vignettes/PWFSLSmoke.Rmd",177,6,"style","Put spaces around all infix operators."," pch=16,","infix_spaces_linter" +"vignettes/PWFSLSmoke.Rmd",178,7,"style","Put spaces around all infix operators."," xlab=""2018""","infix_spaces_linter" +"vignettes/PWFSLSmoke.Rmd",182,17,"style","Put spaces around all infix operators.","addAQILegend(cex=0.8)","infix_spaces_linter" +"vignettes/PWFSLSmoke.Rmd",204,40,"style","Trailing whitespace is superfluous.","monitor_timeseriesPlot(Sacramento_area, ","trailing_whitespace_linter" +"vignettes/PWFSLSmoke.Rmd",205,32,"style","Only use double-quotes."," style = 'gnats',","single_quotes_linter" diff --git a/.dev/revdep_emails/PWFSLSmoke/email-body b/.dev/revdep_emails/PWFSLSmoke/email-body new file mode 100644 index 000000000..c68a0c326 --- /dev/null +++ b/.dev/revdep_emails/PWFSLSmoke/email-body @@ -0,0 +1,29 @@ +Hello Jonathan Callahan! Thank you for using {lintr} in your package {PWFSLSmoke}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/MazamaScience/PWFSLSmoke (hash: 1fa59b51b7424c0a5539451de109b672d1ca0657) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 156s on CRAN vs. 94s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/Plasmidprofiler/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/Plasmidprofiler/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..153a8621f --- /dev/null +++ b/.dev/revdep_emails/Plasmidprofiler/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,19 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/graphics_related.R",106,10,"style","Variable and function name style should be snake_case."," report$Colours2 <- colours.amr[match(report$AMR_gene,","object_name_linter" +"R/graphics_related.R",233,10,"style","Variable and function name style should be snake_case."," report$Colours2 <- colours.amr[match(report$AMR_gene,","object_name_linter" +"R/graphics_related.R",260,30,"style","There should be a space between right parenthesis and an opening curly brace."," # if (!is.na(len.highlight)){","paren_brace_linter" +"R/main_aux.R",218,28,"style","There should be a space between right parenthesis and an opening curly brace."," #if (!exists(""filecache"")){","paren_brace_linter" +"R/parse_related.R",184,54,"style","There should be a space between right parenthesis and an opening curly brace."," # if (length(grep(""AMR"", blast.results$qseqid)) > 0){","paren_brace_linter" +"R/parse_related.R",185,50,"style","There should be a space between right parenthesis and an opening curly brace."," # for (i in grep(""AMR"", blast.results$qseqid)){","paren_brace_linter" +"R/parse_related.R",186,39,"style","There should be a space between right parenthesis and an opening curly brace."," # if (blast.results[i, 3] == 100){","paren_brace_linter" +"R/parse_related.R",247,10,"style","Variable and function name style should be snake_case."," report$Plasmid <- as.character(br$qseqid[match(report$gene, br$sseqid)])","object_name_linter" +"R/parse_related.R",251,10,"style","Variable and function name style should be snake_case."," report$Plasmid <- str_split_fixed(report$Plasmid, ""_"", 3)[, 1]","object_name_linter" +"R/report_related.R",67,10,"style","Variable and function name style should be snake_case."," report$AMR_gene <- as.character(pos.samples$Gene[match(report$Plasmid,","object_name_linter" +"R/report_related.R",122,12,"style","Variable and function name style should be snake_case."," report$Inc_group <- str_split_fixed(report$Inc_group, ""\\("", 2)[, 1]","object_name_linter" +"R/report_related.R",220,12,"style","Variable and function name style should be snake_case."," report$Sample <- ordered(report$Sample,","object_name_linter" +"R/report_related.R",233,10,"style","Variable and function name style should be snake_case."," report$Plasmid <- ordered(report$Plasmid,","object_name_linter" +"R/report_related.R",237,10,"style","Variable and function name style should be snake_case."," report$Inc_group <- as.factor(report$Inc_group)","object_name_linter" +"R/report_related.R",238,10,"style","Variable and function name style should be snake_case."," report$AMR_gene <- as.factor(report$AMR_gene)","object_name_linter" +"R/report_related.R",241,12,"style","Variable and function name style should be snake_case."," report$Sample <- mapvalues(report$Sample,","object_name_linter" +"R/report_related.R",245,12,"style","Variable and function name style should be snake_case."," report$Plasmid <- mapvalues(report$Plasmid,","object_name_linter" +"R/zzz.R",5,1,"style","Variable and function name style should be snake_case.",".onAttach <- function(libname, pkgname) {","object_name_linter" diff --git a/.dev/revdep_emails/Plasmidprofiler/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/Plasmidprofiler/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..d34605c1e --- /dev/null +++ b/.dev/revdep_emails/Plasmidprofiler/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,22 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/graphics_related.R",45,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/graphics_related.R",125,42,"style","Use FALSE instead of the symbol F."," inherit.aes = F,","T_and_F_symbol_linter" +"R/graphics_related.R",158,3,"style","Variable and function name style should be snake_case or symbols."," max.height <- unit.pmax(pp.gt$heights[4:5], tree.gt$heights[4:5])","object_name_linter" +"R/graphics_related.R",161,3,"style","Variable and function name style should be snake_case or symbols."," pp.gt$heights[4:5] <- as.list(max.height)","object_name_linter" +"R/graphics_related.R",162,3,"style","Variable and function name style should be snake_case or symbols."," tree.gt$heights[4:5] <- as.list(max.height)","object_name_linter" +"R/graphics_related.R",227,31,"style","Put spaces around all infix operators."," post=NA,","infix_spaces_linter" +"R/graphics_related.R",228,32,"style","Put spaces around all infix operators."," title=""Plasmid Profiles"",","infix_spaces_linter" +"R/graphics_related.R",288,36,"style","Use FALSE instead of the symbol F."," inherit.aes = F,","T_and_F_symbol_linter" +"R/graphics_related.R",334,32,"style","Use FALSE instead of the symbol F."," plotly::layout(autosize = F,","T_and_F_symbol_linter" +"R/main_aux.R",71,27,"style","Put spaces around all infix operators."," anonymize=NA,","infix_spaces_linter" +"R/main_aux.R",158,10,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/main_aux.R",179,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/parse_related.R",68,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/parse_related.R",89,14,"style","Variable and function name style should be snake_case or symbols."," colnames(blast.results) <- c(""qseqid"",","object_name_linter" +"R/parse_related.R",121,7,"style","Variable and function name style should be snake_case or symbols."," adj.br$ratio[i] <- adj.br$length[i] / adj.br$qlen[i]","object_name_linter" +"R/parse_related.R",122,10,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/parse_related.R",123,7,"style","Variable and function name style should be snake_case or symbols."," adj.br$ratio[i] <- adj.br$qlen[i] / adj.br$length[i]","object_name_linter" +"R/parse_related.R",130,3,"style","Variable and function name style should be snake_case or symbols."," adj.br$ratio <- format(adj.br$ratio, digits = 3)","object_name_linter" +"R/parse_related.R",134,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/parse_related.R",165,3,"style","Variable and function name style should be snake_case or symbols."," blast.results$qseqid <- as.character(blast.results$qseqid)","object_name_linter" +"R/report_related.R",170,3,"style","Variable and function name style should be snake_case or symbols."," reportable.wide[is.na(reportable.wide)] <- 0","object_name_linter" diff --git a/.dev/revdep_emails/Plasmidprofiler/email-body b/.dev/revdep_emails/Plasmidprofiler/email-body new file mode 100644 index 000000000..2ac8cb9a3 --- /dev/null +++ b/.dev/revdep_emails/Plasmidprofiler/email-body @@ -0,0 +1,29 @@ +Hello Adrian Zetner! Thank you for using {lintr} in your package {Plasmidprofiler}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cran/Plasmidprofiler (hash: 5d7647899468cfdc46a286634d87c68b6e2eec7f) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 12s on CRAN vs. 7s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/PosteriorBootstrap/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/PosteriorBootstrap/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..70bcbaaa1 --- /dev/null +++ b/.dev/revdep_emails/PosteriorBootstrap/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,24 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/PosteriorBootstrap.R",145,39,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(all(is.numeric(gamma_mean)) & all(is.numeric(gamma_vcov)))) {","vector_logic_linter" +"vignettes/PosteriorBootstrap.Rmd",16,12,"style","Put spaces around all infix operators."," fig.width=7,","infix_spaces_linter" +"vignettes/PosteriorBootstrap.Rmd",17,13,"style","Put spaces around all infix operators."," fig.height=3","infix_spaces_linter" +"vignettes/PosteriorBootstrap.Rmd",153,81,"style","Lines should not be more than 80 characters."," train_dat <- list(n = length(german$y), p = ncol(german$x), x = german$x, y = german$y, beta_sd = prior_sd)","line_length_linter" +"vignettes/PosteriorBootstrap.Rmd",186,81,"style","Lines should not be more than 80 characters."," anpl_sample <- PosteriorBootstrap::draw_logit_samples(x = german$x, y = german$y,","line_length_linter" +"vignettes/PosteriorBootstrap.Rmd",187,81,"style","Lines should not be more than 80 characters."," concentration = concentration,","line_length_linter" +"vignettes/PosteriorBootstrap.Rmd",188,81,"style","Lines should not be more than 80 characters."," n_bootstrap = n_bootstrap,","line_length_linter" +"vignettes/PosteriorBootstrap.Rmd",189,81,"style","Lines should not be more than 80 characters."," posterior_sample = stan_vb_sample,","line_length_linter" +"vignettes/PosteriorBootstrap.Rmd",191,81,"style","Lines should not be more than 80 characters."," show_progress = TRUE)","line_length_linter" +"vignettes/PosteriorBootstrap.Rmd",214,81,"style","Lines should not be more than 80 characters."," plot_df <- append_to_plot(plot_df, sample = anpl_samples[[toString(concentration)]],","line_length_linter" +"vignettes/PosteriorBootstrap.Rmd",239,81,"style","Lines should not be more than 80 characters."," data = dplyr::filter(plot_df, plot_df$Method != ""Bayes-Stan"")) +","line_length_linter" +"vignettes/PosteriorBootstrap.Rmd",246,62,"style","Put spaces around all infix operators."," labeller = ggplot2::label_bquote(c ~"" = ""~","infix_spaces_linter" +"vignettes/PosteriorBootstrap.Rmd",246,68,"style","Put spaces around all infix operators."," labeller = ggplot2::label_bquote(c ~"" = ""~","infix_spaces_linter" +"vignettes/PosteriorBootstrap.Rmd",301,39,"style","Do not place spaces before parentheses.","if (""Windows"" != Sys.info()[""sysname""] ) {","spaces_inside_linter" +"vignettes/PosteriorBootstrap.Rmd",311,81,"style","Lines should not be more than 80 characters."," anpl_samples <- PosteriorBootstrap::draw_logit_samples(x = german$x, y = german$y,","line_length_linter" +"vignettes/PosteriorBootstrap.Rmd",313,81,"style","Lines should not be more than 80 characters."," n_bootstrap = n_bootstrap,","line_length_linter" +"vignettes/PosteriorBootstrap.Rmd",314,81,"style","Lines should not be more than 80 characters."," gamma_mean = rep(0, ncol(german$x)),","line_length_linter" +"vignettes/PosteriorBootstrap.Rmd",315,81,"style","Lines should not be more than 80 characters."," gamma_vcov = diag(1, ncol(german$x)),","line_length_linter" +"vignettes/PosteriorBootstrap.Rmd",317,81,"style","Lines should not be more than 80 characters."," num_cores = num_cores)","line_length_linter" +"vignettes/PosteriorBootstrap.Rmd",322,81,"style","Lines should not be more than 80 characters."," speedups <- rbind(speedups, c(num_cores, n_bootstrap, one_core_duration / lap))","line_length_linter" +"vignettes/PosteriorBootstrap.Rmd",348,39,"style","Do not place spaces before parentheses.","if (""Windows"" != Sys.info()[""sysname""] ) {","spaces_inside_linter" +"vignettes/PosteriorBootstrap.Rmd",353,81,"style","Lines should not be more than 80 characters."," speedups$proportion <- (1 / speedups$speedup - 1) / (1 / speedups$Num_cores - 1)","line_length_linter" +"vignettes/PosteriorBootstrap.Rmd",355,81,"style","Lines should not be more than 80 characters."," ggplot2::qplot(proportion, data = speedups, fill = N_bootstrap, binwidth = 0.005) +","line_length_linter" diff --git a/.dev/revdep_emails/PosteriorBootstrap/email-body b/.dev/revdep_emails/PosteriorBootstrap/email-body new file mode 100644 index 000000000..d4fa32cbf --- /dev/null +++ b/.dev/revdep_emails/PosteriorBootstrap/email-body @@ -0,0 +1,29 @@ +Hello James Robinson! Thank you for using {lintr} in your package {PosteriorBootstrap}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/alan-turing-institute/PosteriorBootstrap (hash: d2962ece8b50d13ed275fc4c7c2f5dac20fbb3e1) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 5s on CRAN vs. 4s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/RSQL/attachments/RSQL.warnings b/.dev/revdep_emails/RSQL/attachments/RSQL.warnings new file mode 100644 index 000000000..328bcbcc8 --- /dev/null +++ b/.dev/revdep_emails/RSQL/attachments/RSQL.warnings @@ -0,0 +1,2 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Trying to remove β€˜paren_brace_linter’ and β€˜function_left_parentheses’, which are not in `defaults`. diff --git a/.dev/revdep_emails/RSQL/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/RSQL/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..ce8c349d9 --- /dev/null +++ b/.dev/revdep_emails/RSQL/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,25 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/sql-lib.R",129,5,"style","`else` should come on the same line as the previous `}`."," else{","brace_linter" +"R/sql-lib.R",129,9,"style","There should be a space before an opening curly brace."," else{","brace_linter" +"R/sql-lib.R",138,42,"style","There should be a space before an opening curly brace."," setupResultClassFromDriver = function(){","brace_linter" +"R/sql-lib.R",138,42,"style","There should be a space between a right parenthesis and a body expression."," setupResultClassFromDriver = function(){","paren_body_linter" +"R/sql-lib.R",141,47,"style","There should be a space before an opening curly brace."," if (inherits(self$driver, ""SQLiteDriver"")){","brace_linter" +"R/sql-lib.R",141,47,"style","There should be a space between a right parenthesis and a body expression."," if (inherits(self$driver, ""SQLiteDriver"")){","paren_body_linter" +"R/sql-lib.R",145,43,"style","There should be a space before an opening curly brace."," if (inherits(self$driver, ""PqDriver"")){","brace_linter" +"R/sql-lib.R",145,43,"style","There should be a space between a right parenthesis and a body expression."," if (inherits(self$driver, ""PqDriver"")){","paren_body_linter" +"R/sql-lib.R",148,37,"style","There should be a space before an opening curly brace."," if (is.null(self$results.class)){","brace_linter" +"R/sql-lib.R",148,37,"style","There should be a space between a right parenthesis and a body expression."," if (is.null(self$results.class)){","paren_body_linter" +"R/sql-lib.R",412,31,"style","There should be a space before an opening curly brace."," clearLastResult = function(){","brace_linter" +"R/sql-lib.R",412,31,"style","There should be a space between a right parenthesis and a body expression."," clearLastResult = function(){","paren_body_linter" +"R/sql-lib.R",413,63,"style","There should be a space before an opening curly brace."," if (!is.null(self$results.class) & !is.null(self$last.rs)){","brace_linter" +"R/sql-lib.R",413,63,"style","There should be a space between a right parenthesis and a body expression."," if (!is.null(self$results.class) & !is.null(self$last.rs)){","paren_body_linter" +"R/sql-lib.R",414,54,"style","There should be a space before an opening curly brace."," if (inherits(self$last.rs, self$results.class)){","brace_linter" +"R/sql-lib.R",414,54,"style","There should be a space between a right parenthesis and a body expression."," if (inherits(self$last.rs, self$results.class)){","paren_body_linter" +"R/sql-lib.R",425,26,"style","There should be a space before an opening curly brace."," getSummary = function(){","brace_linter" +"R/sql-lib.R",425,26,"style","There should be a space between a right parenthesis and a body expression."," getSummary = function(){","paren_body_linter" +"R/sql-lib.R",575,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," while (!ret & i <= length(quotes_symbols)) {","vector_logic_linter" +"R/sql-lib.R",683,38,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (quotes == substr(text, 1, 1) & quotes == substr(text, nchar(text), nchar(text))) {","vector_logic_linter" +"R/sql-lib.R",906,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(where_fields) > 0 & !(length(where_fields) == 1 & nchar(where_fields[1]) ==","vector_logic_linter" +"R/sql-lib.R",906,64,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(where_fields) > 0 & !(length(where_fields) == 1 & nchar(where_fields[1]) ==","vector_logic_linter" +"R/sql-lib.R",1022,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(values_df) > 1 & !inherits(values_df, ""data.frame"")) {","vector_logic_linter" +"R/sql-lib.R",1258,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nrow(values) > 0 & nrow(values) != nrow(values_uk)) {","vector_logic_linter" diff --git a/.dev/revdep_emails/RSQL/email-body b/.dev/revdep_emails/RSQL/email-body new file mode 100644 index 000000000..dde9f9d13 --- /dev/null +++ b/.dev/revdep_emails/RSQL/email-body @@ -0,0 +1,29 @@ +Hello Alejandro Baranek! Thank you for using {lintr} in your package {RSQL}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/rOpenStats/RSQL (hash: a651f6071e7edb04d72785265238403ba5bcd2f0) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 6s on CRAN vs. 3s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/RestRserve/attachments/RestRserve.failure b/.dev/revdep_emails/RestRserve/attachments/RestRserve.failure new file mode 100644 index 000000000..08edf6748 --- /dev/null +++ b/.dev/revdep_emails/RestRserve/attachments/RestRserve.failure @@ -0,0 +1 @@ +`defaults` must be a named list. diff --git a/.dev/revdep_emails/RestRserve/attachments/RestRserve.warnings b/.dev/revdep_emails/RestRserve/attachments/RestRserve.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/RestRserve/attachments/RestRserve.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/RestRserve/email-body b/.dev/revdep_emails/RestRserve/email-body new file mode 100644 index 000000000..f7bac2d6e --- /dev/null +++ b/.dev/revdep_emails/RestRserve/email-body @@ -0,0 +1,29 @@ +Hello Dmitry Selivanov! Thank you for using {lintr} in your package {RestRserve}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/rexyai/RestRserve (hash: 852785a6bfa1c6691de520bd14d1246619436419) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 25s on CRAN vs. 0s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/SamplerCompare/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/SamplerCompare/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..fa1462dc6 --- /dev/null +++ b/.dev/revdep_emails/SamplerCompare/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,15 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/00dist-util.R",13,48,"style","Variable and function name style should be snake_case."," mean = NULL, cov = NULL, mean.log.dens = NULL) {","object_name_linter" +"R/00dist-util.R",44,8,"style","Variable and function name style should be snake_case."," ds$grad.log.density <-","object_name_linter" +"R/00dist-util.R",115,6,"style","Variable and function name style should be snake_case."," ds$grad.log.density <- function(x) {","object_name_linter" +"R/00dist-util.R",121,6,"style","Variable and function name style should be snake_case."," ds$c.log.density.and.grad <- c.log.density","object_name_linter" +"R/compare-samplers.R",121,8,"style","Variable and function name style should be snake_case."," rv$dist.expr <- sprintf(""plain('%s')"", rv$dist)","object_name_linter" +"R/compare-samplers.R",125,8,"style","Variable and function name style should be snake_case."," rv$sampler.expr <- sprintf(""plain('%s')"", sampler.name)","object_name_linter" +"R/compare-samplers.R",131,6,"style","Variable and function name style should be snake_case."," rv$act.025 <- acts$act.025","object_name_linter" +"R/compare-samplers.R",132,6,"style","Variable and function name style should be snake_case."," rv$act.975 <- acts$act.975","object_name_linter" +"R/compare-samplers.R",142,8,"style","Variable and function name style should be snake_case."," rv$act.y <- acts.y$act","object_name_linter" +"R/compare-samplers.R",143,8,"style","Variable and function name style should be snake_case."," rv$act.y.025 <- acts.y$act.025","object_name_linter" +"R/compare-samplers.R",144,8,"style","Variable and function name style should be snake_case."," rv$act.y.975 <- acts.y$act.975","object_name_linter" +"R/distributions.R",53,3,"style","Variable and function name style should be snake_case."," mean.log.dens <- log.density(mean) - 0.5 * ndim","object_name_linter" +"R/distributions.R",168,3,"style","Variable and function name style should be snake_case."," mean.log.dens <- -16.5","object_name_linter" +"R/distributions.R",259,6,"style","Variable and function name style should be snake_case."," ds$lower.bound <- rep(0, length(shape))","object_name_linter" diff --git a/.dev/revdep_emails/SamplerCompare/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/SamplerCompare/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..e41a292ea --- /dev/null +++ b/.dev/revdep_emails/SamplerCompare/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,91 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/doc/sc-intro.Rnw",53,12,"style","Only use double-quotes.","dir.create('Figures', showWarnings=FALSE)","single_quotes_linter" +"inst/doc/sc-intro.Rnw",53,35,"style","Put spaces around all infix operators.","dir.create('Figures', showWarnings=FALSE)","infix_spaces_linter" +"inst/doc/sc-intro.Rnw",54,23,"style","Only use double-quotes.","capture.output(source('Code/ex-compare-samplers.Rfrag'),","single_quotes_linter" +"inst/doc/sc-intro.Rnw",55,7,"style","Put spaces around all infix operators."," file='Figures/ex-compare-samplers.txt')","infix_spaces_linter" +"inst/doc/sc-intro.Rnw",55,8,"style","Only use double-quotes."," file='Figures/ex-compare-samplers.txt')","single_quotes_linter" +"inst/doc/sc-intro.Rnw",56,23,"style","Only use double-quotes.","capture.output(source('Code/ex-compare-results.Rfrag'),","single_quotes_linter" +"inst/doc/sc-intro.Rnw",57,7,"style","Put spaces around all infix operators."," file='Figures/ex-compare-results.txt')","infix_spaces_linter" +"inst/doc/sc-intro.Rnw",57,8,"style","Only use double-quotes."," file='Figures/ex-compare-results.txt')","single_quotes_linter" +"inst/doc/sc-intro.Rnw",59,5,"style","Only use double-quotes.","pdf('Figures/ex-comparison-plot.pdf', height=4, width=4)","single_quotes_linter" +"inst/doc/sc-intro.Rnw",59,45,"style","Put spaces around all infix operators.","pdf('Figures/ex-comparison-plot.pdf', height=4, width=4)","infix_spaces_linter" +"inst/doc/sc-intro.Rnw",59,54,"style","Put spaces around all infix operators.","pdf('Figures/ex-comparison-plot.pdf', height=4, width=4)","infix_spaces_linter" +"inst/doc/sc-intro.Rnw",60,52,"style","Put spaces around all infix operators.","print(comparison.plot(sampler.comparison, base_size=8))","infix_spaces_linter" +"inst/doc/sc-intro.Rnw",63,8,"style","Only use double-quotes.","source('Code/ex-metropolis.Rfrag')","single_quotes_linter" +"inst/doc/sc-intro.Rnw",64,8,"style","Only use double-quotes.","source('Code/ex-beta.Rfrag')","single_quotes_linter" +"inst/doc/sc-intro.Rnw",65,8,"style","Only use double-quotes.","source('Code/ex-final.Rfrag')","single_quotes_linter" +"inst/doc/sc-intro.Rnw",66,23,"style","Only use double-quotes.","capture.output(source('Code/ex-final-compare.Rfrag'),","single_quotes_linter" +"inst/doc/sc-intro.Rnw",67,7,"style","Put spaces around all infix operators."," file='Figures/ex-final-compare.txt')","infix_spaces_linter" +"inst/doc/sc-intro.Rnw",67,8,"style","Only use double-quotes."," file='Figures/ex-final-compare.txt')","single_quotes_linter" +"R/00dist-util.R",200,7,"style","Variable and function name style should be snake_case or symbols."," X[obs, ] <- step$x","object_name_linter" +"R/00dist-util.R",214,19,"style","Variable and function name style should be snake_case or symbols."," attr(sampler, ""name.expr"") <- name.expr","object_name_linter" +"R/act.R",33,3,"style","Variable and function name style should be snake_case or symbols."," order.max <- NULL","object_name_linter" +"R/act.R",40,5,"style","Variable and function name style should be snake_case or symbols."," pi.var <- A$asy.var.coef","object_name_linter" +"R/act.R",45,5,"style","Variable and function name style should be snake_case or symbols."," order.max <- floor(A$order * 0.7)","object_name_linter" +"R/act.R",65,5,"style","Variable and function name style should be snake_case or symbols."," pi.sim <- AX[i, ]","object_name_linter" +"R/act.R",68,7,"style","Variable and function name style should be snake_case or symbols."," act.sim[i] <- Inf","object_name_linter" +"R/act.R",70,7,"style","Variable and function name style should be snake_case or symbols."," act.sim[i] <- (1 - sum(pi.sim * acf.sim)) / (1 - sum(pi.sim)) ^ 2","object_name_linter" +"R/act.R",75,3,"style","Variable and function name style should be snake_case or symbols."," act.sim[is.na(act.sim)] <- Inf","object_name_linter" +"R/act.R",104,3,"style","Variable and function name style should be snake_case or symbols."," max.i <- which.max(unlist(acts[""act"", ]))","object_name_linter" +"R/basic-slice.R",13,3,"style","Variable and function name style should be snake_case or symbols."," X[1, ] <- x0","object_name_linter" +"R/basic-slice.R",75,5,"style","Variable and function name style should be snake_case or symbols."," X[obs, ] <- x1","object_name_linter" +"R/basic-slice.R",85,6,"style","Variable and function name style should be snake_case or symbols.","attr(hyperrectangle.sample, ""name"") <- ""Hyperrectangle""","object_name_linter" +"R/basic-slice.R",95,6,"style","Variable and function name style should be snake_case or symbols.","attr(nograd.hyperrectangle.sample, ""name"") <- ""Hyperrectangle (no grad)""","object_name_linter" +"R/basic-slice.R",105,3,"style","Variable and function name style should be snake_case or symbols."," X[1, ] <- x0","object_name_linter" +"R/basic-slice.R",157,5,"style","Variable and function name style should be snake_case or symbols."," X[obs, ] <- x1","object_name_linter" +"R/basic-slice.R",167,6,"style","Variable and function name style should be snake_case or symbols.","attr(stepout.slice.sample, ""name"") <- ""Step-out Slice""","object_name_linter" +"R/basic-slice.R",176,6,"style","Variable and function name style should be snake_case or symbols.","attr(interval.slice.sample, ""name"") <- ""Interval Slice""","object_name_linter" +"R/c-samplers.R",41,19,"style","Variable and function name style should be snake_case or symbols."," attr(sampler, ""name.expression"") <- name.expression","object_name_linter" +"R/c-samplers.R",49,1,"style","Variable and function name style should be snake_case or symbols.","raw.symbol <- function(symbol) {","object_name_linter" +"R/c-samplers.R",64,35,"style","Variable and function name style should be snake_case or symbols."," min.dimension = 1) {","object_name_linter" +"R/c-samplers.R",72,6,"style","Variable and function name style should be snake_case or symbols.","attr(shrinking.rank.sample, ""name"") <- ""Shrinking Rank""","object_name_linter" +"R/c-samplers.R",85,6,"style","Variable and function name style should be snake_case or symbols.","attr(nonadaptive.crumb.sample, ""name"") <- ""Nonadaptive Crumb""","object_name_linter" +"R/comparison-plot.R",48,5,"style","Variable and function name style should be snake_case or symbols."," RSinf$lim <- max(RSfinite$evals * RSfinite$act)","object_name_linter" +"R/comparison-plot.R",60,1,"style","Variable and function name style should be snake_case or symbols.","log.breaks <- function(data, base) {","object_name_linter" +"R/comparison-plot.R",61,3,"warning","local variable β€˜breaks’ assigned but may not be used"," breaks <- base ^ seq(floor(min(log(data, base = base))),","object_usage_linter" +"R/cov-match.R",125,6,"style","Variable and function name style should be snake_case or symbols.","attr(cov.match.sample, ""name"") <- ""Cov. Matching""","object_name_linter" +"R/distributions.R",31,3,"style","Variable and function name style should be snake_case or symbols."," log.det <- sum(log(eigen(sigma, only.values = TRUE)$values))","object_name_linter" +"R/distributions.R",36,3,"style","Variable and function name style should be snake_case or symbols."," log.density <- function(x) {","object_name_linter" +"R/distributions.R",67,3,"warning","local variable β€˜ds’ assigned but may not be used"," ds <- make.dist(ndim, name, name.expression, log.density,","object_usage_linter" +"R/distributions.R",115,3,"style","Variable and function name style should be snake_case or symbols."," log.density <- function(x) {","object_name_linter" +"R/distributions.R",246,21,"style","Any function spanning multiple lines should use curly braces."," log.density = function(x)","brace_linter" +"R/distributions.R",248,26,"style","Any function spanning multiple lines should use curly braces."," grad.log.density = function(x)","brace_linter" +"R/metropolis.R",31,7,"style","Variable and function name style should be snake_case or symbols."," X[obs / target.dist$ndim, ] <- x0","object_name_linter" +"R/metropolis.R",38,6,"style","Variable and function name style should be snake_case or symbols.","attr(multivariate.metropolis.sample, ""name"") <- ""Multivariate Metropolis""","object_name_linter" +"R/metropolis.R",47,3,"style","Variable and function name style should be snake_case or symbols."," X[1, ] <- x0","object_name_linter" +"R/metropolis.R",68,5,"style","Variable and function name style should be snake_case or symbols."," X[obs, ] <- x0 # coordinates updated, save state","object_name_linter" +"R/metropolis.R",75,6,"style","Variable and function name style should be snake_case or symbols.","attr(univar.metropolis.sample, ""name"") <- ""Univariate Metropolis""","object_name_linter" +"R/metropolis.R",97,3,"style","Variable and function name style should be snake_case or symbols."," sample.cov <- NULL","object_name_linter" +"R/metropolis.R",129,7,"style","Variable and function name style should be snake_case or symbols."," X[obs / ndim, ] <- x0","object_name_linter" +"R/metropolis.R",136,7,"style","Variable and function name style should be snake_case or symbols."," sample.cov <- obs.scatter / obs - tcrossprod(obs.sum / obs)","object_name_linter" +"R/metropolis.R",148,6,"style","Variable and function name style should be snake_case or symbols.","attr(adaptive.metropolis.sample, ""name"") <- ""Adaptive Metropolis""","object_name_linter" +"R/oblique-hyperrect.R",13,3,"style","Variable and function name style should be snake_case or symbols."," X[1, ] <- x0","object_name_linter" +"R/oblique-hyperrect.R",79,7,"style","Variable and function name style should be snake_case or symbols."," L[wt < 0] <- wt[wt < 0]","object_name_linter" +"R/oblique-hyperrect.R",80,7,"style","Variable and function name style should be snake_case or symbols."," U[wt > 0] <- wt[wt > 0]","object_name_linter" +"R/oblique-hyperrect.R",84,5,"style","Variable and function name style should be snake_case or symbols."," X[obs, ] <- x1","object_name_linter" +"R/oblique-hyperrect.R",90,6,"style","Variable and function name style should be snake_case or symbols.","attr(oblique.hyperrect.sample, ""name"") <- ""Oblique Hyperrect""","object_name_linter" +"R/oblique-hyperrect.R",97,6,"style","Variable and function name style should be snake_case or symbols.","attr(cheat.oblique.hyperrect.sample, ""name"") <- ""Cheat Oblique Hyperrect""","object_name_linter" +"R/univar-eigen.R",9,3,"style","Variable and function name style should be snake_case or symbols."," X[1, ] <- x0","object_name_linter" +"R/univar-eigen.R",52,7,"style","Variable and function name style should be snake_case or symbols."," which.eig <- floor(1 + ndim * runif(1))","object_name_linter" +"R/univar-eigen.R",108,7,"style","Variable and function name style should be snake_case or symbols."," X[obs / nthin, ] <- x1","object_name_linter" +"R/univar-eigen.R",118,6,"style","Variable and function name style should be snake_case or symbols.","attr(univar.eigen.sample, ""name"") <- ""Univar Eigen""","object_name_linter" +"R/univar-eigen.R",128,6,"style","Variable and function name style should be snake_case or symbols.","attr(cheat.univar.eigen.sample, ""name"") <- ""Cheat Univar Eigen""","object_name_linter" +"tests/test-samplers.R",11,1,"style","Variable and function name style should be snake_case or symbols.","all.samplers <- list(","object_name_linter" +"vignettes/sc-intro.Rnw",53,12,"style","Only use double-quotes.","dir.create('Figures', showWarnings=FALSE)","single_quotes_linter" +"vignettes/sc-intro.Rnw",53,35,"style","Put spaces around all infix operators.","dir.create('Figures', showWarnings=FALSE)","infix_spaces_linter" +"vignettes/sc-intro.Rnw",54,23,"style","Only use double-quotes.","capture.output(source('Code/ex-compare-samplers.Rfrag'),","single_quotes_linter" +"vignettes/sc-intro.Rnw",55,7,"style","Put spaces around all infix operators."," file='Figures/ex-compare-samplers.txt')","infix_spaces_linter" +"vignettes/sc-intro.Rnw",55,8,"style","Only use double-quotes."," file='Figures/ex-compare-samplers.txt')","single_quotes_linter" +"vignettes/sc-intro.Rnw",56,23,"style","Only use double-quotes.","capture.output(source('Code/ex-compare-results.Rfrag'),","single_quotes_linter" +"vignettes/sc-intro.Rnw",57,7,"style","Put spaces around all infix operators."," file='Figures/ex-compare-results.txt')","infix_spaces_linter" +"vignettes/sc-intro.Rnw",57,8,"style","Only use double-quotes."," file='Figures/ex-compare-results.txt')","single_quotes_linter" +"vignettes/sc-intro.Rnw",59,5,"style","Only use double-quotes.","pdf('Figures/ex-comparison-plot.pdf', height=4, width=4)","single_quotes_linter" +"vignettes/sc-intro.Rnw",59,45,"style","Put spaces around all infix operators.","pdf('Figures/ex-comparison-plot.pdf', height=4, width=4)","infix_spaces_linter" +"vignettes/sc-intro.Rnw",59,54,"style","Put spaces around all infix operators.","pdf('Figures/ex-comparison-plot.pdf', height=4, width=4)","infix_spaces_linter" +"vignettes/sc-intro.Rnw",60,52,"style","Put spaces around all infix operators.","print(comparison.plot(sampler.comparison, base_size=8))","infix_spaces_linter" +"vignettes/sc-intro.Rnw",63,8,"style","Only use double-quotes.","source('Code/ex-metropolis.Rfrag')","single_quotes_linter" +"vignettes/sc-intro.Rnw",64,8,"style","Only use double-quotes.","source('Code/ex-beta.Rfrag')","single_quotes_linter" +"vignettes/sc-intro.Rnw",65,8,"style","Only use double-quotes.","source('Code/ex-final.Rfrag')","single_quotes_linter" +"vignettes/sc-intro.Rnw",66,23,"style","Only use double-quotes.","capture.output(source('Code/ex-final-compare.Rfrag'),","single_quotes_linter" +"vignettes/sc-intro.Rnw",67,7,"style","Put spaces around all infix operators."," file='Figures/ex-final-compare.txt')","infix_spaces_linter" +"vignettes/sc-intro.Rnw",67,8,"style","Only use double-quotes."," file='Figures/ex-final-compare.txt')","single_quotes_linter" diff --git a/.dev/revdep_emails/SamplerCompare/email-body b/.dev/revdep_emails/SamplerCompare/email-body new file mode 100644 index 000000000..ede9e695d --- /dev/null +++ b/.dev/revdep_emails/SamplerCompare/email-body @@ -0,0 +1,29 @@ +Hello Madeleine Thompson! Thank you for using {lintr} in your package {SamplerCompare}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cran/SamplerCompare (hash: e3b86a53bfcade5a049f6796dd260fdf0cfec7a7) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 14s on CRAN vs. 8s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/TDA/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/TDA/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..2c16702e2 --- /dev/null +++ b/.dev/revdep_emails/TDA/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,5 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/maxPersistence.R",94,36,"style","There should be a space between right parenthesis and an opening curly brace."," for (i in seq(along = parameters)){","paren_brace_linter" +"R/plot.maxPersistence.R",40,32,"style","There should be a space between right parenthesis and an opening curly brace."," for (j in seq(along = symb)){","paren_brace_linter" +"R/print.summary.diagram.R",1,1,"style","Variable and function name style should be snake_case.","print.summary.diagram <-","object_name_linter" +"R/print.summary.maxPersistence.R",1,1,"style","Variable and function name style should be snake_case.","print.summary.maxPersistence <-","object_name_linter" diff --git a/.dev/revdep_emails/TDA/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/TDA/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..fb1299041 --- /dev/null +++ b/.dev/revdep_emails/TDA/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,262 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/doc/article.R",478,3,"style","Variable and function name style should be snake_case or symbols."," Diags[[i]] <- ripsDiag(subX, maxdimension = 1, maxscale = 5)","object_name_linter" +"inst/doc/article.R",479,3,"style","Variable and function name style should be snake_case or symbols."," Lands[i, ] <- landscape(Diags[[i]][[""diagram""]], dimension = 1,","object_name_linter" +"inst/doc/article.Rnw",222,1,"style","Variable and function name style should be snake_case or symbols.","X <- circleUnif(400)","object_name_linter" +"inst/doc/article.Rnw",224,1,"style","Variable and function name style should be snake_case or symbols.","Xlim <- c(-1.6, 1.6); Ylim <- c(-1.7, 1.7); by <- 0.065","object_name_linter" +"inst/doc/article.Rnw",224,21,"style","Compound semicolons are discouraged. Replace them by a newline.","Xlim <- c(-1.6, 1.6); Ylim <- c(-1.7, 1.7); by <- 0.065","semicolon_linter" +"inst/doc/article.Rnw",224,24,"style","Variable and function name style should be snake_case or symbols.","Xlim <- c(-1.6, 1.6); Ylim <- c(-1.7, 1.7); by <- 0.065","object_name_linter" +"inst/doc/article.Rnw",224,44,"style","Compound semicolons are discouraged. Replace them by a newline.","Xlim <- c(-1.6, 1.6); Ylim <- c(-1.7, 1.7); by <- 0.065","semicolon_linter" +"inst/doc/article.Rnw",226,1,"style","Variable and function name style should be snake_case or symbols.","Xseq <- seq(Xlim[1], Xlim[2], by = by)","object_name_linter" +"inst/doc/article.Rnw",227,1,"style","Variable and function name style should be snake_case or symbols.","Yseq <- seq(Ylim[1], Ylim[2], by = by)","object_name_linter" +"inst/doc/article.Rnw",228,1,"style","Variable and function name style should be snake_case or symbols.","Grid <- expand.grid(Xseq, Yseq)","object_name_linter" +"inst/doc/article.Rnw",265,1,"style","Variable and function name style should be snake_case or symbols.","DTM <- dtm(X = X, Grid = Grid, m0 = m0)","object_name_linter" +"inst/doc/article.Rnw",276,1,"style","Variable and function name style should be snake_case or symbols.","kNN <- knnDE(X = X, Grid = Grid, k = k)","object_name_linter" +"inst/doc/article.Rnw",287,1,"style","Variable and function name style should be snake_case or symbols.","KDE <- kde(X = X, Grid = Grid, h = h)","object_name_linter" +"inst/doc/article.Rnw",298,1,"style","Variable and function name style should be snake_case or symbols.","Kdist <- kernelDist(X = X, Grid = Grid, h = h)","object_name_linter" +"inst/doc/article.Rnw",394,1,"style","Variable and function name style should be snake_case or symbols.","posYgrid <- which(Grid[, 2] > 0)","object_name_linter" +"inst/doc/article.Rnw",395,1,"style","Variable and function name style should be snake_case or symbols.","posYseq <- which(Yseq > 0)","object_name_linter" +"inst/doc/article.Rnw",465,1,"style","Variable and function name style should be snake_case or symbols.","DiagGrid <- gridDiag(","object_name_linter" +"inst/doc/article.Rnw",501,81,"style","Lines should not be more than 80 characters."," lines(DiagGrid[[""cycleLocation""]][[one[i]]][j, , ], pch = 19, cex = 1, col = i)","line_length_linter" +"inst/doc/article.Rnw",556,1,"style","Variable and function name style should be snake_case or symbols.","Circle1 <- circleUnif(60)","object_name_linter" +"inst/doc/article.Rnw",557,1,"style","Variable and function name style should be snake_case or symbols.","Circle2 <- circleUnif(60, r = 2) + 3","object_name_linter" +"inst/doc/article.Rnw",558,1,"style","Variable and function name style should be snake_case or symbols.","Circles <- rbind(Circle1, Circle2)","object_name_linter" +"inst/doc/article.Rnw",571,1,"style","Variable and function name style should be snake_case or symbols.","DiagRips <- ripsDiag(X = Circles, maxdimension, maxscale,","object_name_linter" +"inst/doc/article.Rnw",584,25,"style","Put spaces around all infix operators.","par(mfrow = c(1, 3), mai=c(0.8, 0.8, 0.3, 0.3))","infix_spaces_linter" +"inst/doc/article.Rnw",585,35,"style","Commas should always have a space after.","plot(Circles, pch = 16, xlab = """",ylab = """", main = ""Two Circles"")","commas_linter" +"inst/doc/article.Rnw",592,81,"style","Lines should not be more than 80 characters."," lines(DiagRips[[""cycleLocation""]][[one[i]]][j, , ], pch = 19, cex = 1, col = i)","line_length_linter" +"inst/doc/article.Rnw",617,1,"style","Variable and function name style should be snake_case or symbols.","X <- circleUnif(n = 30)","object_name_linter" +"inst/doc/article.Rnw",624,1,"style","Variable and function name style should be snake_case or symbols.","DiagAlphaCmplx <- alphaComplexDiag(","object_name_linter" +"inst/doc/article.Rnw",646,1,"style","Use spaces to indent, not tabs."," cex = 1, col = i + 1)","no_tab_linter" +"inst/doc/article.Rnw",668,1,"style","Variable and function name style should be snake_case or symbols.","X <- cbind(circleUnif(n = n), runif(n = n, min = -0.1, max = 0.1))","object_name_linter" +"inst/doc/article.Rnw",674,1,"style","Variable and function name style should be snake_case or symbols.","DiagAlphaShape <- alphaShapeDiag(","object_name_linter" +"inst/doc/article.Rnw",716,1,"style","Variable and function name style should be snake_case or symbols.","X <- circleUnif(n = 100)","object_name_linter" +"inst/doc/article.Rnw",724,1,"style","Variable and function name style should be snake_case or symbols.","FltRips <- ripsFiltration(X = X, maxdimension = maxdimension,","object_name_linter" +"inst/doc/article.Rnw",726,1,"style","Use spaces to indent, not tabs."," printProgress = TRUE)","no_tab_linter" +"inst/doc/article.Rnw",735,1,"style","Variable and function name style should be snake_case or symbols.","dtmValues <- dtm(X = X, Grid = X, m0 = m0)","object_name_linter" +"inst/doc/article.Rnw",736,1,"style","Variable and function name style should be snake_case or symbols.","FltFun <- funFiltration(FUNvalues = dtmValues, cmplx = FltRips[[""cmplx""]])","object_name_linter" +"inst/doc/article.Rnw",742,1,"style","Variable and function name style should be snake_case or symbols.","DiagFltFun <- filtrationDiag(filtration = FltFun, maxdimension = maxdimension,","object_name_linter" +"inst/doc/article.Rnw",752,25,"style","Put spaces around all infix operators.","par(mfrow = c(1, 2), mai=c(0.8, 0.8, 0.3, 0.3))","infix_spaces_linter" +"inst/doc/article.Rnw",753,29,"style","Commas should always have a space after.","plot(X, pch = 16, xlab = """",ylab = """")","commas_linter" +"inst/doc/article.Rnw",775,1,"style","Variable and function name style should be snake_case or symbols.","Diag1 <- ripsDiag(Circle1, maxdimension = 1, maxscale = 5)","object_name_linter" +"inst/doc/article.Rnw",776,1,"style","Variable and function name style should be snake_case or symbols.","Diag2 <- ripsDiag(Circle2, maxdimension = 1, maxscale = 5)","object_name_linter" +"inst/doc/article.Rnw",854,1,"style","Variable and function name style should be snake_case or symbols.","PlotTriangles <- function(left, right) {","object_name_linter" +"inst/doc/article.Rnw",856,3,"style","Variable and function name style should be snake_case or symbols."," X <- (left + right) / 2","object_name_linter" +"inst/doc/article.Rnw",857,3,"style","Variable and function name style should be snake_case or symbols."," Y <- (right - left) / 2","object_name_linter" +"inst/doc/article.Rnw",865,1,"style","Use spaces to indent, not tabs."," mtext(""(Birth + Death) / 2"", side = 1, line = 2.5, cex = 1)","no_tab_linter" +"inst/doc/article.Rnw",866,1,"style","Use spaces to indent, not tabs."," mtext(""(Death - Birth) / 2"", side = 2, line = 2.5, cex = 1)","no_tab_linter" +"inst/doc/article.Rnw",867,1,"style","Use spaces to indent, not tabs."," #polygon(c(0, 0, ylimit[2]), c(0, ylimit[2], ylimit[2]),","no_tab_linter" +"inst/doc/article.Rnw",874,3,"style","Variable and function name style should be snake_case or symbols."," B <- max(X + Y)","object_name_linter" +"inst/doc/article.Rnw",876,3,"warning","local variable β€˜maxfun’ assigned but may not be used"," maxfun <- rep(0, length(grid))","object_usage_linter" +"inst/doc/article.Rnw",878,6,"style","Place a space before left parenthesis, except in a function call."," for(i in seq_len(n)) {","spaces_left_parentheses_linter" +"inst/doc/article.Rnw",881,3,"warning","local variable β€˜land’ assigned but may not be used"," land <- apply(tmp, 2, max)","object_usage_linter" +"inst/doc/article.Rnw",882,4,"style","Commented code should be removed."," #lines(grid, land, lwd = 2, col = 4)","commented_code_linter" +"inst/doc/article.Rnw",883,1,"style","Use spaces to indent, not tabs."," points(X, Y, type = ""p"", cex = 1, pch = 19, col = ""pink"")","no_tab_linter" +"inst/doc/article.Rnw",892,27,"style","Trailing whitespace is superfluous.","PlotTriangles(left, right) ","trailing_whitespace_linter" +"inst/doc/article.Rnw",894,1,"style","Variable and function name style should be snake_case or symbols.","Diag1 <- cbind(rep(0, length(left)), left, right)","object_name_linter" +"inst/doc/article.Rnw",896,1,"style","Variable and function name style should be snake_case or symbols.","Land1 <- landscape(Diag1, dimension = 0, KK = 1, tseq)","object_name_linter" +"inst/doc/article.Rnw",897,1,"style","Variable and function name style should be snake_case or symbols.","Sil1 <- silhouette(Diag1, p = 1, dimension = 0, tseq)","object_name_linter" +"inst/doc/article.Rnw",899,1,"style","Variable and function name style should be snake_case or symbols.","X <- (left + right) / 2","object_name_linter" +"inst/doc/article.Rnw",900,1,"style","Variable and function name style should be snake_case or symbols.","Y <- (right - left) / 2","object_name_linter" +"inst/doc/article.Rnw",939,1,"style","Variable and function name style should be snake_case or symbols.","Land <- landscape(DiagRips[[""diagram""]], dimension = 1, KK = 1, tseq)","object_name_linter" +"inst/doc/article.Rnw",940,1,"style","Variable and function name style should be snake_case or symbols.","Sil <- silhouette(DiagRips[[""diagram""]], p = 1, dimension = 1, tseq)","object_name_linter" +"inst/doc/article.Rnw",975,1,"style","Variable and function name style should be snake_case or symbols.","N <- 4000","object_name_linter" +"inst/doc/article.Rnw",976,1,"style","Variable and function name style should be snake_case or symbols.","XX1 <- circleUnif(N / 2)","object_name_linter" +"inst/doc/article.Rnw",977,1,"style","Variable and function name style should be snake_case or symbols.","XX2 <- circleUnif(N / 2, r = 2) + 3","object_name_linter" +"inst/doc/article.Rnw",978,1,"style","Variable and function name style should be snake_case or symbols.","X <- rbind(XX1, XX2)","object_name_linter" +"inst/doc/article.Rnw",990,1,"style","Variable and function name style should be snake_case or symbols.","Diags <- list()","object_name_linter" +"inst/doc/article.Rnw",992,1,"style","Variable and function name style should be snake_case or symbols.","Lands <- matrix(0, nrow = n, ncol = length(tseq))","object_name_linter" +"inst/doc/article.Rnw",1000,3,"style","Variable and function name style should be snake_case or symbols."," subX <- X[sample(seq_len(N), m), ]","object_name_linter" +"inst/doc/article.Rnw",1001,3,"style","Variable and function name style should be snake_case or symbols."," Diags[[i]] <- ripsDiag(subX, maxdimension = 1, maxscale = 5)","object_name_linter" +"inst/doc/article.Rnw",1002,3,"style","Variable and function name style should be snake_case or symbols."," Lands[i, ] <- landscape(Diags[[i]][[""diagram""]], dimension = 1,","object_name_linter" +"inst/doc/article.Rnw",1010,1,"style","Variable and function name style should be snake_case or symbols.","bootLand <- multipBootstrap(Lands, B = 100, alpha = 0.05,","object_name_linter" +"inst/doc/article.Rnw",1080,1,"style","Variable and function name style should be snake_case or symbols.","XX1 <- circleUnif(600)","object_name_linter" +"inst/doc/article.Rnw",1081,1,"style","Variable and function name style should be snake_case or symbols.","XX2 <- circleUnif(1000, r = 1.5) + 2.5","object_name_linter" +"inst/doc/article.Rnw",1083,1,"style","Variable and function name style should be snake_case or symbols.","X <- rbind(XX1, XX2, noise)","object_name_linter" +"inst/doc/article.Rnw",1086,1,"style","Variable and function name style should be snake_case or symbols.","Xlim <- c(-2, 5)","object_name_linter" +"inst/doc/article.Rnw",1087,1,"style","Variable and function name style should be snake_case or symbols.","Ylim <- c(-2, 5)","object_name_linter" +"inst/doc/article.Rnw",1094,1,"style","Variable and function name style should be snake_case or symbols.","parametersKDE <- seq(0.1, 0.6, by = 0.05)","object_name_linter" +"inst/doc/article.Rnw",1096,1,"style","Variable and function name style should be snake_case or symbols.","B <- 50 # number of bootstrap iterations. Should be large.","object_name_linter" +"inst/doc/article.Rnw",1103,1,"style","Variable and function name style should be snake_case or symbols.","maxKDE <- maxPersistence(kde, parametersKDE, X,","object_name_linter" +"inst/doc/article.Rnw",1149,1,"style","Variable and function name style should be snake_case or symbols.","X1 <- cbind(rnorm(300, 1, .8), rnorm(300, 5, 0.8))","object_name_linter" +"inst/doc/article.Rnw",1150,1,"style","Variable and function name style should be snake_case or symbols.","X2 <- cbind(rnorm(300, 3.5, .8), rnorm(300, 5, 0.8))","object_name_linter" +"inst/doc/article.Rnw",1151,1,"style","Variable and function name style should be snake_case or symbols.","X3 <- cbind(rnorm(300, 6, 1), rnorm(300, 1, 1))","object_name_linter" +"inst/doc/article.Rnw",1152,1,"style","Variable and function name style should be snake_case or symbols.","XX <- rbind(X1, X2, X3)","object_name_linter" +"inst/doc/article.Rnw",1158,1,"style","Variable and function name style should be snake_case or symbols.","Tree <- clusterTree(XX, k = 100, density = ""knn"",","object_name_linter" +"inst/doc/article.Rnw",1160,1,"style","Variable and function name style should be snake_case or symbols.","TreeKDE <- clusterTree(XX, k = 100, h = 0.3, density = ""kde"",","object_name_linter" +"inst/doc/article.Rnw",1183,17,"style","Commas should always have a space after.","par(mfrow = c(2,3))","commas_linter" +"inst/doc/article.Rnw",1184,18,"style","Commas should always have a space after.","par(mai = c(0.25,0.35,0.3,0.3))","commas_linter" +"inst/doc/article.Rnw",1184,23,"style","Commas should always have a space after.","par(mai = c(0.25,0.35,0.3,0.3))","commas_linter" +"inst/doc/article.Rnw",1184,27,"style","Commas should always have a space after.","par(mai = c(0.25,0.35,0.3,0.3))","commas_linter" +"inst/doc/article.Rnw",1195,1,"style","Use spaces to indent, not tabs."," points(matrix(XX[Tree[[""DataPoints""]][[i]], ], ncol = 2), col = i,","no_tab_linter" +"R/alphaComplexDiag.R",66,12,"style","Variable and function name style should be snake_case or symbols."," colnames(Diag) <- c(""dimension"", ""Birth"", ""Death"")","object_name_linter" +"R/alphaComplexDiag.R",67,9,"style","Variable and function name style should be snake_case or symbols."," class(Diag) <- ""diagram""","object_name_linter" +"R/alphaComplexDiag.R",68,14,"style","Variable and function name style should be snake_case or symbols."," attributes(Diag)[[""maxdimension""]] <- max(Diag[, 1])","object_name_linter" +"R/alphaComplexDiag.R",70,14,"style","Variable and function name style should be snake_case or symbols."," attributes(Diag)[[""scale""]] <-","object_name_linter" +"R/alphaComplexDiag.R",72,14,"style","Variable and function name style should be snake_case or symbols."," attributes(Diag)[[""call""]] <- match.call()","object_name_linter" +"R/alphaShapeDiag.R",58,12,"style","Variable and function name style should be snake_case or symbols."," colnames(Diag) <- c(""dimension"", ""Birth"", ""Death"")","object_name_linter" +"R/alphaShapeDiag.R",59,9,"style","Variable and function name style should be snake_case or symbols."," class(Diag) <- ""diagram""","object_name_linter" +"R/alphaShapeDiag.R",60,14,"style","Variable and function name style should be snake_case or symbols."," attributes(Diag)[[""maxdimension""]] <- max(Diag[, 1])","object_name_linter" +"R/alphaShapeDiag.R",62,14,"style","Variable and function name style should be snake_case or symbols."," attributes(Diag)[[""scale""]] <-","object_name_linter" +"R/alphaShapeDiag.R",64,14,"style","Variable and function name style should be snake_case or symbols."," attributes(Diag)[[""call""]] <- match.call()","object_name_linter" +"R/bootstrapBand.R",79,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" +"R/bootstrapDiagram.R",159,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" +"R/bottleneck.R",39,5,"style","Variable and function name style should be snake_case or symbols."," bottleDistance[dimIdx] <- Bottleneck(Diag1Dim, Diag2Dim)","object_name_linter" +"R/clusterTree.R",52,7,"style","Variable and function name style should be snake_case or symbols."," adjMat[i, knnInfo[[""nn.index""]][i, ]] <- 1","object_name_linter" +"R/clusterTree.R",68,7,"style","Variable and function name style should be snake_case or symbols."," adjMat[i, knnInfo[[""nn.index""]][i, ]] <- 1","object_name_linter" +"R/clusterTree.R",104,5,"style","Variable and function name style should be snake_case or symbols."," G[NewExcluded, present] <- FALSE # remove edges of the new excluded point","object_name_linter" +"R/clusterTree.R",106,5,"style","Variable and function name style should be snake_case or symbols."," CLUSTERS[[j]] <- list(""no"" = clust[[""no""]], ""mem"" = clust[[""membership""]],","object_name_linter" +"R/clusterTree.R",166,5,"style","Variable and function name style should be snake_case or symbols."," compBranch[[bb]] <- seq_len(n)","object_name_linter" +"R/clusterTree.R",216,9,"style","Variable and function name style should be snake_case or symbols."," compBranch[[bb]] <- components[[i]]","object_name_linter" +"R/clusterTree.R",245,5,"style","Variable and function name style should be snake_case or symbols."," alphaBottom[i] <- sum(hat.f > bottom[i]) / n","object_name_linter" +"R/clusterTree.R",246,5,"style","Variable and function name style should be snake_case or symbols."," alphaTop[i] <- sum(hat.f > top[i]) / n","object_name_linter" +"R/clusterTree.R",262,9,"style","Variable and function name style should be snake_case or symbols."," rBottom[i] <- max(r.k)","object_name_linter" +"R/clusterTree.R",265,9,"style","Variable and function name style should be snake_case or symbols."," rTop[i] <- max(r.k)","object_name_linter" +"R/dtm.R",52,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" +"R/filtrationDiag.R",50,14,"style","Variable and function name style should be snake_case or symbols."," colnames(Diag) <- c(""dimension"", ""Death"", ""Birth"")","object_name_linter" +"R/filtrationDiag.R",51,5,"style","Variable and function name style should be snake_case or symbols."," Diag[, 2:3] <- -Diag[, 3:2]","object_name_linter" +"R/filtrationDiag.R",53,14,"style","Variable and function name style should be snake_case or symbols."," colnames(Diag) <- c(""dimension"", ""Birth"", ""Death"")","object_name_linter" +"R/filtrationDiag.R",56,9,"style","Variable and function name style should be snake_case or symbols."," class(Diag) <- ""diagram""","object_name_linter" +"R/filtrationDiag.R",57,14,"style","Variable and function name style should be snake_case or symbols."," attributes(Diag)[[""maxdimension""]] <- max(Diag[, 1])","object_name_linter" +"R/filtrationDiag.R",59,14,"style","Variable and function name style should be snake_case or symbols."," attributes(Diag)[[""scale""]] <-","object_name_linter" +"R/filtrationDiag.R",61,14,"style","Variable and function name style should be snake_case or symbols."," attributes(Diag)[[""call""]] <- match.call()","object_name_linter" +"R/filtrationDiag.R",74,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" +"R/findKtree.R",9,7,"style","Variable and function name style should be snake_case or symbols."," kappaBottom[i] <- NA","object_name_linter" +"R/findKtree.R",10,7,"style","Variable and function name style should be snake_case or symbols."," kappaTop[i] <- NA","object_name_linter" +"R/findKtree.R",18,11,"style","Variable and function name style should be snake_case or symbols."," kappaTop[i] <-","object_name_linter" +"R/findKtree.R",21,13,"style","Variable and function name style should be snake_case or symbols."," kappaTop[i] <- length(compBranch[[i]]) / n","object_name_linter" +"R/findKtree.R",24,11,"style","Variable and function name style should be snake_case or symbols."," kappaTop[i] <- length(compBranch[[i]]) / n","object_name_linter" +"R/findKtree.R",27,9,"style","Variable and function name style should be snake_case or symbols."," kappaBottom[i] <- kappaTop[parent[i]]","object_name_linter" +"R/findKtree.R",34,13,"style","Variable and function name style should be snake_case or symbols."," kappaTop[i] <- kappaBottom[i] + (length(compBranch[[i]]) -","object_name_linter" +"R/findKtree.R",37,13,"style","Variable and function name style should be snake_case or symbols."," kappaTop[i] <- kappaBottom[i] + length(compBranch[[i]]) / n","object_name_linter" +"R/findKtree.R",40,11,"style","Variable and function name style should be snake_case or symbols."," kappaTop[i] <- kappaBottom[i] + length(compBranch[[i]]) / n","object_name_linter" +"R/funFiltration.R",34,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" +"R/gridBy.R",16,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" +"R/gridDiag.R",130,14,"style","Variable and function name style should be snake_case or symbols."," colnames(Diag) <- c(""dimension"", ""Death"", ""Birth"")","object_name_linter" +"R/gridDiag.R",131,5,"style","Variable and function name style should be snake_case or symbols."," Diag[, 2:3] <- -Diag[, 3:2]","object_name_linter" +"R/gridDiag.R",133,14,"style","Variable and function name style should be snake_case or symbols."," colnames(Diag) <- c(""dimension"", ""Birth"", ""Death"")","object_name_linter" +"R/gridDiag.R",136,9,"style","Variable and function name style should be snake_case or symbols."," class(Diag) <- ""diagram""","object_name_linter" +"R/gridDiag.R",137,14,"style","Variable and function name style should be snake_case or symbols."," attributes(Diag)[[""maxdimension""]] <- max(Diag[, 1])","object_name_linter" +"R/gridDiag.R",139,14,"style","Variable and function name style should be snake_case or symbols."," attributes(Diag)[[""scale""]] <-","object_name_linter" +"R/gridDiag.R",141,14,"style","Variable and function name style should be snake_case or symbols."," attributes(Diag)[[""call""]] <- match.call()","object_name_linter" +"R/gridFiltration.R",94,5,"style","Variable and function name style should be snake_case or symbols."," gridOut[[2]] <- -gridOut[[2]]","object_name_linter" +"R/gridFiltration.R",108,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" +"R/hausdInterval.R",53,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" +"R/knnDE.R",20,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" +"R/landscape.R",53,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" +"R/maxPersistence.R",109,14,"style","Variable and function name style should be snake_case or symbols."," colnames(Pers[[i]]) <- c(""dimension"", ""Persistence"")","object_name_linter" +"R/maxPersistence.R",121,7,"style","Variable and function name style should be snake_case or symbols."," numberSignificant[i] <- sum(Pers[[i]][selctDim, 2] > (2 * eps[i]))","object_name_linter" +"R/maxPersistence.R",122,7,"style","Variable and function name style should be snake_case or symbols."," significantPers[i] <- sum(pmax(0, Pers[[i]][selctDim, 2] - (2 * eps[i])))","object_name_linter" +"R/maxPersistence.R",128,7,"style","Variable and function name style should be snake_case or symbols."," numberSignificant[i] <- sum(Pers[[i]][, 2] > (2 * eps[i]))","object_name_linter" +"R/maxPersistence.R",129,7,"style","Variable and function name style should be snake_case or symbols."," significantPers[i] <- sum(pmax(0, Pers[[i]][, 2] - (2 * eps[i])))","object_name_linter" +"R/multipBootstrap.R",55,3,"style","Variable and function name style should be snake_case or symbols."," LOWband1[which(LOWband1 < 0)] <- 0 #set negative values of lower band =0","object_name_linter" +"R/plot.diagram.R",121,11,"style","Variable and function name style should be snake_case or symbols."," sortedDiag[(oldlD + 1):(lD), ] <- x[posD, ]","object_name_linter" +"R/plot.diagram.R",122,11,"style","Variable and function name style should be snake_case or symbols."," sortedCol[(oldlD + 1):(lD)] <- col[posD]","object_name_linter" +"R/plot.diagram.R",157,9,"style","There should be a space before an opening curly brace."," } else{ ### diagram plot","brace_linter" +"R/plot.diagram.R",173,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plotRule.R",12,9,"style","Variable and function name style should be snake_case or symbols."," Tops[j] <- max(Tree[[""density""]][Tree[[""DataPoints""]][[j]]])","object_name_linter" +"R/plotRule.R",41,13,"style","Variable and function name style should be snake_case or symbols."," NewTree[[""parent""]][which(Tree[[""parent""]] == bros[j])] <- newID[j]","object_name_linter" +"R/plotRule.R",48,15,"style","Variable and function name style should be snake_case or symbols."," NewTree[[""children""]][[newID[j]]] <- NA","object_name_linter" +"R/plotRule.R",62,13,"style","Variable and function name style should be snake_case or symbols."," NewTree[[""Xbase""]][s] <- sum(NewTree[[""silo""]][[s]]) / 2","object_name_linter" +"R/plotRule.R",66,13,"style","Variable and function name style should be snake_case or symbols."," NewTree[[""silo""]][[s]] <- siloF(NewTree[[""silo""]]","object_name_linter" +"R/print.clusterTree.R",5,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" +"R/print.diagram.R",5,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" +"R/print.maxPersistence.R",4,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" +"R/print.summary.diagram.R",11,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" +"R/print.summary.maxPersistence.R",9,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" +"R/ripsDiag.R",102,12,"style","Variable and function name style should be snake_case or symbols."," colnames(Diag) <- c(""dimension"", ""Birth"", ""Death"")","object_name_linter" +"R/ripsDiag.R",103,9,"style","Variable and function name style should be snake_case or symbols."," class(Diag) <- ""diagram""","object_name_linter" +"R/ripsDiag.R",104,14,"style","Variable and function name style should be snake_case or symbols."," attributes(Diag)[[""maxdimension""]] <- max(Diag[, 1])","object_name_linter" +"R/ripsDiag.R",105,14,"style","Variable and function name style should be snake_case or symbols."," attributes(Diag)[[""scale""]] <- c(0, maxscale)","object_name_linter" +"R/ripsDiag.R",106,14,"style","Variable and function name style should be snake_case or symbols."," attributes(Diag)[[""call""]] <- match.call()","object_name_linter" +"R/rMultinom.R",5,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" +"R/sphereUnif.R",18,7,"style","Variable and function name style should be snake_case or symbols."," X[i, ] <- stats::rnorm(d + 1)","object_name_linter" +"R/summary.diagram.R",10,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" +"R/summary.maxPersistence.R",14,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" +"R/wasserstein.R",40,5,"style","Variable and function name style should be snake_case or symbols."," wassersteinDistance[dimIdx] <- Wasserstein(Diag1Dim, Diag2Dim, p)","object_name_linter" +"vignettes/article.Rnw",222,1,"style","Variable and function name style should be snake_case or symbols.","X <- circleUnif(400)","object_name_linter" +"vignettes/article.Rnw",224,1,"style","Variable and function name style should be snake_case or symbols.","Xlim <- c(-1.6, 1.6); Ylim <- c(-1.7, 1.7); by <- 0.065","object_name_linter" +"vignettes/article.Rnw",224,21,"style","Compound semicolons are discouraged. Replace them by a newline.","Xlim <- c(-1.6, 1.6); Ylim <- c(-1.7, 1.7); by <- 0.065","semicolon_linter" +"vignettes/article.Rnw",224,24,"style","Variable and function name style should be snake_case or symbols.","Xlim <- c(-1.6, 1.6); Ylim <- c(-1.7, 1.7); by <- 0.065","object_name_linter" +"vignettes/article.Rnw",224,44,"style","Compound semicolons are discouraged. Replace them by a newline.","Xlim <- c(-1.6, 1.6); Ylim <- c(-1.7, 1.7); by <- 0.065","semicolon_linter" +"vignettes/article.Rnw",226,1,"style","Variable and function name style should be snake_case or symbols.","Xseq <- seq(Xlim[1], Xlim[2], by = by)","object_name_linter" +"vignettes/article.Rnw",227,1,"style","Variable and function name style should be snake_case or symbols.","Yseq <- seq(Ylim[1], Ylim[2], by = by)","object_name_linter" +"vignettes/article.Rnw",228,1,"style","Variable and function name style should be snake_case or symbols.","Grid <- expand.grid(Xseq, Yseq)","object_name_linter" +"vignettes/article.Rnw",265,1,"style","Variable and function name style should be snake_case or symbols.","DTM <- dtm(X = X, Grid = Grid, m0 = m0)","object_name_linter" +"vignettes/article.Rnw",276,1,"style","Variable and function name style should be snake_case or symbols.","kNN <- knnDE(X = X, Grid = Grid, k = k)","object_name_linter" +"vignettes/article.Rnw",287,1,"style","Variable and function name style should be snake_case or symbols.","KDE <- kde(X = X, Grid = Grid, h = h)","object_name_linter" +"vignettes/article.Rnw",298,1,"style","Variable and function name style should be snake_case or symbols.","Kdist <- kernelDist(X = X, Grid = Grid, h = h)","object_name_linter" +"vignettes/article.Rnw",394,1,"style","Variable and function name style should be snake_case or symbols.","posYgrid <- which(Grid[, 2] > 0)","object_name_linter" +"vignettes/article.Rnw",395,1,"style","Variable and function name style should be snake_case or symbols.","posYseq <- which(Yseq > 0)","object_name_linter" +"vignettes/article.Rnw",465,1,"style","Variable and function name style should be snake_case or symbols.","DiagGrid <- gridDiag(","object_name_linter" +"vignettes/article.Rnw",501,81,"style","Lines should not be more than 80 characters."," lines(DiagGrid[[""cycleLocation""]][[one[i]]][j, , ], pch = 19, cex = 1, col = i)","line_length_linter" +"vignettes/article.Rnw",556,1,"style","Variable and function name style should be snake_case or symbols.","Circle1 <- circleUnif(60)","object_name_linter" +"vignettes/article.Rnw",557,1,"style","Variable and function name style should be snake_case or symbols.","Circle2 <- circleUnif(60, r = 2) + 3","object_name_linter" +"vignettes/article.Rnw",558,1,"style","Variable and function name style should be snake_case or symbols.","Circles <- rbind(Circle1, Circle2)","object_name_linter" +"vignettes/article.Rnw",571,1,"style","Variable and function name style should be snake_case or symbols.","DiagRips <- ripsDiag(X = Circles, maxdimension, maxscale,","object_name_linter" +"vignettes/article.Rnw",584,25,"style","Put spaces around all infix operators.","par(mfrow = c(1, 3), mai=c(0.8, 0.8, 0.3, 0.3))","infix_spaces_linter" +"vignettes/article.Rnw",585,35,"style","Commas should always have a space after.","plot(Circles, pch = 16, xlab = """",ylab = """", main = ""Two Circles"")","commas_linter" +"vignettes/article.Rnw",592,81,"style","Lines should not be more than 80 characters."," lines(DiagRips[[""cycleLocation""]][[one[i]]][j, , ], pch = 19, cex = 1, col = i)","line_length_linter" +"vignettes/article.Rnw",617,1,"style","Variable and function name style should be snake_case or symbols.","X <- circleUnif(n = 30)","object_name_linter" +"vignettes/article.Rnw",624,1,"style","Variable and function name style should be snake_case or symbols.","DiagAlphaCmplx <- alphaComplexDiag(","object_name_linter" +"vignettes/article.Rnw",646,1,"style","Use spaces to indent, not tabs."," cex = 1, col = i + 1)","no_tab_linter" +"vignettes/article.Rnw",668,1,"style","Variable and function name style should be snake_case or symbols.","X <- cbind(circleUnif(n = n), runif(n = n, min = -0.1, max = 0.1))","object_name_linter" +"vignettes/article.Rnw",674,1,"style","Variable and function name style should be snake_case or symbols.","DiagAlphaShape <- alphaShapeDiag(","object_name_linter" +"vignettes/article.Rnw",716,1,"style","Variable and function name style should be snake_case or symbols.","X <- circleUnif(n = 100)","object_name_linter" +"vignettes/article.Rnw",724,1,"style","Variable and function name style should be snake_case or symbols.","FltRips <- ripsFiltration(X = X, maxdimension = maxdimension,","object_name_linter" +"vignettes/article.Rnw",726,1,"style","Use spaces to indent, not tabs."," printProgress = TRUE)","no_tab_linter" +"vignettes/article.Rnw",735,1,"style","Variable and function name style should be snake_case or symbols.","dtmValues <- dtm(X = X, Grid = X, m0 = m0)","object_name_linter" +"vignettes/article.Rnw",736,1,"style","Variable and function name style should be snake_case or symbols.","FltFun <- funFiltration(FUNvalues = dtmValues, cmplx = FltRips[[""cmplx""]])","object_name_linter" +"vignettes/article.Rnw",742,1,"style","Variable and function name style should be snake_case or symbols.","DiagFltFun <- filtrationDiag(filtration = FltFun, maxdimension = maxdimension,","object_name_linter" +"vignettes/article.Rnw",752,25,"style","Put spaces around all infix operators.","par(mfrow = c(1, 2), mai=c(0.8, 0.8, 0.3, 0.3))","infix_spaces_linter" +"vignettes/article.Rnw",753,29,"style","Commas should always have a space after.","plot(X, pch = 16, xlab = """",ylab = """")","commas_linter" +"vignettes/article.Rnw",775,1,"style","Variable and function name style should be snake_case or symbols.","Diag1 <- ripsDiag(Circle1, maxdimension = 1, maxscale = 5)","object_name_linter" +"vignettes/article.Rnw",776,1,"style","Variable and function name style should be snake_case or symbols.","Diag2 <- ripsDiag(Circle2, maxdimension = 1, maxscale = 5)","object_name_linter" +"vignettes/article.Rnw",854,1,"style","Variable and function name style should be snake_case or symbols.","PlotTriangles <- function(left, right) {","object_name_linter" +"vignettes/article.Rnw",856,3,"style","Variable and function name style should be snake_case or symbols."," X <- (left + right) / 2","object_name_linter" +"vignettes/article.Rnw",857,3,"style","Variable and function name style should be snake_case or symbols."," Y <- (right - left) / 2","object_name_linter" +"vignettes/article.Rnw",865,1,"style","Use spaces to indent, not tabs."," mtext(""(Birth + Death) / 2"", side = 1, line = 2.5, cex = 1)","no_tab_linter" +"vignettes/article.Rnw",866,1,"style","Use spaces to indent, not tabs."," mtext(""(Death - Birth) / 2"", side = 2, line = 2.5, cex = 1)","no_tab_linter" +"vignettes/article.Rnw",867,1,"style","Use spaces to indent, not tabs."," #polygon(c(0, 0, ylimit[2]), c(0, ylimit[2], ylimit[2]),","no_tab_linter" +"vignettes/article.Rnw",874,3,"style","Variable and function name style should be snake_case or symbols."," B <- max(X + Y)","object_name_linter" +"vignettes/article.Rnw",876,3,"warning","local variable β€˜maxfun’ assigned but may not be used"," maxfun <- rep(0, length(grid))","object_usage_linter" +"vignettes/article.Rnw",878,6,"style","Place a space before left parenthesis, except in a function call."," for(i in seq_len(n)) {","spaces_left_parentheses_linter" +"vignettes/article.Rnw",881,3,"warning","local variable β€˜land’ assigned but may not be used"," land <- apply(tmp, 2, max)","object_usage_linter" +"vignettes/article.Rnw",882,4,"style","Commented code should be removed."," #lines(grid, land, lwd = 2, col = 4)","commented_code_linter" +"vignettes/article.Rnw",883,1,"style","Use spaces to indent, not tabs."," points(X, Y, type = ""p"", cex = 1, pch = 19, col = ""pink"")","no_tab_linter" +"vignettes/article.Rnw",892,27,"style","Trailing whitespace is superfluous.","PlotTriangles(left, right) ","trailing_whitespace_linter" +"vignettes/article.Rnw",894,1,"style","Variable and function name style should be snake_case or symbols.","Diag1 <- cbind(rep(0, length(left)), left, right)","object_name_linter" +"vignettes/article.Rnw",896,1,"style","Variable and function name style should be snake_case or symbols.","Land1 <- landscape(Diag1, dimension = 0, KK = 1, tseq)","object_name_linter" +"vignettes/article.Rnw",897,1,"style","Variable and function name style should be snake_case or symbols.","Sil1 <- silhouette(Diag1, p = 1, dimension = 0, tseq)","object_name_linter" +"vignettes/article.Rnw",899,1,"style","Variable and function name style should be snake_case or symbols.","X <- (left + right) / 2","object_name_linter" +"vignettes/article.Rnw",900,1,"style","Variable and function name style should be snake_case or symbols.","Y <- (right - left) / 2","object_name_linter" +"vignettes/article.Rnw",939,1,"style","Variable and function name style should be snake_case or symbols.","Land <- landscape(DiagRips[[""diagram""]], dimension = 1, KK = 1, tseq)","object_name_linter" +"vignettes/article.Rnw",940,1,"style","Variable and function name style should be snake_case or symbols.","Sil <- silhouette(DiagRips[[""diagram""]], p = 1, dimension = 1, tseq)","object_name_linter" +"vignettes/article.Rnw",975,1,"style","Variable and function name style should be snake_case or symbols.","N <- 4000","object_name_linter" +"vignettes/article.Rnw",976,1,"style","Variable and function name style should be snake_case or symbols.","XX1 <- circleUnif(N / 2)","object_name_linter" +"vignettes/article.Rnw",977,1,"style","Variable and function name style should be snake_case or symbols.","XX2 <- circleUnif(N / 2, r = 2) + 3","object_name_linter" +"vignettes/article.Rnw",978,1,"style","Variable and function name style should be snake_case or symbols.","X <- rbind(XX1, XX2)","object_name_linter" +"vignettes/article.Rnw",990,1,"style","Variable and function name style should be snake_case or symbols.","Diags <- list()","object_name_linter" +"vignettes/article.Rnw",992,1,"style","Variable and function name style should be snake_case or symbols.","Lands <- matrix(0, nrow = n, ncol = length(tseq))","object_name_linter" +"vignettes/article.Rnw",1000,3,"style","Variable and function name style should be snake_case or symbols."," subX <- X[sample(seq_len(N), m), ]","object_name_linter" +"vignettes/article.Rnw",1001,3,"style","Variable and function name style should be snake_case or symbols."," Diags[[i]] <- ripsDiag(subX, maxdimension = 1, maxscale = 5)","object_name_linter" +"vignettes/article.Rnw",1002,3,"style","Variable and function name style should be snake_case or symbols."," Lands[i, ] <- landscape(Diags[[i]][[""diagram""]], dimension = 1,","object_name_linter" +"vignettes/article.Rnw",1010,1,"style","Variable and function name style should be snake_case or symbols.","bootLand <- multipBootstrap(Lands, B = 100, alpha = 0.05,","object_name_linter" +"vignettes/article.Rnw",1080,1,"style","Variable and function name style should be snake_case or symbols.","XX1 <- circleUnif(600)","object_name_linter" +"vignettes/article.Rnw",1081,1,"style","Variable and function name style should be snake_case or symbols.","XX2 <- circleUnif(1000, r = 1.5) + 2.5","object_name_linter" +"vignettes/article.Rnw",1083,1,"style","Variable and function name style should be snake_case or symbols.","X <- rbind(XX1, XX2, noise)","object_name_linter" +"vignettes/article.Rnw",1086,1,"style","Variable and function name style should be snake_case or symbols.","Xlim <- c(-2, 5)","object_name_linter" +"vignettes/article.Rnw",1087,1,"style","Variable and function name style should be snake_case or symbols.","Ylim <- c(-2, 5)","object_name_linter" +"vignettes/article.Rnw",1094,1,"style","Variable and function name style should be snake_case or symbols.","parametersKDE <- seq(0.1, 0.6, by = 0.05)","object_name_linter" +"vignettes/article.Rnw",1096,1,"style","Variable and function name style should be snake_case or symbols.","B <- 50 # number of bootstrap iterations. Should be large.","object_name_linter" +"vignettes/article.Rnw",1103,1,"style","Variable and function name style should be snake_case or symbols.","maxKDE <- maxPersistence(kde, parametersKDE, X,","object_name_linter" +"vignettes/article.Rnw",1149,1,"style","Variable and function name style should be snake_case or symbols.","X1 <- cbind(rnorm(300, 1, .8), rnorm(300, 5, 0.8))","object_name_linter" +"vignettes/article.Rnw",1150,1,"style","Variable and function name style should be snake_case or symbols.","X2 <- cbind(rnorm(300, 3.5, .8), rnorm(300, 5, 0.8))","object_name_linter" +"vignettes/article.Rnw",1151,1,"style","Variable and function name style should be snake_case or symbols.","X3 <- cbind(rnorm(300, 6, 1), rnorm(300, 1, 1))","object_name_linter" +"vignettes/article.Rnw",1152,1,"style","Variable and function name style should be snake_case or symbols.","XX <- rbind(X1, X2, X3)","object_name_linter" +"vignettes/article.Rnw",1158,1,"style","Variable and function name style should be snake_case or symbols.","Tree <- clusterTree(XX, k = 100, density = ""knn"",","object_name_linter" +"vignettes/article.Rnw",1160,1,"style","Variable and function name style should be snake_case or symbols.","TreeKDE <- clusterTree(XX, k = 100, h = 0.3, density = ""kde"",","object_name_linter" +"vignettes/article.Rnw",1183,17,"style","Commas should always have a space after.","par(mfrow = c(2,3))","commas_linter" +"vignettes/article.Rnw",1184,18,"style","Commas should always have a space after.","par(mai = c(0.25,0.35,0.3,0.3))","commas_linter" +"vignettes/article.Rnw",1184,23,"style","Commas should always have a space after.","par(mai = c(0.25,0.35,0.3,0.3))","commas_linter" +"vignettes/article.Rnw",1184,27,"style","Commas should always have a space after.","par(mai = c(0.25,0.35,0.3,0.3))","commas_linter" +"vignettes/article.Rnw",1195,1,"style","Use spaces to indent, not tabs."," points(matrix(XX[Tree[[""DataPoints""]][[i]], ], ncol = 2), col = i,","no_tab_linter" diff --git a/.dev/revdep_emails/TDA/email-body b/.dev/revdep_emails/TDA/email-body new file mode 100644 index 000000000..4f8d2f067 --- /dev/null +++ b/.dev/revdep_emails/TDA/email-body @@ -0,0 +1,29 @@ +Hello Jisu Kim! Thank you for using {lintr} in your package {TDA}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cran/TDA (hash: 0fe703f3def3e7a7d09678e9897ed4ed40a9df42) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 28s on CRAN vs. 20s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/WikidataQueryServiceR/attachments/WikidataQueryServiceR.warnings b/.dev/revdep_emails/WikidataQueryServiceR/attachments/WikidataQueryServiceR.warnings new file mode 100644 index 000000000..2bb977138 --- /dev/null +++ b/.dev/revdep_emails/WikidataQueryServiceR/attachments/WikidataQueryServiceR.warnings @@ -0,0 +1,2 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Trying to remove β€˜closed_curly_linter’, β€˜open_curly_linter’ and β€˜camel_case_linter’, which are not in `defaults`. diff --git a/.dev/revdep_emails/WikidataQueryServiceR/email-body b/.dev/revdep_emails/WikidataQueryServiceR/email-body new file mode 100644 index 000000000..61aa33d57 --- /dev/null +++ b/.dev/revdep_emails/WikidataQueryServiceR/email-body @@ -0,0 +1,29 @@ +Hello Mikhail Popov! Thank you for using {lintr} in your package {WikidataQueryServiceR}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/bearloga/WikidataQueryServiceR (hash: accff89a06ad4ac4af1bef369f589175c92837b6) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 2s on CRAN vs. 1s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/WoodburyMatrix/attachments/WoodburyMatrix.warnings b/.dev/revdep_emails/WoodburyMatrix/attachments/WoodburyMatrix.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/WoodburyMatrix/attachments/WoodburyMatrix.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/WoodburyMatrix/email-body b/.dev/revdep_emails/WoodburyMatrix/email-body new file mode 100644 index 000000000..a9465b7f5 --- /dev/null +++ b/.dev/revdep_emails/WoodburyMatrix/email-body @@ -0,0 +1,29 @@ +Hello Michael Bertolacci! Thank you for using {lintr} in your package {WoodburyMatrix}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/mbertolacci/WoodburyMatrix (hash: 5861c0e95a645ec90848bcc2f1f651ea96cbecb8) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 5s on CRAN vs. 3s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/abbyyR/email-body b/.dev/revdep_emails/abbyyR/email-body new file mode 100644 index 000000000..3520096fb --- /dev/null +++ b/.dev/revdep_emails/abbyyR/email-body @@ -0,0 +1,29 @@ +Hello Gaurav Sood! Thank you for using {lintr} in your package {abbyyR}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at http://github.com/soodoku/abbyyR (hash: 98442a0ba1aee5146ac1a47722cf8559ffd18043) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 0s on CRAN vs. 0s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/adaptalint/email-body b/.dev/revdep_emails/adaptalint/email-body new file mode 100644 index 000000000..060933463 --- /dev/null +++ b/.dev/revdep_emails/adaptalint/email-body @@ -0,0 +1,29 @@ +Hello Max Conway! Thank you for using {lintr} in your package {adaptalint}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cran/adaptalint (hash: b8c854f8722d3f5ad1f7b3e57d628e428b688c01) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 4s on CRAN vs. 2s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/admiral/attachments/admiral.warnings b/.dev/revdep_emails/admiral/attachments/admiral.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/admiral/attachments/admiral.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/admiral/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/admiral/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..4cf6085f8 --- /dev/null +++ b/.dev/revdep_emails/admiral/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,37 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/templates/ad_adpp.R",69,6,"style","Use TRUE instead of the symbol T."," T ~ NA_real_","T_and_F_symbol_linter" +"R/assertions.R",404,17,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!provided & !optional) {","vector_logic_linter" +"R/assertions.R",409,16,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (provided & !(quo_is_call(arg) | is_logical(quo_get_expr(arg)))) {","vector_logic_linter" +"R/assertions.R",409,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (provided & !(quo_is_call(arg) | is_logical(quo_get_expr(arg)))) {","vector_logic_linter" +"R/assertions.R",1088,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!accept_var & (!is_quosures(arg) || !is_named(arg))) {","vector_logic_linter" +"R/assertions.R",1102,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (accept_var & (!contains_vars(arg))) {","vector_logic_linter" +"R/create_query_data.R",853,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!""TERM_NAME"" %in% vars & !""TERM_ID"" %in% vars) {","vector_logic_linter" +"R/create_single_dose_dataset.R",367,17,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (time_flag &","vector_logic_linter" +"R/create_single_dose_dataset.R",368,46,"warning","Conditional expressions require scalar logical operators (&& and ||)"," (is.Date(eval_tidy(start_date, dataset)) | is.Date(eval_tidy(end_date, dataset)))) {","vector_logic_linter" +"R/dataset_vignette.R",81,21,"style","Use TRUE instead of the symbol T."," scroller = T,","T_and_F_symbol_linter" +"R/derive_date_vars.R",204,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (date_imputation == ""MID"" & preserve) {","vector_logic_linter" +"R/derive_date_vars.R",210,41,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (date_imputation == ""MID"" & !preserve) {","vector_logic_linter" +"R/derive_date_vars.R",216,41,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (date_imputation != ""MID"" & preserve) {","vector_logic_linter" +"R/derive_date_vars.R",224,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (date_imputation == ""LAST"" & !preserve) {","vector_logic_linter" +"R/derive_date_vars.R",234,42,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (date_imputation == ""LAST"" & preserve) {","vector_logic_linter" +"R/derive_date_vars.R",248,36,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (date_imputation == ""FIRST"" & preserve) {","vector_logic_linter" +"R/derive_date_vars.R",301,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(min_dates) | !is.null(max_dates)) {","vector_logic_linter" +"R/derive_param_tte.R",273,39,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(set_values_to$PARAMCD) & !is.null(dataset)) {","vector_logic_linter" +"R/derive_param_tte.R",319,62,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (start_date_imputation_flag %in% colnames(dataset_adsl) &","vector_logic_linter" +"R/derive_param_tte.R",328,62,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (start_time_imputation_flag %in% colnames(dataset_adsl) &","vector_logic_linter" +"R/derive_var_obs_number.R",91,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(by_vars) | !is.null(order)) {","vector_logic_linter" +"R/derive_vars_disposition_reason.R",186,64,"style","Use TRUE instead of the symbol T."," new_var_spe <- assert_symbol(enquo(new_var_spe), optional = T)","T_and_F_symbol_linter" +"R/derive_vars_disposition_reason.R",187,70,"style","Use TRUE instead of the symbol T."," reason_var_spe <- assert_symbol(enquo(reason_var_spe), optional = T)","T_and_F_symbol_linter" +"R/derive_vars_query.R",251,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (any(queries$QUERY_NAME == """") | any(is.na(queries$QUERY_NAME))) {","vector_logic_linter" +"R/derive_vars_query.R",291,62,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (any(is.na(queries$TERM_NAME) & is.na(queries$TERM_ID)) |","vector_logic_linter" +"vignettes/adsl.Rmd",245,27,"style","Variable and function name style should be snake_case or symbols.","format_eosstt <- function(DSDECOD) {","object_name_linter" +"vignettes/adsl.Rmd",318,101,"style","Lines should not be more than 100 characters."," if_else(dsdecod %notin% c(""COMPLETED"", ""SCREEN FAILURE"") & !is.na(dsdecod), dsdecod, NA_character_)","line_length_linter" +"vignettes/bds_exposure.Rmd",69,101,"style","Lines should not be more than 100 characters.","ex <- filter(ex, USUBJID %in% c(""01-701-1015"", ""01-701-1023"", ""01-703-1086"", ""01-703-1096"", ""01-707-1037"", ""01-716-1024""))","line_length_linter" +"vignettes/bds_finding.Rmd",74,101,"style","Lines should not be more than 100 characters.","vs <- filter(vs, USUBJID %in% c(""01-701-1015"", ""01-701-1023"", ""01-703-1086"", ""01-703-1096"", ""01-707-1037"", ""01-716-1024""))","line_length_linter" +"vignettes/bds_tte.Rmd",480,101,"style","Lines should not be more than 100 characters."," dataset_vignette(display_vars = vars(USUBJID, PARAMCD, STARTDT, ADT, CNSR, EVNTDESC, SRCDOM, SRCVAR))","line_length_linter" +"vignettes/occds.Rmd",438,101,"style","Lines should not be more than 100 characters."," ~VAR_PREFIX, ~QUERY_NAME, ~SDG_ID, ~QUERY_SCOPE, ~QUERY_SCOPE_NUM, ~TERM_LEVEL, ~TERM_NAME, ~TERM_ID,","line_length_linter" +"vignettes/occds.Rmd",439,101,"style","Lines should not be more than 100 characters."," ""SDG01"", ""Diuretics"", 11, ""BROAD"", 1, ""CMDECOD"", ""Diuretic 1"", NA,","line_length_linter" +"vignettes/occds.Rmd",440,101,"style","Lines should not be more than 100 characters."," ""SDG01"", ""Diuretics"", 11, ""BROAD"", 2, ""CMDECOD"", ""Diuretic 2"", NA,","line_length_linter" +"vignettes/occds.Rmd",441,101,"style","Lines should not be more than 100 characters."," ""SDG02"", ""Costicosteroids"", 12, ""BROAD"", 1, ""CMDECOD"", ""Costicosteroid 1"", NA,","line_length_linter" +"vignettes/occds.Rmd",442,101,"style","Lines should not be more than 100 characters."," ""SDG02"", ""Costicosteroids"", 12, ""BROAD"", 2, ""CMDECOD"", ""Costicosteroid 2"", NA,","line_length_linter" +"vignettes/occds.Rmd",443,101,"style","Lines should not be more than 100 characters."," ""SDG02"", ""Costicosteroids"", 12, ""BROAD"", 2, ""CMDECOD"", ""Costicosteroid 3"", NA,","line_length_linter" diff --git a/.dev/revdep_emails/admiral/email-body b/.dev/revdep_emails/admiral/email-body new file mode 100644 index 000000000..928055860 --- /dev/null +++ b/.dev/revdep_emails/admiral/email-body @@ -0,0 +1,29 @@ +Hello Thomas Neitmann! Thank you for using {lintr} in your package {admiral}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/pharmaverse/admiral (hash: 5e87df448a0b55d2dc73c43b487885a82f3911c6) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 223s on CRAN vs. 129s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/autoharp/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/autoharp/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..9ceb51895 --- /dev/null +++ b/.dev/revdep_emails/autoharp/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,11 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/check_correctness.R",78,28,"style","There should be a space between right parenthesis and an opening curly brace.","# if(length(test_list) > 0){","paren_brace_linter" +"R/check_correctness.R",115,33,"style","There should be a space between right parenthesis and an opening curly brace.","# } else if(!is.null(tt_parsed)){","paren_brace_linter" +"R/count_lints.R",44,5,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" +"R/lang_2_tree.R",99,29,"style","There should be a space between right parenthesis and an opening curly brace."," # if(is.null(call_name1)){","paren_brace_linter" +"R/populate_soln_env.R",141,47,"style","There should be a space between right parenthesis and an opening curly brace."," # if("".scalars_to_keep"" %in% names(e_soln)){","paren_brace_linter" +"R/utils.R",201,37,"style","There should be a space between right parenthesis and an opening curly brace."," #else if (length(kept_chunks) == 1){","paren_brace_linter" +"R/zzz.R",3,1,"style","Variable and function name style should be snake_case.",".onLoad <- function(libname, pkgname) {","object_name_linter" +"R/zzz.R",9,1,"style","Variable and function name style should be snake_case.",".onUnload <- function(libpath) {","object_name_linter" +"R/zzz.R",15,1,"style","Variable and function name style should be snake_case.",".onDetach <- function(libpath) {","object_name_linter" +"tests/testthat/test-02-th_constructors.R",22,43,"style","Place a space before left parenthesis, except in a function call.","slot_dollar_mix <- quote(y <- l$ll$mmm@the(x = 3))","spaces_left_parentheses_linter" diff --git a/.dev/revdep_emails/autoharp/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/autoharp/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..d12bb09b8 --- /dev/null +++ b/.dev/revdep_emails/autoharp/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,54 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/examples/question_sheets/sample_questions_01.Rmd",19,3,"style","Variable and function name style should be snake_case or symbols."," U <- runif(n)","object_name_linter" +"inst/examples/question_sheets/sample_questions_01.Rmd",20,3,"style","Variable and function name style should be snake_case or symbols."," X <- U^(1/4)","object_name_linter" +"inst/examples/question_sheets/sample_questions_01.Rmd",20,12,"style","Put spaces around all infix operators."," X <- U^(1/4)","infix_spaces_linter" +"inst/examples/soln_templates/soln_template_01.Rmd",12,3,"style","Variable and function name style should be snake_case or symbols."," U <- runif(n)","object_name_linter" +"inst/examples/soln_templates/soln_template_01.Rmd",13,3,"style","Variable and function name style should be snake_case or symbols."," X <- U^(1/4)","object_name_linter" +"inst/examples/soln_templates/soln_template_01.Rmd",13,12,"style","Put spaces around all infix operators."," X <- U^(1/4)","infix_spaces_linter" +"inst/examples/soln_templates/soln_template_01.Rmd",16,1,"style","Variable and function name style should be snake_case or symbols.","X <- rf(1e4)","object_name_linter" +"inst/examples/soln_templates/soln_template_01.Rmd",20,1,"style","Variable and function name style should be snake_case or symbols.","lenX <- (length(X) == length(.X))","object_name_linter" +"inst/examples/soln_templates/soln_template_01.Rmd",26,1,"style","Variable and function name style should be snake_case or symbols.","sd.X <- sd(X)","object_name_linter" +"inst/examples/soln_templates/soln_template_01.Rmd",31,69,"style","Put spaces around all infix operators.","for_loop <- fapply(f1, detect_for_in_fn_def, fn_name = ""rf"", combine=TRUE, ","infix_spaces_linter" +"inst/examples/soln_templates/soln_template_01.Rmd",31,75,"style","Trailing whitespace is superfluous.","for_loop <- fapply(f1, detect_for_in_fn_def, fn_name = ""rf"", combine=TRUE, ","trailing_whitespace_linter" +"inst/examples/soln_templates/soln_template_02.Rmd",11,1,"style","Variable and function name style should be snake_case or symbols.","X <- c(1L, 3L, 5L, 7L, 9L, 11L)","object_name_linter" +"inst/examples/soln_templates/soln_template_02.Rmd",12,1,"style","Variable and function name style should be snake_case or symbols.","mean_X <- mean(X)","object_name_linter" +"inst/examples/soln_templates/soln_template_02.Rmd",16,1,"style","Variable and function name style should be snake_case or symbols.","last.X <- X[length(X)]","object_name_linter" +"R/check_correctness.R",15,31,"style","Any function spanning multiple lines should use curly braces."," function(x) paste0(as.character(x$srcref),","brace_linter" +"R/check_correctness.R",71,3,"warning","local variable β€˜copy_out’ assigned but may not be used"," copy_out <- sapply(obj_to_copy,","object_usage_linter" +"R/check_runtime.R",20,64,"style","Put spaces around all infix operators.","check_runtime <- function(stud_fname, knit_root_dir, return_env=FALSE) {","infix_spaces_linter" +"R/examplify_to_r.R",21,56,"style","Put spaces around all infix operators.","examplify_to_r <- function(in_fname, out_fname, verbose=FALSE) {","infix_spaces_linter" +"R/forestharp_helpers.R",236,37,"style","Put spaces around all infix operators.","detect_growing <- function(th, count=FALSE, within_for=FALSE) {","infix_spaces_linter" +"R/forestharp_helpers.R",236,55,"style","Put spaces around all infix operators.","detect_growing <- function(th, count=FALSE, within_for=FALSE) {","infix_spaces_linter" +"R/forestharp.R",53,32,"style","Any function spanning multiple lines should use curly braces."," all_trees <- lapply(all_exp, function(x)","brace_linter" +"R/forestharp.R",64,24,"style","Any function spanning multiple lines should use curly braces."," lint_out <- Filter(function(x)","brace_linter" +"R/forestharp.R",67,24,"style","Any function spanning multiple lines should use curly braces."," lint_out <- Filter(function(x)","brace_linter" +"R/generate_thumbnails.R",24,42,"style","Put spaces around all infix operators."," anonymise=FALSE) {","infix_spaces_linter" +"R/lang_2_tree_helpers.R",107,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" +"R/lum_local_match.R",25,3,"style","Either both or neither branch in `if`/`else` should use curly braces."," else{","brace_linter" +"R/lum_local_match.R",25,7,"style","There should be a space before an opening curly brace."," else{","brace_linter" +"R/nlp_related.R",15,54,"style","Put spaces around all infix operators.","rmd_to_token_count <- function(fname, include_actuals=TRUE) {","infix_spaces_linter" +"R/populate_soln_env.R",104,42,"style","Put spaces around all infix operators."," render_only=FALSE, output=NULL) {","infix_spaces_linter" +"R/populate_soln_env.R",104,56,"style","Put spaces around all infix operators."," render_only=FALSE, output=NULL) {","infix_spaces_linter" +"R/render_one.R",31,69,"style","Put spaces around all infix operators."," max_time_per_run = 120, permission_to_install=FALSE) {","infix_spaces_linter" +"R/render_one.R",135,7,"style","`else` should come on the same line as the previous `}`."," else","brace_linter" +"R/reset_path.R",39,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" +"R/to_BFS.R",30,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/tree_kernel.R",20,34,"style","Put spaces around all infix operators.","tree_sim <- function(t1, t2, norm=FALSE, ...) {","infix_spaces_linter" +"R/tree_kernel.R",396,48,"style","Put spaces around all infix operators.","jaccard_treeharp <- function(th1, th2, weighted=FALSE) {","infix_spaces_linter" +"R/tree_routines.R",77,51,"style","Put spaces around all infix operators.","subtree_at <- function(obj, at_node, preserve_call=FALSE) {","infix_spaces_linter" +"R/tree_routines.R",99,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/tree_routines.R",211,40,"style","Put spaces around all infix operators.","is_connected <- function(adj_list, root=1) {","infix_spaces_linter" +"R/tree_routines.R",255,53,"style","Put spaces around all infix operators.","is_cyclic_r <- function(adj_mat, node_v, parent_node=-1, visited_env) {","infix_spaces_linter" +"R/tree_routines.R",265,10,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/tree_routines.R",470,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/utils.R",64,40,"style","Put spaces around all infix operators.","clean_dir <- function(dir_name, verbose=FALSE) {","infix_spaces_linter" +"R/utils.R",199,3,"style","Either both or neither branch in `if`/`else` should use curly braces."," else {","brace_linter" +"R/write_html.R",2,46,"style","Only use double-quotes."," as.character(shiny::tags$style(shiny::HTML('","single_quotes_linter" +"tests/testthat/example_01.R",2,11,"style","Missing terminal newline.","y <- 11:20","trailing_blank_lines_linter" +"tests/testthat/example_04.R",2,11,"style","Missing terminal newline.","y <- 11:19","trailing_blank_lines_linter" +"tests/testthat/soln_template_02.Rmd",7,1,"style","Variable and function name style should be snake_case or symbols.","X <- 1:10","object_name_linter" +"tests/testthat/soln_template_02.Rmd",8,1,"style","Variable and function name style should be snake_case or symbols.","Y <- LETTERS[1:5]","object_name_linter" +"tests/testthat/soln_template_02.Rmd",9,1,"style","Variable and function name style should be snake_case or symbols.","Z <- 10:15","object_name_linter" +"tests/testthat/soln_template_02.Rmd",14,1,"style","Variable and function name style should be snake_case or symbols.","Xmean <- mean(X)","object_name_linter" +"tests/testthat/soln_template_02.Rmd",15,1,"style","Variable and function name style should be snake_case or symbols.","Zmean <- mean(Z)","object_name_linter" +"tests/testthat/soln_template_02.Rmd",19,1,"style","Variable and function name style should be snake_case or symbols.","Y1 <- Y[3] # Note that it is character here.","object_name_linter" diff --git a/.dev/revdep_emails/autoharp/email-body b/.dev/revdep_emails/autoharp/email-body new file mode 100644 index 000000000..7783cf87e --- /dev/null +++ b/.dev/revdep_emails/autoharp/email-body @@ -0,0 +1,29 @@ +Hello Vik Gopal! Thank you for using {lintr} in your package {autoharp}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cran/autoharp (hash: d2efbb0a76285ba95ed6950a61e05f1398b5e656) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 47s on CRAN vs. 29s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/aws.alexa/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/aws.alexa/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..8c9905db0 --- /dev/null +++ b/.dev/revdep_emails/aws.alexa/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,23 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/doc/overview.Rmd",22,3,"style","Commented code should be removed.","# install.packages(""devtools"")","commented_code_linter" +"inst/doc/overview.Rmd",31,19,"style","Put spaces around all infix operators.","set_secret_key(key=""key"", secret=""secret"")","infix_spaces_linter" +"inst/doc/overview.Rmd",31,33,"style","Put spaces around all infix operators.","set_secret_key(key=""key"", secret=""secret"")","infix_spaces_linter" +"inst/doc/overview.Rmd",39,23,"warning","1:nrow(...) is likely to be wrong in the empty edge case. Use seq_len() instead.","dimnames(res) <- list(1:nrow(res), c(""url"", ""attribute"", ""title"", ""description"", ""online_since""))","seq_linter" +"inst/doc/overview.Rmd",39,81,"style","Lines should not be more than 80 characters.","dimnames(res) <- list(1:nrow(res), c(""url"", ""attribute"", ""title"", ""description"", ""online_since""))","line_length_linter" +"inst/doc/overview.Rmd",71,23,"style","Put spaces around all infix operators.","browse_categories(path=""Top/Arts"")","infix_spaces_linter" +"inst/doc/overview.Rmd",77,34,"style","Put spaces around all infix operators.","cat_list <- category_listing(path=""Top/Arts"")","infix_spaces_linter" +"inst/doc/overview.Rmd",102,26,"style","Put spaces around all infix operators.","res_links <- in_links(url=""google.com"")","infix_spaces_linter" +"R/aws.alexa.package.R",50,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (identical(key, """") | identical(secret, """")) {","vector_logic_linter" +"R/category_listing.R",53,13,"style","Any function spanning multiple lines should use curly braces."," function(x)","brace_linter" +"R/set_secret_key.R",26,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(key) & !is.null(secret)) {","vector_logic_linter" +"R/traffic_history.R",24,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.numeric(range) | (range < 1 | range > 31)) {","vector_logic_linter" +"R/traffic_history.R",24,41,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.numeric(range) | (range < 1 | range > 31)) {","vector_logic_linter" +"R/traffic_history.R",40,17,"style","Any function spanning multiple lines should use curly braces."," function(x)","brace_linter" +"vignettes/overview.Rmd",22,3,"style","Commented code should be removed.","# install.packages(""devtools"")","commented_code_linter" +"vignettes/overview.Rmd",31,19,"style","Put spaces around all infix operators.","set_secret_key(key=""key"", secret=""secret"")","infix_spaces_linter" +"vignettes/overview.Rmd",31,33,"style","Put spaces around all infix operators.","set_secret_key(key=""key"", secret=""secret"")","infix_spaces_linter" +"vignettes/overview.Rmd",39,23,"warning","1:nrow(...) is likely to be wrong in the empty edge case. Use seq_len() instead.","dimnames(res) <- list(1:nrow(res), c(""url"", ""attribute"", ""title"", ""description"", ""online_since""))","seq_linter" +"vignettes/overview.Rmd",39,81,"style","Lines should not be more than 80 characters.","dimnames(res) <- list(1:nrow(res), c(""url"", ""attribute"", ""title"", ""description"", ""online_since""))","line_length_linter" +"vignettes/overview.Rmd",71,23,"style","Put spaces around all infix operators.","browse_categories(path=""Top/Arts"")","infix_spaces_linter" +"vignettes/overview.Rmd",77,34,"style","Put spaces around all infix operators.","cat_list <- category_listing(path=""Top/Arts"")","infix_spaces_linter" +"vignettes/overview.Rmd",102,26,"style","Put spaces around all infix operators.","res_links <- in_links(url=""google.com"")","infix_spaces_linter" diff --git a/.dev/revdep_emails/aws.alexa/email-body b/.dev/revdep_emails/aws.alexa/email-body new file mode 100644 index 000000000..fa8936b2a --- /dev/null +++ b/.dev/revdep_emails/aws.alexa/email-body @@ -0,0 +1,29 @@ +Hello Gaurav Sood! Thank you for using {lintr} in your package {aws.alexa}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cran/aws.alexa (hash: 44f796039e5a1737697c95a900fda9d9f916e0bb) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 5s on CRAN vs. 3s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/babette/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/babette/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..1e3a63aa0 --- /dev/null +++ b/.dev/revdep_emails/babette/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,5 @@ +"filename","line_number","column_number","type","message","line","linter" +"vignettes/nested_sampling.Rmd",122,4,"style","Trailing whitespace is superfluous."," ) ","trailing_whitespace_linter" +"vignettes/step_by_step.Rmd",51,45,"style","Trailing whitespace is superfluous."," pattern = ""treelog_"", fileext = "".trees"" ","trailing_whitespace_linter" +"vignettes/step_by_step.Rmd",145,81,"style","Lines should not be more than 80 characters."," knitr::kable(head(parse_beast_tracelog_file(inference_model$mcmc$tracelog$filename)))","line_length_linter" +"vignettes/step_by_step.Rmd",161,81,"style","Lines should not be more than 80 characters."," knitr::kable(head(parse_beast_state_operators(beast2_options$output_state_filename)))","line_length_linter" diff --git a/.dev/revdep_emails/babette/email-body b/.dev/revdep_emails/babette/email-body new file mode 100644 index 000000000..e5ed14bda --- /dev/null +++ b/.dev/revdep_emails/babette/email-body @@ -0,0 +1,29 @@ +Hello RichΓ¨l J.C. Bilderbeek! Thank you for using {lintr} in your package {babette}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/ropensci/babette (hash: 0b37951b00675982d1d7b2101e400b3c7fef3068) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 23s on CRAN vs. 15s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/beautier/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/beautier/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..f632afb05 --- /dev/null +++ b/.dev/revdep_emails/beautier/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,3 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/create_branch_rate_model_xml.R",106,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/remove_empty_lines.R",13,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" diff --git a/.dev/revdep_emails/beautier/email-body b/.dev/revdep_emails/beautier/email-body new file mode 100644 index 000000000..b8438b9db --- /dev/null +++ b/.dev/revdep_emails/beautier/email-body @@ -0,0 +1,29 @@ +Hello RichΓ¨l J.C. Bilderbeek! Thank you for using {lintr} in your package {beautier}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/ropensci/beautier (hash: 7f4ee9a8f3692afafd3ba5f7d01e9605f33603a6) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 280s on CRAN vs. 156s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/biolink/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/biolink/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..6fced2c44 --- /dev/null +++ b/.dev/revdep_emails/biolink/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,3 @@ +"filename","line_number","column_number","type","message","line","linter" +"tests/testthat/test-tags-go.r",13,1,"style","Trailing semicolons are not needed.",";})","semicolon_linter" +"tests/testthat/test-tags-go.r",27,1,"style","Trailing semicolons are not needed.",";})","semicolon_linter" diff --git a/.dev/revdep_emails/biolink/email-body b/.dev/revdep_emails/biolink/email-body new file mode 100644 index 000000000..5bf0325e7 --- /dev/null +++ b/.dev/revdep_emails/biolink/email-body @@ -0,0 +1,29 @@ +Hello Aaron Wolen! Thank you for using {lintr} in your package {biolink}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cran/biolink (hash: 579383b93d11368dbdb5dddb043f7d04f8c6f242) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 10s on CRAN vs. 6s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/caretEnsemble/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/caretEnsemble/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..b96c5293a --- /dev/null +++ b/.dev/revdep_emails/caretEnsemble/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,8 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/caretEnsemble.R",235,12,"style","Variable and function name style should be snake_case."," object$modelType <- extractModelTypes(object$models)[1]","object_name_linter" +"R/caretEnsemble.R",355,7,"style","Variable and function name style should be snake_case."," dat$metricSD <- dat[[paste0(metricLab, ""SD"")]]","object_name_linter" +"R/caretList.R",95,7,"style","Variable and function name style should be snake_case."," x$savePredictions <- ""final""","object_name_linter" +"R/caretList.R",100,7,"style","Variable and function name style should be snake_case."," x$savePredictions <- ""final""","object_name_linter" +"tests/testthat/test-caretList.R",143,15,"style","Variable and function name style should be snake_case."," models[[1]]$modelType <- ""Bogus""","object_name_linter" +"tests/testthat/test-caretList.R",202,3,"style","There should be a space between right parenthesis and an opening curly brace."," ){","paren_brace_linter" +"tests/testthat/test-caretList.R",252,3,"style","There should be a space between right parenthesis and an opening curly brace."," ){","paren_brace_linter" diff --git a/.dev/revdep_emails/caretEnsemble/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/caretEnsemble/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..aa0425e79 --- /dev/null +++ b/.dev/revdep_emails/caretEnsemble/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,114 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/caretEnsemble.R",93,9,"style","Variable and function name style should be snake_case or symbols."," names(modRes)[2:3] <- c(metric, paste0(metric, ""SD""))","object_name_linter" +"R/caretEnsemble.R",307,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/caretEnsemble.R",325,5,"style","Variable and function name style should be snake_case or symbols."," datList[[i]] <- model$models[[i]]$trainingData","object_name_linter" +"R/caretEnsemble.R",408,3,"style","Variable and function name style should be snake_case or symbols."," wghtFrame$method <- row.names(wghtFrame)","object_name_linter" +"R/caretEnsemble.R",409,9,"style","Variable and function name style should be snake_case or symbols."," names(wghtFrame) <- c(""weights"", ""method"")","object_name_linter" +"R/caretList.R",233,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/caretList.R",238,9,"style","Variable and function name style should be snake_case or symbols."," names(modelList) <- names(tuneList)","object_name_linter" +"R/caretList.R",245,9,"style","Variable and function name style should be snake_case or symbols."," class(modelList) <- c(""caretList"")","object_name_linter" +"R/caretList.R",344,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/caretList.R",349,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/caretStack.R",67,18,"style","Put spaces around all infix operators."," object, newdata=NULL,","infix_spaces_linter" +"R/caretStack.R",68,5,"style","Put spaces around all infix operators."," se=FALSE, level=0.95,","infix_spaces_linter" +"R/caretStack.R",68,18,"style","Put spaces around all infix operators."," se=FALSE, level=0.95,","infix_spaces_linter" +"R/caretStack.R",69,17,"style","Put spaces around all infix operators."," return_weights=FALSE,","infix_spaces_linter" +"R/caretStack.R",84,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/caretStack.R",87,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/caretStack.R",110,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/helper_functions.R",61,27,"style","Compound semicolons are discouraged. Replace them by a newline."," w <- w[i <- !is.na(x)]; x <- x[i]","semicolon_linter" +"tests/testthat/test-caretList.R",49,9,"style","Variable and function name style should be snake_case or symbols."," names(tuneList) <- all_models","object_name_linter" +"tests/testthat/test-caretList.R",50,9,"style","Variable and function name style should be snake_case or symbols."," names(tuneList)[c(1, 5, 10)] <- """"","object_name_linter" +"tests/testthat/test-caretList.R",155,9,"style","Variable and function name style should be snake_case or symbols."," class(modelList) <- ""list""","object_name_linter" +"tests/testthat/test-classSelection.R",109,15,"style","Any function spanning multiple lines should use curly braces."," refactor <- function(d) factor(","brace_linter" +"tests/testthat/test-ensemble.R",141,9,"style","Variable and function name style should be snake_case or symbols."," class(nestedList) <- ""caretList""","object_name_linter" +"tests/testthat/test-ensemble.R",149,3,"style","Variable and function name style should be snake_case or symbols."," X_reg_new[2, 3] <- NA","object_name_linter" +"tests/testthat/test-ensemble.R",150,3,"style","Variable and function name style should be snake_case or symbols."," X_reg_new[25, 3] <- NA","object_name_linter" +"tests/testthat/test-ensemble.R",197,3,"style","Variable and function name style should be snake_case or symbols."," custom.rf$method <- ""custom.rf""","object_name_linter" +"tests/testthat/test-ensemble.R",200,3,"style","Variable and function name style should be snake_case or symbols."," custom.rpart$method <- ""custom.rpart""","object_name_linter" +"tests/testthat/test-ensembleMethods.R",20,9,"style","Variable and function name style should be snake_case or symbols."," class(models.subset) <- ""caretList""","object_name_linter" +"tests/testthat/test-ensembleMethods.R",36,9,"style","Variable and function name style should be snake_case or symbols."," class(models.subset) <- ""caretList""","object_name_linter" +"tests/testthat/test-ensembleMethods.R",58,9,"style","Variable and function name style should be snake_case or symbols."," class(models.subset) <- ""caretList""","object_name_linter" +"tests/testthat/test-ensembleMethods.R",93,9,"style","Variable and function name style should be snake_case or symbols."," class(models.subset) <- ""caretList""","object_name_linter" +"tests/testthat/test-ensembleMethods.R",138,9,"style","Variable and function name style should be snake_case or symbols."," class(models.subset) <- ""caretList""","object_name_linter" +"tests/testthat/test-ensembleMethods.R",181,9,"style","Variable and function name style should be snake_case or symbols."," class(models.subset) <- ""caretList""","object_name_linter" +"tests/testthat/test-ensembleMethods.R",203,14,"style","Variable and function name style should be snake_case or symbols."," attributes(mr2.tmp1) <- NULL","object_name_linter" +"tests/testthat/test-ensembleMethods.R",242,9,"style","Variable and function name style should be snake_case or symbols."," class(models.subset) <- ""caretList""","object_name_linter" +"tests/testthat/test-ensembleMethods.R",257,9,"style","Variable and function name style should be snake_case or symbols."," class(models.class2) <- ""caretList""","object_name_linter" +"tests/testthat/test-ensembleMethods.R",260,3,"style","Variable and function name style should be snake_case or symbols."," newDat[2, 2] <- NA","object_name_linter" +"tests/testthat/test-ensembleMethods.R",261,3,"style","Variable and function name style should be snake_case or symbols."," newDat[3, 3] <- NA","object_name_linter" +"tests/testthat/test-ensembleMethods.R",262,3,"style","Variable and function name style should be snake_case or symbols."," newDat[4, 4] <- NA","object_name_linter" +"tests/testthat/test-ensembleMethods.R",289,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"tests/testthat/test-ensembleMethods.R",296,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"tests/testthat/test-ensembleMethods.R",318,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"tests/testthat/test-ensembleMethods.R",325,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"vignettes/caretEnsemble-intro.Rmd",33,1,"style","Variable and function name style should be snake_case or symbols.","inTrain <- createDataPartition(y = Sonar$Class, p = .75, list = FALSE)","object_name_linter" +"vignettes/caretEnsemble-intro.Rmd",34,19,"style","Do not place spaces after square brackets.","training <- Sonar[ inTrain,]","spaces_inside_linter" +"vignettes/caretEnsemble-intro.Rmd",34,28,"style","Commas should always have a space after.","training <- Sonar[ inTrain,]","commas_linter" +"vignettes/caretEnsemble-intro.Rmd",35,27,"style","Commas should always have a space after.","testing <- Sonar[-inTrain,]","commas_linter" +"vignettes/caretEnsemble-intro.Rmd",37,9,"style","Put spaces around all infix operators."," method=""boot"",","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",38,9,"style","Put spaces around all infix operators."," number=25,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",39,18,"style","Put spaces around all infix operators."," savePredictions=""final"",","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",40,13,"style","Put spaces around all infix operators."," classProbs=TRUE,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",41,8,"style","Put spaces around all infix operators."," index=createResample(training$Class, 25),","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",42,18,"style","Put spaces around all infix operators."," summaryFunction=twoClassSummary","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",52,8,"style","Put spaces around all infix operators."," Class~., data=training,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",52,16,"style","Put spaces around all infix operators."," Class~., data=training,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",53,12,"style","Put spaces around all infix operators."," trControl=my_control,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",54,13,"style","Put spaces around all infix operators."," methodList=c(""glm"", ""rpart"")","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",60,47,"style","Put spaces around all infix operators.","p <- as.data.frame(predict(model_list, newdata=head(testing)))","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",78,8,"style","Put spaces around all infix operators."," Class~., data=training,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",78,16,"style","Put spaces around all infix operators."," Class~., data=training,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",79,12,"style","Put spaces around all infix operators."," trControl=my_control,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",80,9,"style","Put spaces around all infix operators."," metric=""ROC"",","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",81,13,"style","Put spaces around all infix operators."," methodList=c(""glm"", ""rpart""),","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",82,11,"style","Put spaces around all infix operators."," tuneList=list(","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",83,8,"style","Put spaces around all infix operators."," rf1=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=2)),","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",83,30,"style","Put spaces around all infix operators."," rf1=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=2)),","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",83,45,"style","Put spaces around all infix operators."," rf1=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=2)),","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",83,62,"style","Put spaces around all infix operators."," rf1=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=2)),","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",84,8,"style","Put spaces around all infix operators."," rf2=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=10), preProcess=""pca""),","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",84,30,"style","Put spaces around all infix operators."," rf2=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=10), preProcess=""pca""),","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",84,45,"style","Put spaces around all infix operators."," rf2=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=10), preProcess=""pca""),","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",84,62,"style","Put spaces around all infix operators."," rf2=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=10), preProcess=""pca""),","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",84,78,"style","Put spaces around all infix operators."," rf2=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=10), preProcess=""pca""),","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",84,81,"style","Lines should not be more than 80 characters."," rf2=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=10), preProcess=""pca""),","line_length_linter" +"vignettes/caretEnsemble-intro.Rmd",85,7,"style","Put spaces around all infix operators."," nn=caretModelSpec(method=""nnet"", tuneLength=2, trace=FALSE)","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",85,29,"style","Put spaces around all infix operators."," nn=caretModelSpec(method=""nnet"", tuneLength=2, trace=FALSE)","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",85,48,"style","Put spaces around all infix operators."," nn=caretModelSpec(method=""nnet"", tuneLength=2, trace=FALSE)","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",85,57,"style","Put spaces around all infix operators."," nn=caretModelSpec(method=""nnet"", tuneLength=2, trace=FALSE)","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",108,14,"style","Trailing whitespace is superfluous."," model_list, ","trailing_whitespace_linter" +"vignettes/caretEnsemble-intro.Rmd",109,9,"style","Put spaces around all infix operators."," metric=""ROC"",","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",110,12,"style","Put spaces around all infix operators."," trControl=trainControl(","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",111,11,"style","Put spaces around all infix operators."," number=2,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",112,20,"style","Put spaces around all infix operators."," summaryFunction=twoClassSummary,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",113,15,"style","Put spaces around all infix operators."," classProbs=TRUE","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",121,51,"style","Put spaces around all infix operators.","model_preds <- lapply(model_list, predict, newdata=testing, type=""prob"")","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",121,65,"style","Put spaces around all infix operators.","model_preds <- lapply(model_list, predict, newdata=testing, type=""prob"")","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",122,51,"style","Commas should always have a space after.","model_preds <- lapply(model_preds, function(x) x[,""M""])","commas_linter" +"vignettes/caretEnsemble-intro.Rmd",124,46,"style","Put spaces around all infix operators.","ens_preds <- predict(greedy_ensemble, newdata=testing, type=""prob"")","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",124,60,"style","Put spaces around all infix operators.","ens_preds <- predict(greedy_ensemble, newdata=testing, type=""prob"")","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",147,9,"style","Put spaces around all infix operators."," method=""glm"",","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",148,9,"style","Put spaces around all infix operators."," metric=""ROC"",","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",149,12,"style","Put spaces around all infix operators."," trControl=trainControl(","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",150,11,"style","Put spaces around all infix operators."," method=""boot"",","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",151,11,"style","Put spaces around all infix operators."," number=10,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",152,20,"style","Put spaces around all infix operators."," savePredictions=""final"",","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",153,15,"style","Put spaces around all infix operators."," classProbs=TRUE,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",154,20,"style","Put spaces around all infix operators."," summaryFunction=twoClassSummary","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",158,55,"style","Put spaces around all infix operators.","model_preds2$ensemble <- predict(glm_ensemble, newdata=testing, type=""prob"")","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",158,69,"style","Put spaces around all infix operators.","model_preds2$ensemble <- predict(glm_ensemble, newdata=testing, type=""prob"")","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",159,1,"style","Variable and function name style should be snake_case or symbols.","CF <- coef(glm_ensemble$ens_model$finalModel)[-1]","object_name_linter" +"vignettes/caretEnsemble-intro.Rmd",161,3,"style","Put spaces around all infix operators.","CF/sum(CF)","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",175,9,"style","Put spaces around all infix operators."," method=""gbm"",","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",176,10,"style","Put spaces around all infix operators."," verbose=FALSE,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",177,13,"style","Put spaces around all infix operators."," tuneLength=10,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",178,9,"style","Put spaces around all infix operators."," metric=""ROC"",","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",179,12,"style","Put spaces around all infix operators."," trControl=trainControl(","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",180,11,"style","Put spaces around all infix operators."," method=""boot"",","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",181,11,"style","Put spaces around all infix operators."," number=10,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",182,20,"style","Put spaces around all infix operators."," savePredictions=""final"",","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",183,15,"style","Put spaces around all infix operators."," classProbs=TRUE,","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",184,20,"style","Put spaces around all infix operators."," summaryFunction=twoClassSummary","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",188,55,"style","Put spaces around all infix operators.","model_preds3$ensemble <- predict(gbm_ensemble, newdata=testing, type=""prob"")","infix_spaces_linter" +"vignettes/caretEnsemble-intro.Rmd",188,69,"style","Put spaces around all infix operators.","model_preds3$ensemble <- predict(gbm_ensemble, newdata=testing, type=""prob"")","infix_spaces_linter" diff --git a/.dev/revdep_emails/caretEnsemble/email-body b/.dev/revdep_emails/caretEnsemble/email-body new file mode 100644 index 000000000..9ae1f9850 --- /dev/null +++ b/.dev/revdep_emails/caretEnsemble/email-body @@ -0,0 +1,29 @@ +Hello Zachary A. Deane-Mayer! Thank you for using {lintr} in your package {caretEnsemble}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/zachmayer/caretEnsemble (hash: 87ad142a8cc0b106fdd0d0ca61cbc3e8a200ab3b) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 28s on CRAN vs. 15s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/cattonum/attachments/cattonum.warnings b/.dev/revdep_emails/cattonum/attachments/cattonum.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/cattonum/attachments/cattonum.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/cattonum/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/cattonum/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..2625ea5b8 --- /dev/null +++ b/.dev/revdep_emails/cattonum/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,2 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/cattonum.R",18,1,"style","Variable and function name style should be snake_case.",".onAttach <- function(libname, pkgname) {","object_name_linter" diff --git a/.dev/revdep_emails/cattonum/email-body b/.dev/revdep_emails/cattonum/email-body new file mode 100644 index 000000000..296f007c5 --- /dev/null +++ b/.dev/revdep_emails/cattonum/email-body @@ -0,0 +1,29 @@ +Hello Bernie Gray! Thank you for using {lintr} in your package {cattonum}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/bfgray3/cattonum (hash: d78393e245012aa0dc1187f1c8af6c04361f7505) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 12s on CRAN vs. 7s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/cleaR/attachments/cleaR.warnings b/.dev/revdep_emails/cleaR/attachments/cleaR.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/cleaR/attachments/cleaR.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/cleaR/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/cleaR/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..6d25f7316 --- /dev/null +++ b/.dev/revdep_emails/cleaR/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,29 @@ +"filename","line_number","column_number","type","message","line","linter" +"data-raw/devstuffs.R",57,2,"style","Commented code should be removed.","#usethis::use_gpl3_license(name = ""UniversitΓ€tsklinikum Erlangen"")","commented_code_linter" +"data-raw/devstuffs.R",61,81,"style","Lines should not be more than 80 characters.","# Listing a package in either Depends or Imports ensures that it’s installed when needed","line_length_linter" +"data-raw/devstuffs.R",63,81,"style","Lines should not be more than 80 characters.","# Loading will load code, data and any DLLs; register S3 and S4 methods; and run the .onLoad() function.","line_length_linter" +"data-raw/devstuffs.R",64,81,"style","Lines should not be more than 80 characters.","## After loading, the package is available in memory, but because it’s not in the search path,","line_length_linter" +"data-raw/devstuffs.R",66,81,"style","Lines should not be more than 80 characters.","## Confusingly, :: will also load a package automatically if it isn’t already loaded.","line_length_linter" +"data-raw/devstuffs.R",67,81,"style","Lines should not be more than 80 characters.","## It’s rare to load a package explicitly, but you can do so with requireNamespace() or loadNamespace().","line_length_linter" +"data-raw/devstuffs.R",68,81,"style","Lines should not be more than 80 characters.","# Attaching puts the package in the search path. You can’t attach a package without first loading it,","line_length_linter" +"data-raw/devstuffs.R",78,3,"style","Commented code should be removed.","# usethis::use_package(""config"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",79,3,"style","Commented code should be removed.","# usethis::use_package(""magrittr"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",80,3,"style","Commented code should be removed.","# usethis::use_package(""data.table"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",82,3,"style","Commented code should be removed.","# usethis::use_package(""Hmisc"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",84,3,"style","Commented code should be removed.","# usethis::use_package(""parsedate"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",86,3,"style","Commented code should be removed.","# usethis::use_package(""psych"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",88,3,"style","Commented code should be removed.","# usethis::use_package(""RJSONIO"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",89,3,"style","Commented code should be removed.","# usethis::use_package(""shiny"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",90,3,"style","Commented code should be removed.","# usethis::use_package(""shinyjs"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",92,3,"style","Commented code should be removed.","# usethis::use_package(""xml2"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",94,3,"style","Commented code should be removed.","# usethis::use_package(""logger"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",100,3,"style","Commented code should be removed.","# usethis::use_package(""shiny"", type = ""Suggests"")","commented_code_linter" +"data-raw/devstuffs.R",101,3,"style","Commented code should be removed.","# usethis::use_package(""shinyjs"", type = ""Suggests"")","commented_code_linter" +"data-raw/devstuffs.R",112,81,"style","Lines should not be more than 80 characters.","usethis::use_build_ignore(""## Please apply changes in `./data-raw/devstuffs.R`!"")","line_length_linter" +"data-raw/devstuffs.R",170,3,"style","Commented code should be removed.","# covr::package_coverage()","commented_code_linter" +"data-raw/devstuffs.R",173,3,"style","Commented code should be removed.","# lintr::lint_package()","commented_code_linter" +"data-raw/devstuffs.R",176,3,"style","Commented code should be removed.","# devtools::test()","commented_code_linter" +"data-raw/devstuffs.R",179,3,"style","Commented code should be removed.","# rcmdcheck::rcmdcheck()","commented_code_linter" +"data-raw/devstuffs.R",180,3,"style","Commented code should be removed.","# rcmdcheck::rcmdcheck(args = ""--no-vignettes"", build_args = ""--no-build-vignettes"")","commented_code_linter" +"data-raw/devstuffs.R",180,81,"style","Lines should not be more than 80 characters.","# rcmdcheck::rcmdcheck(args = ""--no-vignettes"", build_args = ""--no-build-vignettes"")","line_length_linter" +"data-raw/devstuffs.R",188,3,"style","Commented code should be removed.","# build|ci|docs|feat|fix|perf|refactor|test","commented_code_linter" diff --git a/.dev/revdep_emails/cleaR/email-body b/.dev/revdep_emails/cleaR/email-body new file mode 100644 index 000000000..f0cee85c8 --- /dev/null +++ b/.dev/revdep_emails/cleaR/email-body @@ -0,0 +1,29 @@ +Hello Jonathan M. Mang! Thank you for using {lintr} in your package {cleaR}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/joundso/cleaR (hash: ead74bff86cde29573ee30958bebb26fc4ad373b) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 1s on CRAN vs. 1s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/cloudos/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/cloudos/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..69f2dd16c --- /dev/null +++ b/.dev/revdep_emails/cloudos/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,19 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/cb_cohort_extract.R",124,36,"style","Variable and function name style should be snake_case."," req_body$criteria$pagination$pageNumber <- i","object_name_linter" +"R/cb_cohort_extract.R",125,36,"style","Variable and function name style should be snake_case."," req_body$criteria$pagination$pageSize <- page_size","object_name_linter" +"R/cb_cohort_extract.R",224,33,"style","There should be a space between right parenthesis and an opening curly brace."," for (col in res$header$columns){","paren_brace_linter" +"R/cb_cohort_extract.R",301,25,"style","There should be a space between right parenthesis and an opening curly brace."," for (col in res$header){","paren_brace_linter" +"R/cb_cohort_extract.R",349,35,"style","There should be a space between right parenthesis and an opening curly brace."," for (colname in colnames(res_df)){","paren_brace_linter" +"R/cb_cohort_extract.R",426,25,"style","There should be a space between right parenthesis and an opening curly brace."," for (col in res$header){","paren_brace_linter" +"R/cb_cohort_extract.R",474,27,"style","There should be a space between right parenthesis and an opening curly brace."," for (group in datagroups){","paren_brace_linter" +"R/cb_cohort_extract.R",476,33,"style","There should be a space between right parenthesis and an opening curly brace."," for (colname in colnames(df)){","paren_brace_linter" +"R/cb_cohort_extract.R",485,37,"style","There should be a space between right parenthesis and an opening curly brace."," for (colname in colnames(final_df)){","paren_brace_linter" +"R/cb_cohorts_list.R",85,11,"style","Variable and function name style should be snake_case."," cohorts$numberOfFilters <- sapply(cohorts$phenotypeFilters, nrow)","object_name_linter" +"R/cb_filter_apply.R",10,26,"style","There should be a space between right parenthesis and an opening curly brace."," for (filter in unnested){","paren_brace_linter" +"R/cb_filter_explore.R",117,25,"style","Variable and function name style should be snake_case."," req_body$criteria$pageNumber <- i","object_name_linter" +"R/cb_filter_explore.R",118,25,"style","Variable and function name style should be snake_case."," req_body$criteria$pageSize <- page_size","object_name_linter" +"R/cb_filter_explore.R",195,1,"style","Variable and function names should not be longer than 30 characters.",".cb_get_phenotype_statistics_v1 <- function(cohort, pheno_id) {","object_length_linter" +"R/cb_filter_explore.R",199,45,"style","There should be a space between right parenthesis and an opening curly brace."," for (filter in .unnest_query(cohort@query)){","paren_brace_linter" +"R/cb_json.R",42,26,"style","There should be a space between right parenthesis and an opening curly brace."," for (filter in unnested){","paren_brace_linter" +"R/zzz.R",1,1,"style","Variable and function name style should be snake_case.",".onLoad <- function(libname, pkgname, ...) {","object_name_linter" +"R/zzz.R",5,1,"style","Variable and function name style should be snake_case.",".onAttach <- function(libname, pkgname, ...) {","object_name_linter" diff --git a/.dev/revdep_emails/cloudos/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/cloudos/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..83b188f3a --- /dev/null +++ b/.dev/revdep_emails/cloudos/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,25 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/cb_class.R",84,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/cb_cohort_extract.R",109,67,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(req_body, auto_unbox = T),","T_and_F_symbol_linter" +"R/cb_cohort_extract.R",129,71,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(req_body, auto_unbox = T),","T_and_F_symbol_linter" +"R/cb_cohort_extract.R",197,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/cb_cohort_extract.R",213,35,"style","Use TRUE instead of the symbol T."," auto_unbox = T),","T_and_F_symbol_linter" +"R/cb_cohorts_list.R",39,48,"style","Use TRUE instead of the symbol T."," res <- httr::content(r, simplifyDataFrame = T)","T_and_F_symbol_linter" +"R/cb_filter_apply.R",59,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," starting_depth > 1 &","vector_logic_linter" +"R/cb_filter_apply.R",77,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (keep_query & !identical(cohort@query, list())) {","vector_logic_linter" +"R/cb_filter_apply.R",81,3,"style","`else` should come on the same line as the previous `}`."," else if (keep_query) {","brace_linter" +"R/cb_filter_apply.R",96,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !is.null(x$operator) &","vector_logic_linter" +"R/cb_filter_apply.R",171,64,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(r_body, auto_unbox = T),","T_and_F_symbol_linter" +"R/cb_filter_apply.R",192,80,"style","Use FALSE instead of the symbol F."," no_participants <- cb_participant_count(cohort, query = query, keep_query = F)","T_and_F_symbol_linter" +"R/cb_filter_apply.R",212,64,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(r_body, auto_unbox = T),","T_and_F_symbol_linter" +"R/cb_filter_explore.R",95,67,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(req_body, auto_unbox = T),","T_and_F_symbol_linter" +"R/cb_filter_explore.R",114,16,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (iter_all & paged) {","vector_logic_linter" +"R/cb_filter_explore.R",122,71,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(req_body, auto_unbox = T),","T_and_F_symbol_linter" +"R/cb_filter_explore.R",149,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(item$children) > 0 & depth < max_depth) {","vector_logic_linter" +"R/cb_filter_explore.R",224,65,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(r_body, auto_unbox = T),","T_and_F_symbol_linter" +"R/cb_filter_explore.R",328,65,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(r_body, auto_unbox = T),","T_and_F_symbol_linter" +"R/cb_filter_explore.R",346,67,"style","Use TRUE instead of the symbol T."," r_body <- jsonlite::toJSON(list(query = query), auto_unbox = T)","T_and_F_symbol_linter" +"R/cb_plots.R",118,12,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/cb_set_columns.R",77,64,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(r_body, auto_unbox = T),","T_and_F_symbol_linter" +"R/cb_set_columns.R",112,64,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(r_body, auto_unbox = T),","T_and_F_symbol_linter" +"tests/testthat/helper.R",6,5,"style","Missing terminal newline.","# })","trailing_blank_lines_linter" diff --git a/.dev/revdep_emails/cloudos/email-body b/.dev/revdep_emails/cloudos/email-body new file mode 100644 index 000000000..0314708f1 --- /dev/null +++ b/.dev/revdep_emails/cloudos/email-body @@ -0,0 +1,29 @@ +Hello Sangram Keshari Sahu! Thank you for using {lintr} in your package {cloudos}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/lifebit-ai/cloudos (hash: 01e4e5debc79b13ee3c31a8149e11abc3d41b253) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 18s on CRAN vs. 11s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/cmstatr/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/cmstatr/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..1e382d0ab --- /dev/null +++ b/.dev/revdep_emails/cmstatr/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,97 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/adk.R",179,15,"warning","no visible binding for global variable β€˜alpha’"," alpha = alpha,","object_usage_linter" +"R/adk.R",180,11,"warning","no visible binding for global variable β€˜n’"," n = n,","object_usage_linter" +"R/adk.R",181,11,"warning","no visible binding for global variable β€˜k’"," k = k,","object_usage_linter" +"R/adk.R",183,12,"warning","no visible binding for global variable β€˜ad’"," ad = ad,","object_usage_linter" +"R/adk.R",184,11,"warning","no visible binding for global variable β€˜p’"," p = p,","object_usage_linter" +"R/adk.R",185,26,"warning","no visible binding for global variable β€˜reject_same_dist’"," reject_same_dist = reject_same_dist","object_usage_linter" +"R/adtest.R",198,11,"warning","no visible binding for global variable β€˜n’"," n = n,","object_usage_linter" +"R/adtest.R",200,13,"warning","no visible binding for global variable β€˜osl’"," osl = osl,","object_usage_linter" +"R/adtest.R",201,15,"warning","no visible binding for global variable β€˜alpha’"," alpha = alpha,","object_usage_linter" +"R/adtest.R",202,29,"warning","no visible binding for global variable β€˜reject_distribution’"," reject_distribution = reject_distribution","object_usage_linter" +"R/basis.R",489,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(groups) & !all(is.na(groups))) {","vector_logic_linter" +"R/basis.R",595,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(vec) & length(vec) > 0) {","vector_logic_linter" +"R/basis.R",614,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(x$r) & !all(is.na(x$r))) {","vector_logic_linter" +"R/basis.R",632,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (x$conf == 0.95 & x$p == 0.9) {","vector_logic_linter" +"R/basis.R",635,3,"style","`else` should come on the same line as the previous `}`."," else if (x$conf == 0.95 & x$p == 0.99) {","brace_linter" +"R/basis.R",635,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," else if (x$conf == 0.95 & x$p == 0.99) {","vector_logic_linter" +"R/basis.R",638,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/basis.R",1267,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (p == 0.90 & conf == 0.95) {","vector_logic_linter" +"R/basis.R",1272,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (p == 0.99 & conf == 0.95) {","vector_logic_linter" +"R/basis.R",1283,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (p == 0.90 & conf == 0.95) {","vector_logic_linter" +"R/basis.R",1288,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (p == 0.99 & conf == 0.95) {","vector_logic_linter" +"R/basis.R",1481,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (p == 0.90 & conf == 0.95) {","vector_logic_linter" +"R/basis.R",1486,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (p == 0.99 & conf == 0.95) {","vector_logic_linter" +"R/equiv.R",693,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (alpha <= 0 | alpha >= 1) {","vector_logic_linter" +"R/equiv.R",890,15,"warning","no visible binding for global variable β€˜alpha’"," alpha = alpha,","object_usage_linter" +"R/equiv.R",891,18,"warning","no visible binding for global variable β€˜n_sample’"," n_sample = n_sample,","object_usage_linter" +"R/equiv.R",892,21,"warning","no visible binding for global variable β€˜mean_sample’"," mean_sample = mean_sample,","object_usage_linter" +"R/equiv.R",893,19,"warning","no visible binding for global variable β€˜sd_sample’"," sd_sample = sd_sample,","object_usage_linter" +"R/equiv.R",894,16,"warning","no visible binding for global variable β€˜n_qual’"," n_qual = n_qual,","object_usage_linter" +"R/equiv.R",895,19,"warning","no visible binding for global variable β€˜mean_qual’"," mean_qual = mean_qual,","object_usage_linter" +"R/equiv.R",896,17,"warning","no visible binding for global variable β€˜sd_qual’"," sd_qual = sd_qual,","object_usage_linter" +"R/equiv.R",897,15,"warning","no visible binding for global variable β€˜modcv’"," modcv = modcv,","object_usage_linter" +"R/equiv.R",898,12,"warning","no visible binding for global variable β€˜sp’"," sp = sp,","object_usage_linter" +"R/equiv.R",899,12,"warning","no visible binding for global variable β€˜t0’"," t0 = t0,","object_usage_linter" +"R/equiv.R",900,15,"warning","no visible binding for global variable β€˜t_req’"," t_req = t_req,","object_usage_linter" +"R/equiv.R",901,23,"warning","no visible binding for global variable β€˜threshold’"," threshold_min = threshold[1],","object_usage_linter" +"R/equiv.R",901,23,"warning","no visible binding for global variable β€˜threshold’"," threshold_min = threshold[1],","object_usage_linter" +"R/equiv.R",903,16,"warning","no visible binding for global variable β€˜result’"," result = result","object_usage_linter" +"R/levene.R",192,15,"warning","no visible binding for global variable β€˜alpha’"," alpha = alpha,","object_usage_linter" +"R/levene.R",193,15,"warning","no visible binding for global variable β€˜modcv’"," modcv = modcv,","object_usage_linter" +"R/levene.R",194,11,"warning","no visible binding for global variable β€˜n’"," n = n,","object_usage_linter" +"R/levene.R",195,11,"warning","no visible binding for global variable β€˜k’"," k = k,","object_usage_linter" +"R/levene.R",196,11,"warning","no visible binding for global variable β€˜f’"," f = f,","object_usage_linter" +"R/levene.R",197,11,"warning","no visible binding for global variable β€˜p’"," p = p,","object_usage_linter" +"R/levene.R",198,31,"warning","no visible binding for global variable β€˜reject_equal_variance’"," reject_equal_variance = reject_equal_variance","object_usage_linter" +"R/mnr.R",197,13,"warning","no visible binding for global variable β€˜mnr’"," mnr = mnr,","object_usage_linter" +"R/mnr.R",198,15,"warning","no visible binding for global variable β€˜alpha’"," alpha = alpha,","object_usage_linter" +"R/mnr.R",199,14,"warning","no visible binding for global variable β€˜crit’"," crit = crit,","object_usage_linter" +"R/mnr.R",200,20,"warning","no visible binding for global variable β€˜n_outliers’"," n_outliers = n_outliers","object_usage_linter" +"R/plot-nested.R",92,5,"warning","local variable β€˜y_obj’ assigned but may not be used"," y_obj <-","object_usage_linter" +"R/plot-nested.R",247,55,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(levels(as.factor(extras[[name]]))) > 1 & must_be_equal) {","vector_logic_linter" +"vignettes/cmstatr_Graphing.Rmd",23,42,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," requireNamespace(pkg, quietly = TRUE)}","brace_linter" +"vignettes/cmstatr_Tutorial.Rmd",22,42,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," requireNamespace(pkg, quietly = TRUE)}","brace_linter" +"vignettes/cmstatr_Tutorial.Rmd",171,30,"style","Trailing whitespace is superfluous."," basis_normal(strength.norm, ","trailing_whitespace_linter" +"vignettes/cmstatr_Validation.Rmd",512,81,"style","Lines should not be more than 80 characters."," 1, 79.04517, ""CTD"", 1, 103.2006, ""RTD"", 1, 63.22764, ""ETW"", 1, 54.09806, ""ETW2"",","line_length_linter" +"vignettes/cmstatr_Validation.Rmd",513,81,"style","Lines should not be more than 80 characters."," 1, 102.6014, ""CTD"", 1, 105.1034, ""RTD"", 1, 70.84454, ""ETW"", 1, 58.87615, ""ETW2"",","line_length_linter" +"vignettes/cmstatr_Validation.Rmd",514,81,"style","Lines should not be more than 80 characters."," 1, 97.79372, ""CTD"", 1, 105.1893, ""RTD"", 1, 66.43223, ""ETW"", 1, 61.60167, ""ETW2"",","line_length_linter" +"vignettes/cmstatr_Validation.Rmd",515,81,"style","Lines should not be more than 80 characters."," 1, 92.86423, ""CTD"", 1, 100.4189, ""RTD"", 1, 75.37771, ""ETW"", 1, 60.23973, ""ETW2"",","line_length_linter" +"vignettes/cmstatr_Validation.Rmd",516,81,"style","Lines should not be more than 80 characters."," 1, 117.218, ""CTD"", 2, 85.32319, ""RTD"", 1, 72.43773, ""ETW"", 1, 61.4808, ""ETW2"",","line_length_linter" +"vignettes/cmstatr_Validation.Rmd",517,81,"style","Lines should not be more than 80 characters."," 1, 108.7168, ""CTD"", 2, 92.69923, ""RTD"", 1, 68.43073, ""ETW"", 1, 64.55832, ""ETW2"",","line_length_linter" +"vignettes/cmstatr_Validation.Rmd",518,81,"style","Lines should not be more than 80 characters."," 1, 112.2773, ""CTD"", 2, 98.45242, ""RTD"", 1, 69.72524, ""ETW"", 2, 57.76131, ""ETW2"",","line_length_linter" +"vignettes/cmstatr_Validation.Rmd",519,81,"style","Lines should not be more than 80 characters."," 1, 114.0129, ""CTD"", 2, 104.1014, ""RTD"", 2, 66.20343, ""ETW"", 2, 49.91463, ""ETW2"",","line_length_linter" +"vignettes/cmstatr_Validation.Rmd",520,81,"style","Lines should not be more than 80 characters."," 2, 106.8452, ""CTD"", 2, 91.51841, ""RTD"", 2, 60.51251, ""ETW"", 2, 61.49271, ""ETW2"",","line_length_linter" +"vignettes/cmstatr_Validation.Rmd",521,81,"style","Lines should not be more than 80 characters."," 2, 112.3911, ""CTD"", 2, 101.3746, ""RTD"", 2, 65.69334, ""ETW"", 2, 57.7281, ""ETW2"",","line_length_linter" +"vignettes/cmstatr_Validation.Rmd",522,81,"style","Lines should not be more than 80 characters."," 2, 115.5658, ""CTD"", 2, 101.5828, ""RTD"", 2, 62.73595, ""ETW"", 2, 62.11653, ""ETW2"",","line_length_linter" +"vignettes/cmstatr_Validation.Rmd",523,81,"style","Lines should not be more than 80 characters."," 2, 87.40657, ""CTD"", 2, 99.57384, ""RTD"", 2, 59.00798, ""ETW"", 2, 62.69353, ""ETW2"",","line_length_linter" +"vignettes/cmstatr_Validation.Rmd",524,81,"style","Lines should not be more than 80 characters."," 2, 102.2785, ""CTD"", 2, 88.84826, ""RTD"", 2, 62.37761, ""ETW"", 3, 61.38523, ""ETW2"",","line_length_linter" +"vignettes/cmstatr_Validation.Rmd",525,81,"style","Lines should not be more than 80 characters."," 2, 110.6073, ""CTD"", 3, 92.18703, ""RTD"", 3, 64.3947, ""ETW"", 3, 60.39053, ""ETW2"",","line_length_linter" +"vignettes/cmstatr_Validation.Rmd",526,81,"style","Lines should not be more than 80 characters."," 3, 105.2762, ""CTD"", 3, 101.8234, ""RTD"", 3, 72.8491, ""ETW"", 3, 59.17616, ""ETW2"",","line_length_linter" +"vignettes/cmstatr_Validation.Rmd",527,81,"style","Lines should not be more than 80 characters."," 3, 110.8924, ""CTD"", 3, 97.68909, ""RTD"", 3, 66.56226, ""ETW"", 3, 60.17616, ""ETW2"",","line_length_linter" +"vignettes/cmstatr_Validation.Rmd",528,81,"style","Lines should not be more than 80 characters."," 3, 108.7638, ""CTD"", 3, 101.5172, ""RTD"", 3, 66.56779, ""ETW"", 3, 46.47396, ""ETW2"",","line_length_linter" +"vignettes/cmstatr_Validation.Rmd",529,81,"style","Lines should not be more than 80 characters."," 3, 110.9833, ""CTD"", 3, 100.0481, ""RTD"", 3, 66.00123, ""ETW"", 3, 51.16616, ""ETW2"",","line_length_linter" +"vignettes/cmstatr_Validation.Rmd",1195,65,"style","Trailing whitespace is superfluous."," mutate(diff = expect_equal(z, z_calc, tolerance = 0.0001)) %>% ","trailing_whitespace_linter" +"vignettes/cmstatr_Validation.Rmd",1243,56,"style","Trailing whitespace is superfluous."," mutate(diff = expect_lt(abs(k - z_calc), 0.0001)) %>% ","trailing_whitespace_linter" +"vignettes/cmstatr_Validation.Rmd",1287,6,"style","Trailing whitespace is superfluous.",") %>% ","trailing_whitespace_linter" +"vignettes/cmstatr_Validation.Rmd",1372,55,"style","Trailing whitespace is superfluous."," filter(n >= 5 & (alpha == 0.01 | alpha == 0.05)) %>% ","trailing_whitespace_linter" +"vignettes/cmstatr_Validation.Rmd",1378,24,"style","Trailing whitespace is superfluous."," select(-c(equiv)) %>% ","trailing_whitespace_linter" +"vignettes/cmstatr_Validation.Rmd",1379,47,"style","Trailing whitespace is superfluous."," unnest(cols = c(data, k1_calc, k2_calc)) %>% ","trailing_whitespace_linter" +"vignettes/cmstatr_Validation.Rmd",1381,24,"style","Trailing whitespace is superfluous."," select(-c(check)) %>% ","trailing_whitespace_linter" +"vignettes/hk_ext.R",1,81,"style","Lines should not be more than 80 characters.","## ----setup, include = FALSE-------------------------------------------------------------------------------------------","line_length_linter" +"vignettes/hk_ext.R",9,81,"style","Lines should not be more than 80 characters.","## ----message=FALSE, warning=FALSE-------------------------------------------------------------------------------------","line_length_linter" +"vignettes/hk_ext.R",16,81,"style","Lines should not be more than 80 characters.","## ---------------------------------------------------------------------------------------------------------------------","line_length_linter" +"vignettes/hk_ext.R",49,81,"style","Lines should not be more than 80 characters.","## ----include=FALSE----------------------------------------------------------------------------------------------------","line_length_linter" +"vignettes/hk_ext.R",56,81,"style","Lines should not be more than 80 characters.","## ----include=FALSE----------------------------------------------------------------------------------------------------","line_length_linter" +"vignettes/hk_ext.R",65,81,"style","Lines should not be more than 80 characters.","## ---------------------------------------------------------------------------------------------------------------------","line_length_linter" +"vignettes/hk_ext.R",70,81,"style","Lines should not be more than 80 characters.","## ---------------------------------------------------------------------------------------------------------------------","line_length_linter" +"vignettes/hk_ext.R",76,81,"style","Lines should not be more than 80 characters.","## ---------------------------------------------------------------------------------------------------------------------","line_length_linter" +"vignettes/hk_ext.R",104,81,"style","Lines should not be more than 80 characters.","## ----distribution-normal, fig.width=7, fig.height=5-------------------------------------------------------------------","line_length_linter" +"vignettes/hk_ext.R",114,81,"style","Lines should not be more than 80 characters.","## ---------------------------------------------------------------------------------------------------------------------","line_length_linter" +"vignettes/hk_ext.R",119,81,"style","Lines should not be more than 80 characters.","## ---------------------------------------------------------------------------------------------------------------------","line_length_linter" +"vignettes/hk_ext.R",132,81,"style","Lines should not be more than 80 characters.","## ---------------------------------------------------------------------------------------------------------------------","line_length_linter" +"vignettes/hk_ext.R",156,81,"style","Lines should not be more than 80 characters.","## ----distribution-Weibull, fig.width=7, fig.height=5------------------------------------------------------------------","line_length_linter" +"vignettes/hk_ext.R",166,81,"style","Lines should not be more than 80 characters.","## ---------------------------------------------------------------------------------------------------------------------","line_length_linter" +"vignettes/hk_ext.R",171,81,"style","Lines should not be more than 80 characters.","## ---------------------------------------------------------------------------------------------------------------------","line_length_linter" +"vignettes/hk_ext.R",184,81,"style","Lines should not be more than 80 characters.","## ---------------------------------------------------------------------------------------------------------------------","line_length_linter" +"vignettes/hk_ext.R",186,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" diff --git a/.dev/revdep_emails/cmstatr/email-body b/.dev/revdep_emails/cmstatr/email-body new file mode 100644 index 000000000..1550aa19d --- /dev/null +++ b/.dev/revdep_emails/cmstatr/email-body @@ -0,0 +1,29 @@ +Hello Stefan Kloppenborg! Thank you for using {lintr} in your package {cmstatr}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cmstatr/cmstatr (hash: 682bdd0f0843876e43f8d6fe9ae9f94fee43aac8) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 67s on CRAN vs. 43s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/connectwidgets/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/connectwidgets/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..f739c78e0 --- /dev/null +++ b/.dev/revdep_emails/connectwidgets/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,9 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/rmarkdown/templates/connectwidgets/skeleton/skeleton.Rmd",14,5,"style","Commented code should be removed."," # api_key = Sys.getenv(""CONNECT_API_KEY"")","commented_code_linter" +"R/connect.R",46,56,"style","Use TRUE instead of the symbol T."," jsonlite::fromJSON(results, simplifyDataFrame = T)","T_and_F_symbol_linter" +"R/theme.R",274,47,"style","Trailing semicolons are not needed."," page_btns_style[""background""] <- ""#5A5B5A"";","semicolon_linter" +"tests/testthat/setup.R",11,3,"warning","no visible global function definition for β€˜stub_request’"," stub_request(""get"", ""https://example.com/__api__/server_settings"") %>%","object_usage_linter" +"tests/testthat/setup.R",12,5,"warning","no visible global function definition for β€˜to_return’"," to_return(","object_usage_linter" +"tests/testthat/setup.R",31,3,"warning","no visible global function definition for β€˜stub_request’"," stub_request(","object_usage_linter" +"tests/testthat/setup.R",34,9,"warning","no visible global function definition for β€˜to_return’"," ) %>% to_return(","object_usage_linter" +"vignettes/using-crosstalk.Rmd",80,81,"style","Lines should not be more than 80 characters."," rsc_grid(crosstalk::SharedData$new(..2, key = ~ guid, group = ""xfilter""))","line_length_linter" diff --git a/.dev/revdep_emails/connectwidgets/email-body b/.dev/revdep_emails/connectwidgets/email-body new file mode 100644 index 000000000..73269c99a --- /dev/null +++ b/.dev/revdep_emails/connectwidgets/email-body @@ -0,0 +1,29 @@ +Hello Brian Smith! Thank you for using {lintr} in your package {connectwidgets}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/rstudio/connectwidgets (hash: c3e51a9fac7ef355237eba2daabbe3cecaec4dda) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 17s on CRAN vs. 8s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/crunch/attachments/crunch.warnings b/.dev/revdep_emails/crunch/attachments/crunch.warnings new file mode 100644 index 000000000..7c377045e --- /dev/null +++ b/.dev/revdep_emails/crunch/attachments/crunch.warnings @@ -0,0 +1,2 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Trying to remove β€˜closed_curly_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/crunch/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/crunch/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..6b5a8ff9a --- /dev/null +++ b/.dev/revdep_emails/crunch/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,2 @@ +"filename","line_number","column_number","type","message","line","linter" +"tests/testthat/test-misc.R",203,9,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" diff --git a/.dev/revdep_emails/crunch/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/crunch/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..fbb66262f --- /dev/null +++ b/.dev/revdep_emails/crunch/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,765 @@ +"filename","line_number","column_number","type","message","line","linter" +"data-raw/SO-survey.R",1,101,"style","Lines should not be more than 100 characters.","stack_df <- read.csv(""data-raw/survey_results_public.csv"") ## This file is big and not checked into git","line_length_linter" +"R/case-variables.R",98,29,"style","Any function spanning multiple lines should use curly braces."," cases <- mapply(function(e, n) list(","brace_linter" +"R/case-variables.R",248,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(case$id) & !is.whole(case$id)) {","vector_logic_linter" +"R/case-variables.R",264,38,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(case$numeric_value) & !is.numeric(case$numeric_value)) {","vector_logic_linter" +"R/case-variables.R",267,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.logical(case$missing) | is.na(case$missing)) {","vector_logic_linter" +"R/categories.R",157,5,"warning","local variable β€˜out’ assigned but may not be used"," out <- handleMissingCategoryLookup(ix, value, strict = TRUE)","object_usage_linter" +"R/categories.R",321,9,"warning","local variable β€˜ent’ assigned but may not be used"," ent <- setEntitySlot(entity(x), ""categories"", value)","object_usage_linter" +"R/categories.R",331,9,"warning","local variable β€˜ent’ assigned but may not be used"," ent <- setEntitySlot(entity(x), ""categories"", value)","object_usage_linter" +"R/change-category-id.R",32,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(is.numeric(from) & length(from) == 1)) {","vector_logic_linter" +"R/change-category-id.R",36,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(is.numeric(to) & length(to) == 1)) {","vector_logic_linter" +"R/combine-categories.R",52,41,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (is.Categorical(variable) | is.CategoricalArray(variable)) {","vector_logic_linter" +"R/combine-categories.R",66,36,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(is.Categorical(variable) | is.CategoricalArray(variable) | is.Expr(variable))) {","vector_logic_linter" +"R/combine-categories.R",66,68,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(is.Categorical(variable) | is.CategoricalArray(variable) | is.Expr(variable))) {","vector_logic_linter" +"R/combine-categories.R",102,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(is.MR(variable) | is.Expr(variable))) {","vector_logic_linter" +"R/conditional-transform.R",99,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (type != ""categorical"" & !is.null(categories)) {","vector_logic_linter" +"R/crunch-data-frame.R",101,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(out) == 1 & drop) {","vector_logic_linter" +"R/crunch-data-frame.R",160,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (is.numeric(j) | is.logical(j)) {","vector_logic_linter" +"R/crunch-data-frame.R",248,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(value) & missing(row_inds)) {","vector_logic_linter" +"R/crunch-data-frame.R",257,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(value) == 1 & length(row_inds) > 1) {","vector_logic_linter" +"R/cube-residuals.R",142,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((dim == ""cols"" & startsWith(dim_types[2], ""mr_"")) |","vector_logic_linter" +"R/cube-residuals.R",142,59,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((dim == ""cols"" & startsWith(dim_types[2], ""mr_"")) |","vector_logic_linter" +"R/cube-residuals.R",143,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," (dim == ""rows"" & startsWith(dim_types[1], ""mr_""))) {","vector_logic_linter" +"R/cube-residuals.R",292,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(dim(values)) & identical(dim(values), as.integer(c(nrow, ncol)))) {","vector_logic_linter" +"R/expressions.R",674,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(category_order) | is.numeric(category_order)) {","vector_logic_linter" +"R/fill-variable.R",36,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(dots) == 0 & missing(fills)) {","vector_logic_linter" +"R/fill-variable.R",39,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(dots) > 0 & !missing(fills)) {","vector_logic_linter" +"R/filters.R",45,13,"warning","local variable β€˜f’ assigned but may not be used"," f <- .newFilter(i, value, catalog_url = self(x))","object_usage_linter" +"R/folders.R",57,5,"warning","local variable β€˜fns’ assigned but may not be used"," fns <- list(","object_usage_linter" +"R/folders.R",323,5,"warning","local variable β€˜out’ assigned but may not be used"," out <- lapply(seq_along(folder), function(i) {","object_usage_linter" +"R/folders.R",379,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.dataset(source) | !is.dataset(target)) {","vector_logic_linter" +"R/formula.R",247,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (is.CA(x) | is.NumericArray(x)) {","vector_logic_linter" +"R/geo.R",61,9,"warning","local variable β€˜ent’ assigned but may not be used"," ent <- setEntitySlot(entity(x), ""view"", geodata)","object_usage_linter" +"R/geo.R",135,61,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(unique(match_scores$geodatum_name)) == 1 &","vector_logic_linter" +"R/hide-variables.R",140,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" +"R/insertions.R",110,50,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.character(anchor) && (anchor == ""top"" | anchor == ""bottom"")) {","vector_logic_linter" +"R/make-array.R",221,35,"style","Any function spanning multiple lines should use curly braces."," subvarderivs <- lapply(items, function(x) createSubvarDeriv(","brace_linter" +"R/make-array.R",339,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.list(x) & !is.VarDef(x)) {","vector_logic_linter" +"R/merge-crunch-data-frame.R",120,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.data.frame(data) & all(!class(data) %in% ""CrunchDataFrame"")) {","vector_logic_linter" +"R/multitables.R",38,13,"warning","local variable β€˜f’ assigned but may not be used"," f <- newMultitable(","object_usage_linter" +"R/ordering.R",131,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.dataset(source) | !is.dataset(target)) {","vector_logic_linter" +"R/ordering.R",179,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(group) == 1 & is.character(group)) {","vector_logic_linter" +"R/project-folder.R",49,13,"warning","local variable β€˜proj’ assigned but may not be used"," proj <- do.call(","object_usage_linter" +"R/shoji-order.R",54,13,"style","Any function spanning multiple lines should use curly braces."," function(a) do.call(","brace_linter" +"R/show.R",70,19,"style","Any function spanning multiple lines should use curly braces.","showInsertions <- function(x) do.call(","brace_linter" +"R/show.R",702,9,"warning","local variable β€˜along’ assigned but may not be used"," along <- ifelse(num_unique_dims == 3, 2, num_unique_dims)","object_usage_linter" +"R/subtotals-and-headings.R",268,5,"warning","local variable β€˜ent’ assigned but may not be used"," ent <- setEntitySlot(entity(x), ""view"", bd)","object_usage_linter" +"R/subtotals-and-headings.R",284,9,"warning","local variable β€˜ent’ assigned but may not be used"," ent <- setEntitySlot(entity(x), ""view"", bd)","object_usage_linter" +"R/subtotals-and-headings.R",453,36,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (is.na(func(insert)) & !is.na(anchor(insert))) {","vector_logic_linter" +"R/subtotals-and-headings.R",730,5,"warning","local variable β€˜ent’ assigned but may not be used"," ent <- setEntitySlot(entity(x), ""view"", bd)","object_usage_linter" +"R/subtotals-and-headings.R",746,9,"warning","local variable β€˜ent’ assigned but may not be used"," ent <- setEntitySlot(entity(x), ""view"", bd)","object_usage_linter" +"R/subtotals-and-headings.R",915,36,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (is.na(func(insert)) & !is.na(anchor(insert))) {","vector_logic_linter" +"R/subvariables.R",44,36,"warning","no visible binding for global variable β€˜subvariables_catalog’"," catalog_url <- absoluteURL(tup$subvariables_catalog, base = tup@index_url)","object_usage_linter" +"R/subvariables.R",45,22,"warning","no visible binding for global variable β€˜subreferences’"," if (!is.null(tup$subreferences)) {","object_usage_linter" +"R/subvariables.R",66,34,"warning","no visible binding for global variable β€˜subvariables_catalog’"," catalog_url <- absoluteURL(x$subvariables_catalog, base = x@index_url) %||% """"","object_usage_linter" +"R/subvariables.R",67,18,"warning","no visible binding for global variable β€˜subreferences’"," subvars <- x$subreferences","object_usage_linter" +"R/summary-insertions.R",141,9,"warning","local variable β€˜args’ assigned but may not be used"," args <- ids(var_items)","object_usage_linter" +"R/summary-insertions.R",283,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(opts$after) & is.null(opts$position)) opts$position <- ""bottom""","vector_logic_linter" +"R/teams.R",40,13,"warning","local variable β€˜u’ assigned but may not be used"," u <- crPOST(self(x), body = toJSON(list(name = i)))","object_usage_linter" +"R/variable-update.R",254,13,"warning","local variable β€˜out’ assigned but may not be used"," out <- .updateVariable(x, value, filter = .dispatchFilter(i))","object_usage_linter" +"R/versions.R",60,5,"warning","local variable β€˜out’ assigned but may not be used"," out <- crPOST(u,","object_usage_linter" +"R/weight.R",157,54,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.variable(vars) || (length(vars) == 1) & !is.character(vars)) {","vector_logic_linter" +"tests/testthat/setup.R",24,2,"style","Missing terminal newline.",")","trailing_blank_lines_linter" +"tests/testthat/test-cube-subset.R",23,80,"style","Use TRUE instead of the symbol T."," replaceCharWithNumeric(dimnames, c(""cats"", ""llamas""), visible = c(T, F, T)),","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",23,83,"style","Use FALSE instead of the symbol F."," replaceCharWithNumeric(dimnames, c(""cats"", ""llamas""), visible = c(T, F, T)),","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",23,86,"style","Use TRUE instead of the symbol T."," replaceCharWithNumeric(dimnames, c(""cats"", ""llamas""), visible = c(T, F, T)),","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",50,26,"style","Use TRUE instead of the symbol T."," not_hidden <- c(T, T, F, F)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",50,29,"style","Use TRUE instead of the symbol T."," not_hidden <- c(T, T, F, F)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",50,32,"style","Use FALSE instead of the symbol F."," not_hidden <- c(T, T, F, F)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",50,35,"style","Use FALSE instead of the symbol F."," not_hidden <- c(T, T, F, F)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",56,26,"style","Use FALSE instead of the symbol F."," not_hidden <- c(F, T, F, F, T, T)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",56,29,"style","Use TRUE instead of the symbol T."," not_hidden <- c(F, T, F, F, T, T)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",56,32,"style","Use FALSE instead of the symbol F."," not_hidden <- c(F, T, F, F, T, T)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",56,35,"style","Use FALSE instead of the symbol F."," not_hidden <- c(F, T, F, F, T, T)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",56,38,"style","Use TRUE instead of the symbol T."," not_hidden <- c(F, T, F, F, T, T)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",56,41,"style","Use TRUE instead of the symbol T."," not_hidden <- c(F, T, F, F, T, T)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",62,26,"style","Use FALSE instead of the symbol F."," not_hidden <- c(F, T, T)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",62,29,"style","Use TRUE instead of the symbol T."," not_hidden <- c(F, T, T)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",62,32,"style","Use TRUE instead of the symbol T."," not_hidden <- c(F, T, T)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",69,26,"style","Use FALSE instead of the symbol F."," not_hidden <- c(F, T, T, F)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",69,29,"style","Use TRUE instead of the symbol T."," not_hidden <- c(F, T, T, F)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",69,32,"style","Use TRUE instead of the symbol T."," not_hidden <- c(F, T, T, F)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",69,35,"style","Use FALSE instead of the symbol F."," not_hidden <- c(F, T, T, F)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",72,23,"style","Use TRUE instead of the symbol T."," visible <- c(T, T, T, F)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",72,26,"style","Use TRUE instead of the symbol T."," visible <- c(T, T, T, F)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",72,29,"style","Use TRUE instead of the symbol T."," visible <- c(T, T, T, F)","T_and_F_symbol_linter" +"tests/testthat/test-cube-subset.R",72,32,"style","Use FALSE instead of the symbol F."," visible <- c(T, T, T, F)","T_and_F_symbol_linter" +"tests/testthat/test-formula.R",57,44,"style","Put spaces around all infix operators."," formulaToQuery(mean(ds$birthyr)~1),","infix_spaces_linter" +"vignettes/abstract-categories.Rmd",51,34,"style","Put spaces around all infix operators.","income <- AbstractCategories(data=income_list)","infix_spaces_linter" +"vignettes/abstract-categories.Rmd",120,65,"style","Trailing whitespace is superfluous."," Subtotal(name = ""Generally Happy"", after = ""Somewhat Happy"", ","trailing_whitespace_linter" +"vignettes/abstract-categories.Rmd",122,52,"style","Trailing whitespace is superfluous."," Subtotal(name = ""Generally Unhappy"", after = 5, ","trailing_whitespace_linter" +"vignettes/abstract-categories.Rmd",142,101,"style","Lines should not be more than 100 characters.","feeling_insertions <- Insertions(data = lapply(feeling_subtotals, makeInsertion, var_items = feeling_cats))","line_length_linter" +"vignettes/analyze.Rmd",16,14,"style","Put spaces around all infix operators.","options(width=120)","infix_spaces_linter" +"vignettes/analyze.Rmd",31,28,"style","Put spaces around all infix operators.","tab1 <- crtabs(~ educ, data=ds)","infix_spaces_linter" +"vignettes/analyze.Rmd",41,37,"style","Put spaces around all infix operators.","tab2 <- crtabs(~ educ + gender, data=ds)","infix_spaces_linter" +"vignettes/analyze.Rmd",67,29,"style","Put spaces around all infix operators.","crtabs(~ educ + gender, data=ds)","infix_spaces_linter" +"vignettes/analyze.Rmd",76,29,"style","Put spaces around all infix operators.","crtabs(~ educ + gender, data=ds, weight=NULL)","infix_spaces_linter" +"vignettes/analyze.Rmd",76,40,"style","Put spaces around all infix operators.","crtabs(~ educ + gender, data=ds, weight=NULL)","infix_spaces_linter" +"vignettes/analyze.Rmd",98,10,"style","Put spaces around all infix operators.","round(100*prop.table(tab2, 2))","infix_spaces_linter" +"vignettes/analyze.Rmd",105,38,"style","Put spaces around all infix operators.","tab3 <- crtabs(~ imiss + gender, data=ds)","infix_spaces_linter" +"vignettes/analyze.Rmd",123,40,"style","Put spaces around all infix operators.","tab3mr <- crtabs(~ imiss + gender, data=ds)","infix_spaces_linter" +"vignettes/analyze.Rmd",139,10,"style","Put spaces around all infix operators.","round(100*prop.table(tab3mr, 2))","infix_spaces_linter" +"vignettes/analyze.Rmd",145,38,"style","Put spaces around all infix operators.","crtabs(~ imiss$imiss_f + gender, data=ds)","infix_spaces_linter" +"vignettes/analyze.Rmd",156,43,"style","Put spaces around all infix operators.","round(crtabs(~ imiss + educ + gender, data=ds))","infix_spaces_linter" +"vignettes/analyze.Rmd",172,39,"style","Put spaces around all infix operators.","crtabs(mean(age) ~ educ + gender, data=ds)","infix_spaces_linter" +"vignettes/analyze.Rmd",181,38,"style","Put spaces around all infix operators.","crtabs(min(age) ~ educ + gender, data=ds)","infix_spaces_linter" +"vignettes/analyze.Rmd",190,26,"style","Put spaces around all infix operators.","crtabs(min(age) ~ 1, data=ds)","infix_spaces_linter" +"vignettes/analyze.Rmd",208,47,"style","Put spaces around all infix operators.","round(crtabs(mean(track) ~ educ + gender, data=ds), 2)","infix_spaces_linter" +"vignettes/analyze.Rmd",221,47,"style","Put spaces around all infix operators.","round(crtabs(mean(track) ~ educ + gender, data=ds[ds$pid3 == ""Democrat"",]), 2)","infix_spaces_linter" +"vignettes/analyze.Rmd",242,28,"style","Put spaces around all infix operators.","cat(snowdenleakapp.var, sep=""\n"")","infix_spaces_linter" +"vignettes/analyze.Rmd",249,9,"style","Put spaces around all infix operators."," data=ds)","infix_spaces_linter" +"vignettes/analyze.Rmd",262,11,"style","Put spaces around all infix operators."," family=binomial(link=""logit""), data=ds)","infix_spaces_linter" +"vignettes/analyze.Rmd",262,25,"style","Put spaces around all infix operators."," family=binomial(link=""logit""), data=ds)","infix_spaces_linter" +"vignettes/analyze.Rmd",262,40,"style","Put spaces around all infix operators."," family=binomial(link=""logit""), data=ds)","infix_spaces_linter" +"vignettes/array-variables.Rmd",30,33,"style","Put spaces around all infix operators.","grep(""^imiss_"", names(ds), value=TRUE)","infix_spaces_linter" +"vignettes/array-variables.Rmd",33,47,"style","Put spaces around all infix operators.","grep(""^imiss_"", names(start_make_array), value=TRUE)","infix_spaces_linter" +"vignettes/array-variables.Rmd",42,22,"style","Put spaces around all infix operators.","cat(show_imiss_b, sep=""\n"")","infix_spaces_linter" +"vignettes/array-variables.Rmd",48,59,"style","Put spaces around all infix operators.","ds$imiss <- makeArray(ds[grep(""^imiss_"", names(ds))], name=""Issue importance"")","infix_spaces_linter" +"vignettes/array-variables.Rmd",52,20,"style","Put spaces around all infix operators.","cat(show_imiss, sep=""\n"")","infix_spaces_linter" +"vignettes/array-variables.Rmd",63,28,"style","Put spaces around all infix operators.","cat(show_imiss_subvars, sep=""\n"")","infix_spaces_linter" +"vignettes/array-variables.Rmd",72,22,"style","Put spaces around all infix operators.","cat(show_imiss_b, sep=""\n"")","infix_spaces_linter" +"vignettes/array-variables.Rmd",98,29,"style","Put spaces around all infix operators.","cat(show_imiss_subvars2, sep=""\n"")","infix_spaces_linter" +"vignettes/array-variables.Rmd",109,29,"style","Put spaces around all infix operators.","cat(show_imiss_subvars3, sep=""\n"")","infix_spaces_linter" +"vignettes/array-variables.Rmd",122,21,"style","Put spaces around all infix operators.","cat(show_boap_4, sep=""\n"")","infix_spaces_linter" +"vignettes/array-variables.Rmd",131,9,"style","Put spaces around all infix operators."," name=""Approval of Obama on issues"",","infix_spaces_linter" +"vignettes/array-variables.Rmd",132,15,"style","Put spaces around all infix operators."," selections=c(""Strongly approve"", ""Somewhat approve""))","infix_spaces_linter" +"vignettes/array-variables.Rmd",136,19,"style","Put spaces around all infix operators.","cat(show_boap, sep=""\n"")","infix_spaces_linter" +"vignettes/array-variables.Rmd",150,20,"style","Put spaces around all infix operators.","cat(show_boap2, sep=""\n"")","infix_spaces_linter" +"vignettes/array-variables.Rmd",160,20,"style","Put spaces around all infix operators.","cat(show_boap3, sep=""\n"")","infix_spaces_linter" +"vignettes/array-variables.Rmd",168,30,"style","Put spaces around all infix operators.","grep(""boap"", names(ds), value=TRUE)","infix_spaces_linter" +"vignettes/array-variables.Rmd",186,30,"style","Put spaces around all infix operators.","grep(""boap"", names(ds), value=TRUE)","infix_spaces_linter" +"vignettes/crunch.Rmd",36,76,"style","Trailing whitespace is superfluous.","# like ""update all packages from CRAN"" if it asks which packages to update, ","trailing_whitespace_linter" +"vignettes/crunch.Rmd",89,33,"style","Put spaces around all infix operators.","ds <- newDataset(SO_survey, name=""Stack Overflow Developer Survey 2017"")","infix_spaces_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Mon, 04 May 2020 21:39:23 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",3,66,"style","Trailing whitespace is superfluous."," `content-length` = ""176"", location = ""/api/datasets/c25696/"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",5,64,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",7,63,"style","Trailing whitespace is superfluous.",")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",8,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:23 GMT"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",9,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""176"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",10,62,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/c25696/"", server = ""nginx"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",11,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",12,68,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",13,61,"style","Trailing whitespace is superfluous."," `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",14,64,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = "".crunch.io"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",15,101,"style","Lines should not be more than 100 characters."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164363, class = c(""POSIXct"", ","line_length_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",15,101,"style","Trailing whitespace is superfluous."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164363, class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",16,71,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = ""token"", value = ""REDACTED""), row.names = c(NA, ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",17,101,"style","Lines should not be more than 100 characters.","-1L), class = ""data.frame""), content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",17,144,"style","Trailing whitespace is superfluous.","-1L), class = ""data.frame""), content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",19,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 3.1e-05, ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets-03e1cd-POST.R",20,73,"style","Trailing whitespace is superfluous."," connect = 3.2e-05, pretransfer = 0.000134, starttransfer = 0.000139, ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/c25696/batches/"", status_code = 202L, ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:26 GMT"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""178"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",4,101,"style","Lines should not be more than 100 characters."," location = ""/api/datasets/c25696/batches/import_batch%3Ac25696%245f5c3f13-f95f-4cbe-b60a-1a30e139cf18/"", ","line_length_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",4,113,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/c25696/batches/import_batch%3Ac25696%245f5c3f13-f95f-4cbe-b60a-1a30e139cf18/"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",5,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",7,61,"style","Trailing whitespace is superfluous."," `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",8,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",9,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:26 GMT"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",10,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",11,101,"style","Lines should not be more than 100 characters."," `content-length` = ""178"", location = ""/api/datasets/c25696/batches/import_batch%3Ac25696%245f5c3f13-f95f-4cbe-b60a-1a30e139cf18/"", ","line_length_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",11,143,"style","Trailing whitespace is superfluous."," `content-length` = ""178"", location = ""/api/datasets/c25696/batches/import_batch%3Ac25696%245f5c3f13-f95f-4cbe-b60a-1a30e139cf18/"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",12,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",13,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",14,65,"style","Trailing whitespace is superfluous."," `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",15,68,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = "".crunch.io"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",16,101,"style","Lines should not be more than 100 characters."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164366, class = c(""POSIXct"", ","line_length_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",16,105,"style","Trailing whitespace is superfluous."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164366, class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",17,75,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = ""token"", value = ""REDACTED""), row.names = c(NA, ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",18,101,"style","Lines should not be more than 100 characters."," -1L), class = ""data.frame""), content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/c25696/batches/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",18,163,"style","Trailing whitespace is superfluous."," -1L), class = ""data.frame""), content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/c25696/batches/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",20,67,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2e-05, ","trailing_whitespace_linter" +"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",21,71,"style","Trailing whitespace is superfluous."," connect = 2.2e-05, pretransfer = 8.9e-05, starttransfer = 9.3e-05, ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Mon, 04 May 2020 21:39:26 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",3,64,"style","Trailing whitespace is superfluous."," `content-length` = ""86"", location = ""/api/sources/cec83c/"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",5,101,"style","Lines should not be more than 100 characters."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","line_length_linter" +"vignettes/crunch/0/api/sources-POST.R",5,110,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",6,69,"style","Trailing whitespace is superfluous.","""list"")), all_headers = list(list(status = 201L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",7,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:26 GMT"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",8,84,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""86"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",9,61,"style","Trailing whitespace is superfluous."," location = ""/api/sources/cec83c/"", server = ""nginx"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",10,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",11,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",12,61,"style","Trailing whitespace is superfluous."," `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",13,64,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = "".crunch.io"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",14,101,"style","Lines should not be more than 100 characters."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164366, class = c(""POSIXct"", ","line_length_linter" +"vignettes/crunch/0/api/sources-POST.R",14,101,"style","Trailing whitespace is superfluous."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164366, class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",15,71,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = ""token"", value = ""REDACTED""), row.names = c(NA, ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",16,101,"style","Lines should not be more than 100 characters.","-1L), class = ""data.frame""), content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/sources/\""}""), ","line_length_linter" +"vignettes/crunch/0/api/sources-POST.R",16,112,"style","Trailing whitespace is superfluous.","-1L), class = ""data.frame""), content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/sources/\""}""), ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",18,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.6e-05, ","trailing_whitespace_linter" +"vignettes/crunch/0/api/sources-POST.R",19,72,"style","Trailing whitespace is superfluous."," connect = 2.7e-05, pretransfer = 0.00014, starttransfer = 0.000145, ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",1,76,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/c25696/variables/"", status_code = 201L, ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:32 GMT"", ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",3,83,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""0"", ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",4,61,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/c25696/variables/d270c8/"", ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",5,101,"style","Lines should not be more than 100 characters."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, PATCH, POST"", ","line_length_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",5,103,"style","Trailing whitespace is superfluous."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, PATCH, POST"", ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",6,61,"style","Trailing whitespace is superfluous."," `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",7,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 201L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",8,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:32 GMT"", ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",9,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",10,89,"style","Trailing whitespace is superfluous."," `content-length` = ""0"", location = ""/api/datasets/c25696/variables/d270c8/"", ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",11,64,"style","Trailing whitespace is superfluous."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",12,101,"style","Lines should not be more than 100 characters."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","line_length_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",12,108,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",13,68,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = "".crunch.io"", ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",14,101,"style","Lines should not be more than 100 characters."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164372, class = c(""POSIXct"", ","line_length_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",14,105,"style","Trailing whitespace is superfluous."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164372, class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",15,75,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = ""token"", value = ""REDACTED""), row.names = c(NA, ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",16,101,"style","Lines should not be more than 100 characters."," -1L), class = ""data.frame""), content = charToRaw(""""), date = structure(1588628372, class = c(""POSIXct"", ","line_length_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",16,108,"style","Trailing whitespace is superfluous."," -1L), class = ""data.frame""), content = charToRaw(""""), date = structure(1588628372, class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",17,77,"style","Trailing whitespace is superfluous."," ""POSIXt""), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.8e-05, ","trailing_whitespace_linter" +"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",18,72,"style","Trailing whitespace is superfluous."," connect = 2.9e-05, pretransfer = 9.8e-05, starttransfer = 0.000103, ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",1,76,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/c25696/variables/"", status_code = 201L, ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:37 GMT"", ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",3,83,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""0"", ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",4,61,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/c25696/variables/6af3ce/"", ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",5,101,"style","Lines should not be more than 100 characters."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, PATCH, POST"", ","line_length_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",5,103,"style","Trailing whitespace is superfluous."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, PATCH, POST"", ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",6,61,"style","Trailing whitespace is superfluous."," `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",7,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 201L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",8,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:37 GMT"", ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",9,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",10,89,"style","Trailing whitespace is superfluous."," `content-length` = ""0"", location = ""/api/datasets/c25696/variables/6af3ce/"", ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",11,64,"style","Trailing whitespace is superfluous."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",12,101,"style","Lines should not be more than 100 characters."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","line_length_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",12,108,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",13,68,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = "".crunch.io"", ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",14,101,"style","Lines should not be more than 100 characters."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164377, class = c(""POSIXct"", ","line_length_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",14,105,"style","Trailing whitespace is superfluous."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164377, class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",15,75,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = ""token"", value = ""REDACTED""), row.names = c(NA, ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",16,101,"style","Lines should not be more than 100 characters."," -1L), class = ""data.frame""), content = charToRaw(""""), date = structure(1588628377, class = c(""POSIXct"", ","line_length_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",16,108,"style","Trailing whitespace is superfluous."," -1L), class = ""data.frame""), content = charToRaw(""""), date = structure(1588628377, class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",17,77,"style","Trailing whitespace is superfluous."," ""POSIXt""), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.4e-05, ","trailing_whitespace_linter" +"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",18,71,"style","Trailing whitespace is superfluous."," connect = 2.5e-05, pretransfer = 8.8e-05, starttransfer = 9.3e-05, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",76,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",77,27,"style","Trailing whitespace is superfluous."," mean(ndogs) ~ country, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",102,18,"style","Trailing whitespace is superfluous."," private_deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",103,9,"style","Trailing whitespace is superfluous."," ~q1, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",104,40,"style","Trailing whitespace is superfluous."," title = ""Bar Plot of Favorite Pet"", ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",133,8,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",134,47,"style","Trailing whitespace is superfluous."," ""This survey was collected by ACME surveys"", ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",179,101,"style","Lines should not be more than 100 characters.","# (Note this controls the order of the slides in a deck, which controls how they appear in the web app's","line_length_linter" +"vignettes/deck-cookbook.Rmd",180,101,"style","Lines should not be more than 100 characters.","# deck viewer and Excel and PowerPoint exports, but does not change order or position of an existing ","line_length_linter" +"vignettes/deck-cookbook.Rmd",180,101,"style","Trailing whitespace is superfluous.","# deck viewer and Excel and PowerPoint exports, but does not change order or position of an existing ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",228,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",229,9,"style","Trailing whitespace is superfluous."," ~q1, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",244,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",245,19,"style","Trailing whitespace is superfluous."," ~q1 + country, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",251,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",252,26,"style","Trailing whitespace is superfluous."," ~q1 + country + wave, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",270,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",271,14,"style","Trailing whitespace is superfluous."," ~allpets, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",276,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",277,50,"style","Trailing whitespace is superfluous."," ~categories(allpets) + subvariables(allpets), ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",312,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",318,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",337,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",338,34,"style","Trailing whitespace is superfluous."," ~scorecard(allpets, allpets), ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",369,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",370,9,"style","Trailing whitespace is superfluous."," ~q1, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",380,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",381,48,"style","Trailing whitespace is superfluous."," ~categories(petloc) + subvariables(petloc), ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",400,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",401,9,"style","Trailing whitespace is superfluous."," ~q1, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",422,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",423,9,"style","Trailing whitespace is superfluous."," ~q1, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",451,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",452,19,"style","Trailing whitespace is superfluous."," ~q1 + country, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",459,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",460,16,"style","Trailing whitespace is superfluous."," ~q1 + wave, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",480,19,"style","Trailing whitespace is superfluous."," template_deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",481,9,"style","Trailing whitespace is superfluous."," ~q1, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",496,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",540,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",561,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",583,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",585,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",589,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",609,14,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",620,14,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/deck-cookbook.Rmd",631,14,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" +"vignettes/derive.Rmd",16,14,"style","Put spaces around all infix operators.","options(width=120)","infix_spaces_linter" +"vignettes/export.Rmd",15,14,"style","Put spaces around all infix operators.","options(width=120)","infix_spaces_linter" +"vignettes/export.Rmd",33,36,"style","Put spaces around all infix operators.","party_id <- as.vector(ds$pid3, mode=""id"")","infix_spaces_linter" +"vignettes/export.Rmd",64,30,"style","Put spaces around all infix operators.","df <- as.data.frame(ds, force=TRUE)","infix_spaces_linter" +"vignettes/export.Rmd",76,81,"style","Put spaces around all infix operators.","df <- as.data.frame(ds[ds$pid3 == ""Democrat"", c(""age"", ""educ"", ""gender"")], force=TRUE)","infix_spaces_linter" +"vignettes/export.Rmd",115,23,"style","Put spaces around all infix operators.","exportDataset(ds, file=""econ.sav"", format=""spss"")","infix_spaces_linter" +"vignettes/export.Rmd",115,42,"style","Put spaces around all infix operators.","exportDataset(ds, file=""econ.sav"", format=""spss"")","infix_spaces_linter" +"vignettes/export.Rmd",121,19,"style","Put spaces around all infix operators.","write.csv(ds, file=""econ.csv"")","infix_spaces_linter" +"vignettes/export.Rmd",129,70,"style","Put spaces around all infix operators.","write.csv(ds[ds$pid3 == ""Democrat"", c(""age"", ""educ"", ""gender"")], file=""demo-demos.csv"")","infix_spaces_linter" +"vignettes/filters.Rmd",15,14,"style","Put spaces around all infix operators.","options(width=120)","infix_spaces_linter" +"vignettes/filters.Rmd",33,19,"style","Put spaces around all infix operators.","cat(printdems, sep=""\n"")","infix_spaces_linter" +"vignettes/filters.Rmd",37,47,"style","Put spaces around all infix operators.","round(crtabs(mean(track) ~ educ + gender, data=dems), 2)","infix_spaces_linter" +"vignettes/filters.Rmd",90,28,"style","Put spaces around all infix operators.","cat(print.young.males1, sep=""\n"")","infix_spaces_linter" +"vignettes/filters.Rmd",125,28,"style","Put spaces around all infix operators.","cat(print.young.males2, sep=""\n"")","infix_spaces_linter" +"vignettes/filters.Rmd",144,27,"style","Put spaces around all infix operators.","cat(high_perc_skipped, sep=""\n"")","infix_spaces_linter" +"vignettes/fork-and-merge.Rmd",50,101,"style","Lines should not be more than 100 characters.","forked_ds$ImportantHiringCA <- makeArray(forked_ds[, c(""ImportantHiringTechExp"", ""ImportantHiringPMExp"")],","line_length_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Thu, 25 Mar 2021 15:16:07 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",3,66,"style","Trailing whitespace is superfluous."," `content-length` = ""176"", location = ""/api/datasets/5b6c9f/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",5,64,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",6,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",6,111,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",7,68,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",8,69,"style","Trailing whitespace is superfluous.","""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",9,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:16:07 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",10,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""176"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",11,62,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/5b6c9f/"", server = ""nginx"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",12,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",13,68,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",14,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",14,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",15,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",16,62,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",17,63,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",19,95,"style","Trailing whitespace is superfluous."," )), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",20,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",20,119,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.8e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",23,69,"style","Trailing whitespace is superfluous."," connect = 3e-05, pretransfer = 8.6e-05, starttransfer = 9.1e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/5b6c9f/batches/"", status_code = 202L, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:28 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""179"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",4,101,"style","Lines should not be more than 100 characters."," location = ""/api/datasets/5b6c9f/batches/import_batch%3A5b6c9f%24c6f12343-98a7-414c-b850-f4bc7ab927e2/"", ","line_length_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",4,113,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/5b6c9f/batches/import_batch%3A5b6c9f%24c6f12343-98a7-414c-b850-f4bc7ab927e2/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",5,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",7,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",7,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",8,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",9,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",10,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:28 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",11,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",12,101,"style","Lines should not be more than 100 characters."," `content-length` = ""179"", location = ""/api/datasets/5b6c9f/batches/import_batch%3A5b6c9f%24c6f12343-98a7-414c-b850-f4bc7ab927e2/"", ","line_length_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",12,143,"style","Trailing whitespace is superfluous."," `content-length` = ""179"", location = ""/api/datasets/5b6c9f/batches/import_batch%3A5b6c9f%24c6f12343-98a7-414c-b850-f4bc7ab927e2/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",13,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",14,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",15,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",15,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",16,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",17,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",18,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",19,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",20,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",20,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",21,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/batches/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",21,134,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/batches/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",23,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.8e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",24,69,"style","Trailing whitespace is superfluous."," connect = 2.9e-05, pretransfer = 8.5e-05, starttransfer = 9e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",1,72,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/5b6c9f/forks/"", status_code = 202L, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:31 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""176"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",4,62,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/9540f6/"", server = ""nginx"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",5,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",7,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",7,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",8,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",9,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",10,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:31 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",11,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",12,74,"style","Trailing whitespace is superfluous."," `content-length` = ""176"", location = ""/api/datasets/9540f6/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",13,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",14,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",15,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",15,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",16,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",17,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",18,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",19,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",20,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",20,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",21,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/forks/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",21,132,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/forks/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",23,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.3e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",24,71,"style","Trailing whitespace is superfluous."," connect = 2.4e-05, pretransfer = 7.5e-05, starttransfer = 7.9e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Thu, 25 Mar 2021 15:18:27 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",3,64,"style","Trailing whitespace is superfluous."," `content-length` = ""86"", location = ""/api/sources/16269c/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",5,95,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",6,73,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",7,68,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",8,69,"style","Trailing whitespace is superfluous.","""list"")), all_headers = list(list(status = 201L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",9,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:27 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",10,84,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""86"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",11,61,"style","Trailing whitespace is superfluous."," location = ""/api/sources/16269c/"", server = ""nginx"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",12,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",13,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",14,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",14,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",15,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",16,62,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",17,63,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",19,95,"style","Trailing whitespace is superfluous."," )), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",20,87,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/sources/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.8e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/0/api/sources-POST.R",23,71,"style","Trailing whitespace is superfluous."," connect = 3e-05, pretransfer = 0.000183, starttransfer = 0.000189, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",1,76,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/9540f6/variables/"", status_code = 201L, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:35 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",3,83,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""0"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",4,61,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/9540f6/variables/a57c56/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",5,101,"style","Lines should not be more than 100 characters."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, PATCH, POST"", ","line_length_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",5,103,"style","Trailing whitespace is superfluous."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, PATCH, POST"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",6,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",6,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",7,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",8,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 201L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",9,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:35 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",10,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",11,89,"style","Trailing whitespace is superfluous."," `content-length` = ""0"", location = ""/api/datasets/9540f6/variables/a57c56/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",12,64,"style","Trailing whitespace is superfluous."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",13,93,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",14,81,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",15,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",16,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",17,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",18,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",19,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",19,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",20,79,"style","Trailing whitespace is superfluous."," content = charToRaw(""""), date = structure(1616685515, class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",21,77,"style","Trailing whitespace is superfluous."," ""POSIXt""), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.7e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",22,71,"style","Trailing whitespace is superfluous."," connect = 2.9e-05, pretransfer = 8.9e-05, starttransfer = 9.4e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/5b6c9f/actions/"", status_code = 202L, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:37 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""178"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",4,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",5,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",6,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",6,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",7,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",8,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",9,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:37 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",10,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",11,85,"style","Trailing whitespace is superfluous."," `content-length` = ""178"", server = ""nginx"", `content-encoding` = ""gzip"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",12,82,"style","Trailing whitespace is superfluous."," vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, POST"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",13,67,"style","Trailing whitespace is superfluous."," `x-timing` = """", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",14,81,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",15,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",16,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",17,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",18,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",19,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",19,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",20,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/actions/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",20,134,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/actions/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.5e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",23,71,"style","Trailing whitespace is superfluous."," connect = 2.6e-05, pretransfer = 7.9e-05, starttransfer = 8.4e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Thu, 25 Mar 2021 15:18:40 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",3,66,"style","Trailing whitespace is superfluous."," `content-length` = ""176"", location = ""/api/datasets/25c7c7/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",5,64,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",6,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",6,111,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",7,68,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",8,69,"style","Trailing whitespace is superfluous.","""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",9,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:40 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",10,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""176"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",11,62,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/25c7c7/"", server = ""nginx"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",12,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",13,68,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",14,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",14,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",15,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",16,62,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",17,63,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",19,95,"style","Trailing whitespace is superfluous."," )), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",20,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",20,119,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.5e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",23,73,"style","Trailing whitespace is superfluous."," connect = 2.6e-05, pretransfer = 0.000106, starttransfer = 0.000109, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/25c7c7/batches/"", status_code = 202L, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:21:29 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""179"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",4,101,"style","Lines should not be more than 100 characters."," location = ""/api/datasets/25c7c7/batches/import_batch%3A25c7c7%24f8ecc6af-28ee-4ae1-8877-566f570f1b96/"", ","line_length_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",4,113,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/25c7c7/batches/import_batch%3A25c7c7%24f8ecc6af-28ee-4ae1-8877-566f570f1b96/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",5,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",7,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",7,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",8,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",9,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",10,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:21:29 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",11,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",12,101,"style","Lines should not be more than 100 characters."," `content-length` = ""179"", location = ""/api/datasets/25c7c7/batches/import_batch%3A25c7c7%24f8ecc6af-28ee-4ae1-8877-566f570f1b96/"", ","line_length_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",12,143,"style","Trailing whitespace is superfluous."," `content-length` = ""179"", location = ""/api/datasets/25c7c7/batches/import_batch%3A25c7c7%24f8ecc6af-28ee-4ae1-8877-566f570f1b96/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",13,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",14,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",15,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",15,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",16,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",17,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",18,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",19,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",20,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",20,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",21,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/25c7c7/batches/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",21,134,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/25c7c7/batches/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",23,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.7e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",24,71,"style","Trailing whitespace is superfluous."," connect = 2.8e-05, pretransfer = 8.1e-05, starttransfer = 8.6e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Thu, 25 Mar 2021 15:21:29 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",3,64,"style","Trailing whitespace is superfluous."," `content-length` = ""86"", location = ""/api/sources/e2adbc/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",5,95,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",6,73,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",7,68,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",8,69,"style","Trailing whitespace is superfluous.","""list"")), all_headers = list(list(status = 201L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",9,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:21:29 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",10,84,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""86"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",11,61,"style","Trailing whitespace is superfluous."," location = ""/api/sources/e2adbc/"", server = ""nginx"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",12,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",13,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",14,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",14,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",15,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",16,62,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",17,63,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",19,95,"style","Trailing whitespace is superfluous."," )), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",20,87,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/sources/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.4e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/3/api/sources-POST.R",23,73,"style","Trailing whitespace is superfluous."," connect = 2.5e-05, pretransfer = 0.000137, starttransfer = 0.000142, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",1,72,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/5b6c9f/forks/"", status_code = 202L, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:21:31 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""175"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",4,62,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/d04628/"", server = ""nginx"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",5,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",7,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",7,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",8,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",9,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",10,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:21:31 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",11,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",12,74,"style","Trailing whitespace is superfluous."," `content-length` = ""175"", location = ""/api/datasets/d04628/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",13,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",14,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",15,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",15,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",16,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",17,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",18,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",19,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",20,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",20,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",21,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/forks/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",21,132,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/forks/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",23,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.5e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",24,71,"style","Trailing whitespace is superfluous."," connect = 2.6e-05, pretransfer = 7.8e-05, starttransfer = 8.3e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/d04628/batches/"", status_code = 202L, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:22:41 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""177"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",4,101,"style","Lines should not be more than 100 characters."," location = ""/api/datasets/d04628/batches/import_batch%3Ad04628%2427437777-7092-4ad7-8705-4e154e217872/"", ","line_length_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",4,113,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/d04628/batches/import_batch%3Ad04628%2427437777-7092-4ad7-8705-4e154e217872/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",5,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",7,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",7,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",8,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",9,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",10,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:22:41 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",11,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",12,101,"style","Lines should not be more than 100 characters."," `content-length` = ""177"", location = ""/api/datasets/d04628/batches/import_batch%3Ad04628%2427437777-7092-4ad7-8705-4e154e217872/"", ","line_length_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",12,143,"style","Trailing whitespace is superfluous."," `content-length` = ""177"", location = ""/api/datasets/d04628/batches/import_batch%3Ad04628%2427437777-7092-4ad7-8705-4e154e217872/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",13,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",14,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",15,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",15,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",16,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",17,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",18,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",19,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",20,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",20,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",21,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/d04628/batches/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",21,134,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/d04628/batches/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",23,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.5e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",24,71,"style","Trailing whitespace is superfluous."," connect = 2.7e-05, pretransfer = 7.4e-05, starttransfer = 7.9e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/5b6c9f/actions/"", status_code = 202L, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:51 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""179"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",4,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",5,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",6,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",6,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",7,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",8,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",9,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:51 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",10,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",11,85,"style","Trailing whitespace is superfluous."," `content-length` = ""179"", server = ""nginx"", `content-encoding` = ""gzip"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",12,82,"style","Trailing whitespace is superfluous."," vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, POST"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",13,67,"style","Trailing whitespace is superfluous."," `x-timing` = """", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",14,81,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",15,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",16,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",17,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",18,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",19,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",19,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",20,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/actions/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",20,134,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/actions/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.9e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",23,71,"style","Trailing whitespace is superfluous."," connect = 3.1e-05, pretransfer = 8.8e-05, starttransfer = 9.2e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Thu, 25 Mar 2021 15:23:55 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",3,66,"style","Trailing whitespace is superfluous."," `content-length` = ""176"", location = ""/api/datasets/b5a775/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",5,64,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",6,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",6,111,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",7,68,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",8,69,"style","Trailing whitespace is superfluous.","""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",9,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:55 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",10,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""176"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",11,62,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/b5a775/"", server = ""nginx"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",12,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",13,68,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",14,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",14,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",15,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",16,62,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",17,63,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",19,95,"style","Trailing whitespace is superfluous."," )), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",20,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",20,119,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.7e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",23,71,"style","Trailing whitespace is superfluous."," connect = 2.8e-05, pretransfer = 8.1e-05, starttransfer = 8.6e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",1,72,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/5b6c9f/forks/"", status_code = 202L, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:59 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""176"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",4,62,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/91e745/"", server = ""nginx"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",5,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",7,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",7,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",8,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",9,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",10,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:59 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",11,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",12,74,"style","Trailing whitespace is superfluous."," `content-length` = ""176"", location = ""/api/datasets/91e745/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",13,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",14,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",15,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",15,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",16,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",17,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",18,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",19,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",20,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",20,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",21,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/forks/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",21,132,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/forks/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",23,67,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",24,71,"style","Trailing whitespace is superfluous."," connect = 2.1e-05, pretransfer = 6.1e-05, starttransfer = 6.4e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",1,76,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/91e745/variables/"", status_code = 202L, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:26:22 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""208"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",4,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",5,89,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",6,77,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",7,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",8,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",9,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:26:22 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",10,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",11,85,"style","Trailing whitespace is superfluous."," `content-length` = ""208"", server = ""nginx"", `content-encoding` = ""gzip"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",12,89,"style","Trailing whitespace is superfluous."," vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, PATCH, POST"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",13,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",13,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",14,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",15,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",16,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",17,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",18,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",18,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",19,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""description\"": \""Progress status of adapt job\"", \""value\"": \""/api/progress/\"", \""element\"": \""shoji:view\""}""), ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",19,140,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""description\"": \""Progress status of adapt job\"", \""value\"": \""/api/progress/\"", \""element\"": \""shoji:view\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",21,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.6e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",22,69,"style","Trailing whitespace is superfluous."," connect = 2.7e-05, pretransfer = 7.7e-05, starttransfer = 9e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/b5a775/batches/"", status_code = 202L, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:57 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""178"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",4,101,"style","Lines should not be more than 100 characters."," location = ""/api/datasets/b5a775/batches/import_batch%3Ab5a775%24125593e4-5a97-42e8-b680-fb537a150a66/"", ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",4,113,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/b5a775/batches/import_batch%3Ab5a775%24125593e4-5a97-42e8-b680-fb537a150a66/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",5,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",7,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",7,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",8,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",9,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",10,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:57 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",11,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",12,101,"style","Lines should not be more than 100 characters."," `content-length` = ""178"", location = ""/api/datasets/b5a775/batches/import_batch%3Ab5a775%24125593e4-5a97-42e8-b680-fb537a150a66/"", ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",12,143,"style","Trailing whitespace is superfluous."," `content-length` = ""178"", location = ""/api/datasets/b5a775/batches/import_batch%3Ab5a775%24125593e4-5a97-42e8-b680-fb537a150a66/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",13,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",14,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",15,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",15,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",16,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",17,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",18,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",19,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",20,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",20,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",21,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/b5a775/batches/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",21,134,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/b5a775/batches/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",23,67,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 3e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",24,71,"style","Trailing whitespace is superfluous."," connect = 3.2e-05, pretransfer = 8.9e-05, starttransfer = 9.4e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Thu, 25 Mar 2021 15:23:56 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",3,64,"style","Trailing whitespace is superfluous."," `content-length` = ""86"", location = ""/api/sources/4f9156/"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",5,95,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",6,73,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",7,68,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",8,69,"style","Trailing whitespace is superfluous.","""list"")), all_headers = list(list(status = 201L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",9,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:56 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",10,84,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""86"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",11,61,"style","Trailing whitespace is superfluous."," location = ""/api/sources/4f9156/"", server = ""nginx"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",12,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",13,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",14,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",14,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",15,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",16,62,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",17,63,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",19,95,"style","Trailing whitespace is superfluous."," )), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",20,87,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/sources/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.4e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/6/api/sources-POST.R",23,73,"style","Trailing whitespace is superfluous."," connect = 2.5e-05, pretransfer = 0.000155, starttransfer = 0.000161, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/5b6c9f/actions/"", status_code = 202L, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:26:26 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""178"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",4,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",5,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",6,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",6,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",7,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",8,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",9,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:26:26 GMT"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",10,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",11,85,"style","Trailing whitespace is superfluous."," `content-length` = ""178"", server = ""nginx"", `content-encoding` = ""gzip"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",12,82,"style","Trailing whitespace is superfluous."," vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, POST"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",13,67,"style","Trailing whitespace is superfluous."," `x-timing` = """", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",14,81,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",15,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",16,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",17,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",18,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",19,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",19,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",20,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/actions/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",20,134,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/actions/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.6e-05, ","trailing_whitespace_linter" +"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",23,71,"style","Trailing whitespace is superfluous."," connect = 2.7e-05, pretransfer = 8.2e-05, starttransfer = 8.7e-05, ","trailing_whitespace_linter" +"vignettes/subtotals.Rmd",19,14,"style","Put spaces around all infix operators.","options(width=120)","infix_spaces_linter" +"vignettes/subtotals.Rmd",27,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/subtotals.Rmd",33,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/subtotals.Rmd",187,101,"style","Lines should not be more than 100 characters.","transforms(cube)$q1$insertions <- list(Heading(""Mammals"", position = ""top""), Heading(""Other"", after = ""Dog""))","line_length_linter" +"vignettes/variable-order.Rmd",15,14,"style","Put spaces around all infix operators.","options(width=120)","infix_spaces_linter" +"vignettes/variables.Rmd",20,14,"style","Put spaces around all infix operators.","options(width=120)","infix_spaces_linter" +"vignettes/variables.Rmd",61,27,"style","Put spaces around all infix operators.","cat(summary.track.var, sep=""\n"")","infix_spaces_linter" +"vignettes/variables.Rmd",68,101,"style","Lines should not be more than 100 characters.","description(track.var) <- ""In your opinon, is the country going in the right direction, or is it on the wrong track?""","line_length_linter" +"vignettes/variables.Rmd",211,73,"style","Put spaces around all infix operators.","ids(categories(track.var)) <- sample(ids(categories(track.var)), replace=FALSE)","infix_spaces_linter" diff --git a/.dev/revdep_emails/crunch/email-body b/.dev/revdep_emails/crunch/email-body new file mode 100644 index 000000000..2926f2564 --- /dev/null +++ b/.dev/revdep_emails/crunch/email-body @@ -0,0 +1,29 @@ +Hello Greg Freedman Ellis! Thank you for using {lintr} in your package {crunch}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/Crunch-io/rcrunch (hash: 5f78824de8c653398fc36866ae127549a008db7e) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 340s on CRAN vs. 185s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/dampack/attachments/dampack.warnings b/.dev/revdep_emails/dampack/attachments/dampack.warnings new file mode 100644 index 000000000..182961f94 --- /dev/null +++ b/.dev/revdep_emails/dampack/attachments/dampack.warnings @@ -0,0 +1,2 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Trying to remove β€˜camel_case_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/dampack/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/dampack/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..d34293462 --- /dev/null +++ b/.dev/revdep_emails/dampack/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,331 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/calculate_outcome.R",32,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (outcome == ""nhb_loss"" | outcome == ""nmb_loss"") {","vector_logic_linter" +"R/calculate_outcome.R",43,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (outcome == ""nhb_loss_voi"" | outcome == ""nmb_loss_voi"") {","vector_logic_linter" +"R/create_sa.R",146,17,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (all_strat | (x$n_strategies <= n_trunc)) {","vector_logic_linter" +"R/evsi.R",140,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(length(n) == 1 | length(n) == n_params)) {","vector_logic_linter" +"R/evsi.R",144,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(length(n0) == 1 | length(n0) == n_params)) {","vector_logic_linter" +"R/evsi.R",315,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(unique(x$WTP)) == 1 & ""n"" %in% names(x)) {","vector_logic_linter" +"R/evsi.R",319,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (!(""n"" %in% names(x)) | (""n"" %in% names(x) & length(unique(x$n)) == 1)) {","vector_logic_linter" +"R/evsi.R",319,56,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (!(""n"" %in% names(x)) | (""n"" %in% names(x) & length(unique(x$n)) == 1)) {","vector_logic_linter" +"R/evsi.R",323,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (length(unique(x$WTP > 1)) & length(unique(x$n)) > 1) {","vector_logic_linter" +"R/icers.R",63,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (n_cost != n_eff | n_eff != n_strat) {","vector_logic_linter" +"R/icers.R",221,7,"warning","no visible global function definition for β€˜pivot_longer’"," pivot_longer(cols = everything(), names_to = ""Strategy"") %>%","object_usage_linter" +"R/icers.R",227,7,"warning","no visible global function definition for β€˜pivot_longer’"," pivot_longer(cols = everything(), names_to = ""Strategy"") %>%","object_usage_linter" +"R/metamodel.R",62,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (length(params) != 2 & analysis == ""twoway"") {","vector_logic_linter" +"R/metamodel.R",111,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (analysis == ""twoway"" | analysis == ""multiway"") {","vector_logic_linter" +"R/metamodel.R",324,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(i) & length(i) != 2) {","vector_logic_linter" +"R/metamodel.R",446,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (p_range[1] < psa_range[1] | p_range[2] > psa_range[2]) {","vector_logic_linter" +"R/owsa.R",136,7,"warning","no visible global function definition for β€˜pivot_longer’"," pivot_longer(cols = everything(),","object_usage_linter" +"R/owsa.R",181,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (min_rel_diff < 0 | min_rel_diff > 1) {","vector_logic_linter" +"R/psa.R",163,5,"warning","no visible global function definition for β€˜pivot_longer’"," pivot_longer(cost,","object_usage_linter" +"R/psa.R",169,5,"warning","no visible global function definition for β€˜pivot_longer’"," pivot_longer(effectiveness,","object_usage_linter" +"R/psa.R",204,32,"warning","no visible binding for global variable β€˜Effectiveness’"," ellipse(cor(Effectiveness, Cost),","object_usage_linter" +"R/psa.R",204,32,"warning","no visible binding for global variable β€˜Effectiveness’"," ellipse(cor(Effectiveness, Cost),","object_usage_linter" +"R/psa.R",204,32,"warning","no visible binding for global variable β€˜Effectiveness’"," ellipse(cor(Effectiveness, Cost),","object_usage_linter" +"R/psa.R",204,47,"warning","no visible binding for global variable β€˜Cost’"," ellipse(cor(Effectiveness, Cost),","object_usage_linter" +"R/psa.R",204,47,"warning","no visible binding for global variable β€˜Cost’"," ellipse(cor(Effectiveness, Cost),","object_usage_linter" +"R/psa.R",204,47,"warning","no visible binding for global variable β€˜Cost’"," ellipse(cor(Effectiveness, Cost),","object_usage_linter" +"R/run_dsa.R",52,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.list(params_basecase) | is.null(names(params_basecase))) {","vector_logic_linter" +"R/run_dsa.R",215,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.list(params_basecase) | is.null(names(params_basecase)))","vector_logic_linter" +"R/run_psa.R",85,78,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (i / (nrow(psa_samp) / 10) == round(i / (nrow(psa_samp) / 10), 0) & progress == TRUE) {","vector_logic_linter" +"R/run_psa.R",96,78,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (i / (nrow(psa_samp) / 10) == round(i / (nrow(psa_samp) / 10), 0) & progress == TRUE) {","vector_logic_linter" +"R/twsa.R",28,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(param1) | is.null(param2)) {","vector_logic_linter" +"tests/testthat/util_models_detfun.R",41,64,"style","Use FALSE instead of the symbol F."," nrow = length(state_name), byrow = F)","T_and_F_symbol_linter" +"vignettes/basic_cea.Rmd",71,33,"style","Put spaces around all infix operators.","icer_hiv <- calculate_icers(cost=v_hiv_costs, ","infix_spaces_linter" +"vignettes/basic_cea.Rmd",71,46,"style","Trailing whitespace is superfluous.","icer_hiv <- calculate_icers(cost=v_hiv_costs, ","trailing_whitespace_linter" +"vignettes/basic_cea.Rmd",72,35,"style","Put spaces around all infix operators."," effect=v_hiv_qalys, ","infix_spaces_linter" +"vignettes/basic_cea.Rmd",72,48,"style","Trailing whitespace is superfluous."," effect=v_hiv_qalys, ","trailing_whitespace_linter" +"vignettes/basic_cea.Rmd",73,39,"style","Put spaces around all infix operators."," strategies=v_hiv_strat_names)","infix_spaces_linter" +"vignettes/basic_cea.Rmd",101,15,"style","Trailing whitespace is superfluous.","plot(icer_hiv, ","trailing_whitespace_linter" +"vignettes/basic_cea.Rmd",102,11,"style","Put spaces around all infix operators."," label=""all"")","infix_spaces_linter" +"vignettes/basic_cea.Rmd",107,15,"style","Trailing whitespace is superfluous.","plot(icer_hiv, ","trailing_whitespace_linter" +"vignettes/basic_cea.Rmd",108,11,"style","Put spaces around all infix operators."," label=""all"") +","infix_spaces_linter" +"vignettes/basic_cea.Rmd",157,25,"style","Put spaces around all infix operators."," filter(Status == ""ND"")%>%","infix_spaces_linter" +"vignettes/dsa_generation.Rmd",43,80,"style","Trailing whitespace is superfluous."," # -- disease progression parameters (annual): r_HD, p_S1S2, hr_S1D, hr_S2D, ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",49,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",51,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",55,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",57,24,"warning","no visible binding for global variable β€˜r_disc’"," v_dw <- 1 / ((1 + r_disc) ^ (0:n_cycles))","object_usage_linter" +"vignettes/dsa_generation.Rmd",57,37,"warning","no visible binding for global variable β€˜n_cycles’"," v_dw <- 1 / ((1 + r_disc) ^ (0:n_cycles))","object_usage_linter" +"vignettes/dsa_generation.Rmd",58,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",60,29,"warning","no visible binding for global variable β€˜c_H’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" +"vignettes/dsa_generation.Rmd",60,41,"warning","no visible binding for global variable β€˜c_S1’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" +"vignettes/dsa_generation.Rmd",60,54,"warning","no visible binding for global variable β€˜c_S2’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" +"vignettes/dsa_generation.Rmd",60,66,"warning","no visible binding for global variable β€˜c_D’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" +"vignettes/dsa_generation.Rmd",61,32,"warning","no visible binding for global variable β€˜u_H’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" +"vignettes/dsa_generation.Rmd",61,44,"warning","no visible binding for global variable β€˜u_S1’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" +"vignettes/dsa_generation.Rmd",61,57,"warning","no visible binding for global variable β€˜u_S2’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" +"vignettes/dsa_generation.Rmd",61,69,"warning","no visible binding for global variable β€˜u_D’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" +"vignettes/dsa_generation.Rmd",62,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",64,14,"warning","no visible binding for global variable β€˜hr_S1D’"," r_S1D <- hr_S1D * r_HD # rate of death in sick state","object_usage_linter" +"vignettes/dsa_generation.Rmd",64,23,"warning","no visible binding for global variable β€˜r_HD’"," r_S1D <- hr_S1D * r_HD # rate of death in sick state","object_usage_linter" +"vignettes/dsa_generation.Rmd",65,14,"warning","no visible binding for global variable β€˜hr_S2D’"," r_S2D <- hr_S2D * r_HD # rate of death in sicker state","object_usage_linter" +"vignettes/dsa_generation.Rmd",65,23,"warning","no visible binding for global variable β€˜r_HD’"," r_S2D <- hr_S2D * r_HD # rate of death in sicker state","object_usage_linter" +"vignettes/dsa_generation.Rmd",68,23,"warning","no visible binding for global variable β€˜r_HD’"," p_HD <- 1 - exp(-r_HD) # probability of dying when healthy","object_usage_linter" +"vignettes/dsa_generation.Rmd",69,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",70,48,"style","Trailing whitespace is superfluous."," ## Initialize transition probability matrix ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",71,85,"style","Trailing whitespace is superfluous."," # all transitions to a non-death state are assumed to be conditional on survival ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",72,21,"style","Trailing whitespace is superfluous."," m_P <- matrix(0, ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",73,52,"style","Trailing whitespace is superfluous."," nrow = n_states, ncol = n_states, ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",77,42,"warning","no visible binding for global variable β€˜p_HS1’"," m_P[""H"", ""H""] <- (1 - p_HD) * (1 - p_HS1) ","object_usage_linter" +"vignettes/dsa_generation.Rmd",77,48,"style","Trailing whitespace is superfluous."," m_P[""H"", ""H""] <- (1 - p_HD) * (1 - p_HS1) ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",78,37,"warning","no visible binding for global variable β€˜p_HS1’"," m_P[""H"", ""S1""] <- (1 - p_HD) * p_HS1 ","object_usage_linter" +"vignettes/dsa_generation.Rmd",78,42,"style","Trailing whitespace is superfluous."," m_P[""H"", ""S1""] <- (1 - p_HD) * p_HS1 ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",81,38,"warning","no visible binding for global variable β€˜p_S1H’"," m_P[""S1"", ""H""] <- (1 - p_S1D) * p_S1H","object_usage_linter" +"vignettes/dsa_generation.Rmd",82,44,"warning","no visible binding for global variable β€˜p_S1H’"," m_P[""S1"", ""S1""] <- (1 - p_S1D) * (1 - (p_S1H + p_S1S2))","object_usage_linter" +"vignettes/dsa_generation.Rmd",82,52,"warning","no visible binding for global variable β€˜p_S1S2’"," m_P[""S1"", ""S1""] <- (1 - p_S1D) * (1 - (p_S1H + p_S1S2))","object_usage_linter" +"vignettes/dsa_generation.Rmd",83,38,"warning","no visible binding for global variable β€˜p_S1S2’"," m_P[""S1"", ""S2""] <- (1 - p_S1D) * p_S1S2","object_usage_linter" +"vignettes/dsa_generation.Rmd",90,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",91,67,"style","Trailing whitespace is superfluous."," # check that all transition matrix entries are between 0 and 1 ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",92,7,"style","Place a space before left parenthesis, except in a function call."," if(!all(m_P <= 1 & m_P >= 0)){","spaces_left_parentheses_linter" +"vignettes/dsa_generation.Rmd",92,34,"style","There should be a space before an opening curly brace."," if(!all(m_P <= 1 & m_P >= 0)){","brace_linter" +"vignettes/dsa_generation.Rmd",92,34,"style","There should be a space between a right parenthesis and a body expression."," if(!all(m_P <= 1 & m_P >= 0)){","paren_body_linter" +"vignettes/dsa_generation.Rmd",96,47,"style","Commas should always have a space after."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","commas_linter" +"vignettes/dsa_generation.Rmd",96,53,"style","Commas should always have a space after."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","commas_linter" +"vignettes/dsa_generation.Rmd",96,64,"style","There should be a space before an opening curly brace."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","brace_linter" +"vignettes/dsa_generation.Rmd",96,64,"style","There should be a space between a right parenthesis and a body expression."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","paren_body_linter" +"vignettes/dsa_generation.Rmd",99,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",102,34,"warning","no visible binding for global variable β€˜n_cycles’"," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","object_usage_linter" +"vignettes/dsa_generation.Rmd",102,34,"warning","no visible binding for global variable β€˜n_cycles’"," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","object_usage_linter" +"vignettes/dsa_generation.Rmd",102,46,"style","Commas should never have a space before."," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","commas_linter" +"vignettes/dsa_generation.Rmd",102,48,"style","Trailing whitespace is superfluous."," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",105,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",107,36,"warning","no visible binding for global variable β€˜n_cycles’"," v_C <- v_Q <- numeric(length = n_cycles + 1)","object_usage_linter" +"vignettes/dsa_generation.Rmd",108,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",110,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",111,21,"warning","no visible binding for global variable β€˜v_s_init’"," m_Trace[1, ] <- v_s_init # initialize Markov trace","object_usage_linter" +"vignettes/dsa_generation.Rmd",114,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",115,17,"warning","no visible binding for global variable β€˜n_cycles’"," for (t in 1:n_cycles){ # throughout the number of cycles","object_usage_linter" +"vignettes/dsa_generation.Rmd",117,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",119,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",121,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",123,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",125,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",128,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",131,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",133,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",136,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",144,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",156,56,"style","There should be a space before an opening curly brace.","simulate_strategies <- function(l_params, wtp = 100000){","brace_linter" +"vignettes/dsa_generation.Rmd",156,56,"style","There should be a space between a right parenthesis and a body expression.","simulate_strategies <- function(l_params, wtp = 100000){","paren_body_linter" +"vignettes/dsa_generation.Rmd",159,80,"style","Trailing whitespace is superfluous."," # -- disease progression parameters (annual): r_HD, p_S1S2, hr_S1D, hr_S2D, ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",169,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",171,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",177,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",180,18,"warning","no visible binding for global variable β€˜u_trtA’"," u_S1_trtA <- u_trtA","object_usage_linter" +"vignettes/dsa_generation.Rmd",182,18,"warning","no visible binding for global variable β€˜c_S1’"," c_S1_trtA <- c_S1 + c_trtA","object_usage_linter" +"vignettes/dsa_generation.Rmd",182,25,"warning","no visible binding for global variable β€˜c_trtA’"," c_S1_trtA <- c_S1 + c_trtA","object_usage_linter" +"vignettes/dsa_generation.Rmd",183,18,"warning","no visible binding for global variable β€˜c_S2’"," c_S2_trtA <- c_S2 + c_trtA","object_usage_linter" +"vignettes/dsa_generation.Rmd",183,25,"warning","no visible binding for global variable β€˜c_trtA’"," c_S2_trtA <- c_S2 + c_trtA","object_usage_linter" +"vignettes/dsa_generation.Rmd",184,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",187,29,"warning","no visible binding for global variable β€˜p_S1S2’"," r_S1S2_trtB <- -log(1 - p_S1S2) * hr_S1S2_trtB ","object_usage_linter" +"vignettes/dsa_generation.Rmd",187,39,"warning","no visible binding for global variable β€˜hr_S1S2_trtB’"," r_S1S2_trtB <- -log(1 - p_S1S2) * hr_S1S2_trtB ","object_usage_linter" +"vignettes/dsa_generation.Rmd",187,51,"style","Trailing whitespace is superfluous."," r_S1S2_trtB <- -log(1 - p_S1S2) * hr_S1S2_trtB ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",190,18,"warning","no visible binding for global variable β€˜c_S1’"," c_S1_trtB <- c_S1 + c_trtB","object_usage_linter" +"vignettes/dsa_generation.Rmd",190,25,"warning","no visible binding for global variable β€˜c_trtB’"," c_S1_trtB <- c_S1 + c_trtB","object_usage_linter" +"vignettes/dsa_generation.Rmd",191,18,"warning","no visible binding for global variable β€˜c_S2’"," c_S2_trtB <- c_S2 + c_trtB","object_usage_linter" +"vignettes/dsa_generation.Rmd",191,25,"warning","no visible binding for global variable β€˜c_trtB’"," c_S2_trtB <- c_S2 + c_trtB","object_usage_linter" +"vignettes/dsa_generation.Rmd",193,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",194,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",202,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",203,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",206,42,"warning","no visible binding for global variable β€˜n_cycles’"," l_params_markov <- list(n_cycles = n_cycles, r_disc = r_disc, v_s_init = v_s_init,","object_usage_linter" +"vignettes/dsa_generation.Rmd",206,61,"warning","no visible binding for global variable β€˜r_disc’"," l_params_markov <- list(n_cycles = n_cycles, r_disc = r_disc, v_s_init = v_s_init,","object_usage_linter" +"vignettes/dsa_generation.Rmd",206,80,"warning","no visible binding for global variable β€˜v_s_init’"," l_params_markov <- list(n_cycles = n_cycles, r_disc = r_disc, v_s_init = v_s_init,","object_usage_linter" +"vignettes/dsa_generation.Rmd",207,38,"warning","no visible binding for global variable β€˜c_H’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" +"vignettes/dsa_generation.Rmd",207,50,"warning","no visible binding for global variable β€˜c_S2’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" +"vignettes/dsa_generation.Rmd",207,63,"warning","no visible binding for global variable β€˜c_S1’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" +"vignettes/dsa_generation.Rmd",207,75,"warning","no visible binding for global variable β€˜c_D’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" +"vignettes/dsa_generation.Rmd",208,38,"warning","no visible binding for global variable β€˜u_H’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" +"vignettes/dsa_generation.Rmd",208,50,"warning","no visible binding for global variable β€˜u_S2’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" +"vignettes/dsa_generation.Rmd",208,63,"warning","no visible binding for global variable β€˜u_S1’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" +"vignettes/dsa_generation.Rmd",208,75,"warning","no visible binding for global variable β€˜u_D’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" +"vignettes/dsa_generation.Rmd",209,38,"warning","no visible binding for global variable β€˜r_HD’"," r_HD = r_HD, hr_S1D = hr_S1D, hr_S2D = hr_S2D,","object_usage_linter" +"vignettes/dsa_generation.Rmd",209,53,"warning","no visible binding for global variable β€˜hr_S1D’"," r_HD = r_HD, hr_S1D = hr_S1D, hr_S2D = hr_S2D,","object_usage_linter" +"vignettes/dsa_generation.Rmd",209,70,"warning","no visible binding for global variable β€˜hr_S2D’"," r_HD = r_HD, hr_S1D = hr_S1D, hr_S2D = hr_S2D,","object_usage_linter" +"vignettes/dsa_generation.Rmd",210,39,"warning","no visible binding for global variable β€˜p_HS1’"," p_HS1 = p_HS1, p_S1H = p_S1H, p_S1S2 = p_S1S2)","object_usage_linter" +"vignettes/dsa_generation.Rmd",210,54,"warning","no visible binding for global variable β€˜p_S1H’"," p_HS1 = p_HS1, p_S1H = p_S1H, p_S1S2 = p_S1S2)","object_usage_linter" +"vignettes/dsa_generation.Rmd",210,70,"warning","no visible binding for global variable β€˜p_S1S2’"," p_HS1 = p_HS1, p_S1H = p_S1H, p_S1S2 = p_S1S2)","object_usage_linter" +"vignettes/dsa_generation.Rmd",211,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",212,45,"style","There should be a space before an opening curly brace."," if (v_names_strat[i] == ""Treatment_A""){","brace_linter" +"vignettes/dsa_generation.Rmd",212,45,"style","There should be a space between a right parenthesis and a body expression."," if (v_names_strat[i] == ""Treatment_A""){","paren_body_linter" +"vignettes/dsa_generation.Rmd",216,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",217,16,"style","Place a space before left parenthesis, except in a function call."," } else if(v_names_strat[i] == ""Treatment_B""){","spaces_left_parentheses_linter" +"vignettes/dsa_generation.Rmd",217,51,"style","There should be a space before an opening curly brace."," } else if(v_names_strat[i] == ""Treatment_B""){","brace_linter" +"vignettes/dsa_generation.Rmd",217,51,"style","There should be a space between a right parenthesis and a body expression."," } else if(v_names_strat[i] == ""Treatment_B""){","paren_body_linter" +"vignettes/dsa_generation.Rmd",224,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",230,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",242,41,"style","Trailing whitespace is superfluous."," r_HD = 0.002, ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",243,39,"style","Trailing whitespace is superfluous."," hr_S1D = 3, ","trailing_whitespace_linter" +"vignettes/dsa_generation.Rmd",248,41,"style","Trailing whitespace is superfluous."," c_S2 = 15000, ","trailing_whitespace_linter" +"vignettes/psa_analysis.Rmd",98,28,"style","Trailing whitespace is superfluous.","psa_sum <- summary(psa_obj, ","trailing_whitespace_linter" +"vignettes/psa_analysis.Rmd",106,50,"style","Trailing whitespace is superfluous.","icers <- calculate_icers(cost = psa_sum$meanCost, ","trailing_whitespace_linter" +"vignettes/psa_analysis.Rmd",107,54,"style","Trailing whitespace is superfluous."," effect = psa_sum$meanEffect, ","trailing_whitespace_linter" +"vignettes/psa_analysis.Rmd",119,40,"style","Trailing whitespace is superfluous.","ceac_obj <- ceac(wtp = example_psa$wtp, ","trailing_whitespace_linter" +"vignettes/psa_analysis.Rmd",133,15,"style","Trailing whitespace is superfluous.","plot(ceac_obj, ","trailing_whitespace_linter" +"vignettes/psa_analysis.Rmd",134,22,"style","Trailing whitespace is superfluous."," frontier = TRUE, ","trailing_whitespace_linter" +"vignettes/psa_analysis.Rmd",145,43,"style","Trailing whitespace is superfluous.","el <- calc_exp_loss(wtp = example_psa$wtp, ","trailing_whitespace_linter" +"vignettes/psa_analysis.Rmd",148,9,"style","Trailing whitespace is superfluous.","plot(el, ","trailing_whitespace_linter" +"vignettes/psa_analysis.Rmd",149,20,"style","Trailing whitespace is superfluous."," n_x_ticks = 8, ","trailing_whitespace_linter" +"vignettes/psa_analysis.Rmd",183,16,"style","Trailing whitespace is superfluous.","owsa_tornado(o, ","trailing_whitespace_linter" +"vignettes/psa_analysis.Rmd",189,16,"style","Trailing whitespace is superfluous.","owsa_tornado(o, ","trailing_whitespace_linter" +"vignettes/psa_analysis.Rmd",198,18,"style","Trailing whitespace is superfluous.","owsa_opt_strat(o, ","trailing_whitespace_linter" +"vignettes/psa_analysis.Rmd",205,18,"style","Trailing whitespace is superfluous.","owsa_opt_strat(o, ","trailing_whitespace_linter" +"vignettes/psa_analysis.Rmd",214,20,"style","Trailing whitespace is superfluous.","tw <- twsa(psa_obj, ","trailing_whitespace_linter" +"vignettes/psa_analysis.Rmd",215,34,"style","Trailing whitespace is superfluous."," param1 = ""pFailChemo"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",39,80,"style","Trailing whitespace is superfluous."," # -- disease progression parameters (annual): r_HD, p_S1S2, hr_S1D, hr_S2D, ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",45,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",47,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",51,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",53,24,"warning","no visible binding for global variable β€˜r_disc’"," v_dw <- 1 / ((1 + r_disc) ^ (0:n_cycles))","object_usage_linter" +"vignettes/psa_generation.Rmd",53,37,"warning","no visible binding for global variable β€˜n_cycles’"," v_dw <- 1 / ((1 + r_disc) ^ (0:n_cycles))","object_usage_linter" +"vignettes/psa_generation.Rmd",54,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",56,29,"warning","no visible binding for global variable β€˜c_H’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" +"vignettes/psa_generation.Rmd",56,41,"warning","no visible binding for global variable β€˜c_S1’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" +"vignettes/psa_generation.Rmd",56,54,"warning","no visible binding for global variable β€˜c_S2’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" +"vignettes/psa_generation.Rmd",56,66,"warning","no visible binding for global variable β€˜c_D’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" +"vignettes/psa_generation.Rmd",57,32,"warning","no visible binding for global variable β€˜u_H’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" +"vignettes/psa_generation.Rmd",57,44,"warning","no visible binding for global variable β€˜u_S1’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" +"vignettes/psa_generation.Rmd",57,57,"warning","no visible binding for global variable β€˜u_S2’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" +"vignettes/psa_generation.Rmd",57,69,"warning","no visible binding for global variable β€˜u_D’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" +"vignettes/psa_generation.Rmd",58,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",60,14,"warning","no visible binding for global variable β€˜hr_S1D’"," r_S1D <- hr_S1D * r_HD # rate of death in sick state","object_usage_linter" +"vignettes/psa_generation.Rmd",60,23,"warning","no visible binding for global variable β€˜r_HD’"," r_S1D <- hr_S1D * r_HD # rate of death in sick state","object_usage_linter" +"vignettes/psa_generation.Rmd",61,14,"warning","no visible binding for global variable β€˜hr_S2D’"," r_S2D <- hr_S2D * r_HD # rate of death in sicker state","object_usage_linter" +"vignettes/psa_generation.Rmd",61,23,"warning","no visible binding for global variable β€˜r_HD’"," r_S2D <- hr_S2D * r_HD # rate of death in sicker state","object_usage_linter" +"vignettes/psa_generation.Rmd",64,23,"warning","no visible binding for global variable β€˜r_HD’"," p_HD <- 1 - exp(-r_HD) # probability of dying when healthy","object_usage_linter" +"vignettes/psa_generation.Rmd",65,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",66,48,"style","Trailing whitespace is superfluous."," ## Initialize transition probability matrix ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",67,85,"style","Trailing whitespace is superfluous."," # all transitions to a non-death state are assumed to be conditional on survival ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",68,21,"style","Trailing whitespace is superfluous."," m_P <- matrix(0, ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",69,52,"style","Trailing whitespace is superfluous."," nrow = n_states, ncol = n_states, ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",73,42,"warning","no visible binding for global variable β€˜p_HS1’"," m_P[""H"", ""H""] <- (1 - p_HD) * (1 - p_HS1) ","object_usage_linter" +"vignettes/psa_generation.Rmd",73,48,"style","Trailing whitespace is superfluous."," m_P[""H"", ""H""] <- (1 - p_HD) * (1 - p_HS1) ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",74,37,"warning","no visible binding for global variable β€˜p_HS1’"," m_P[""H"", ""S1""] <- (1 - p_HD) * p_HS1 ","object_usage_linter" +"vignettes/psa_generation.Rmd",74,42,"style","Trailing whitespace is superfluous."," m_P[""H"", ""S1""] <- (1 - p_HD) * p_HS1 ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",77,38,"warning","no visible binding for global variable β€˜p_S1H’"," m_P[""S1"", ""H""] <- (1 - p_S1D) * p_S1H","object_usage_linter" +"vignettes/psa_generation.Rmd",78,44,"warning","no visible binding for global variable β€˜p_S1H’"," m_P[""S1"", ""S1""] <- (1 - p_S1D) * (1 - (p_S1H + p_S1S2))","object_usage_linter" +"vignettes/psa_generation.Rmd",78,52,"warning","no visible binding for global variable β€˜p_S1S2’"," m_P[""S1"", ""S1""] <- (1 - p_S1D) * (1 - (p_S1H + p_S1S2))","object_usage_linter" +"vignettes/psa_generation.Rmd",79,38,"warning","no visible binding for global variable β€˜p_S1S2’"," m_P[""S1"", ""S2""] <- (1 - p_S1D) * p_S1S2","object_usage_linter" +"vignettes/psa_generation.Rmd",86,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",87,67,"style","Trailing whitespace is superfluous."," # check that all transition matrix entries are between 0 and 1 ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",88,7,"style","Place a space before left parenthesis, except in a function call."," if(!all(m_P <= 1 & m_P >= 0)){","spaces_left_parentheses_linter" +"vignettes/psa_generation.Rmd",88,34,"style","There should be a space before an opening curly brace."," if(!all(m_P <= 1 & m_P >= 0)){","brace_linter" +"vignettes/psa_generation.Rmd",88,34,"style","There should be a space between a right parenthesis and a body expression."," if(!all(m_P <= 1 & m_P >= 0)){","paren_body_linter" +"vignettes/psa_generation.Rmd",92,47,"style","Commas should always have a space after."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","commas_linter" +"vignettes/psa_generation.Rmd",92,53,"style","Commas should always have a space after."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","commas_linter" +"vignettes/psa_generation.Rmd",92,64,"style","There should be a space before an opening curly brace."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","brace_linter" +"vignettes/psa_generation.Rmd",92,64,"style","There should be a space between a right parenthesis and a body expression."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","paren_body_linter" +"vignettes/psa_generation.Rmd",95,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",98,34,"warning","no visible binding for global variable β€˜n_cycles’"," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","object_usage_linter" +"vignettes/psa_generation.Rmd",98,34,"warning","no visible binding for global variable β€˜n_cycles’"," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","object_usage_linter" +"vignettes/psa_generation.Rmd",98,46,"style","Commas should never have a space before."," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","commas_linter" +"vignettes/psa_generation.Rmd",98,48,"style","Trailing whitespace is superfluous."," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",101,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",103,36,"warning","no visible binding for global variable β€˜n_cycles’"," v_C <- v_Q <- numeric(length = n_cycles + 1)","object_usage_linter" +"vignettes/psa_generation.Rmd",104,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",106,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",107,21,"warning","no visible binding for global variable β€˜v_s_init’"," m_Trace[1, ] <- v_s_init # initialize Markov trace","object_usage_linter" +"vignettes/psa_generation.Rmd",110,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",111,17,"warning","no visible binding for global variable β€˜n_cycles’"," for (t in 1:n_cycles){ # throughout the number of cycles","object_usage_linter" +"vignettes/psa_generation.Rmd",113,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",115,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",117,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",119,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",121,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",124,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",127,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",129,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",132,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",140,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",148,56,"style","There should be a space before an opening curly brace.","simulate_strategies <- function(l_params, wtp = 100000){","brace_linter" +"vignettes/psa_generation.Rmd",148,56,"style","There should be a space between a right parenthesis and a body expression.","simulate_strategies <- function(l_params, wtp = 100000){","paren_body_linter" +"vignettes/psa_generation.Rmd",151,80,"style","Trailing whitespace is superfluous."," # -- disease progression parameters (annual): r_HD, p_S1S2, hr_S1D, hr_S2D, ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",161,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",163,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",169,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",172,18,"warning","no visible binding for global variable β€˜u_trtA’"," u_S1_trtA <- u_trtA","object_usage_linter" +"vignettes/psa_generation.Rmd",174,18,"warning","no visible binding for global variable β€˜c_S1’"," c_S1_trtA <- c_S1 + c_trtA","object_usage_linter" +"vignettes/psa_generation.Rmd",174,25,"warning","no visible binding for global variable β€˜c_trtA’"," c_S1_trtA <- c_S1 + c_trtA","object_usage_linter" +"vignettes/psa_generation.Rmd",175,18,"warning","no visible binding for global variable β€˜c_S2’"," c_S2_trtA <- c_S2 + c_trtA","object_usage_linter" +"vignettes/psa_generation.Rmd",175,25,"warning","no visible binding for global variable β€˜c_trtA’"," c_S2_trtA <- c_S2 + c_trtA","object_usage_linter" +"vignettes/psa_generation.Rmd",176,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",179,29,"warning","no visible binding for global variable β€˜p_S1S2’"," r_S1S2_trtB <- -log(1 - p_S1S2) * hr_S1S2_trtB ","object_usage_linter" +"vignettes/psa_generation.Rmd",179,39,"warning","no visible binding for global variable β€˜hr_S1S2_trtB’"," r_S1S2_trtB <- -log(1 - p_S1S2) * hr_S1S2_trtB ","object_usage_linter" +"vignettes/psa_generation.Rmd",179,51,"style","Trailing whitespace is superfluous."," r_S1S2_trtB <- -log(1 - p_S1S2) * hr_S1S2_trtB ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",182,18,"warning","no visible binding for global variable β€˜c_S1’"," c_S1_trtB <- c_S1 + c_trtB","object_usage_linter" +"vignettes/psa_generation.Rmd",182,25,"warning","no visible binding for global variable β€˜c_trtB’"," c_S1_trtB <- c_S1 + c_trtB","object_usage_linter" +"vignettes/psa_generation.Rmd",183,18,"warning","no visible binding for global variable β€˜c_S2’"," c_S2_trtB <- c_S2 + c_trtB","object_usage_linter" +"vignettes/psa_generation.Rmd",183,25,"warning","no visible binding for global variable β€˜c_trtB’"," c_S2_trtB <- c_S2 + c_trtB","object_usage_linter" +"vignettes/psa_generation.Rmd",185,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",186,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",194,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",195,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",198,42,"warning","no visible binding for global variable β€˜n_cycles’"," l_params_markov <- list(n_cycles = n_cycles, r_disc = r_disc, v_s_init = v_s_init,","object_usage_linter" +"vignettes/psa_generation.Rmd",198,61,"warning","no visible binding for global variable β€˜r_disc’"," l_params_markov <- list(n_cycles = n_cycles, r_disc = r_disc, v_s_init = v_s_init,","object_usage_linter" +"vignettes/psa_generation.Rmd",198,80,"warning","no visible binding for global variable β€˜v_s_init’"," l_params_markov <- list(n_cycles = n_cycles, r_disc = r_disc, v_s_init = v_s_init,","object_usage_linter" +"vignettes/psa_generation.Rmd",199,38,"warning","no visible binding for global variable β€˜c_H’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" +"vignettes/psa_generation.Rmd",199,50,"warning","no visible binding for global variable β€˜c_S2’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" +"vignettes/psa_generation.Rmd",199,63,"warning","no visible binding for global variable β€˜c_S1’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" +"vignettes/psa_generation.Rmd",199,75,"warning","no visible binding for global variable β€˜c_D’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" +"vignettes/psa_generation.Rmd",200,38,"warning","no visible binding for global variable β€˜u_H’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" +"vignettes/psa_generation.Rmd",200,50,"warning","no visible binding for global variable β€˜u_S2’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" +"vignettes/psa_generation.Rmd",200,63,"warning","no visible binding for global variable β€˜u_S1’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" +"vignettes/psa_generation.Rmd",200,75,"warning","no visible binding for global variable β€˜u_D’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" +"vignettes/psa_generation.Rmd",201,38,"warning","no visible binding for global variable β€˜r_HD’"," r_HD = r_HD, hr_S1D = hr_S1D, hr_S2D = hr_S2D,","object_usage_linter" +"vignettes/psa_generation.Rmd",201,53,"warning","no visible binding for global variable β€˜hr_S1D’"," r_HD = r_HD, hr_S1D = hr_S1D, hr_S2D = hr_S2D,","object_usage_linter" +"vignettes/psa_generation.Rmd",201,70,"warning","no visible binding for global variable β€˜hr_S2D’"," r_HD = r_HD, hr_S1D = hr_S1D, hr_S2D = hr_S2D,","object_usage_linter" +"vignettes/psa_generation.Rmd",202,39,"warning","no visible binding for global variable β€˜p_HS1’"," p_HS1 = p_HS1, p_S1H = p_S1H, p_S1S2 = p_S1S2)","object_usage_linter" +"vignettes/psa_generation.Rmd",202,54,"warning","no visible binding for global variable β€˜p_S1H’"," p_HS1 = p_HS1, p_S1H = p_S1H, p_S1S2 = p_S1S2)","object_usage_linter" +"vignettes/psa_generation.Rmd",202,70,"warning","no visible binding for global variable β€˜p_S1S2’"," p_HS1 = p_HS1, p_S1H = p_S1H, p_S1S2 = p_S1S2)","object_usage_linter" +"vignettes/psa_generation.Rmd",203,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",204,45,"style","There should be a space before an opening curly brace."," if (v_names_strat[i] == ""Treatment_A""){","brace_linter" +"vignettes/psa_generation.Rmd",204,45,"style","There should be a space between a right parenthesis and a body expression."," if (v_names_strat[i] == ""Treatment_A""){","paren_body_linter" +"vignettes/psa_generation.Rmd",208,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",209,16,"style","Place a space before left parenthesis, except in a function call."," } else if(v_names_strat[i] == ""Treatment_B""){","spaces_left_parentheses_linter" +"vignettes/psa_generation.Rmd",209,51,"style","There should be a space before an opening curly brace."," } else if(v_names_strat[i] == ""Treatment_B""){","brace_linter" +"vignettes/psa_generation.Rmd",209,51,"style","There should be a space between a right parenthesis and a body expression."," } else if(v_names_strat[i] == ""Treatment_B""){","paren_body_linter" +"vignettes/psa_generation.Rmd",216,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",222,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",238,24,"style","Trailing whitespace is superfluous."," ""p_HS1"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",239,24,"style","Trailing whitespace is superfluous."," ""p_S1H"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",240,25,"style","Trailing whitespace is superfluous."," ""p_S1S2"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",242,24,"style","Trailing whitespace is superfluous."," ""hr_S1"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",246,22,"style","Trailing whitespace is superfluous."," ""c_H"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",247,23,"style","Trailing whitespace is superfluous."," ""c_S1"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",254,23,"style","Trailing whitespace is superfluous."," ""u_S2"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",258,22,"style","Trailing whitespace is superfluous."," ""beta"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",259,22,"style","Trailing whitespace is superfluous."," ""beta"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",263,28,"style","Trailing whitespace is superfluous."," ""log-normal"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",266,23,"style","Trailing whitespace is superfluous."," ""gamma"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",267,23,"style","Trailing whitespace is superfluous."," ""gamma"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",269,23,"style","Trailing whitespace is superfluous."," ""gamma"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",270,23,"style","Trailing whitespace is superfluous."," ""gamma"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",272,34,"style","Trailing whitespace is superfluous."," ""truncated-normal"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",273,34,"style","Trailing whitespace is superfluous."," ""truncated-normal"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",274,34,"style","Trailing whitespace is superfluous."," ""truncated-normal"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",278,39,"style","Trailing whitespace is superfluous."," ""a, b"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",279,39,"style","Trailing whitespace is superfluous."," ""a, b"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",282,43,"style","Trailing whitespace is superfluous."," ""mean, sd"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",283,43,"style","Trailing whitespace is superfluous."," ""mean, sd"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",286,47,"style","Trailing whitespace is superfluous."," ""shape, scale"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",287,47,"style","Trailing whitespace is superfluous."," ""shape, scale"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",292,51,"style","Trailing whitespace is superfluous."," ""mean, sd, ll, ul"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",293,51,"style","Trailing whitespace is superfluous."," ""mean, sd, ll, ul"", ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",298,38,"style","Trailing whitespace is superfluous."," c(7.5, 42.5), ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",299,35,"style","Trailing whitespace is superfluous."," c(12, 12), ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",302,35,"style","Trailing whitespace is superfluous."," c(3, 0.5), ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",306,37,"style","Trailing whitespace is superfluous."," c(44.5, 45), ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",308,39,"style","Trailing whitespace is superfluous."," c(900, 16.67), ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",313,46,"style","Trailing whitespace is superfluous."," c(0.75, 0.02, NA, 1), ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",316,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",332,41,"style","Trailing whitespace is superfluous."," r_HD = 0.002, ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",333,39,"style","Trailing whitespace is superfluous."," hr_S1D = 3, ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",338,41,"style","Trailing whitespace is superfluous."," c_S2 = 15000, ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",364,62,"style","Trailing whitespace is superfluous.","cea_psa <- make_psa_obj(cost = psa_output$Cost$other_outcome, ","trailing_whitespace_linter" +"vignettes/psa_generation.Rmd",365,64,"style","Trailing whitespace is superfluous."," effect = psa_output$QALY$other_outcome, ","trailing_whitespace_linter" +"vignettes/voi.Rmd",37,42,"style","Trailing whitespace is superfluous.","psa_big <- make_psa_obj(example_psa$cost, ","trailing_whitespace_linter" +"vignettes/voi.Rmd",39,48,"style","Trailing whitespace is superfluous."," example_psa$parameters, ","trailing_whitespace_linter" +"vignettes/voi.Rmd",54,24,"style","Trailing whitespace is superfluous."," txtsize = 16, ","trailing_whitespace_linter" +"vignettes/voi.Rmd",55,33,"style","Trailing whitespace is superfluous."," effect_units = ""QALY"", ","trailing_whitespace_linter" +"vignettes/voi.Rmd",57,42,"style","Trailing whitespace is superfluous."," xbreaks = seq(0, 200, by = 10), ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/dampack/email-body b/.dev/revdep_emails/dampack/email-body new file mode 100644 index 000000000..5b693382a --- /dev/null +++ b/.dev/revdep_emails/dampack/email-body @@ -0,0 +1,29 @@ +Hello Greg Knowlton! Thank you for using {lintr} in your package {dampack}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/DARTH-git/dampack (hash: 09da4afe8cb56d99637ee1e51a67bfbdae6385d2) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 27s on CRAN vs. 14s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/dashboardthemes/attachments/dashboardthemes.warnings b/.dev/revdep_emails/dashboardthemes/attachments/dashboardthemes.warnings new file mode 100644 index 000000000..3c25f3e16 --- /dev/null +++ b/.dev/revdep_emails/dashboardthemes/attachments/dashboardthemes.warnings @@ -0,0 +1,263 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Linter closed_curly_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. +Trying to remove β€˜open_curly_linter’, β€˜undesirable_function_linter’, β€˜undesirable_operator_linter’ and β€˜todo_comment_linter’, which are not in `defaults`. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. diff --git a/.dev/revdep_emails/dashboardthemes/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/dashboardthemes/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..35aab9a3a --- /dev/null +++ b/.dev/revdep_emails/dashboardthemes/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,3 @@ +"filename","line_number","column_number","type","message","line","linter" +"vignettes/using_dashboardthemes.Rmd",70,3,"error","unexpected symbol"," ...",NA +"vignettes/using_dashboardthemes.Rmd",267,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" diff --git a/.dev/revdep_emails/dashboardthemes/email-body b/.dev/revdep_emails/dashboardthemes/email-body new file mode 100644 index 000000000..427c235c2 --- /dev/null +++ b/.dev/revdep_emails/dashboardthemes/email-body @@ -0,0 +1,29 @@ +Hello Nik Lilovski! Thank you for using {lintr} in your package {dashboardthemes}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/nik01010/dashboardthemes (hash: 107e5a56663ed586f54655754069f4680647f37c) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 11s on CRAN vs. 8s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/dat/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/dat/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..6e7ec86ce --- /dev/null +++ b/.dev/revdep_emails/dat/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,7 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/DataFrame.R",64,1,"style","Variable and function name style should be snake_case.","as.DataFrame.data.frame <- function(x, ...) {","object_name_linter" +"R/dataTableBackend.R",44,7,"style","Variable and function name style should be snake_case."," env$.__x__ <- x","object_name_linter" +"R/helper.R",20,13,"style","Variable and function name style should be snake_case."," .self$classOfX <- class(xS3)","object_name_linter" +"R/helper.R",23,13,"style","Variable and function name style should be snake_case."," .self$s4Object <- x","object_name_linter" +"R/helper.R",28,13,"style","Variable and function name style should be snake_case."," .self$classOfX <- class(x)","object_name_linter" +"R/useDplyr.R",12,1,"style","Variable and function name style should be snake_case.",".onAttach <- function(libname, pkgname) {","object_name_linter" diff --git a/.dev/revdep_emails/dat/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/dat/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..a856b4180 --- /dev/null +++ b/.dev/revdep_emails/dat/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,44 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/as.function.R",30,3,"style","`else` should come on the same line as the previous `}`."," else if (length(x) == 3) {","brace_linter" +"R/as.function.R",30,8,"style","Either both or neither branch in `if`/`else` should use curly braces."," else if (length(x) == 3) {","brace_linter" +"R/dataTableBackend.R",28,9,"style","Variable and function name style should be snake_case or symbols."," names(listOfNames) <- colsTmp","object_name_linter" +"R/FormulaList.R",47,9,"style","Variable and function name style should be snake_case or symbols."," names(formulaList) <- NULL","object_name_linter" +"R/FormulaList.R",62,3,"style","`else` should come on the same line as the previous `}`."," else if (is.list(object@.n)) {","brace_linter" +"R/helper.R",22,29,"style","Variable and function name style should be snake_case or symbols."," S3Part(x, needClass = ""data.frame"") <- data.frame()","object_name_linter" +"R/helper.R",27,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/helper.R",42,5,"style","`else` should come on the same line as the previous `}`."," else if (!is.null(classOfX)) {","brace_linter" +"R/helper.R",45,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/helper.R",81,10,"style","Variable and function name style should be snake_case or symbols."," S3Part(.Object) <- addTypeCheck(.Object@fun, class(.Object@prototype)) %>%","object_name_linter" +"R/helper.R",87,10,"style","Variable and function name style should be snake_case or symbols."," S3Part(.Object) <- addTypeCheck(.Object@fun, .Object@type)","object_name_linter" +"R/helper.R",92,11,"style","Compound semicolons are discouraged. Replace them by a newline."," force(f); force(l)","semicolon_linter" +"R/helper.R",106,11,"style","Compound semicolons are discouraged. Replace them by a newline."," force(f); force(type)","semicolon_linter" +"R/helper.R",196,10,"style","Variable and function name style should be snake_case or symbols."," S3Part(.Object) <- formula(tmp, lhs = 1, rhs = 1)","object_name_linter" +"R/helper.R",198,3,"style","Variable and function name style should be snake_case or symbols."," .Object@.n <- eval(.nUnevaluated, envir = environment(.Object))","object_name_linter" +"R/map.R",111,10,"style","Either both or neither branch in `if`/`else` should use curly braces."," ind <- if (length(p) == 1 && grepl(""^\\^"", p)) {","brace_linter" +"tests/testthat/test-DataFrame.R",85,9,"style","Variable and function name style should be snake_case or symbols."," datRef[""newVar""] <- datRef$x + 1","object_name_linter" +"tests/testthat/test-DataFrame.R",94,9,"style","Variable and function name style should be snake_case or symbols."," datRef[""newVar""] <- datRef$x + 1","object_name_linter" +"tests/testthat/test-DataFrame.R",95,9,"style","Variable and function name style should be snake_case or symbols."," datRef[""newVar1""] <- datRef$x + 2","object_name_linter" +"tests/testthat/test-DataFrame.R",105,9,"style","Variable and function name style should be snake_case or symbols."," datRef[""newVar""] <- datRef$x + 1","object_name_linter" +"tests/testthat/test-DataFrame.R",106,9,"style","Variable and function name style should be snake_case or symbols."," datRef[""newVar1""] <- datRef$x + 2","object_name_linter" +"tests/testthat/test-DataFrame.R",117,9,"style","Variable and function name style should be snake_case or symbols."," datRef[""newVar""] <- datRef$x + 1","object_name_linter" +"tests/testthat/test-DataFrame.R",118,9,"style","Variable and function name style should be snake_case or symbols."," datRef[""newVar1""] <- datRef$x + 2","object_name_linter" +"tests/testthat/test-DataFrame.R",126,9,"style","Variable and function name style should be snake_case or symbols."," datRef$id <- datRef$x > 4","object_name_linter" +"tests/testthat/test-DataFrame.R",128,15,"style","Variable and function name style should be snake_case or symbols."," names(datRef)[2] <- ""count""","object_name_linter" +"vignettes/Introduction.Rmd",136,1,"style","Variable and function name style should be snake_case or symbols.","DataTable <- function(...) {","object_name_linter" +"vignettes/performance.Rmd",56,1,"style","Variable and function name style should be snake_case or symbols.","N <- 2e7 # more is not possible with small laptop","object_name_linter" +"vignettes/performance.Rmd",57,1,"style","Variable and function name style should be snake_case or symbols.","K <- 100","object_name_linter" +"vignettes/performance.Rmd",60,1,"style","Variable and function name style should be snake_case or symbols.","DT <- data.table(","object_name_linter" +"vignettes/performance.Rmd",61,33,"style","Commas should always have a space after."," id1 = sample(sprintf(""id%03d"",1:K), N, TRUE), # large groups (char)","commas_linter" +"vignettes/performance.Rmd",62,33,"style","Commas should always have a space after."," id2 = sample(sprintf(""id%03d"",1:K), N, TRUE), # large groups (char)","commas_linter" +"vignettes/performance.Rmd",63,34,"style","Commas should always have a space after."," id3 = sample(sprintf(""id%010d"",1:(N/K)), N, TRUE), # small groups (char)","commas_linter" +"vignettes/performance.Rmd",63,38,"style","Put spaces around all infix operators."," id3 = sample(sprintf(""id%010d"",1:(N/K)), N, TRUE), # small groups (char)","infix_spaces_linter" +"vignettes/performance.Rmd",66,17,"style","Put spaces around all infix operators."," id6 = sample(N/K, N, TRUE), # small groups (int)","infix_spaces_linter" +"vignettes/performance.Rmd",69,32,"style","Commas should always have a space after."," v3 = sample(round(runif(100,max=100),4), N, TRUE) # numeric e.g. 23.5749","commas_linter" +"vignettes/performance.Rmd",69,35,"style","Put spaces around all infix operators."," v3 = sample(round(runif(100,max=100),4), N, TRUE) # numeric e.g. 23.5749","infix_spaces_linter" +"vignettes/performance.Rmd",69,41,"style","Commas should always have a space after."," v3 = sample(round(runif(100,max=100),4), N, TRUE) # numeric e.g. 23.5749","commas_linter" +"vignettes/performance.Rmd",74,1,"style","Variable and function name style should be snake_case or symbols.","DT4 <- new(""DataTable"", DT)","object_name_linter" +"vignettes/performance.Rmd",76,29,"style","Commas should always have a space after.","cat(""GB ="", round(sum(gc()[,2]) / 1024, 3), ""\n"")","commas_linter" +"vignettes/performance.Rmd",105,81,"style","Lines should not be more than 80 characters.","system.time(group_by(DT, id4) %>% summarise(V1 = mean(v1), V2 = mean(v2), V3 = mean(v3)))","line_length_linter" +"vignettes/performance.Rmd",106,81,"style","Lines should not be more than 80 characters.","system.time(group_by(DT, id4) %>% summarise(V1 = mean(v1), V2 = mean(v2), V3 = mean(v3)))","line_length_linter" +"vignettes/performance.Rmd",112,81,"style","Lines should not be more than 80 characters.","system.time(group_by(DT, id6) %>% summarise(V1 = sum(v1), V2 = sum(v2), V3 = sum(v3)))","line_length_linter" +"vignettes/performance.Rmd",113,81,"style","Lines should not be more than 80 characters.","system.time(group_by(DT, id6) %>% summarise(V1 = sum(v1), V2 = sum(v2), V3 = sum(v3)))","line_length_linter" diff --git a/.dev/revdep_emails/dat/email-body b/.dev/revdep_emails/dat/email-body new file mode 100644 index 000000000..fbea9e5cc --- /dev/null +++ b/.dev/revdep_emails/dat/email-body @@ -0,0 +1,29 @@ +Hello Sebastian Warnholz! Thank you for using {lintr} in your package {dat}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/wahani/dat (hash: 1e5f56bc36f67bcf1cccb29e48e73cce3406c679) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 18s on CRAN vs. 11s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/datarobot/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/datarobot/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..71597f503 --- /dev/null +++ b/.dev/revdep_emails/datarobot/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,104 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/doc/AdvancedVignette.R",112,4,"style","Variable and function name style should be snake_case.","lc$binWeight <- NULL","object_name_linter" +"inst/doc/Calendars.R",61,10,"style","Variable and function name style should be snake_case.","calendar$projectIds <- list(""59dab74bbd2a54035786bfc0"")","object_name_linter" +"inst/doc/VariableImportance.R",87,10,"style","Variable and function name style should be snake_case."," deltas$New <- xRef","object_name_linter" +"R/AdvancedTuning.R",34,10,"style","Variable and function name style should be snake_case."," params$tuningParameters <- lapply(params$tuningParameters,","object_name_linter" +"R/Blueprints.R",22,39,"style","Variable and function name style should be snake_case."," blueprint$blueprintId <- blueprint$id","object_name_linter" +"R/Calendars.R",42,10,"style","Variable and function name style should be snake_case."," body$multiseriesIdColumns <- jsonlite::toJSON(multiSeriesIdColumn)","object_name_linter" +"R/CloneProject.R",25,10,"style","Variable and function name style should be snake_case."," body$projectId <- projectId","object_name_linter" +"R/CloneProject.R",26,10,"style","Variable and function name style should be snake_case."," body$projectName <- newProjectName","object_name_linter" +"R/ComplianceDocumentation.R",105,9,"style","Variable and function name style should be snake_case."," query$namePart <- namePart","object_name_linter" +"R/ConfusionChart.R",71,16,"style","Variable and function name style should be snake_case."," chart$data$classMetrics <- as.list(chart$data$classMetrics[[1]])","object_name_linter" +"R/ConfusionChart.R",73,16,"style","Variable and function name style should be snake_case."," chart$data$confusionMatrix <- chart$data$confusionMatrix[[1]]","object_name_linter" +"R/DataSources.R",17,12,"style","Variable and function name style should be snake_case."," elements$dataStoreId <- elements$params$dataStoreId","object_name_linter" +"R/Deployment.R",34,8,"style","Variable and function name style should be snake_case."," body$defaultPredictionServerId <- defaultPredictionServerId","object_name_linter" +"R/Deployment.R",155,7,"style","Variable and function name style should be snake_case."," out$modelHealth <- ApplySchema(out$modelHealth,","object_name_linter" +"R/Deployment.R",157,7,"style","Variable and function name style should be snake_case."," out$accuracyHealth <- ApplySchema(out$accuracyHealth,","object_name_linter" +"R/Deployment.R",159,7,"style","Variable and function name style should be snake_case."," out$serviceHealth <- ApplySchema(out$serviceHealth,","object_name_linter" +"R/Deployment.R",161,7,"style","Variable and function name style should be snake_case."," out$predictionUsage <- ApplySchema(out$predictionUsage,","object_name_linter" +"R/Deployment.R",367,7,"style","Variable and function name style should be snake_case."," out$targetDrift <- ApplySchema(out$targetDrift, ""enabled"")","object_name_linter" +"R/Deployment.R",368,7,"style","Variable and function name style should be snake_case."," out$featureDrift <- ApplySchema(out$featureDrift, ""enabled"")","object_name_linter" +"R/Deployment.R",369,7,"style","Variable and function name style should be snake_case."," out$associationId <- ApplySchema(out$associationId, c(""columnNames"",","object_name_linter" +"R/Deployment.R",395,10,"style","Variable and function name style should be snake_case."," body$targetDrift <- list(enabled = targetDriftEnabled)","object_name_linter" +"R/Deployment.R",398,10,"style","Variable and function name style should be snake_case."," body$featureDrift <- list(enabled = featureDriftEnabled)","object_name_linter" +"R/Deployment.R",584,7,"style","Variable and function name style should be snake_case."," out$dataRobotKey <- out[[""datarobot-key""]]","object_name_linter" +"R/DeploymentAccuracy.R",68,11,"style","Variable and function name style should be snake_case."," query$modelId <- modelId","object_name_linter" +"R/DeploymentAccuracy.R",75,11,"style","Variable and function name style should be snake_case."," query$segmentAttribute <- segmentAttribute","object_name_linter" +"R/DeploymentAccuracy.R",76,11,"style","Variable and function name style should be snake_case."," query$segmentValue <- segmentValue","object_name_linter" +"R/DeploymentAccuracy.R",77,11,"style","Variable and function name style should be snake_case."," query$targetClasses <- targetClasses","object_name_linter" +"R/DeploymentAccuracy.R",187,11,"style","Variable and function name style should be snake_case."," query$modelId <- modelId","object_name_linter" +"R/DeploymentAccuracy.R",194,11,"style","Variable and function name style should be snake_case."," query$bucketSize <- bucketSize","object_name_linter" +"R/DeploymentAccuracy.R",195,11,"style","Variable and function name style should be snake_case."," query$segmentAttribute <- segmentAttribute","object_name_linter" +"R/DeploymentAccuracy.R",196,11,"style","Variable and function name style should be snake_case."," query$segmentValue <- segmentValue","object_name_linter" +"R/DeploymentAccuracy.R",223,25,"style","Variable and function name style should be snake_case."," outlist$summary$sampleSize <- 0L","object_name_linter" +"R/DeploymentAccuracy.R",234,26,"style","Variable and function name style should be snake_case."," outlist$baseline$sampleSize <- 0L","object_name_linter" +"R/DeploymentServiceStats.R",76,11,"style","Variable and function name style should be snake_case."," query$modelId <- modelId","object_name_linter" +"R/DeploymentServiceStats.R",83,11,"style","Variable and function name style should be snake_case."," query$executionTimeQuantile <- executionTimeQuantile","object_name_linter" +"R/DeploymentServiceStats.R",84,11,"style","Variable and function name style should be snake_case."," query$responseTimeQuantile <- responseTimeQuantile","object_name_linter" +"R/DeploymentServiceStats.R",85,11,"style","Variable and function name style should be snake_case."," query$slowRequestsThreshold <- slowRequestsThreshold","object_name_linter" +"R/DeploymentServiceStats.R",86,11,"style","Variable and function name style should be snake_case."," query$segmentAttribute <- segmentAttribute","object_name_linter" +"R/DeploymentServiceStats.R",87,11,"style","Variable and function name style should be snake_case."," query$segmentValue <- segmentValue","object_name_linter" +"R/DeploymentServiceStats.R",99,21,"style","Variable and function name style should be snake_case."," outlist$metrics$totalRequests <- as.integer(outlist$metrics$totalRequests)","object_name_linter" +"R/DeploymentServiceStats.R",100,21,"style","Variable and function name style should be snake_case."," outlist$metrics$slowRequests <- as.integer(outlist$metrics$slowRequests)","object_name_linter" +"R/DeploymentServiceStats.R",101,21,"style","Variable and function name style should be snake_case."," outlist$metrics$medianLoad <- as.integer(outlist$metrics$medianLoad)","object_name_linter" +"R/DeploymentServiceStats.R",102,21,"style","Variable and function name style should be snake_case."," outlist$metrics$peakLoad <- as.integer(outlist$metrics$peakLoad)","object_name_linter" +"R/DeploymentServiceStats.R",103,21,"style","Variable and function name style should be snake_case."," outlist$metrics$numConsumers <- as.integer(outlist$metrics$numConsumers)","object_name_linter" +"R/DeploymentServiceStats.R",211,11,"style","Variable and function name style should be snake_case."," query$modelId <- modelId","object_name_linter" +"R/DeploymentServiceStats.R",218,11,"style","Variable and function name style should be snake_case."," query$bucketSize <- bucketSize","object_name_linter" +"R/DeploymentServiceStats.R",221,11,"style","Variable and function name style should be snake_case."," query$segmentAttribute <- segmentAttribute","object_name_linter" +"R/DeploymentServiceStats.R",222,11,"style","Variable and function name style should be snake_case."," query$segmentValue <- segmentValue","object_name_linter" +"R/Featurelists.R",262,11,"style","Variable and function name style should be snake_case."," flist$featurelistId <- flist$id","object_name_linter" +"R/Featurelists.R",298,11,"style","Variable and function name style should be snake_case."," flist$featurelistId <- flist$id","object_name_linter" +"R/Features.R",219,9,"style","Variable and function name style should be snake_case."," query$binLimit <- binLimit","object_name_linter" +"R/GetPredictions.R",241,9,"style","Variable and function name style should be snake_case."," query$modelId <- modelId","object_name_linter" +"R/GetPredictions.R",242,9,"style","Variable and function name style should be snake_case."," query$datasetId <- datasetId","object_name_linter" +"R/Models.R",236,33,"style","Variable and function name style should be snake_case."," model$projectName <- fullProject$projectName","object_name_linter" +"R/Models.R",237,33,"style","Variable and function name style should be snake_case."," model$projectTarget <- fullProject$target","object_name_linter" +"R/Models.R",238,33,"style","Variable and function name style should be snake_case."," model$projectMetric <- fullProject$metric","object_name_linter" +"R/Models.R",519,10,"style","Variable and function name style should be snake_case."," body$samplePct <- samplePct","object_name_linter" +"R/Models.R",522,10,"style","Variable and function name style should be snake_case."," body$trainingRowCount <- trainingRowCount","object_name_linter" +"R/MultiSeries.R",121,13,"style","Variable and function name style should be snake_case."," payload$multiseriesIdColumns <- multiseriesIdColumns","object_name_linter" +"R/MultiSeries.R",192,13,"style","Variable and function name style should be snake_case."," payload$multiseriesIdColumn <- multiseriesIdColumns","object_name_linter" +"R/MultiSeries.R",202,13,"style","Variable and function name style should be snake_case."," payload$crossSeriesGroupByColumns <- crossSeriesGroupByColumns","object_name_linter" +"R/Partitions.R",172,17,"style","Variable and function name style should be snake_case."," partition$cvHoldoutLevel <- NA","object_name_linter" +"R/Partitions.R",174,17,"style","Variable and function name style should be snake_case."," partition$cvHoldoutLevel <- cvHoldoutLevel","object_name_linter" +"R/Partitions.R",181,17,"style","Variable and function name style should be snake_case."," partition$trainingLevel <- trainingLevel","object_name_linter" +"R/Partitions.R",182,17,"style","Variable and function name style should be snake_case."," partition$holdoutLevel <- holdoutLevel","object_name_linter" +"R/Partitions.R",188,17,"style","Variable and function name style should be snake_case."," partition$validationLevel <- validationLevel","object_name_linter" +"R/Partitions.R",406,13,"style","Variable and function name style should be snake_case."," partition$datetimePartitionColumn <- datetimePartitionColumn","object_name_linter" +"R/Partitions.R",407,13,"style","Variable and function name style should be snake_case."," partition$autopilotDataSelectionMethod <- autopilotDataSelectionMethod","object_name_linter" +"R/Partitions.R",408,13,"style","Variable and function name style should be snake_case."," partition$validationDuration <- validationDuration","object_name_linter" +"R/Partitions.R",409,13,"style","Variable and function name style should be snake_case."," partition$holdoutStartDate <- holdoutStartDate","object_name_linter" +"R/Partitions.R",410,13,"style","Variable and function name style should be snake_case."," partition$holdoutDuration <- holdoutDuration","object_name_linter" +"R/Partitions.R",411,13,"style","Variable and function name style should be snake_case."," partition$disableHoldout <- disableHoldout","object_name_linter" +"R/Partitions.R",412,13,"style","Variable and function name style should be snake_case."," partition$gapDuration <- gapDuration","object_name_linter" +"R/Partitions.R",413,13,"style","Variable and function name style should be snake_case."," partition$numberOfBacktests <- numberOfBacktests","object_name_linter" +"R/Partitions.R",415,13,"style","Variable and function name style should be snake_case."," partition$useTimeSeries <- useTimeSeries","object_name_linter" +"R/Partitions.R",416,13,"style","Variable and function name style should be snake_case."," partition$defaultToKnownInAdvance <- defaultToKnownInAdvance","object_name_linter" +"R/Partitions.R",417,13,"style","Variable and function name style should be snake_case."," partition$featureDerivationWindowStart <- featureDerivationWindowStart","object_name_linter" +"R/Partitions.R",418,13,"style","Variable and function name style should be snake_case."," partition$featureDerivationWindowEnd <- featureDerivationWindowEnd","object_name_linter" +"R/Partitions.R",419,13,"style","Variable and function name style should be snake_case."," partition$featureSettings <- featureSettings","object_name_linter" +"R/Partitions.R",420,13,"style","Variable and function name style should be snake_case."," partition$treatAsExponential <- treatAsExponential","object_name_linter" +"R/Partitions.R",421,13,"style","Variable and function name style should be snake_case."," partition$differencingMethod <- differencingMethod","object_name_linter" +"R/Partitions.R",423,13,"style","Variable and function name style should be snake_case."," partition$windowsBasisUnit <- windowsBasisUnit","object_name_linter" +"R/Partitions.R",424,13,"style","Variable and function name style should be snake_case."," partition$forecastWindowStart <- forecastWindowStart","object_name_linter" +"R/Partitions.R",425,13,"style","Variable and function name style should be snake_case."," partition$forecastWindowEnd <- forecastWindowEnd","object_name_linter" +"R/Partitions.R",426,13,"style","Variable and function name style should be snake_case."," partition$multiseriesIdColumns <- multiseriesIdColumns","object_name_linter" +"R/Partitions.R",427,13,"style","Variable and function name style should be snake_case."," partition$useCrossSeriesFeatures <- useCrossSeries","object_name_linter" +"R/Partitions.R",428,13,"style","Variable and function name style should be snake_case."," partition$aggregationType <- aggregationType","object_name_linter" +"R/Partitions.R",429,13,"style","Variable and function name style should be snake_case."," partition$calendarId <- calendarId","object_name_linter" +"R/Partitions.R",430,13,"style","Variable and function name style should be snake_case."," partition$crossSeriesGroupByColumns <- crossSeriesGroupByColumns","object_name_linter" +"R/Partitions.R",604,8,"style","Variable and function name style should be snake_case."," spec$cvMethod <- NULL","object_name_linter" +"R/Partitions.R",628,8,"style","Variable and function name style should be snake_case."," part$cvMethod <- cvMethods$DATETIME","object_name_linter" +"R/PredictionDatasets.R",120,10,"style","Variable and function name style should be snake_case."," body$forecastPoint <- forecastPoint","object_name_linter" +"R/PredictionDatasets.R",123,10,"style","Variable and function name style should be snake_case."," body$relaxKIAFeaturesCheck <- relaxKIAFeaturesCheck","object_name_linter" +"R/PredictionExplanations.R",191,10,"style","Variable and function name style should be snake_case."," body$maxExplanations <- maxExplanations","object_name_linter" +"R/PredictionExplanations.R",194,10,"style","Variable and function name style should be snake_case."," body$thresholdLow <- thresholdLow","object_name_linter" +"R/PredictionExplanations.R",197,10,"style","Variable and function name style should be snake_case."," body$thresholdHigh <- thresholdHigh","object_name_linter" +"R/PrimeFiles.R",24,11,"style","Variable and function name style should be snake_case."," query$parentModelId <- parentModelId","object_name_linter" +"R/PrimeFiles.R",27,11,"style","Variable and function name style should be snake_case."," query$modelId <- modelId","object_name_linter" +"R/RequestSampleSizeUpdate.R",45,10,"style","Variable and function name style should be snake_case."," body$samplePct <- samplePct","object_name_linter" +"R/RequestSampleSizeUpdate.R",48,10,"style","Variable and function name style should be snake_case."," body$trainingRowCount <- trainingRowCount","object_name_linter" +"R/StartAutopilot.R",170,21,"style","Variable and function name style should be snake_case."," partition$multiseriesIdColumns <- list(partition$multiseriesIdColumns)","object_name_linter" +"R/Validate.R",139,17,"style","Variable and function name style should be snake_case."," partition$validationPct <- validationPct","object_name_linter" +"R/zzz.R",5,1,"style","Variable and function name style should be snake_case.",".onAttach <- function(libname, pkgname) {","object_name_linter" diff --git a/.dev/revdep_emails/datarobot/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/datarobot/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..2d72e02a5 --- /dev/null +++ b/.dev/revdep_emails/datarobot/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,967 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/doc/AdvancedTuning.Rmd",22,1,"style","Variable and function name style should be snake_case or symbols.","tuningJobId <- RunInteractiveTuning(myModel)","object_name_linter" +"inst/doc/AdvancedTuning.Rmd",28,1,"style","Variable and function name style should be snake_case or symbols.","tunedModel <- GetModelFromJobId(myModel$projectId, tuningJobId)","object_name_linter" +"inst/doc/AdvancedTuning.Rmd",54,1,"style","Variable and function name style should be snake_case or symbols.","myXGBModel <- GetModel(projectId, modelId)","object_name_linter" +"inst/doc/AdvancedTuning.Rmd",55,1,"style","Variable and function name style should be snake_case or symbols.","RunTune <- StartTuningSession(myXGBModel)","object_name_linter" +"inst/doc/AdvancedTuning.Rmd",56,1,"style","Variable and function name style should be snake_case or symbols.","tuningJob <- RunTune(myXGBModel, colsample_bytree = 0.4, colsample_bylevel = 0.8)","object_name_linter" +"inst/doc/AdvancedTuning.Rmd",56,81,"style","Lines should not be more than 80 characters.","tuningJob <- RunTune(myXGBModel, colsample_bytree = 0.4, colsample_bylevel = 0.8)","line_length_linter" +"inst/doc/AdvancedTuning.Rmd",57,1,"style","Variable and function name style should be snake_case or symbols.","tunedModel <- GetModelFromJobId(projectId, tuningJob)","object_name_linter" +"inst/doc/AdvancedVignette.Rmd",37,81,"style","Lines should not be more than 80 characters.","ConnectToDataRobot(endpoint = ""http:///api/v2"", token = """")","line_length_linter" +"inst/doc/AdvancedVignette.Rmd",46,1,"style","Variable and function name style should be snake_case or symbols.","lendingClubURL <- ""https://s3.amazonaws.com/datarobot_public_datasets/10K_Lending_Club_Loans.csv""","object_name_linter" +"inst/doc/AdvancedVignette.Rmd",46,81,"style","Lines should not be more than 80 characters.","lendingClubURL <- ""https://s3.amazonaws.com/datarobot_public_datasets/10K_Lending_Club_Loans.csv""","line_length_linter" +"inst/doc/AdvancedVignette.Rmd",79,1,"style","Variable and function name style should be snake_case or symbols.","allModels <- ListModels(project)","object_name_linter" +"inst/doc/AdvancedVignette.Rmd",81,1,"style","Variable and function name style should be snake_case or symbols.","modelFrame <- as.data.frame(allModels)","object_name_linter" +"inst/doc/AdvancedVignette.Rmd",83,27,"style","Only use double-quotes.","if (project$metric %in% c('AUC', 'Gini Norm')) {","single_quotes_linter" +"inst/doc/AdvancedVignette.Rmd",83,34,"style","Only use double-quotes.","if (project$metric %in% c('AUC', 'Gini Norm')) {","single_quotes_linter" +"inst/doc/AdvancedVignette.Rmd",84,3,"style","Variable and function name style should be snake_case or symbols."," bestIndex <- which.max(metric)","object_name_linter" +"inst/doc/AdvancedVignette.Rmd",86,3,"style","Variable and function name style should be snake_case or symbols."," bestIndex <- which.min(metric)","object_name_linter" +"inst/doc/AdvancedVignette.Rmd",88,1,"style","Variable and function name style should be snake_case or symbols.","bestModel <- allModels[[bestIndex]]","object_name_linter" +"inst/doc/AdvancedVignette.Rmd",93,1,"style","Variable and function name style should be snake_case or symbols.","allModels <- readRDS(""modelsModelInsights.rds"")","object_name_linter" +"inst/doc/AdvancedVignette.Rmd",94,1,"style","Variable and function name style should be snake_case or symbols.","bestModel <- allModels[[1]]","object_name_linter" +"inst/doc/AdvancedVignette.Rmd",115,1,"style","Variable and function name style should be snake_case or symbols.","ValidationLiftChart <- GetLiftChart(bestModel, source = ""validation"")","object_name_linter" +"inst/doc/AdvancedVignette.Rmd",122,1,"style","Variable and function name style should be snake_case or symbols.","LiftChartPlot <- function(ValidationLiftChart, bins = 10) {","object_name_linter" +"inst/doc/AdvancedVignette.Rmd",122,27,"style","Variable and function name style should be snake_case or symbols.","LiftChartPlot <- function(ValidationLiftChart, bins = 10) {","object_name_linter" +"inst/doc/AdvancedVignette.Rmd",124,5,"style","Variable and function name style should be snake_case or symbols."," ValidationLiftChart$bins <- rep(seq(bins), each = 60 / bins)","object_name_linter" +"inst/doc/AdvancedVignette.Rmd",125,5,"style","Variable and function name style should be snake_case or symbols."," ValidationLiftChart <- data.table(ValidationLiftChart)","object_name_linter" +"inst/doc/AdvancedVignette.Rmd",133,1,"style","Variable and function name style should be snake_case or symbols.","LiftChartData <- LiftChartPlot(ValidationLiftChart)","object_name_linter" +"inst/doc/AdvancedVignette.Rmd",142,3,"style","Commented code should be removed.","# dr_dark_blue <- ""#08233F""","commented_code_linter" +"inst/doc/AdvancedVignette.Rmd",143,3,"style","Commented code should be removed.","# dr_blue <- ""#1F77B4""","commented_code_linter" +"inst/doc/AdvancedVignette.Rmd",144,3,"style","Commented code should be removed.","# dr_orange <- ""#FF7F0E""","commented_code_linter" +"inst/doc/AdvancedVignette.Rmd",145,3,"style","Commented code should be removed.","# LiftChartData <- readRDS(""LiftChartDataVal.rds"")","commented_code_linter" +"inst/doc/AdvancedVignette.Rmd",146,3,"style","Commented code should be removed.","# par(bg = dr_dark_blue)","commented_code_linter" +"inst/doc/AdvancedVignette.Rmd",149,3,"style","Commented code should be removed.","# lines(LiftChartData$Predicted, col = dr_blue, pch = 20, type = ""b"")","commented_code_linter" +"inst/doc/AdvancedVignette.Rmd",156,1,"style","Variable and function name style should be snake_case or symbols.","AllLiftChart <- ListLiftCharts(bestModel)","object_name_linter" +"inst/doc/AdvancedVignette.Rmd",157,1,"style","Variable and function name style should be snake_case or symbols.","LiftChartData <- LiftChartPlot(AllLiftChart[[""crossValidation""]])","object_name_linter" +"inst/doc/AdvancedVignette.Rmd",166,3,"style","Commented code should be removed.","# LiftChartData <- readRDS(""LiftChartDataCV.rds"")","commented_code_linter" +"inst/doc/AdvancedVignette.Rmd",167,3,"style","Commented code should be removed.","# par(bg = dr_dark_blue)","commented_code_linter" +"inst/doc/AdvancedVignette.Rmd",170,3,"style","Commented code should be removed.","# lines(LiftChartData$Predicted, col = dr_blue, pch = 20, type = ""b"")","commented_code_linter" +"inst/doc/AdvancedVignette.Rmd",212,1,"style","Variable and function name style should be snake_case or symbols.","ValidationRocCurve <- GetRocCurve(bestModel)","object_name_linter" +"inst/doc/AdvancedVignette.Rmd",213,1,"style","Variable and function name style should be snake_case or symbols.","ValidationRocPoints <- ValidationRocCurve[[""rocPoints""]]","object_name_linter" +"inst/doc/AdvancedVignette.Rmd",216,81,"style","Lines should not be more than 80 characters.","plot(ValidationRocPoints$falsePositiveRate, ValidationRocPoints$truePositiveRate,","line_length_linter" +"inst/doc/AdvancedVignette.Rmd",218,81,"style","Lines should not be more than 80 characters."," xlab = ""False Positive Rate (Fallout)"", ylab = ""True Positive Rate (Sensitivity)"",","line_length_linter" +"inst/doc/AdvancedVignette.Rmd",220,17,"style","Commas should always have a space after."," ylim = c(0,1), xlim = c(0,1),","commas_linter" +"inst/doc/AdvancedVignette.Rmd",220,32,"style","Commas should always have a space after."," ylim = c(0,1), xlim = c(0,1),","commas_linter" +"inst/doc/AdvancedVignette.Rmd",227,1,"style","Variable and function name style should be snake_case or symbols.","ValidationRocPoints <- readRDS(""ValidationRocPoints.rds"")","object_name_linter" +"inst/doc/AdvancedVignette.Rmd",229,81,"style","Lines should not be more than 80 characters.","plot(ValidationRocPoints$falsePositiveRate, ValidationRocPoints$truePositiveRate,","line_length_linter" +"inst/doc/AdvancedVignette.Rmd",231,81,"style","Lines should not be more than 80 characters."," xlab = ""False Positive Rate (Fallout)"", ylab = ""True Positive Rate (Sensitivity)"",","line_length_linter" +"inst/doc/AdvancedVignette.Rmd",240,1,"style","Variable and function name style should be snake_case or symbols.","AllRocCurve <- ListRocCurves(bestModel)","object_name_linter" +"inst/doc/AdvancedVignette.Rmd",241,1,"style","Variable and function name style should be snake_case or symbols.","CrossValidationRocPoints <- AllRocCurve[['crossValidation']][['rocPoints']]","object_name_linter" +"inst/doc/AdvancedVignette.Rmd",241,42,"style","Only use double-quotes.","CrossValidationRocPoints <- AllRocCurve[['crossValidation']][['rocPoints']]","single_quotes_linter" +"inst/doc/AdvancedVignette.Rmd",241,63,"style","Only use double-quotes.","CrossValidationRocPoints <- AllRocCurve[['crossValidation']][['rocPoints']]","single_quotes_linter" +"inst/doc/AdvancedVignette.Rmd",242,35,"style","Only use double-quotes.","saveRDS(CrossValidationRocPoints, 'CrossValidationRocPoints.rds')","single_quotes_linter" +"inst/doc/AdvancedVignette.Rmd",244,81,"style","Lines should not be more than 80 characters.","plot(CrossValidationRocPoints$falsePositiveRate, CrossValidationRocPoints$truePositiveRate,","line_length_linter" +"inst/doc/AdvancedVignette.Rmd",246,81,"style","Lines should not be more than 80 characters."," xlab = ""False Positive Rate (Fallout)"", ylab = ""True Positive Rate (Sensitivity)"",","line_length_linter" +"inst/doc/AdvancedVignette.Rmd",253,1,"style","Variable and function name style should be snake_case or symbols.","CrossValidationRocPoints <- readRDS(""CrossValidationRocPoints.rds"")","object_name_linter" +"inst/doc/AdvancedVignette.Rmd",255,81,"style","Lines should not be more than 80 characters.","plot(CrossValidationRocPoints$falsePositiveRate, CrossValidationRocPoints$truePositiveRate,","line_length_linter" +"inst/doc/AdvancedVignette.Rmd",257,81,"style","Lines should not be more than 80 characters."," xlab = ""False Positive Rate (Fallout)"", ylab = ""True Positive Rate (Sensitivity)"",","line_length_linter" +"inst/doc/AdvancedVignette.Rmd",267,23,"style","Trailing whitespace is superfluous."," ValidationRocPoints, ","trailing_whitespace_linter" +"inst/doc/AdvancedVignette.Rmd",278,81,"style","Lines should not be more than 80 characters.","threshold <- ValidationRocPoints$threshold[which.max(ValidationRocPoints$f1Score)]","line_length_linter" +"inst/doc/AdvancedVignette.Rmd",284,81,"style","Lines should not be more than 80 characters.","ValidationRocPoints[ValidationRocPoints$threshold == tail(Filter(function(x) x > threshold,","line_length_linter" +"inst/doc/AdvancedVignette.Rmd",285,81,"style","Lines should not be more than 80 characters."," ValidationRocPoints$threshold),","line_length_linter" +"inst/doc/AdvancedVignette.Rmd",302,1,"style","Variable and function name style should be snake_case or symbols.","wordModels <- allModels[grep(""Word"", lapply(allModels, `[[`, ""modelType""))]","object_name_linter" +"inst/doc/AdvancedVignette.Rmd",303,1,"style","Variable and function name style should be snake_case or symbols.","wordModel <- wordModels[[1]]","object_name_linter" +"inst/doc/AdvancedVignette.Rmd",305,1,"style","Variable and function name style should be snake_case or symbols.","wordCloud <- GetWordCloud(project, wordModel$modelId)","object_name_linter" +"inst/doc/AdvancedVignette.Rmd",311,1,"style","Variable and function name style should be snake_case or symbols.","wordCloud <- readRDS(""wordCloudModelInsights.rds"")","object_name_linter" +"inst/doc/AdvancedVignette.Rmd",318,47,"style","Trailing whitespace is superfluous."," colormap::colormap(c(""#255FEC"", ""#2DBEF9"")), ","trailing_whitespace_linter" +"inst/doc/AdvancedVignette.Rmd",320,29,"style","Trailing whitespace is superfluous."," c(""#FFAC9D"", ""#D80909""), ","trailing_whitespace_linter" +"inst/doc/AdvancedVignette.Rmd",329,1,"style","Variable and function name style should be snake_case or symbols.","wordCloud <- wordCloud[!wordCloud$isStopword, ]","object_name_linter" +"inst/doc/AdvancedVignette.Rmd",331,56,"style","Trailing whitespace is superfluous.","# Specify colors similar to what DataRobot produces for ","trailing_whitespace_linter" +"inst/doc/Calendars.Rmd",18,81,"style","Lines should not be more than 80 characters.","calendar <- read.csv(system.file(""extdata"", ""calendar.csv"", package = ""datarobot""))","line_length_linter" +"inst/doc/Calendars.Rmd",31,1,"style","Variable and function name style should be snake_case or symbols.","apiToken <- """"","object_name_linter" +"inst/doc/Calendars.Rmd",72,1,"style","Variable and function name style should be snake_case or symbols.","newCalendar <- UpdateCalendar(calendar, name = ""newName"")","object_name_linter" +"inst/doc/Calendars.Rmd",88,81,"style","Lines should not be more than 80 characters.","project <- SetupProject(timeSeriesData, projectName = ""time series with calendar"")","line_length_linter" +"inst/doc/Calendars.Rmd",91,81,"style","Lines should not be more than 80 characters."," autopilotDataSelectionMethod = ""duration"",","line_length_linter" +"inst/doc/Calendars.Rmd",103,1,"style","Variable and function name style should be snake_case or symbols.","projectId <- ""59dab74bbd2a54035786bfc0""","object_name_linter" +"inst/doc/ComparingSubsets.R",24,1,"style","Variable and function name style should be snake_case or symbols.","modifiedPima$insulin <- NULL","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",63,1,"style","Variable and function name style should be snake_case or symbols.","MissPctInsulin <- round(100 * length(which(PimaIndiansDiabetes$insulin == 0)) /","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",75,1,"style","Variable and function name style should be snake_case or symbols.","insulinMissing <- as.numeric(PimaIndiansDiabetes$insulin == 0)","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",76,1,"style","Variable and function name style should be snake_case or symbols.","modifiedPima <- PimaIndiansDiabetes","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",77,1,"style","Variable and function name style should be snake_case or symbols.","modifiedPima$insulin <- NULL","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",78,1,"style","Variable and function name style should be snake_case or symbols.","modifiedPima$insulinMissing <- insulinMissing","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",84,1,"style","Variable and function name style should be snake_case or symbols.","insulinProject <- StartProject(dataSource = modifiedPima,","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",93,1,"style","Variable and function name style should be snake_case or symbols.","insulinModelList <- ListModels(insulinProject)","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",98,1,"style","Variable and function name style should be snake_case or symbols.","insulinModelList <- readRDS(""insulinModelList.rds"")","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",99,1,"style","Variable and function name style should be snake_case or symbols.","insulinModelFrame <- as.data.frame(insulinModelList, simple = FALSE)","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",107,1,"style","Variable and function name style should be snake_case or symbols.","bestIndex <- which.min(insulinModelFrame$LogLoss.validation)","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",108,1,"style","Variable and function name style should be snake_case or symbols.","worstIndex <- which.max(insulinModelFrame$LogLoss.validation)","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",118,81,"style","Lines should not be more than 80 characters.","plot(insulinModelFrame$AUC.validation, xlab = ""Model number"", ylab = ""Area under the ROC curve"")","line_length_linter" +"inst/doc/ComparingSubsets.Rmd",119,81,"style","Lines should not be more than 80 characters.","points(bestIndex, insulinModelFrame$AUC.validation[bestIndex], pch = 16, col = ""red"")","line_length_linter" +"inst/doc/ComparingSubsets.Rmd",129,1,"style","Variable and function name style should be snake_case or symbols.","modelList <- list(n = 9)","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",130,1,"style","Variable and function name style should be snake_case or symbols.","modelList[[1]] <- insulinModelList","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",131,1,"style","Variable and function name style should be snake_case or symbols.","allVars <- colnames(modifiedPima)[1:8]","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",132,1,"style","Variable and function name style should be snake_case or symbols.","permFile <- tempfile(fileext = ""permFile.csv"")","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",134,3,"style","Variable and function name style should be snake_case or symbols."," varName <- allVars[i]","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",136,3,"style","Variable and function name style should be snake_case or symbols."," projName <- paste(""PermProject"",varName,sep="""")","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",136,35,"style","Commas should always have a space after."," projName <- paste(""PermProject"",varName,sep="""")","commas_linter" +"inst/doc/ComparingSubsets.Rmd",136,43,"style","Commas should always have a space after."," projName <- paste(""PermProject"",varName,sep="""")","commas_linter" +"inst/doc/ComparingSubsets.Rmd",136,46,"style","Put spaces around all infix operators."," projName <- paste(""PermProject"",varName,sep="""")","infix_spaces_linter" +"inst/doc/ComparingSubsets.Rmd",137,3,"style","Variable and function name style should be snake_case or symbols."," permProject <- StartProject(permFile, projectName = projName, target = ""insulinMissing"", wait = TRUE)","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",137,81,"style","Lines should not be more than 80 characters."," permProject <- StartProject(permFile, projectName = projName, target = ""insulinMissing"", wait = TRUE)","line_length_linter" +"inst/doc/ComparingSubsets.Rmd",138,3,"style","Variable and function name style should be snake_case or symbols."," modelList[[i+1]] <- ListModels(permProject)","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",138,15,"style","Put spaces around all infix operators."," modelList[[i+1]] <- ListModels(permProject)","infix_spaces_linter" +"inst/doc/ComparingSubsets.Rmd",147,1,"style","Variable and function name style should be snake_case or symbols.","logLossDeltas <- readRDS(""insulinDeltaFrame.rds"")","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",151,1,"style","Variable and function name style should be snake_case or symbols.","bestRow <- which.min(logLossDeltas$originalLogLoss)","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",152,81,"style","Lines should not be more than 80 characters.","points(seq(1, 8, 1), logLossDeltas[bestRow, 1:8], pch = 16, col = ""limegreen"", cex = 1.5)","line_length_linter" +"inst/doc/ComparingSubsets.Rmd",164,1,"style","Variable and function name style should be snake_case or symbols.","AUCshiftFrame <- readRDS(""AUCshiftFrame.rds"")","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",165,1,"style","Variable and function name style should be snake_case or symbols.","sortIndex <- order(logLossDeltas$originalLogLoss)","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",166,81,"style","Lines should not be more than 80 characters.","plot(AUCshiftFrame$originalAUC[sortIndex], xlab = ""Model number"", ylab = ""Area under ROC curve"")","line_length_linter" +"inst/doc/ComparingSubsets.Rmd",174,1,"style","Variable and function name style should be snake_case or symbols.","missingInsulin <- as.numeric(PimaIndiansDiabetes$insulin == 0)","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",175,1,"style","Variable and function name style should be snake_case or symbols.","missingTriceps <- as.numeric(PimaIndiansDiabetes$triceps == 0)","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",198,1,"style","Variable and function name style should be snake_case or symbols.","lossIndex <- which(dataCar$claimcst0 > 0)","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",199,1,"style","Variable and function name style should be snake_case or symbols.","keepVars <- c(""veh_value"", ""exposure"", ""claimcst0"", ""veh_body"", ""veh_age"",","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",201,1,"style","Variable and function name style should be snake_case or symbols.","lossFrame <- subset(dataCar, claimcst0 > 0, select = keepVars)","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",222,1,"style","Variable and function name style should be snake_case or symbols.","lossPct <- round(100 * length(lossIndex) / nrow(dataCar), digits = 1)","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",223,1,"style","Variable and function name style should be snake_case or symbols.","anomIndex <- which(lossFrame$claimcst0 == 200)","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",224,1,"style","Variable and function name style should be snake_case or symbols.","anomPct <- round(100 * length(anomIndex) / length(lossIndex), digits = 1)","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",235,1,"style","Variable and function name style should be snake_case or symbols.","anomFrame <- lossFrame","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",236,1,"style","Variable and function name style should be snake_case or symbols.","anomFrame$claimcst0 <- NULL","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",237,1,"style","Variable and function name style should be snake_case or symbols.","anomFrame$anomaly <- anomaly","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",238,1,"style","Variable and function name style should be snake_case or symbols.","anomProject <- StartProject(anomFrame, projectName = ""AnomalyProject"", target = anomaly, wait = TRUE)","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",238,81,"style","Lines should not be more than 80 characters.","anomProject <- StartProject(anomFrame, projectName = ""AnomalyProject"", target = anomaly, wait = TRUE)","line_length_linter" +"inst/doc/ComparingSubsets.Rmd",239,1,"style","Variable and function name style should be snake_case or symbols.","anomalyModelList <- ListModels(anomProject)","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",247,1,"style","Variable and function name style should be snake_case or symbols.","anomalyLeaderboard <- readRDS(""anomalyModelList.rds"")","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",248,1,"style","Variable and function name style should be snake_case or symbols.","anomalyLeaderFrame <- as.data.frame(anomalyLeaderboard, simple = FALSE)","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",249,1,"style","Variable and function name style should be snake_case or symbols.","plotPct <- max(anomalyLeaderFrame$samplePct)","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",250,81,"style","Lines should not be more than 80 characters.","plot(anomalyLeaderboard, pct = plotPct, orderDecreasing = TRUE, xlim = c(0, 0.45))","line_length_linter" +"inst/doc/ComparingSubsets.Rmd",251,81,"style","Lines should not be more than 80 characters.","abline(v = min(anomalyLeaderFrame$LogLoss.validation), lty = 2, lwd = 2, col = ""magenta"")","line_length_linter" +"inst/doc/ComparingSubsets.Rmd",258,1,"style","Variable and function name style should be snake_case or symbols.","AAUC <- anomalyLeaderFrame$AUC.validation","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",259,1,"style","Variable and function name style should be snake_case or symbols.","samplePct <- anomalyLeaderFrame$samplePct","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",262,1,"style","Variable and function name style should be snake_case or symbols.","Index64 <- which(samplePct == sizes[3])","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",264,1,"style","Variable and function name style should be snake_case or symbols.","Index32 <- which(samplePct == sizes[2])","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",266,1,"style","Variable and function name style should be snake_case or symbols.","Index16 <- which(samplePct == sizes[1])","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",275,1,"style","Variable and function name style should be snake_case or symbols.","anomAUCDeltaFrame <- readRDS(""anomAUCDeltaFrame.rds"")","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",276,1,"style","Variable and function name style should be snake_case or symbols.","bestIndex <- which.min(anomalyLeaderFrame$LogLoss.validation)","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",277,1,"style","Variable and function name style should be snake_case or symbols.","bestExpModel <- as.character(anomalyLeaderFrame$expandedModel)[bestIndex]","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",278,1,"style","Variable and function name style should be snake_case or symbols.","bestRow <- which(anomAUCDeltaFrame$expandedModel == bestExpModel)","object_name_linter" +"inst/doc/ComparingSubsets.Rmd",282,14,"style","Put spaces around all infix operators."," what=c(0, 1, 1, 1), ylim=c(-0.1, 0.1))","infix_spaces_linter" +"inst/doc/ComparingSubsets.Rmd",282,34,"style","Put spaces around all infix operators."," what=c(0, 1, 1, 1), ylim=c(-0.1, 0.1))","infix_spaces_linter" +"inst/doc/ComparingSubsets.Rmd",283,81,"style","Lines should not be more than 80 characters.","points(seq(1, 7, 1), anomAUCDeltaFrame[bestRow, 1:7], pch = 16, col = ""limegreen"", cex = 1.5)","line_length_linter" +"inst/doc/ComplianceDocumentation.Rmd",26,1,"style","Variable and function name style should be snake_case or symbols.","apiToken <- """"","object_name_linter" +"inst/doc/ComplianceDocumentation.Rmd",59,81,"style","Lines should not be more than 80 characters.","UploadComplianceDocTemplate(name = ""myNewTemplate"", filename = ""path/to/modified_file.json"")","line_length_linter" +"inst/doc/ComplianceDocumentation.Rmd",67,81,"style","Lines should not be more than 80 characters."," ""regularText"" = ""This dataset had a lot of Missing Values. See the chart below: {{missingValues}}"",","line_length_linter" +"inst/doc/ComplianceDocumentation.Rmd",70,81,"style","Lines should not be more than 80 characters."," ""regularText"" = ""{{blueprintDiagram}} /n Blueprint for this model"",","line_length_linter" +"inst/doc/ComplianceDocumentation.Rmd",72,81,"style","Lines should not be more than 80 characters.","UploadComplianceDocTemplate(name = ""myNewTemplateFromSections"", sections = sections)","line_length_linter" +"inst/doc/ComplianceDocumentation.Rmd",78,1,"style","Variable and function name style should be snake_case or symbols.","myTemplate <- ListComplianceDocTemplates(namePart = ""myNewTemplateFromSections"")[[1]]","object_name_linter" +"inst/doc/ComplianceDocumentation.Rmd",78,81,"style","Lines should not be more than 80 characters.","myTemplate <- ListComplianceDocTemplates(namePart = ""myNewTemplateFromSections"")[[1]]","line_length_linter" +"inst/doc/ComplianceDocumentation.Rmd",87,1,"style","Variable and function name style should be snake_case or symbols.","myTemplate <- ListComplianceDocTemplates(namePart = ""myNewTemplate"")[[1]]","object_name_linter" +"inst/doc/DatetimePartitionedProjects.Rmd",26,81,"style","Lines should not be more than 80 characters.","lending <- read.csv(""https://s3.amazonaws.com/datarobot_public_datasets/10K_Lending_Club_Loans.csv"")","line_length_linter" +"inst/doc/DatetimePartitionedProjects.Rmd",27,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""earliest_cr_line"",","line_length_linter" +"inst/doc/DatetimePartitionedProjects.Rmd",43,81,"style","Lines should not be more than 80 characters."," ""1989-12-01"", ConstructDurationString(days = 100))","line_length_linter" +"inst/doc/DatetimePartitionedProjects.Rmd",44,81,"style","Lines should not be more than 80 characters.","backtest[[2]] <- CreateBacktestSpecification(1, ConstructDurationString(), ""1999-10-01"",","line_length_linter" +"inst/doc/DatetimePartitionedProjects.Rmd",45,81,"style","Lines should not be more than 80 characters."," ConstructDurationString(days = 100))","line_length_linter" +"inst/doc/DatetimePartitionedProjects.Rmd",67,81,"style","Lines should not be more than 80 characters.","# Retrieve a datetime model. There is now a new retrieval function specific to datetime partitioning","line_length_linter" +"inst/doc/DatetimePartitionedProjects.Rmd",71,1,"style","Variable and function name style should be snake_case or symbols.","scoreJobId <- ScoreBacktests(dt_model)","object_name_linter" +"inst/doc/DatetimePartitionedProjects.Rmd",75,1,"style","Variable and function name style should be snake_case or symbols.","dtModelWithBt <- GetDatetimeModel(proj, dt_model$modelId)","object_name_linter" +"inst/doc/DatetimePartitionedProjects.Rmd",78,81,"style","Lines should not be more than 80 characters.","# One has to request a `Frozen` model to keep the hyper-parameters static and avoid lookahead bias.","line_length_linter" +"inst/doc/DatetimePartitionedProjects.Rmd",79,81,"style","Lines should not be more than 80 characters.","# Within the context of deployment, this can be used to retrain a resulting model on more recent data.","line_length_linter" +"inst/doc/DatetimePartitionedProjects.Rmd",80,81,"style","Lines should not be more than 80 characters.","UpdateProject(proj, holdoutUnlocked = TRUE) # If retraining on 100% of the data, we need to unlock the holdout set.","line_length_linter" +"inst/doc/DatetimePartitionedProjects.Rmd",81,1,"style","Variable and function name style should be snake_case or symbols.","modelJobId_frozen <- RequestFrozenDatetimeModel(dt_model,","object_name_linter" +"inst/doc/DatetimePartitionedProjects.Rmd",82,81,"style","Lines should not be more than 80 characters."," trainingStartDate = as.Date(""1950/12/1""),","line_length_linter" +"inst/doc/DatetimePartitionedProjects.Rmd",83,81,"style","Lines should not be more than 80 characters."," trainingEndDate = as.Date(""1998/3/1""))","line_length_linter" +"inst/doc/DatetimePartitionedProjects.Rmd",87,1,"style","Variable and function name style should be snake_case or symbols.","modelJobId <- RequestNewDatetimeModel(proj, bps[[1]], trainingRowCount = 100)","object_name_linter" +"inst/doc/DatetimePartitionedProjects.Rmd",91,1,"style","Variable and function name style should be snake_case or symbols.","modelJobId <- RequestNewDatetimeModel(proj, bps[[1]],","object_name_linter" +"inst/doc/DatetimePartitionedProjects.Rmd",92,81,"style","Lines should not be more than 80 characters."," trainingDuration = ConstructDurationString(months=10))","line_length_linter" +"inst/doc/DatetimePartitionedProjects.Rmd",92,90,"style","Put spaces around all infix operators."," trainingDuration = ConstructDurationString(months=10))","infix_spaces_linter" +"inst/doc/Deployment.Rmd",31,1,"style","Variable and function name style should be snake_case or symbols.","predictionServer <- ListPredictionServers()[[1]]","object_name_linter" +"inst/doc/Deployment.Rmd",34,81,"style","Lines should not be more than 80 characters."," description = ""A new deployment for demo purposes"",","line_length_linter" +"inst/doc/Deployment.Rmd",83,1,"style","Variable and function name style should be snake_case or symbols.","newModel <- ListModels(project)[[2]]","object_name_linter" +"inst/doc/Deployment.Rmd",96,1,"style","Variable and function name style should be snake_case or symbols.","newModel <- ListModels(project)[[2]]","object_name_linter" +"inst/doc/IntroductionToDataRobot.Rmd",49,81,"style","Lines should not be more than 80 characters.","ConnectToDataRobot(endpoint = ""YOUR-ENDPOINT-HERE"", token = ""YOUR-API_TOKEN-HERE"")","line_length_linter" +"inst/doc/IntroductionToDataRobot.Rmd",111,1,"style","Variable and function name style should be snake_case or symbols.","listOfBostonModels <- readRDS(""listOfBostonModels.rds"")","object_name_linter" +"inst/doc/IntroductionToDataRobot.Rmd",112,1,"style","Variable and function name style should be snake_case or symbols.","fullFrame <- as.data.frame(listOfBostonModels, simple = FALSE)","object_name_linter" +"inst/doc/IntroductionToDataRobot.Rmd",118,1,"style","Variable and function name style should be snake_case or symbols.","listOfBostonModels <- ListModels(project)","object_name_linter" +"inst/doc/IntroductionToDataRobot.Rmd",153,1,"style","Variable and function name style should be snake_case or symbols.","modelFrame <- as.data.frame(listOfBostonModels)","object_name_linter" +"inst/doc/IntroductionToDataRobot.Rmd",183,1,"style","Variable and function name style should be snake_case or symbols.","bestModel <- GetRecommendedModel(project)","object_name_linter" +"inst/doc/IntroductionToDataRobot.Rmd",184,1,"style","Variable and function name style should be snake_case or symbols.","bestPredictions <- Predict(bestModel, Boston)","object_name_linter" +"inst/doc/IntroductionToDataRobot.Rmd",202,1,"style","Variable and function name style should be snake_case or symbols.","bestPredictions <- readRDS(""bestPredictions.rds"")","object_name_linter" +"inst/doc/IntroductionToDataRobot.Rmd",203,33,"style","Put spaces around all infix operators.","plot(medv, bestPredictions, xlab=""Observed medv value"", ylab=""Predicted medv value"",","infix_spaces_linter" +"inst/doc/IntroductionToDataRobot.Rmd",203,61,"style","Put spaces around all infix operators.","plot(medv, bestPredictions, xlab=""Observed medv value"", ylab=""Predicted medv value"",","infix_spaces_linter" +"inst/doc/IntroductionToDataRobot.Rmd",203,81,"style","Lines should not be more than 80 characters.","plot(medv, bestPredictions, xlab=""Observed medv value"", ylab=""Predicted medv value"",","line_length_linter" +"inst/doc/Multiclass.Rmd",26,1,"style","Variable and function name style should be snake_case or symbols.","apiToken <- """"","object_name_linter" +"inst/doc/Multiclass.Rmd",92,1,"style","Variable and function name style should be snake_case or symbols.","confusionChart <- GetConfusionChart(model, source = DataPartition$VALIDATION)","object_name_linter" +"inst/doc/PartialDependence.R",52,3,"style","Variable and function name style should be snake_case or symbols."," outFrame[, refIndex] <- grid[1]","object_name_linter" +"inst/doc/PartialDependence.R",55,5,"style","Variable and function name style should be snake_case or symbols."," upFrame[, refIndex] <- grid[i]","object_name_linter" +"inst/doc/PartialDependence.R",71,3,"style","Variable and function name style should be snake_case or symbols."," hatFrame$prediction <- yHat","object_name_linter" +"inst/doc/PartialDependence.R",73,12,"style","Variable and function name style should be snake_case or symbols."," colnames(hatSum)[2] <- model$modelType","object_name_linter" +"inst/doc/PartialDependence.R",79,5,"style","Variable and function name style should be snake_case or symbols."," hatFrame$prediction <- yHat","object_name_linter" +"inst/doc/PartialDependence.R",81,14,"style","Variable and function name style should be snake_case or symbols."," colnames(upSum)[2] <- model$modelType","object_name_linter" +"inst/doc/PartialDependence.Rmd",31,1,"style","Variable and function name style should be snake_case or symbols.","concreteFrame <- read.csv(system.file(""extdata"", ""concreteData.csv"", package = ""datarobot""))","object_name_linter" +"inst/doc/PartialDependence.Rmd",31,81,"style","Lines should not be more than 80 characters.","concreteFrame <- read.csv(system.file(""extdata"", ""concreteData.csv"", package = ""datarobot""))","line_length_linter" +"inst/doc/PartialDependence.Rmd",43,1,"style","Variable and function name style should be snake_case or symbols.","myDRProject <- StartProject(concreteFrame, ""ConcreteProject"", target = ""strength"", wait = TRUE)","object_name_linter" +"inst/doc/PartialDependence.Rmd",43,81,"style","Lines should not be more than 80 characters.","myDRProject <- StartProject(concreteFrame, ""ConcreteProject"", target = ""strength"", wait = TRUE)","line_length_linter" +"inst/doc/PartialDependence.Rmd",48,1,"style","Variable and function name style should be snake_case or symbols.","concreteModels <- readRDS(""concreteModels.rds"")","object_name_linter" +"inst/doc/PartialDependence.Rmd",49,1,"style","Variable and function name style should be snake_case or symbols.","fullFrame <- as.data.frame(concreteModels, simple = FALSE)","object_name_linter" +"inst/doc/PartialDependence.Rmd",50,1,"style","Variable and function name style should be snake_case or symbols.","modelsFrame <- as.data.frame(concreteModels)","object_name_linter" +"inst/doc/PartialDependence.Rmd",56,1,"style","Variable and function name style should be snake_case or symbols.","concreteModels <- ListModels(myDRProject)","object_name_linter" +"inst/doc/PartialDependence.Rmd",80,1,"style","Variable and function name style should be snake_case or symbols.","poorCol <- c(""black"", ""red"", rep(""black"", 13))","object_name_linter" +"inst/doc/PartialDependence.Rmd",99,1,"style","Variable and function name style should be snake_case or symbols.","ridgeRows <- grep(""Ridge"", modelsFrame$modelType)","object_name_linter" +"inst/doc/PartialDependence.Rmd",104,1,"style","Variable and function name style should be snake_case or symbols.","goodCol <- c(rep(""black"", 3), ""red"", rep(""black"", 6), ""red"", rep(""black"", 3), ""red"")","object_name_linter" +"inst/doc/PartialDependence.Rmd",104,81,"style","Lines should not be more than 80 characters.","goodCol <- c(rep(""black"", 3), ""red"", rep(""black"", 6), ""red"", rep(""black"", 3), ""red"")","line_length_linter" +"inst/doc/PartialDependence.Rmd",156,1,"style","Variable and function name style should be snake_case or symbols.","FullAverageDataset <- function(covarFrame, refCovar, numGrid, plotRange = NULL) {","object_name_linter" +"inst/doc/PartialDependence.Rmd",156,32,"style","Variable and function name style should be snake_case or symbols.","FullAverageDataset <- function(covarFrame, refCovar, numGrid, plotRange = NULL) {","object_name_linter" +"inst/doc/PartialDependence.Rmd",156,44,"style","Variable and function name style should be snake_case or symbols.","FullAverageDataset <- function(covarFrame, refCovar, numGrid, plotRange = NULL) {","object_name_linter" +"inst/doc/PartialDependence.Rmd",156,54,"style","Variable and function name style should be snake_case or symbols.","FullAverageDataset <- function(covarFrame, refCovar, numGrid, plotRange = NULL) {","object_name_linter" +"inst/doc/PartialDependence.Rmd",156,63,"style","Variable and function name style should be snake_case or symbols.","FullAverageDataset <- function(covarFrame, refCovar, numGrid, plotRange = NULL) {","object_name_linter" +"inst/doc/PartialDependence.Rmd",156,81,"style","Lines should not be more than 80 characters.","FullAverageDataset <- function(covarFrame, refCovar, numGrid, plotRange = NULL) {","line_length_linter" +"inst/doc/PartialDependence.Rmd",158,3,"style","Variable and function name style should be snake_case or symbols."," refIndex <- which(covars == refCovar)","object_name_linter" +"inst/doc/PartialDependence.Rmd",159,3,"style","Variable and function name style should be snake_case or symbols."," refVar <- covarFrame[, refIndex]","object_name_linter" +"inst/doc/PartialDependence.Rmd",168,3,"style","Variable and function name style should be snake_case or symbols."," outFrame <- covarFrame","object_name_linter" +"inst/doc/PartialDependence.Rmd",169,3,"style","Variable and function name style should be snake_case or symbols."," outFrame[, refIndex] <- grid[1]","object_name_linter" +"inst/doc/PartialDependence.Rmd",171,5,"style","Variable and function name style should be snake_case or symbols."," upFrame <- covarFrame","object_name_linter" +"inst/doc/PartialDependence.Rmd",172,5,"style","Variable and function name style should be snake_case or symbols."," upFrame[, refIndex] <- grid[i]","object_name_linter" +"inst/doc/PartialDependence.Rmd",173,5,"style","Variable and function name style should be snake_case or symbols."," outFrame <- rbind.data.frame(outFrame, upFrame)","object_name_linter" +"inst/doc/PartialDependence.Rmd",184,1,"style","Variable and function name style should be snake_case or symbols.","PDPbuilder <- function(covarFrame, refCovar, listOfModels,","object_name_linter" +"inst/doc/PartialDependence.Rmd",184,24,"style","Variable and function name style should be snake_case or symbols.","PDPbuilder <- function(covarFrame, refCovar, listOfModels,","object_name_linter" +"inst/doc/PartialDependence.Rmd",184,36,"style","Variable and function name style should be snake_case or symbols.","PDPbuilder <- function(covarFrame, refCovar, listOfModels,","object_name_linter" +"inst/doc/PartialDependence.Rmd",184,46,"style","Variable and function name style should be snake_case or symbols.","PDPbuilder <- function(covarFrame, refCovar, listOfModels,","object_name_linter" +"inst/doc/PartialDependence.Rmd",185,24,"style","Variable and function name style should be snake_case or symbols."," numGrid = 100, plotRange = NULL) {","object_name_linter" +"inst/doc/PartialDependence.Rmd",185,39,"style","Variable and function name style should be snake_case or symbols."," numGrid = 100, plotRange = NULL) {","object_name_linter" +"inst/doc/PartialDependence.Rmd",186,3,"style","Variable and function name style should be snake_case or symbols."," augmentedFrame <- FullAverageDataset(covarFrame, refCovar,","object_name_linter" +"inst/doc/PartialDependence.Rmd",188,3,"style","Variable and function name style should be snake_case or symbols."," nModels <- length(listOfModels)","object_name_linter" +"inst/doc/PartialDependence.Rmd",191,3,"style","Variable and function name style should be snake_case or symbols."," yHat <- Predict(model, augmentedFrame)","object_name_linter" +"inst/doc/PartialDependence.Rmd",192,3,"style","Variable and function name style should be snake_case or symbols."," hatFrame <- augmentedFrame","object_name_linter" +"inst/doc/PartialDependence.Rmd",193,3,"style","Variable and function name style should be snake_case or symbols."," hatFrame$prediction <- yHat","object_name_linter" +"inst/doc/PartialDependence.Rmd",194,3,"style","Variable and function name style should be snake_case or symbols."," hatSum <- summaryBy(list(c(""prediction""), c(refCovar)), data = hatFrame, FUN = mean)","object_name_linter" +"inst/doc/PartialDependence.Rmd",194,13,"warning","no visible global function definition for β€˜summaryBy’"," hatSum <- summaryBy(list(c(""prediction""), c(refCovar)), data = hatFrame, FUN = mean)","object_usage_linter" +"inst/doc/PartialDependence.Rmd",194,81,"style","Lines should not be more than 80 characters."," hatSum <- summaryBy(list(c(""prediction""), c(refCovar)), data = hatFrame, FUN = mean)","line_length_linter" +"inst/doc/PartialDependence.Rmd",195,12,"style","Variable and function name style should be snake_case or symbols."," colnames(hatSum)[2] <- model$modelType","object_name_linter" +"inst/doc/PartialDependence.Rmd",199,5,"style","Variable and function name style should be snake_case or symbols."," yHat <- Predict(model, augmentedFrame)","object_name_linter" +"inst/doc/PartialDependence.Rmd",200,5,"style","Variable and function name style should be snake_case or symbols."," hatFrame <- augmentedFrame","object_name_linter" +"inst/doc/PartialDependence.Rmd",201,5,"style","Variable and function name style should be snake_case or symbols."," hatFrame$prediction <- yHat","object_name_linter" +"inst/doc/PartialDependence.Rmd",202,5,"style","Variable and function name style should be snake_case or symbols."," upSum <- summaryBy(list(c(""prediction""), c(refCovar)), data = hatFrame, FUN = mean)","object_name_linter" +"inst/doc/PartialDependence.Rmd",202,14,"warning","no visible global function definition for β€˜summaryBy’"," upSum <- summaryBy(list(c(""prediction""), c(refCovar)), data = hatFrame, FUN = mean)","object_usage_linter" +"inst/doc/PartialDependence.Rmd",202,81,"style","Lines should not be more than 80 characters."," upSum <- summaryBy(list(c(""prediction""), c(refCovar)), data = hatFrame, FUN = mean)","line_length_linter" +"inst/doc/PartialDependence.Rmd",203,14,"style","Variable and function name style should be snake_case or symbols."," colnames(upSum)[2] <- model$modelType","object_name_linter" +"inst/doc/PartialDependence.Rmd",204,5,"style","Variable and function name style should be snake_case or symbols."," hatSum <- merge(hatSum, upSum)","object_name_linter" +"inst/doc/PartialDependence.Rmd",215,1,"style","Variable and function name style should be snake_case or symbols.","modelList <- list(concreteModels[[1]], concreteModels[[5]],","object_name_linter" +"inst/doc/PartialDependence.Rmd",217,1,"style","Variable and function name style should be snake_case or symbols.","agePDPframe <- PDPbuilder(concreteFrame[, 1:8], ""age"", modelList)","object_name_linter" +"inst/doc/PartialDependence.Rmd",223,1,"style","Variable and function name style should be snake_case or symbols.","PDPlot <- function(PDframe, Response, ltypes,","object_name_linter" +"inst/doc/PartialDependence.Rmd",223,20,"style","Variable and function name style should be snake_case or symbols.","PDPlot <- function(PDframe, Response, ltypes,","object_name_linter" +"inst/doc/PartialDependence.Rmd",223,29,"style","Variable and function name style should be snake_case or symbols.","PDPlot <- function(PDframe, Response, ltypes,","object_name_linter" +"inst/doc/PartialDependence.Rmd",224,20,"style","Variable and function name style should be snake_case or symbols."," lColors, ...) {","object_name_linter" +"inst/doc/PartialDependence.Rmd",225,3,"style","Variable and function name style should be snake_case or symbols."," Rng <- range(Response)","object_name_linter" +"inst/doc/PartialDependence.Rmd",226,3,"style","Variable and function name style should be snake_case or symbols."," nModels <- ncol(PDframe) - 1","object_name_linter" +"inst/doc/PartialDependence.Rmd",227,3,"style","Variable and function name style should be snake_case or symbols."," modelNames <- colnames(PDframe)[2: (nModels + 1)]","object_name_linter" +"inst/doc/PartialDependence.Rmd",228,40,"style","Put spaces around all infix operators."," plot(PDframe[, 1], PDframe[, 2], ylim=Rng, type = ""l"",","infix_spaces_linter" +"inst/doc/PartialDependence.Rmd",232,22,"style","Put spaces around all infix operators."," abline(h = Rng, lty=3, lwd=2, col=""black"")","infix_spaces_linter" +"inst/doc/PartialDependence.Rmd",232,29,"style","Put spaces around all infix operators."," abline(h = Rng, lty=3, lwd=2, col=""black"")","infix_spaces_linter" +"inst/doc/PartialDependence.Rmd",232,36,"style","Put spaces around all infix operators."," abline(h = Rng, lty=3, lwd=2, col=""black"")","infix_spaces_linter" +"inst/doc/PartialDependence.Rmd",245,10,"style","Put spaces around all infix operators.","par(mfrow=c(1, 1))","infix_spaces_linter" +"inst/doc/PartialDependence.Rmd",246,1,"style","Variable and function name style should be snake_case or symbols.","agePDPframe <- readRDS(""agePDPframe.rds"")","object_name_linter" +"inst/doc/PartialDependence.Rmd",247,1,"style","Variable and function name style should be snake_case or symbols.","Response <- concreteFrame$strength","object_name_linter" +"inst/doc/PartialDependence.Rmd",249,1,"style","Variable and function name style should be snake_case or symbols.","lColors <- c(""limegreen"", ""black"", ""blue"", ""magenta"")","object_name_linter" +"inst/doc/PartialDependence.Rmd",256,10,"style","Put spaces around all infix operators.","par(mfrow=c(1, 1))","infix_spaces_linter" +"inst/doc/PartialDependence.Rmd",257,1,"style","Variable and function name style should be snake_case or symbols.","cementPDPframe <- readRDS(""cementPDPframe.rds"")","object_name_linter" +"inst/doc/PartialDependence.Rmd",264,10,"style","Put spaces around all infix operators.","par(mfrow=c(1, 1))","infix_spaces_linter" +"inst/doc/PartialDependence.Rmd",265,1,"style","Variable and function name style should be snake_case or symbols.","waterPDPframe <- readRDS(""waterPDPframe.rds"")","object_name_linter" +"inst/doc/PartialDependence.Rmd",272,10,"style","Put spaces around all infix operators.","par(mfrow=c(1, 1))","infix_spaces_linter" +"inst/doc/PartialDependence.Rmd",273,1,"style","Variable and function name style should be snake_case or symbols.","blastPDPframe <- readRDS(""blastPDPframe.rds"")","object_name_linter" +"inst/doc/PredictionExplanations.Rmd",144,1,"error","Missing chunk end for chunk (maybe starting at line 144).","```{r results = ""asis"", message = FALSE, warning = FALSE, eval = FALSE}",NA +"inst/doc/RatingTables.Rmd",26,1,"style","Variable and function name style should be snake_case or symbols.","apiToken <- """"","object_name_linter" +"inst/doc/RatingTables.Rmd",36,1,"style","Variable and function name style should be snake_case or symbols.","projectId <- ""59dab74bbd2a54035786bfc0""","object_name_linter" +"inst/doc/RatingTables.Rmd",37,1,"style","Variable and function name style should be snake_case or symbols.","ratingTables <- ListRatingTables(projectId)","object_name_linter" +"inst/doc/RatingTables.Rmd",38,1,"style","Variable and function name style should be snake_case or symbols.","ratingTable <- ratingTables[[1]]","object_name_linter" +"inst/doc/RatingTables.Rmd",43,1,"style","Variable and function name style should be snake_case or symbols.","ratingTable <- readRDS(""ratingTable.rds"")","object_name_linter" +"inst/doc/RatingTables.Rmd",50,1,"style","Variable and function name style should be snake_case or symbols.","projectId <- ""59dab74bbd2a54035786bfc0""","object_name_linter" +"inst/doc/RatingTables.Rmd",51,1,"style","Variable and function name style should be snake_case or symbols.","ratingTableModels <- ListRatingTableModels(projectId)","object_name_linter" +"inst/doc/RatingTables.Rmd",52,1,"style","Variable and function name style should be snake_case or symbols.","ratingTableModel <- ratingTableModels[[1]]","object_name_linter" +"inst/doc/RatingTables.Rmd",53,1,"style","Variable and function name style should be snake_case or symbols.","ratingTableId <- ratingTableModel$ratingTableId","object_name_linter" +"inst/doc/RatingTables.Rmd",54,1,"style","Variable and function name style should be snake_case or symbols.","ratingTable <- GetRatingTable(projectId, ratingTableId)","object_name_linter" +"inst/doc/RatingTables.Rmd",59,1,"style","Variable and function name style should be snake_case or symbols.","ratingTable <- readRDS(""ratingTable.rds"")","object_name_linter" +"inst/doc/RatingTables.Rmd",66,1,"style","Variable and function name style should be snake_case or symbols.","projectId <- ""59dab74bbd2a54035786bfc0""","object_name_linter" +"inst/doc/RatingTables.Rmd",67,1,"style","Variable and function name style should be snake_case or symbols.","modelId <- ""59dd0b01d9575702bec96e4""","object_name_linter" +"inst/doc/RatingTables.Rmd",68,1,"style","Variable and function name style should be snake_case or symbols.","ratingTableModel <- GetRatingTableModel(projectId, modelId)","object_name_linter" +"inst/doc/RatingTables.Rmd",69,1,"style","Variable and function name style should be snake_case or symbols.","ratingTableId <- ratingTableModel$ratingTableId","object_name_linter" +"inst/doc/RatingTables.Rmd",70,1,"style","Variable and function name style should be snake_case or symbols.","ratingTable <- GetRatingTable(projectId, ratingTableId)","object_name_linter" +"inst/doc/RatingTables.Rmd",75,1,"style","Variable and function name style should be snake_case or symbols.","ratingTable <- readRDS(""ratingTable.rds"")","object_name_linter" +"inst/doc/RatingTables.Rmd",94,1,"style","Variable and function name style should be snake_case or symbols.","newRatingTableJobId <- CreateRatingTable(project,","object_name_linter" +"inst/doc/RatingTables.Rmd",98,1,"style","Variable and function name style should be snake_case or symbols.","newRatingTable <- GetRatingTableFromJobId(project, newRatingTableJobId)","object_name_linter" +"inst/doc/RatingTables.Rmd",103,1,"style","Variable and function name style should be snake_case or symbols.","ratingTable <- readRDS(""ratingTable.rds"")","object_name_linter" +"inst/doc/RatingTables.Rmd",113,1,"style","Variable and function name style should be snake_case or symbols.","newModelJobId <- RequestNewRatingTableModel(project, newRatingTable)","object_name_linter" +"inst/doc/RatingTables.Rmd",114,1,"style","Variable and function name style should be snake_case or symbols.","newRatingTableModel <- GetRatingTableModelFromJobId(project, newModelJobId)","object_name_linter" +"inst/doc/RatingTables.Rmd",119,1,"style","Variable and function name style should be snake_case or symbols.","newRatingTableModel <- readRDS(""ratingTableModel.RDS"")","object_name_linter" +"inst/doc/TimeSeries.Rmd",67,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""timestamp"",","line_length_linter" +"inst/doc/TimeSeries.Rmd",69,81,"style","Lines should not be more than 80 characters.","StartProject(dataSource = data, target = ""target"", partition = partition, metric = ""RMSE"")","line_length_linter" +"inst/doc/TimeSeries.Rmd",86,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""timestamp"",","line_length_linter" +"inst/doc/TimeSeries.Rmd",87,81,"style","Lines should not be more than 80 characters."," featureDerivationWindowStart = -24,","line_length_linter" +"inst/doc/TimeSeries.Rmd",88,81,"style","Lines should not be more than 80 characters."," featureDerivationWindowEnd = -12,","line_length_linter" +"inst/doc/TimeSeries.Rmd",104,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""timestamp"",","line_length_linter" +"inst/doc/TimeSeries.Rmd",136,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""timestamp"",","line_length_linter" +"inst/doc/TimeSeries.Rmd",138,81,"style","Lines should not be more than 80 characters."," featureSettings = list(""featureName"" = ""holiday"",","line_length_linter" +"inst/doc/TimeSeries.Rmd",139,81,"style","Lines should not be more than 80 characters."," ""knownInAdvance"" = TRUE))","line_length_linter" +"inst/doc/TimeSeries.Rmd",150,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""timestamp"",","line_length_linter" +"inst/doc/TimeSeries.Rmd",152,81,"style","Lines should not be more than 80 characters."," featureSettings = list(list(""featureName"" = ""holiday"",","line_length_linter" +"inst/doc/TimeSeries.Rmd",153,81,"style","Lines should not be more than 80 characters."," ""knownInAdvance"" = TRUE),","line_length_linter" +"inst/doc/TimeSeries.Rmd",154,81,"style","Lines should not be more than 80 characters."," list(""featureName"" = ""weekend"",","line_length_linter" +"inst/doc/TimeSeries.Rmd",155,81,"style","Lines should not be more than 80 characters."," ""knownInAdvance"" = TRUE)))","line_length_linter" +"inst/doc/TimeSeries.Rmd",186,81,"style","Lines should not be more than 80 characters.","data <- read.csv(system.file(""extdata"", ""multiseries.csv"", package = ""datarobot""))","line_length_linter" +"inst/doc/TimeSeries.Rmd",187,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""timestamp"",","line_length_linter" +"inst/doc/TimeSeries.Rmd",189,81,"style","Lines should not be more than 80 characters."," multiseriesIdColumns = ""series_id"")","line_length_linter" +"inst/doc/TimeSeries.Rmd",219,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""timestamp"",","line_length_linter" +"inst/doc/TimeSeries.Rmd",221,81,"style","Lines should not be more than 80 characters."," featureSettings = list(list(""featureName"" = ""sales"",","line_length_linter" +"inst/doc/TimeSeries.Rmd",222,81,"style","Lines should not be more than 80 characters."," ""doNotDerive"" = TRUE)))","line_length_linter" +"inst/doc/TrainingPredictions.Rmd",26,1,"style","Variable and function name style should be snake_case or symbols.","trainingPredictions <- GetTrainingPredictionsForModel(model, dataSubset = DataSubset$All)","object_name_linter" +"inst/doc/TrainingPredictions.Rmd",26,81,"style","Lines should not be more than 80 characters.","trainingPredictions <- GetTrainingPredictionsForModel(model, dataSubset = DataSubset$All)","line_length_linter" +"inst/doc/TrainingPredictions.Rmd",27,81,"style","Lines should not be more than 80 characters.","kable(head(trainingPredictions), longtable = TRUE, booktabs = TRUE, row.names = TRUE)","line_length_linter" +"inst/doc/TrainingPredictions.Rmd",32,1,"style","Variable and function name style should be snake_case or symbols.","trainingPredictions <- readRDS(""trainingPredictions.rds"")","object_name_linter" +"inst/doc/TrainingPredictions.Rmd",33,81,"style","Lines should not be more than 80 characters.","kable(head(trainingPredictions), longtable = TRUE, booktabs = TRUE, row.names = TRUE)","line_length_linter" +"inst/doc/TrainingPredictions.Rmd",41,1,"style","Variable and function name style should be snake_case or symbols.","jobId <- RequestTrainingPredictions(model, dataSubset = DataSubset$All)","object_name_linter" +"inst/doc/TrainingPredictions.Rmd",43,1,"style","Variable and function name style should be snake_case or symbols.","trainingPredictions <- GetTrainingPredictionsFromJobId(projectId, jobId) # blocks until job complete","object_name_linter" +"inst/doc/TrainingPredictions.Rmd",43,81,"style","Lines should not be more than 80 characters.","trainingPredictions <- GetTrainingPredictionsFromJobId(projectId, jobId) # blocks until job complete","line_length_linter" +"inst/doc/TrainingPredictions.Rmd",44,81,"style","Lines should not be more than 80 characters.","kable(head(trainingPredictions), longtable = TRUE, booktabs = TRUE, row.names = TRUE)","line_length_linter" +"inst/doc/TrainingPredictions.Rmd",49,1,"style","Variable and function name style should be snake_case or symbols.","trainingPredictions <- readRDS(""trainingPredictions.rds"")","object_name_linter" +"inst/doc/TrainingPredictions.Rmd",50,81,"style","Lines should not be more than 80 characters.","kable(head(trainingPredictions), longtable = TRUE, booktabs = TRUE, row.names = TRUE)","line_length_linter" +"inst/doc/TrainingPredictions.Rmd",56,1,"style","Variable and function name style should be snake_case or symbols.","trainingPredictions <- ListTrainingPredictions(projectId)","object_name_linter" +"inst/doc/TrainingPredictions.Rmd",57,1,"style","Variable and function name style should be snake_case or symbols.","trainingPredictionId <- trainingPredictions[[1]]$id","object_name_linter" +"inst/doc/TrainingPredictions.Rmd",58,1,"style","Variable and function name style should be snake_case or symbols.","trainingPrediction <- GetTrainingPredictions(projectId, trainingPredictionId)","object_name_linter" +"inst/doc/TrainingPredictions.Rmd",59,81,"style","Lines should not be more than 80 characters.","kable(head(trainingPrediction), longtable = TRUE, booktabs = TRUE, row.names = TRUE)","line_length_linter" +"inst/doc/TrainingPredictions.Rmd",63,1,"style","Variable and function name style should be snake_case or symbols.","trainingPrediction <- readRDS(""trainingPrediction.rds"")","object_name_linter" +"inst/doc/TrainingPredictions.Rmd",64,81,"style","Lines should not be more than 80 characters.","kable(head(trainingPrediction), longtable = TRUE, booktabs = TRUE, row.names = TRUE)","line_length_linter" +"inst/doc/TrainingPredictions.Rmd",73,81,"style","Lines should not be more than 80 characters.","DownloadTrainingPredictions(projectId, trainingPredictionId, ""trainingPredictions.csv"")","line_length_linter" +"inst/doc/VariableImportance.R",51,3,"style","Variable and function name style should be snake_case or symbols."," keepCols[5] <- metricNames[1]","object_name_linter" +"inst/doc/VariableImportance.R",52,12,"style","Variable and function name style should be snake_case or symbols."," colnames(outFrame) <- keepCols","object_name_linter" +"inst/doc/VariableImportance.R",58,14,"style","Variable and function name style should be snake_case or symbols."," colnames(upFrame) <- c(""blueprintId"", metricNames[i])","object_name_linter" +"inst/doc/VariableImportance.Rmd",60,81,"style","Lines should not be more than 80 characters.","friedman <- read.csv(system.file(""extdata"", ""Friedman1.csv.gz"", package = ""datarobot""))","line_length_linter" +"inst/doc/VariableImportance.Rmd",61,1,"style","Variable and function name style should be snake_case or symbols.","originalProject <- StartProject(friedman, ""OriginalProject"", target = ""Y"", wait = TRUE)","object_name_linter" +"inst/doc/VariableImportance.Rmd",61,81,"style","Lines should not be more than 80 characters.","originalProject <- StartProject(friedman, ""OriginalProject"", target = ""Y"", wait = TRUE)","line_length_linter" +"inst/doc/VariableImportance.Rmd",62,1,"style","Variable and function name style should be snake_case or symbols.","originalModels <- ListModels(originalProject)","object_name_linter" +"inst/doc/VariableImportance.Rmd",70,1,"style","Variable and function name style should be snake_case or symbols.","PermuteColumn <- function(originalFile, colName, permutedFile, iseed = 317) {","object_name_linter" +"inst/doc/VariableImportance.Rmd",70,27,"style","Variable and function name style should be snake_case or symbols.","PermuteColumn <- function(originalFile, colName, permutedFile, iseed = 317) {","object_name_linter" +"inst/doc/VariableImportance.Rmd",70,41,"style","Variable and function name style should be snake_case or symbols.","PermuteColumn <- function(originalFile, colName, permutedFile, iseed = 317) {","object_name_linter" +"inst/doc/VariableImportance.Rmd",70,50,"style","Variable and function name style should be snake_case or symbols.","PermuteColumn <- function(originalFile, colName, permutedFile, iseed = 317) {","object_name_linter" +"inst/doc/VariableImportance.Rmd",72,3,"style","Variable and function name style should be snake_case or symbols."," originalFile <- system.file(""extdata"", originalFile, package = ""datarobot"")","object_name_linter" +"inst/doc/VariableImportance.Rmd",74,3,"style","Variable and function name style should be snake_case or symbols."," varNames <- colnames(dframe)","object_name_linter" +"inst/doc/VariableImportance.Rmd",75,3,"style","Variable and function name style should be snake_case or symbols."," colIndex <- which(varNames == colName)","object_name_linter" +"inst/doc/VariableImportance.Rmd",76,15,"style","Commas should never have a space before."," x <- dframe[ ,colIndex]","commas_linter" +"inst/doc/VariableImportance.Rmd",76,15,"style","Do not place spaces after square brackets."," x <- dframe[ ,colIndex]","spaces_inside_linter" +"inst/doc/VariableImportance.Rmd",76,17,"style","Commas should always have a space after."," x <- dframe[ ,colIndex]","commas_linter" +"inst/doc/VariableImportance.Rmd",78,3,"style","Variable and function name style should be snake_case or symbols."," outFrame <- dframe","object_name_linter" +"inst/doc/VariableImportance.Rmd",79,3,"style","Variable and function name style should be snake_case or symbols."," outFrame[ ,colIndex] <- y","object_name_linter" +"inst/doc/VariableImportance.Rmd",79,12,"style","Commas should never have a space before."," outFrame[ ,colIndex] <- y","commas_linter" +"inst/doc/VariableImportance.Rmd",79,12,"style","Do not place spaces after square brackets."," outFrame[ ,colIndex] <- y","spaces_inside_linter" +"inst/doc/VariableImportance.Rmd",79,14,"style","Commas should always have a space after."," outFrame[ ,colIndex] <- y","commas_linter" +"inst/doc/VariableImportance.Rmd",80,46,"style","Put spaces around all infix operators."," write.csv(outFrame, permutedFile, row.names=FALSE)","infix_spaces_linter" +"inst/doc/VariableImportance.Rmd",87,1,"style","Variable and function name style should be snake_case or symbols.","modelList <- list(n = 11)","object_name_linter" +"inst/doc/VariableImportance.Rmd",88,1,"style","Variable and function name style should be snake_case or symbols.","modelList[[1]] <- originalModels","object_name_linter" +"inst/doc/VariableImportance.Rmd",89,1,"style","Variable and function name style should be snake_case or symbols.","permFile <- tempfile(fileext = ""permFile.csv"")","object_name_linter" +"inst/doc/VariableImportance.Rmd",91,3,"style","Variable and function name style should be snake_case or symbols."," varName <- paste(""X"",i,sep="""")","object_name_linter" +"inst/doc/VariableImportance.Rmd",91,24,"style","Commas should always have a space after."," varName <- paste(""X"",i,sep="""")","commas_linter" +"inst/doc/VariableImportance.Rmd",91,26,"style","Commas should always have a space after."," varName <- paste(""X"",i,sep="""")","commas_linter" +"inst/doc/VariableImportance.Rmd",91,29,"style","Put spaces around all infix operators."," varName <- paste(""X"",i,sep="""")","infix_spaces_linter" +"inst/doc/VariableImportance.Rmd",93,3,"style","Variable and function name style should be snake_case or symbols."," projName <- paste(""PermProject"", varName, sep = """")","object_name_linter" +"inst/doc/VariableImportance.Rmd",94,3,"style","Variable and function name style should be snake_case or symbols."," permProject <- StartProject(permFile, projectName = projName, target = ""Y"", wait = TRUE)","object_name_linter" +"inst/doc/VariableImportance.Rmd",94,81,"style","Lines should not be more than 80 characters."," permProject <- StartProject(permFile, projectName = projName, target = ""Y"", wait = TRUE)","line_length_linter" +"inst/doc/VariableImportance.Rmd",95,3,"style","Variable and function name style should be snake_case or symbols."," modelList[[i+1]] <- ListModels(permProject)","object_name_linter" +"inst/doc/VariableImportance.Rmd",95,15,"style","Put spaces around all infix operators."," modelList[[i+1]] <- ListModels(permProject)","infix_spaces_linter" +"inst/doc/VariableImportance.Rmd",101,1,"style","Variable and function name style should be snake_case or symbols.","modelList <- readRDS(""PermutationModelList.rds"")","object_name_linter" +"inst/doc/VariableImportance.Rmd",116,1,"style","Variable and function name style should be snake_case or symbols.","PermutationMerge <- function(compositeList, matchPct = NULL, metricNames, matchMetric = NULL) {","object_name_linter" +"inst/doc/VariableImportance.Rmd",116,30,"style","Variable and function name style should be snake_case or symbols.","PermutationMerge <- function(compositeList, matchPct = NULL, metricNames, matchMetric = NULL) {","object_name_linter" +"inst/doc/VariableImportance.Rmd",116,45,"style","Variable and function name style should be snake_case or symbols.","PermutationMerge <- function(compositeList, matchPct = NULL, metricNames, matchMetric = NULL) {","object_name_linter" +"inst/doc/VariableImportance.Rmd",116,62,"style","Variable and function name style should be snake_case or symbols.","PermutationMerge <- function(compositeList, matchPct = NULL, metricNames, matchMetric = NULL) {","object_name_linter" +"inst/doc/VariableImportance.Rmd",116,75,"style","Variable and function name style should be snake_case or symbols.","PermutationMerge <- function(compositeList, matchPct = NULL, metricNames, matchMetric = NULL) {","object_name_linter" +"inst/doc/VariableImportance.Rmd",116,81,"style","Lines should not be more than 80 characters.","PermutationMerge <- function(compositeList, matchPct = NULL, metricNames, matchMetric = NULL) {","line_length_linter" +"inst/doc/VariableImportance.Rmd",124,5,"style","Variable and function name style should be snake_case or symbols."," projectMetric <- compositeList[[1]][[1]]$projectMetric","object_name_linter" +"inst/doc/VariableImportance.Rmd",125,5,"style","Variable and function name style should be snake_case or symbols."," matchMetric <- paste(projectMetric, ""validation"", sep = ""."")","object_name_linter" +"inst/doc/VariableImportance.Rmd",127,3,"style","Variable and function name style should be snake_case or symbols."," getCols <- c(""modelType"", ""expandedModel"", ""samplePct"", ""blueprintId"", matchMetric)","object_name_linter" +"inst/doc/VariableImportance.Rmd",127,81,"style","Lines should not be more than 80 characters."," getCols <- c(""modelType"", ""expandedModel"", ""samplePct"", ""blueprintId"", matchMetric)","line_length_linter" +"inst/doc/VariableImportance.Rmd",128,3,"style","Variable and function name style should be snake_case or symbols."," outFrame <- df[index, getCols]","object_name_linter" +"inst/doc/VariableImportance.Rmd",129,3,"style","Variable and function name style should be snake_case or symbols."," keepCols <- getCols","object_name_linter" +"inst/doc/VariableImportance.Rmd",130,3,"style","Variable and function name style should be snake_case or symbols."," keepCols[5] <- metricNames[1]","object_name_linter" +"inst/doc/VariableImportance.Rmd",131,12,"style","Variable and function name style should be snake_case or symbols."," colnames(outFrame) <- keepCols","object_name_linter" +"inst/doc/VariableImportance.Rmd",136,5,"style","Variable and function name style should be snake_case or symbols."," upFrame <- df[index, c(""blueprintId"", matchMetric)]","object_name_linter" +"inst/doc/VariableImportance.Rmd",137,14,"style","Variable and function name style should be snake_case or symbols."," colnames(upFrame) <- c(""blueprintId"", metricNames[i])","object_name_linter" +"inst/doc/VariableImportance.Rmd",138,5,"style","Variable and function name style should be snake_case or symbols."," outFrame <- merge(outFrame, upFrame, by = ""blueprintId"")","object_name_linter" +"inst/doc/VariableImportance.Rmd",147,1,"style","Variable and function name style should be snake_case or symbols.","metricNames <- c(""originalRMSE"", paste(""X"", seq(1, 10, 1), ""RMSE"", sep = """"))","object_name_linter" +"inst/doc/VariableImportance.Rmd",148,1,"style","Variable and function name style should be snake_case or symbols.","mergeFrame <- PermutationMerge(modelList, 16, metricNames)","object_name_linter" +"inst/doc/VariableImportance.Rmd",156,1,"style","Variable and function name style should be snake_case or symbols.","BeanNames <- c(""None"", paste(""X"", seq(1, 10, 1), sep = """"))","object_name_linter" +"inst/doc/VariableImportance.Rmd",167,1,"style","Variable and function name style should be snake_case or symbols.","ComputeDeltas <- function(mergeFrame, refCol, permNames, shiftNames) {","object_name_linter" +"inst/doc/VariableImportance.Rmd",167,27,"style","Variable and function name style should be snake_case or symbols.","ComputeDeltas <- function(mergeFrame, refCol, permNames, shiftNames) {","object_name_linter" +"inst/doc/VariableImportance.Rmd",167,39,"style","Variable and function name style should be snake_case or symbols.","ComputeDeltas <- function(mergeFrame, refCol, permNames, shiftNames) {","object_name_linter" +"inst/doc/VariableImportance.Rmd",167,47,"style","Variable and function name style should be snake_case or symbols.","ComputeDeltas <- function(mergeFrame, refCol, permNames, shiftNames) {","object_name_linter" +"inst/doc/VariableImportance.Rmd",167,58,"style","Variable and function name style should be snake_case or symbols.","ComputeDeltas <- function(mergeFrame, refCol, permNames, shiftNames) {","object_name_linter" +"inst/doc/VariableImportance.Rmd",168,3,"style","Variable and function name style should be snake_case or symbols."," allNames <- colnames(mergeFrame)","object_name_linter" +"inst/doc/VariableImportance.Rmd",169,3,"style","Variable and function name style should be snake_case or symbols."," refIndex <- which(allNames == refCol)","object_name_linter" +"inst/doc/VariableImportance.Rmd",170,3,"style","Variable and function name style should be snake_case or symbols."," xRef <- mergeFrame[, refIndex]","object_name_linter" +"inst/doc/VariableImportance.Rmd",171,3,"style","Variable and function name style should be snake_case or symbols."," permCols <- which(allNames %in% permNames)","object_name_linter" +"inst/doc/VariableImportance.Rmd",172,3,"style","Variable and function name style should be snake_case or symbols."," xPerm <- mergeFrame[, permCols]","object_name_linter" +"inst/doc/VariableImportance.Rmd",176,3,"style","Variable and function name style should be snake_case or symbols."," newIndex <- which(colnames(deltas) == ""New"")","object_name_linter" +"inst/doc/VariableImportance.Rmd",185,1,"style","Variable and function name style should be snake_case or symbols.","allNames <- colnames(mergeFrame)","object_name_linter" +"inst/doc/VariableImportance.Rmd",186,1,"style","Variable and function name style should be snake_case or symbols.","refCol <- allNames[5]","object_name_linter" +"inst/doc/VariableImportance.Rmd",187,1,"style","Variable and function name style should be snake_case or symbols.","permNames <- allNames[6:15]","object_name_linter" +"inst/doc/VariableImportance.Rmd",188,1,"style","Variable and function name style should be snake_case or symbols.","shiftNames <- paste(""X"", seq(1, 10, 1), sep = """")","object_name_linter" +"inst/doc/VariableImportance.Rmd",189,1,"style","Variable and function name style should be snake_case or symbols.","deltaFrame <- ComputeDeltas(mergeFrame, refCol, permNames, shiftNames)","object_name_linter" +"inst/doc/VariableImportance.Rmd",193,10,"style","Put spaces around all infix operators.","par(mfrow=c(1, 1))","infix_spaces_linter" +"inst/doc/VariableImportance.Rmd",198,1,"style","Variable and function name style should be snake_case or symbols.","bestRow <- which.min(deltaFrame$originalRMSE)","object_name_linter" +"inst/doc/VariableImportance.Rmd",199,1,"style","Variable and function name style should be snake_case or symbols.","bestModel <- mergeFrame$modelType[bestRow]","object_name_linter" +"inst/doc/VariableImportance.Rmd",200,81,"style","Lines should not be more than 80 characters.","points(seq(1, 10, 1), deltaFrame[bestRow, 1:10], pch = 16, col = ""limegreen"", cex = 1.5)","line_length_linter" +"inst/doc/VariableImportance.Rmd",219,1,"style","Variable and function name style should be snake_case or symbols.","varImpSummary <- function(deltaFrame, refCol, oneIndex) {","object_name_linter" +"inst/doc/VariableImportance.Rmd",219,27,"style","Variable and function name style should be snake_case or symbols.","varImpSummary <- function(deltaFrame, refCol, oneIndex) {","object_name_linter" +"inst/doc/VariableImportance.Rmd",219,39,"style","Variable and function name style should be snake_case or symbols.","varImpSummary <- function(deltaFrame, refCol, oneIndex) {","object_name_linter" +"inst/doc/VariableImportance.Rmd",219,47,"style","Variable and function name style should be snake_case or symbols.","varImpSummary <- function(deltaFrame, refCol, oneIndex) {","object_name_linter" +"inst/doc/VariableImportance.Rmd",221,3,"style","Variable and function name style should be snake_case or symbols."," refIndex <- which(vars == refCol)","object_name_linter" +"inst/doc/VariableImportance.Rmd",222,3,"style","Variable and function name style should be snake_case or symbols."," refValue <- deltaFrame[, refIndex]","object_name_linter" +"inst/doc/VariableImportance.Rmd",223,11,"style","Put spaces around all infix operators."," wts <- 1/refValue # Performance-weights = reciprocal fitting measure","infix_spaces_linter" +"inst/doc/VariableImportance.Rmd",224,3,"style","Variable and function name style should be snake_case or symbols."," deltasOnly <- deltaFrame[, -refIndex]","object_name_linter" +"inst/doc/VariableImportance.Rmd",225,3,"style","Variable and function name style should be snake_case or symbols."," thisModel <- as.numeric(deltasOnly[oneIndex, ])","object_name_linter" +"inst/doc/VariableImportance.Rmd",226,34,"style","Put spaces around all infix operators."," avg <- apply(deltasOnly, MARGIN=2, mean)","infix_spaces_linter" +"inst/doc/VariableImportance.Rmd",227,3,"style","Variable and function name style should be snake_case or symbols."," WtAvgFunction <- function(x, w) { sum(w * x) / sum(w) }","object_name_linter" +"inst/doc/VariableImportance.Rmd",227,35,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," WtAvgFunction <- function(x, w) { sum(w * x) / sum(w) }","brace_linter" +"inst/doc/VariableImportance.Rmd",227,57,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," WtAvgFunction <- function(x, w) { sum(w * x) / sum(w) }","brace_linter" +"inst/doc/VariableImportance.Rmd",228,3,"style","Variable and function name style should be snake_case or symbols."," wtAvg <- apply(deltasOnly, MARGIN = 2, WtAvgFunction, wts)","object_name_linter" +"inst/doc/VariableImportance.Rmd",229,3,"style","Variable and function name style should be snake_case or symbols."," varImpFrame <- data.frame(average = avg,","object_name_linter" +"inst/doc/VariableImportance.Rmd",239,1,"style","Variable and function name style should be snake_case or symbols.","varImp <- varImpSummary(deltaFrame, ""originalRMSE"", bestRow)","object_name_linter" +"inst/doc/VariableImportance.Rmd",241,1,"style","Variable and function name style should be snake_case or symbols.","wtAvg <- round(varImp$weightedAverage, digits = 3)","object_name_linter" +"R/AdvancedTuning.R",80,1,"style","Variable and function names should not be longer than 30 characters.","summary.listOfDataRobotTuningParameters <- function(object, ...) {","object_length_linter" +"R/AdvancedTuning.R",171,11,"style","Variable and function name style should be snake_case or symbols."," formals(tuningFunction) <- args","object_name_linter" +"R/AnomalyAssessment.R",5,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotAnomalyAssessmentRecord""","object_name_linter" +"R/AnomalyAssessment.R",12,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotShapFeatureContribution""","object_name_linter" +"R/AnomalyAssessment.R",18,3,"style","Variable and function name style should be snake_case or symbols."," outList$timestamp <- parseRFC3339Timestamp(outList$timestamp)","object_name_linter" +"R/AnomalyAssessment.R",22,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotPredictionWithExplanationsRow""","object_name_linter" +"R/AnomalyAssessment.R",32,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotAnomalyAssessmentExplanations""","object_name_linter" +"R/AnomalyAssessment.R",43,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotPreviewBin""","object_name_linter" +"R/AnomalyAssessment.R",53,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotAnomalyAssessmentPredictionsPreview""","object_name_linter" +"R/ApplySchema.R",16,13,"style","Variable and function name style should be snake_case or symbols."," names(outList) <- elements","object_name_linter" +"R/asDataFrame.R",44,47,"style","Variable and function name style should be snake_case or symbols.","as.data.frame.listOfBlueprints <- function(x, row.names = NULL,","object_name_linter" +"R/asDataFrame.R",68,14,"style","Variable and function name style should be snake_case or symbols."," rownames(sumFrame) <- row.names","object_name_linter" +"R/asDataFrame.R",75,49,"style","Variable and function name style should be snake_case or symbols.","as.data.frame.listOfFeaturelists <- function(x, row.names = NULL,","object_name_linter" +"R/asDataFrame.R",84,11,"style","Variable and function name style should be snake_case or symbols."," class(upFrame$features) <- ""list""","object_name_linter" +"R/asDataFrame.R",94,14,"style","Variable and function name style should be snake_case or symbols."," rownames(sumFrame) <- row.names","object_name_linter" +"R/asDataFrame.R",151,16,"style","Variable and function name style should be snake_case or symbols."," rownames(outFrame) <- row.names","object_name_linter" +"R/asDataFrame.R",185,16,"style","Variable and function name style should be snake_case or symbols."," colnames(validFrame) <- paste(colnames(validFrame), ""validation"",","object_name_linter" +"R/asDataFrame.R",188,16,"style","Variable and function name style should be snake_case or symbols."," colnames(crossFrame) <- paste(colnames(crossFrame),","object_name_linter" +"R/asDataFrame.R",191,16,"style","Variable and function name style should be snake_case or symbols."," colnames(holdFrame) <- paste(colnames(holdFrame), ""holdout"", sep = ""."")","object_name_linter" +"R/asDataFrame.R",197,16,"style","Variable and function name style should be snake_case or symbols."," rownames(outFrame) <- row.names","object_name_linter" +"R/asDataFrame.R",223,12,"style","Variable and function name style should be snake_case or symbols."," colnames(metricFrame) <- metricNames","object_name_linter" +"R/asDataFrame.R",239,49,"style","Variable and function name style should be snake_case or symbols.","as.data.frame.projectSummaryList <- function(x, row.names = NULL,","object_name_linter" +"R/asDataFrame.R",262,14,"style","Variable and function name style should be snake_case or symbols."," rownames(outFrame) <- row.names","object_name_linter" +"R/asDataFrame.R",270,1,"style","Variable and function names should not be longer than 30 characters.","as.data.frame.listOfDataRobotPredictionDatasets <- function(x, row.names = NULL,","object_length_linter" +"R/asDataFrame.R",270,64,"style","Variable and function name style should be snake_case or symbols.","as.data.frame.listOfDataRobotPredictionDatasets <- function(x, row.names = NULL,","object_name_linter" +"R/asDataFrame.R",294,14,"style","Variable and function name style should be snake_case or symbols."," rownames(sumFrame) <- row.names","object_name_linter" +"R/Blenders.R",69,11,"style","Variable and function name style should be snake_case or symbols."," names(modelDetails)[idIndex] <- ""modelId""","object_name_linter" +"R/Blenders.R",70,5,"style","Variable and function name style should be snake_case or symbols."," modelDetails$metrics <- ReformatMetrics(modelDetails$metrics)","object_name_linter" +"R/Blenders.R",75,7,"style","Variable and function name style should be snake_case or symbols."," modelDetails$processes <- character(0)","object_name_linter" +"R/Blenders.R",163,9,"style","Variable and function name style should be snake_case or symbols."," class(returnModel) <- ""dataRobotBlenderModel""","object_name_linter" +"R/Blenders.R",187,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotBlenderModel""","object_name_linter" +"R/Blueprints.R",27,9,"style","Variable and function name style should be snake_case or symbols."," class(blueprintList) <- c(""listOfBlueprints"", ""listSubclass"")","object_name_linter" +"R/Calendars.R",57,3,"style","Variable and function name style should be snake_case or symbols."," outList$id <- outList$Id","object_name_linter" +"R/Calendars.R",59,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotCalendar""","object_name_linter" +"R/ConfusionChart.R",82,3,"style","Variable and function name style should be snake_case or symbols."," outList$data <- as.list(outList$data)","object_name_linter" +"R/ConnectToDataRobot.R",70,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (!is.na(envEndpoint) & !is.na(envToken)) {","vector_logic_linter" +"R/DataRobotRequests.R",193,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (endpoint == """" | token == """") {","vector_logic_linter" +"R/DataSources.R",50,3,"style","Variable and function name style should be snake_case or symbols."," outList$params <- ApplySchema(outList$params, c(""dataSourceId"", ""table""))","object_name_linter" +"R/DataSources.R",51,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotDataSource""","object_name_linter" +"R/DataStores.R",48,3,"style","Variable and function name style should be snake_case or symbols."," outList$params <- ApplySchema(outList$params, c(""driverId"", ""jdbcUrl""))","object_name_linter" +"R/DataStores.R",49,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotDataStore""","object_name_linter" +"R/DatetimeTrendPlots.R",140,5,"style","Variable and function name style should be snake_case or symbols."," outList$backtestMetadata$training[] <- lapply(","object_name_linter" +"R/DatetimeTrendPlots.R",143,5,"style","Variable and function name style should be snake_case or symbols."," outList$backtestMetadata$validation[] <- lapply(","object_name_linter" +"R/DatetimeTrendPlots.R",146,5,"style","Variable and function name style should be snake_case or symbols."," outList$holdoutMetadata$training <- lapply(","object_name_linter" +"R/DatetimeTrendPlots.R",149,5,"style","Variable and function name style should be snake_case or symbols."," outList$holdoutMetadata$validation <- lapply(","object_name_linter" +"R/DatetimeTrendPlots.R",290,9,"style","Variable and function name style should be snake_case or symbols."," outList$calendarEvents$date <- do.call(","object_name_linter" +"R/DeploymentAccuracy.R",161,34,"style","Any function spanning multiple lines should use curly braces."," responses <- lapply(metrics, function(m)","brace_linter" +"R/DeploymentMonitoringUtils.R",39,9,"style","Variable and function name style should be snake_case or symbols."," periodContainer$period <- list()","object_name_linter" +"R/DeploymentMonitoringUtils.R",40,9,"style","Variable and function name style should be snake_case or symbols."," periodContainer$period$start <- NA","object_name_linter" +"R/DeploymentMonitoringUtils.R",41,9,"style","Variable and function name style should be snake_case or symbols."," periodContainer$period$end <- NA","object_name_linter" +"R/Drivers.R",47,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotDriver""","object_name_linter" +"R/FeatureAssociations.R",78,3,"style","Variable and function name style should be snake_case or symbols."," outList$values <- as.data.frame(outList$values)","object_name_linter" +"R/FeatureAssociations.R",79,12,"style","Variable and function name style should be snake_case or symbols."," colnames(outList$values) <- c(""feature1"", ""feature2"", ""relativeFreq"")","object_name_linter" +"R/Featurelists.R",46,9,"style","Variable and function name style should be snake_case or symbols."," names(featurelistInfo)[idIndex] <- ""featurelistId""","object_name_linter" +"R/Featurelists.R",78,3,"style","Variable and function name style should be snake_case or symbols."," featurelistInfo$id <- NULL","object_name_linter" +"R/Features.R",149,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotFeatureInfo""","object_name_linter" +"R/Features.R",161,3,"style","Variable and function name style should be snake_case or symbols."," outList$summary <- ApplySchema(outList$summary, descriptiveStatisticsElements)","object_name_linter" +"R/Features.R",230,39,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," }) }) }","brace_linter" +"R/GetPredictions.R",94,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/GetPredictions.R",97,27,"style","Any function spanning multiple lines should use curly braces."," function(x) stats::setNames(x$value,","brace_linter" +"R/GetPredictJobs.R",32,3,"style","Variable and function name style should be snake_case or symbols."," predictJobStatus$id <- NULL","object_name_linter" +"R/ListModelJobs.R",58,11,"style","Variable and function name style should be snake_case or symbols."," names(pendingList)[idIndex] <- ""modelJobId""","object_name_linter" +"R/MissingValuesReport.R",60,5,"style","Variable and function name style should be snake_case or symbols."," inList[[i]]$feature <- NULL # Drop feature from within list","object_name_linter" +"R/MissingValuesReport.R",62,7,"style","Variable and function name style should be snake_case or symbols."," inList[[i]]$tasks[[j]]$id <- names(inList[[i]]$tasks)[[j]]","object_name_linter" +"R/MissingValuesReport.R",63,7,"style","Variable and function name style should be snake_case or symbols."," inList[[i]]$tasks[[j]]$name <- as.character(inList[[i]]$tasks[[j]]$name)","object_name_linter" +"R/MissingValuesReport.R",66,5,"style","Variable and function name style should be snake_case or symbols."," inList[[i]]$tasks <- unname(inList[[i]]$tasks)","object_name_linter" +"R/ModelRecommendations.R",25,9,"style","Variable and function name style should be snake_case or symbols."," class(modelRecommendations) <- c(""listOfModelRecommendations"", ""listSubclass"")","object_name_linter" +"R/ModelRecommendations.R",73,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotModelRecommendation""","object_name_linter" +"R/Models.R",91,11,"style","Variable and function name style should be snake_case or symbols."," names(modelDetails)[names(modelDetails) == ""id""] <- ""modelId""","object_name_linter" +"R/Models.R",92,5,"style","Variable and function name style should be snake_case or symbols."," modelDetails$metrics <- ReformatMetrics(modelDetails$metrics)","object_name_linter" +"R/Models.R",97,7,"style","Variable and function name style should be snake_case or symbols."," modelDetails$processes <- character(0)","object_name_linter" +"R/Models.R",153,11,"style","Variable and function name style should be snake_case or symbols."," names(modelDetails)[idIndex] <- ""modelId""","object_name_linter" +"R/Models.R",154,5,"style","Variable and function name style should be snake_case or symbols."," modelDetails$metrics <- ReformatMetrics(modelDetails$metrics)","object_name_linter" +"R/Models.R",159,7,"style","Variable and function name style should be snake_case or symbols."," modelDetails$processes <- character(0)","object_name_linter" +"R/Models.R",214,7,"style","`else` should come on the same line as the previous `}`."," else if (identical(filter$isStarred, FALSE)) {","brace_linter" +"R/Models.R",248,9,"style","Variable and function name style should be snake_case or symbols."," class(returnList) <- c(""listOfModels"", ""listSubclass"")","object_name_linter" +"R/Models.R",296,9,"style","Variable and function name style should be snake_case or symbols."," class(returnModel) <- ""dataRobotModel""","object_name_linter" +"R/Models.R",348,9,"style","Variable and function name style should be snake_case or symbols."," class(returnModel) <- ""dataRobotFrozenModel""","object_name_linter" +"R/Models.R",585,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotModel""","object_name_linter" +"R/Models.R",614,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotFrozenModel""","object_name_linter" +"R/Models.R",686,3,"style","Variable and function name style should be snake_case or symbols."," outList$parameters <- lapply(outList$parameters, as.dataRobotNameValueSchema)","object_name_linter" +"R/Models.R",752,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotDatetimeModel""","object_name_linter" +"R/Models.R",763,5,"style","Variable and function name style should be snake_case or symbols."," bodyFrame[fieldName] <- featurelist","object_name_linter" +"R/Models.R",768,11,"style","Variable and function name style should be snake_case or symbols."," names(bodyFrame)[1] <- fieldName","object_name_linter" +"R/Models.R",885,11,"style","Variable and function name style should be snake_case or symbols."," names(modelDetails)[names(modelDetails) == ""id""] <- ""modelId""","object_name_linter" +"R/Models.R",886,5,"style","Variable and function name style should be snake_case or symbols."," modelDetails$metrics <- ReformatMetrics(modelDetails$metrics)","object_name_linter" +"R/Models.R",891,7,"style","Variable and function name style should be snake_case or symbols."," modelDetails$processes <- character(0)","object_name_linter" +"R/Models.R",894,11,"style","Variable and function name style should be snake_case or symbols."," class(modelDetails) <- ""dataRobotDatetimeModel""","object_name_linter" +"R/Models.R",942,9,"style","Variable and function name style should be snake_case or symbols."," class(returnModel) <- ""dataRobotDatetimeModel""","object_name_linter" +"R/Models.R",1172,3,"warning","local variable β€˜response’ assigned but may not be used"," response <- DataRobotGET(routeString, as = ""file"", filename = fileName,","object_usage_linter" +"R/ParetoFront.R",70,3,"style","Variable and function name style should be snake_case or symbols."," outList$hyperparameters <- as.list(outList$hyperparameters)","object_name_linter" +"R/ParetoFront.R",71,3,"style","Variable and function name style should be snake_case or symbols."," outList$solutions <- as.list(outList$solutions)","object_name_linter" +"R/Partitions.R",473,7,"style","Variable and function name style should be snake_case or symbols."," outList$backtests <- as.dataRobotBacktestSpecification(outList$backtests)","object_name_linter" +"R/Partitions.R",689,3,"style","Variable and function name style should be snake_case or symbols."," outList$backtests <- ApplySchema(outList$backtests, backtestElements)","object_name_linter" +"R/PredictionDatasets.R",228,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotPredictionDataset""","object_name_linter" +"R/PredictionDatasets.R",233,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- c(""listOfDataRobotPredictionDatasets"", ""listSubclass"")","object_name_linter" +"R/PredictionExplanations.R",107,9,"style","Variable and function name style should be snake_case or symbols."," class(pseudoModel) <- ""dataRobotModel""","object_name_linter" +"R/PredictionExplanations.R",473,3,"style","Variable and function name style should be snake_case or symbols."," outDf$prediction <- vapply(explains, `[[`, predictionType, ""prediction"")","object_name_linter" +"R/PredictionExplanations.R",494,7,"style","Variable and function name style should be snake_case or symbols."," outDf[paste0(""class"", m, ""Label"")] <- labels","object_name_linter" +"R/PredictionExplanations.R",497,7,"style","Variable and function name style should be snake_case or symbols."," outDf[paste0(""class"", m, ""Probability"")] <- values","object_name_linter" +"R/PredictionExplanations.R",508,5,"style","Variable and function name style should be snake_case or symbols."," outDf[paste0(""explanation"", n, ""FeatureName"")] <-","object_name_linter" +"R/PredictionExplanations.R",522,5,"style","Variable and function name style should be snake_case or symbols."," outDf[paste0(""explanation"", n, ""QualitativeStrength"")] <-","object_name_linter" +"R/PredictionExplanations.R",533,5,"style","Variable and function name style should be snake_case or symbols."," outDf[paste0(""explanation"", n, ""Strength"")] <- if (length(strength) > 1) {","object_name_linter" +"R/PredictionExplanations.R",536,5,"style","Variable and function name style should be snake_case or symbols."," outDf[paste0(""explanation"", n, ""Label"")] <-","object_name_linter" +"R/PrimeModels.R",99,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- c(""dataRobotPrimeModels"", ""data.frame"")","object_name_linter" +"R/PrimeModels.R",105,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- c(""dataRobotPrimeModel"")","object_name_linter" +"R/Projects.R",127,11,"style","Variable and function name style should be snake_case or symbols."," names(projectSummaryData)[[idIndex]] <- ""projectId""","object_name_linter" +"R/Projects.R",129,11,"style","Variable and function name style should be snake_case or symbols."," class(projectSummaryData) <- ""projectSummaryList""","object_name_linter" +"R/Projects.R",177,9,"style","Variable and function name style should be snake_case or symbols."," names(projectDetails)[idIndex] <- ""projectId""","object_name_linter" +"R/Projects.R",183,9,"style","Variable and function name style should be snake_case or symbols."," class(outProject) <- ""dataRobotProject""","object_name_linter" +"R/RatingTables.R",102,9,"style","Variable and function name style should be snake_case or symbols."," class(ratingTables) <- c(""listOfRatingTables"", ""listSubclass"")","object_name_linter" +"R/RatingTables.R",258,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotRatingTableModel""","object_name_linter" +"R/RatingTables.R",268,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotRatingTable""","object_name_linter" +"R/ReformatMetrics.R",22,5,"style","Variable and function name style should be snake_case or symbols."," outList[[i]] <- as.data.frame(lapply(metricsList[[i]], ReplaceFunction))","object_name_linter" +"R/ReformatMetrics.R",25,9,"style","Variable and function name style should be snake_case or symbols."," names(outList) <- names(metricsList)","object_name_linter" +"R/ResidualsChart.R",48,3,"style","Variable and function name style should be snake_case or symbols."," outList$data <- as.data.frame(outList$data)","object_name_linter" +"R/ResidualsChart.R",52,5,"style","Variable and function name style should be snake_case or symbols."," outList$data[""rowNumber""] <- NA","object_name_linter" +"R/ResidualsChart.R",54,12,"style","Variable and function name style should be snake_case or symbols."," colnames(outList$data) <- c(""actual"",","object_name_linter" +"R/ResidualsChart.R",59,3,"style","Variable and function name style should be snake_case or symbols."," outList$histogram$occurrences <- as.integer(outList$histogram$occurrences)","object_name_linter" +"R/ResidualsChart.R",60,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotResiduals""","object_name_linter" +"R/ServerData.R",6,3,"style","Variable and function name style should be snake_case or symbols."," serverData$`next` <- NULL","object_name_linter" +"R/ServerData.R",7,3,"style","Variable and function name style should be snake_case or symbols."," serverData$previous <- NULL","object_name_linter" +"R/SetupProject.R",41,5,"style","Variable and function name style should be snake_case or symbols."," dataList$url <- dataSource","object_name_linter" +"R/SetupProject.R",43,5,"style","Variable and function name style should be snake_case or symbols."," dataList$file <- UploadData(dataSource)","object_name_linter" +"R/SetupProject.R",186,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotProject""","object_name_linter" +"R/StartAutopilot.R",124,3,"style","Variable and function name style should be snake_case or symbols."," bodyList$metric <- metric","object_name_linter" +"R/StartAutopilot.R",125,3,"style","Variable and function name style should be snake_case or symbols."," bodyList$weights <- weights","object_name_linter" +"R/StartAutopilot.R",126,3,"style","Variable and function name style should be snake_case or symbols."," bodyList$mode <- mode","object_name_linter" +"R/StartAutopilot.R",127,3,"style","Variable and function name style should be snake_case or symbols."," bodyList$quickrun <- quickrun","object_name_linter" +"R/StartAutopilot.R",128,3,"style","Variable and function name style should be snake_case or symbols."," bodyList$seed <- seed","object_name_linter" +"R/StartAutopilot.R",136,3,"style","Variable and function name style should be snake_case or symbols."," bodyList$offset <- offset","object_name_linter" +"R/StartAutopilot.R",137,3,"style","Variable and function name style should be snake_case or symbols."," bodyList$exposure <- exposure","object_name_linter" +"R/TrainingPredictions.R",120,37,"style","Any function spanning multiple lines should use curly braces."," function(x) stats::setNames(x$value,","brace_linter" +"R/utils.R",87,3,"style","Variable and function name style should be snake_case or symbols."," out.vec[var.pos] <- var.nms","object_name_linter" +"R/utils.R",88,3,"style","Variable and function name style should be snake_case or symbols."," out.vec[-var.pos] <- data.nms[!(data.nms %in% var.nms)]","object_name_linter" +"R/Validate.R",36,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(is(model, ""dataRobotModel"") | is(model, ""dataRobotFrozenModel"") |","vector_logic_linter" +"R/Validate.R",36,73,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(is(model, ""dataRobotModel"") | is(model, ""dataRobotFrozenModel"") |","vector_logic_linter" +"R/Validate.R",158,3,"style","`else` should come on the same line as the previous `}`."," else if (!""associationId"" %in% names(actuals)) {","brace_linter" +"R/Validate.R",161,3,"style","`else` should come on the same line as the previous `}`."," else if (max(nchar(actuals[[""associationId""]])) > 128) {","brace_linter" +"R/Validate.R",164,3,"style","`else` should come on the same line as the previous `}`."," else if (!is.character(actuals[[""associationId""]])) {","brace_linter" +"R/Validate.R",167,3,"style","`else` should come on the same line as the previous `}`."," else if (!""actualValue"" %in% names(actuals)) {","brace_linter" +"R/Validate.R",195,3,"style","`else` should come on the same line as the previous `}`."," else if (!(""timeSeriesEligible"" %in% names(properties))) {","brace_linter" +"R/Validate.R",198,3,"style","`else` should come on the same line as the previous `}`."," else if (!(""crossSeriesEligible"" %in% names(properties))) {","brace_linter" +"R/Validate.R",201,3,"style","`else` should come on the same line as the previous `}`."," else if (!isTRUE(properties$timeSeriesEligible)) {","brace_linter" +"tests/testthat/helper-fixtures.R",14,1,"style","Variable and function name style should be snake_case or symbols.","fakeProjectJson$id <- fakeProject$projectId","object_name_linter" +"tests/testthat/helper-fixtures.R",16,7,"style","Variable and function name style should be snake_case or symbols.","class(fakeProjectJson) <- ""list""","object_name_linter" +"tests/testthat/test-StartAutopilot.R",66,55,"warning","no visible binding for global variable β€˜projectUrl’"," getStub$onCall(7)$returns(httr:::response(url = projectUrl,","object_usage_linter" +"tests/testthat/test-StartAutopilot.R",71,55,"warning","no visible binding for global variable β€˜projectUrl’"," getStub$onCall(5)$returns(httr:::response(url = projectUrl,","object_usage_linter" +"tests/testthat/test-StartAutopilot.R",76,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"tests/testthat/test-StartAutopilot.R",78,53,"warning","no visible binding for global variable β€˜projectUrl’"," getStub$onCall(3)$returns(httr:::response(url = projectUrl,","object_usage_linter" +"tests/testthat/test-StartAutopilot.R",112,49,"warning","no visible binding for global variable β€˜fakeEndpoint’"," ""datarobot:::Endpoint"" = function() fakeEndpoint,","object_usage_linter" +"tests/testthat/test-StartAutopilot.R",113,46,"warning","no visible binding for global variable β€˜fakeToken’"," ""datarobot:::Token"" = function() fakeToken,","object_usage_linter" +"vignettes/AdvancedTuning.Rmd",22,1,"style","Variable and function name style should be snake_case or symbols.","tuningJobId <- RunInteractiveTuning(myModel)","object_name_linter" +"vignettes/AdvancedTuning.Rmd",28,1,"style","Variable and function name style should be snake_case or symbols.","tunedModel <- GetModelFromJobId(myModel$projectId, tuningJobId)","object_name_linter" +"vignettes/AdvancedTuning.Rmd",54,1,"style","Variable and function name style should be snake_case or symbols.","myXGBModel <- GetModel(projectId, modelId)","object_name_linter" +"vignettes/AdvancedTuning.Rmd",55,1,"style","Variable and function name style should be snake_case or symbols.","RunTune <- StartTuningSession(myXGBModel)","object_name_linter" +"vignettes/AdvancedTuning.Rmd",56,1,"style","Variable and function name style should be snake_case or symbols.","tuningJob <- RunTune(myXGBModel, colsample_bytree = 0.4, colsample_bylevel = 0.8)","object_name_linter" +"vignettes/AdvancedTuning.Rmd",56,81,"style","Lines should not be more than 80 characters.","tuningJob <- RunTune(myXGBModel, colsample_bytree = 0.4, colsample_bylevel = 0.8)","line_length_linter" +"vignettes/AdvancedTuning.Rmd",57,1,"style","Variable and function name style should be snake_case or symbols.","tunedModel <- GetModelFromJobId(projectId, tuningJob)","object_name_linter" +"vignettes/AdvancedVignette.Rmd",37,81,"style","Lines should not be more than 80 characters.","ConnectToDataRobot(endpoint = ""http:///api/v2"", token = """")","line_length_linter" +"vignettes/AdvancedVignette.Rmd",46,1,"style","Variable and function name style should be snake_case or symbols.","lendingClubURL <- ""https://s3.amazonaws.com/datarobot_public_datasets/10K_Lending_Club_Loans.csv""","object_name_linter" +"vignettes/AdvancedVignette.Rmd",46,81,"style","Lines should not be more than 80 characters.","lendingClubURL <- ""https://s3.amazonaws.com/datarobot_public_datasets/10K_Lending_Club_Loans.csv""","line_length_linter" +"vignettes/AdvancedVignette.Rmd",79,1,"style","Variable and function name style should be snake_case or symbols.","allModels <- ListModels(project)","object_name_linter" +"vignettes/AdvancedVignette.Rmd",81,1,"style","Variable and function name style should be snake_case or symbols.","modelFrame <- as.data.frame(allModels)","object_name_linter" +"vignettes/AdvancedVignette.Rmd",83,27,"style","Only use double-quotes.","if (project$metric %in% c('AUC', 'Gini Norm')) {","single_quotes_linter" +"vignettes/AdvancedVignette.Rmd",83,34,"style","Only use double-quotes.","if (project$metric %in% c('AUC', 'Gini Norm')) {","single_quotes_linter" +"vignettes/AdvancedVignette.Rmd",84,3,"style","Variable and function name style should be snake_case or symbols."," bestIndex <- which.max(metric)","object_name_linter" +"vignettes/AdvancedVignette.Rmd",86,3,"style","Variable and function name style should be snake_case or symbols."," bestIndex <- which.min(metric)","object_name_linter" +"vignettes/AdvancedVignette.Rmd",88,1,"style","Variable and function name style should be snake_case or symbols.","bestModel <- allModels[[bestIndex]]","object_name_linter" +"vignettes/AdvancedVignette.Rmd",93,1,"style","Variable and function name style should be snake_case or symbols.","allModels <- readRDS(""modelsModelInsights.rds"")","object_name_linter" +"vignettes/AdvancedVignette.Rmd",94,1,"style","Variable and function name style should be snake_case or symbols.","bestModel <- allModels[[1]]","object_name_linter" +"vignettes/AdvancedVignette.Rmd",115,1,"style","Variable and function name style should be snake_case or symbols.","ValidationLiftChart <- GetLiftChart(bestModel, source = ""validation"")","object_name_linter" +"vignettes/AdvancedVignette.Rmd",122,1,"style","Variable and function name style should be snake_case or symbols.","LiftChartPlot <- function(ValidationLiftChart, bins = 10) {","object_name_linter" +"vignettes/AdvancedVignette.Rmd",122,27,"style","Variable and function name style should be snake_case or symbols.","LiftChartPlot <- function(ValidationLiftChart, bins = 10) {","object_name_linter" +"vignettes/AdvancedVignette.Rmd",124,5,"style","Variable and function name style should be snake_case or symbols."," ValidationLiftChart$bins <- rep(seq(bins), each = 60 / bins)","object_name_linter" +"vignettes/AdvancedVignette.Rmd",125,5,"style","Variable and function name style should be snake_case or symbols."," ValidationLiftChart <- data.table(ValidationLiftChart)","object_name_linter" +"vignettes/AdvancedVignette.Rmd",133,1,"style","Variable and function name style should be snake_case or symbols.","LiftChartData <- LiftChartPlot(ValidationLiftChart)","object_name_linter" +"vignettes/AdvancedVignette.Rmd",142,3,"style","Commented code should be removed.","# dr_dark_blue <- ""#08233F""","commented_code_linter" +"vignettes/AdvancedVignette.Rmd",143,3,"style","Commented code should be removed.","# dr_blue <- ""#1F77B4""","commented_code_linter" +"vignettes/AdvancedVignette.Rmd",144,3,"style","Commented code should be removed.","# dr_orange <- ""#FF7F0E""","commented_code_linter" +"vignettes/AdvancedVignette.Rmd",145,3,"style","Commented code should be removed.","# LiftChartData <- readRDS(""LiftChartDataVal.rds"")","commented_code_linter" +"vignettes/AdvancedVignette.Rmd",146,3,"style","Commented code should be removed.","# par(bg = dr_dark_blue)","commented_code_linter" +"vignettes/AdvancedVignette.Rmd",149,3,"style","Commented code should be removed.","# lines(LiftChartData$Predicted, col = dr_blue, pch = 20, type = ""b"")","commented_code_linter" +"vignettes/AdvancedVignette.Rmd",156,1,"style","Variable and function name style should be snake_case or symbols.","AllLiftChart <- ListLiftCharts(bestModel)","object_name_linter" +"vignettes/AdvancedVignette.Rmd",157,1,"style","Variable and function name style should be snake_case or symbols.","LiftChartData <- LiftChartPlot(AllLiftChart[[""crossValidation""]])","object_name_linter" +"vignettes/AdvancedVignette.Rmd",166,3,"style","Commented code should be removed.","# LiftChartData <- readRDS(""LiftChartDataCV.rds"")","commented_code_linter" +"vignettes/AdvancedVignette.Rmd",167,3,"style","Commented code should be removed.","# par(bg = dr_dark_blue)","commented_code_linter" +"vignettes/AdvancedVignette.Rmd",170,3,"style","Commented code should be removed.","# lines(LiftChartData$Predicted, col = dr_blue, pch = 20, type = ""b"")","commented_code_linter" +"vignettes/AdvancedVignette.Rmd",212,1,"style","Variable and function name style should be snake_case or symbols.","ValidationRocCurve <- GetRocCurve(bestModel)","object_name_linter" +"vignettes/AdvancedVignette.Rmd",213,1,"style","Variable and function name style should be snake_case or symbols.","ValidationRocPoints <- ValidationRocCurve[[""rocPoints""]]","object_name_linter" +"vignettes/AdvancedVignette.Rmd",216,81,"style","Lines should not be more than 80 characters.","plot(ValidationRocPoints$falsePositiveRate, ValidationRocPoints$truePositiveRate,","line_length_linter" +"vignettes/AdvancedVignette.Rmd",218,81,"style","Lines should not be more than 80 characters."," xlab = ""False Positive Rate (Fallout)"", ylab = ""True Positive Rate (Sensitivity)"",","line_length_linter" +"vignettes/AdvancedVignette.Rmd",220,17,"style","Commas should always have a space after."," ylim = c(0,1), xlim = c(0,1),","commas_linter" +"vignettes/AdvancedVignette.Rmd",220,32,"style","Commas should always have a space after."," ylim = c(0,1), xlim = c(0,1),","commas_linter" +"vignettes/AdvancedVignette.Rmd",227,1,"style","Variable and function name style should be snake_case or symbols.","ValidationRocPoints <- readRDS(""ValidationRocPoints.rds"")","object_name_linter" +"vignettes/AdvancedVignette.Rmd",229,81,"style","Lines should not be more than 80 characters.","plot(ValidationRocPoints$falsePositiveRate, ValidationRocPoints$truePositiveRate,","line_length_linter" +"vignettes/AdvancedVignette.Rmd",231,81,"style","Lines should not be more than 80 characters."," xlab = ""False Positive Rate (Fallout)"", ylab = ""True Positive Rate (Sensitivity)"",","line_length_linter" +"vignettes/AdvancedVignette.Rmd",240,1,"style","Variable and function name style should be snake_case or symbols.","AllRocCurve <- ListRocCurves(bestModel)","object_name_linter" +"vignettes/AdvancedVignette.Rmd",241,1,"style","Variable and function name style should be snake_case or symbols.","CrossValidationRocPoints <- AllRocCurve[['crossValidation']][['rocPoints']]","object_name_linter" +"vignettes/AdvancedVignette.Rmd",241,42,"style","Only use double-quotes.","CrossValidationRocPoints <- AllRocCurve[['crossValidation']][['rocPoints']]","single_quotes_linter" +"vignettes/AdvancedVignette.Rmd",241,63,"style","Only use double-quotes.","CrossValidationRocPoints <- AllRocCurve[['crossValidation']][['rocPoints']]","single_quotes_linter" +"vignettes/AdvancedVignette.Rmd",242,35,"style","Only use double-quotes.","saveRDS(CrossValidationRocPoints, 'CrossValidationRocPoints.rds')","single_quotes_linter" +"vignettes/AdvancedVignette.Rmd",244,81,"style","Lines should not be more than 80 characters.","plot(CrossValidationRocPoints$falsePositiveRate, CrossValidationRocPoints$truePositiveRate,","line_length_linter" +"vignettes/AdvancedVignette.Rmd",246,81,"style","Lines should not be more than 80 characters."," xlab = ""False Positive Rate (Fallout)"", ylab = ""True Positive Rate (Sensitivity)"",","line_length_linter" +"vignettes/AdvancedVignette.Rmd",253,1,"style","Variable and function name style should be snake_case or symbols.","CrossValidationRocPoints <- readRDS(""CrossValidationRocPoints.rds"")","object_name_linter" +"vignettes/AdvancedVignette.Rmd",255,81,"style","Lines should not be more than 80 characters.","plot(CrossValidationRocPoints$falsePositiveRate, CrossValidationRocPoints$truePositiveRate,","line_length_linter" +"vignettes/AdvancedVignette.Rmd",257,81,"style","Lines should not be more than 80 characters."," xlab = ""False Positive Rate (Fallout)"", ylab = ""True Positive Rate (Sensitivity)"",","line_length_linter" +"vignettes/AdvancedVignette.Rmd",267,23,"style","Trailing whitespace is superfluous."," ValidationRocPoints, ","trailing_whitespace_linter" +"vignettes/AdvancedVignette.Rmd",278,81,"style","Lines should not be more than 80 characters.","threshold <- ValidationRocPoints$threshold[which.max(ValidationRocPoints$f1Score)]","line_length_linter" +"vignettes/AdvancedVignette.Rmd",284,81,"style","Lines should not be more than 80 characters.","ValidationRocPoints[ValidationRocPoints$threshold == tail(Filter(function(x) x > threshold,","line_length_linter" +"vignettes/AdvancedVignette.Rmd",285,81,"style","Lines should not be more than 80 characters."," ValidationRocPoints$threshold),","line_length_linter" +"vignettes/AdvancedVignette.Rmd",302,1,"style","Variable and function name style should be snake_case or symbols.","wordModels <- allModels[grep(""Word"", lapply(allModels, `[[`, ""modelType""))]","object_name_linter" +"vignettes/AdvancedVignette.Rmd",303,1,"style","Variable and function name style should be snake_case or symbols.","wordModel <- wordModels[[1]]","object_name_linter" +"vignettes/AdvancedVignette.Rmd",305,1,"style","Variable and function name style should be snake_case or symbols.","wordCloud <- GetWordCloud(project, wordModel$modelId)","object_name_linter" +"vignettes/AdvancedVignette.Rmd",311,1,"style","Variable and function name style should be snake_case or symbols.","wordCloud <- readRDS(""wordCloudModelInsights.rds"")","object_name_linter" +"vignettes/AdvancedVignette.Rmd",318,47,"style","Trailing whitespace is superfluous."," colormap::colormap(c(""#255FEC"", ""#2DBEF9"")), ","trailing_whitespace_linter" +"vignettes/AdvancedVignette.Rmd",320,29,"style","Trailing whitespace is superfluous."," c(""#FFAC9D"", ""#D80909""), ","trailing_whitespace_linter" +"vignettes/AdvancedVignette.Rmd",329,1,"style","Variable and function name style should be snake_case or symbols.","wordCloud <- wordCloud[!wordCloud$isStopword, ]","object_name_linter" +"vignettes/AdvancedVignette.Rmd",331,56,"style","Trailing whitespace is superfluous.","# Specify colors similar to what DataRobot produces for ","trailing_whitespace_linter" +"vignettes/Calendars.Rmd",18,81,"style","Lines should not be more than 80 characters.","calendar <- read.csv(system.file(""extdata"", ""calendar.csv"", package = ""datarobot""))","line_length_linter" +"vignettes/Calendars.Rmd",31,1,"style","Variable and function name style should be snake_case or symbols.","apiToken <- """"","object_name_linter" +"vignettes/Calendars.Rmd",72,1,"style","Variable and function name style should be snake_case or symbols.","newCalendar <- UpdateCalendar(calendar, name = ""newName"")","object_name_linter" +"vignettes/Calendars.Rmd",88,81,"style","Lines should not be more than 80 characters.","project <- SetupProject(timeSeriesData, projectName = ""time series with calendar"")","line_length_linter" +"vignettes/Calendars.Rmd",91,81,"style","Lines should not be more than 80 characters."," autopilotDataSelectionMethod = ""duration"",","line_length_linter" +"vignettes/Calendars.Rmd",103,1,"style","Variable and function name style should be snake_case or symbols.","projectId <- ""59dab74bbd2a54035786bfc0""","object_name_linter" +"vignettes/ComparingSubsets.Rmd",63,1,"style","Variable and function name style should be snake_case or symbols.","MissPctInsulin <- round(100 * length(which(PimaIndiansDiabetes$insulin == 0)) /","object_name_linter" +"vignettes/ComparingSubsets.Rmd",75,1,"style","Variable and function name style should be snake_case or symbols.","insulinMissing <- as.numeric(PimaIndiansDiabetes$insulin == 0)","object_name_linter" +"vignettes/ComparingSubsets.Rmd",76,1,"style","Variable and function name style should be snake_case or symbols.","modifiedPima <- PimaIndiansDiabetes","object_name_linter" +"vignettes/ComparingSubsets.Rmd",77,1,"style","Variable and function name style should be snake_case or symbols.","modifiedPima$insulin <- NULL","object_name_linter" +"vignettes/ComparingSubsets.Rmd",78,1,"style","Variable and function name style should be snake_case or symbols.","modifiedPima$insulinMissing <- insulinMissing","object_name_linter" +"vignettes/ComparingSubsets.Rmd",84,1,"style","Variable and function name style should be snake_case or symbols.","insulinProject <- StartProject(dataSource = modifiedPima,","object_name_linter" +"vignettes/ComparingSubsets.Rmd",93,1,"style","Variable and function name style should be snake_case or symbols.","insulinModelList <- ListModels(insulinProject)","object_name_linter" +"vignettes/ComparingSubsets.Rmd",98,1,"style","Variable and function name style should be snake_case or symbols.","insulinModelList <- readRDS(""insulinModelList.rds"")","object_name_linter" +"vignettes/ComparingSubsets.Rmd",99,1,"style","Variable and function name style should be snake_case or symbols.","insulinModelFrame <- as.data.frame(insulinModelList, simple = FALSE)","object_name_linter" +"vignettes/ComparingSubsets.Rmd",107,1,"style","Variable and function name style should be snake_case or symbols.","bestIndex <- which.min(insulinModelFrame$LogLoss.validation)","object_name_linter" +"vignettes/ComparingSubsets.Rmd",108,1,"style","Variable and function name style should be snake_case or symbols.","worstIndex <- which.max(insulinModelFrame$LogLoss.validation)","object_name_linter" +"vignettes/ComparingSubsets.Rmd",118,81,"style","Lines should not be more than 80 characters.","plot(insulinModelFrame$AUC.validation, xlab = ""Model number"", ylab = ""Area under the ROC curve"")","line_length_linter" +"vignettes/ComparingSubsets.Rmd",119,81,"style","Lines should not be more than 80 characters.","points(bestIndex, insulinModelFrame$AUC.validation[bestIndex], pch = 16, col = ""red"")","line_length_linter" +"vignettes/ComparingSubsets.Rmd",129,1,"style","Variable and function name style should be snake_case or symbols.","modelList <- list(n = 9)","object_name_linter" +"vignettes/ComparingSubsets.Rmd",130,1,"style","Variable and function name style should be snake_case or symbols.","modelList[[1]] <- insulinModelList","object_name_linter" +"vignettes/ComparingSubsets.Rmd",131,1,"style","Variable and function name style should be snake_case or symbols.","allVars <- colnames(modifiedPima)[1:8]","object_name_linter" +"vignettes/ComparingSubsets.Rmd",132,1,"style","Variable and function name style should be snake_case or symbols.","permFile <- tempfile(fileext = ""permFile.csv"")","object_name_linter" +"vignettes/ComparingSubsets.Rmd",134,3,"style","Variable and function name style should be snake_case or symbols."," varName <- allVars[i]","object_name_linter" +"vignettes/ComparingSubsets.Rmd",136,3,"style","Variable and function name style should be snake_case or symbols."," projName <- paste(""PermProject"",varName,sep="""")","object_name_linter" +"vignettes/ComparingSubsets.Rmd",136,35,"style","Commas should always have a space after."," projName <- paste(""PermProject"",varName,sep="""")","commas_linter" +"vignettes/ComparingSubsets.Rmd",136,43,"style","Commas should always have a space after."," projName <- paste(""PermProject"",varName,sep="""")","commas_linter" +"vignettes/ComparingSubsets.Rmd",136,46,"style","Put spaces around all infix operators."," projName <- paste(""PermProject"",varName,sep="""")","infix_spaces_linter" +"vignettes/ComparingSubsets.Rmd",137,3,"style","Variable and function name style should be snake_case or symbols."," permProject <- StartProject(permFile, projectName = projName, target = ""insulinMissing"", wait = TRUE)","object_name_linter" +"vignettes/ComparingSubsets.Rmd",137,81,"style","Lines should not be more than 80 characters."," permProject <- StartProject(permFile, projectName = projName, target = ""insulinMissing"", wait = TRUE)","line_length_linter" +"vignettes/ComparingSubsets.Rmd",138,3,"style","Variable and function name style should be snake_case or symbols."," modelList[[i+1]] <- ListModels(permProject)","object_name_linter" +"vignettes/ComparingSubsets.Rmd",138,15,"style","Put spaces around all infix operators."," modelList[[i+1]] <- ListModels(permProject)","infix_spaces_linter" +"vignettes/ComparingSubsets.Rmd",147,1,"style","Variable and function name style should be snake_case or symbols.","logLossDeltas <- readRDS(""insulinDeltaFrame.rds"")","object_name_linter" +"vignettes/ComparingSubsets.Rmd",151,1,"style","Variable and function name style should be snake_case or symbols.","bestRow <- which.min(logLossDeltas$originalLogLoss)","object_name_linter" +"vignettes/ComparingSubsets.Rmd",152,81,"style","Lines should not be more than 80 characters.","points(seq(1, 8, 1), logLossDeltas[bestRow, 1:8], pch = 16, col = ""limegreen"", cex = 1.5)","line_length_linter" +"vignettes/ComparingSubsets.Rmd",164,1,"style","Variable and function name style should be snake_case or symbols.","AUCshiftFrame <- readRDS(""AUCshiftFrame.rds"")","object_name_linter" +"vignettes/ComparingSubsets.Rmd",165,1,"style","Variable and function name style should be snake_case or symbols.","sortIndex <- order(logLossDeltas$originalLogLoss)","object_name_linter" +"vignettes/ComparingSubsets.Rmd",166,81,"style","Lines should not be more than 80 characters.","plot(AUCshiftFrame$originalAUC[sortIndex], xlab = ""Model number"", ylab = ""Area under ROC curve"")","line_length_linter" +"vignettes/ComparingSubsets.Rmd",174,1,"style","Variable and function name style should be snake_case or symbols.","missingInsulin <- as.numeric(PimaIndiansDiabetes$insulin == 0)","object_name_linter" +"vignettes/ComparingSubsets.Rmd",175,1,"style","Variable and function name style should be snake_case or symbols.","missingTriceps <- as.numeric(PimaIndiansDiabetes$triceps == 0)","object_name_linter" +"vignettes/ComparingSubsets.Rmd",198,1,"style","Variable and function name style should be snake_case or symbols.","lossIndex <- which(dataCar$claimcst0 > 0)","object_name_linter" +"vignettes/ComparingSubsets.Rmd",199,1,"style","Variable and function name style should be snake_case or symbols.","keepVars <- c(""veh_value"", ""exposure"", ""claimcst0"", ""veh_body"", ""veh_age"",","object_name_linter" +"vignettes/ComparingSubsets.Rmd",201,1,"style","Variable and function name style should be snake_case or symbols.","lossFrame <- subset(dataCar, claimcst0 > 0, select = keepVars)","object_name_linter" +"vignettes/ComparingSubsets.Rmd",222,1,"style","Variable and function name style should be snake_case or symbols.","lossPct <- round(100 * length(lossIndex) / nrow(dataCar), digits = 1)","object_name_linter" +"vignettes/ComparingSubsets.Rmd",223,1,"style","Variable and function name style should be snake_case or symbols.","anomIndex <- which(lossFrame$claimcst0 == 200)","object_name_linter" +"vignettes/ComparingSubsets.Rmd",224,1,"style","Variable and function name style should be snake_case or symbols.","anomPct <- round(100 * length(anomIndex) / length(lossIndex), digits = 1)","object_name_linter" +"vignettes/ComparingSubsets.Rmd",235,1,"style","Variable and function name style should be snake_case or symbols.","anomFrame <- lossFrame","object_name_linter" +"vignettes/ComparingSubsets.Rmd",236,1,"style","Variable and function name style should be snake_case or symbols.","anomFrame$claimcst0 <- NULL","object_name_linter" +"vignettes/ComparingSubsets.Rmd",237,1,"style","Variable and function name style should be snake_case or symbols.","anomFrame$anomaly <- anomaly","object_name_linter" +"vignettes/ComparingSubsets.Rmd",238,1,"style","Variable and function name style should be snake_case or symbols.","anomProject <- StartProject(anomFrame, projectName = ""AnomalyProject"", target = anomaly, wait = TRUE)","object_name_linter" +"vignettes/ComparingSubsets.Rmd",238,81,"style","Lines should not be more than 80 characters.","anomProject <- StartProject(anomFrame, projectName = ""AnomalyProject"", target = anomaly, wait = TRUE)","line_length_linter" +"vignettes/ComparingSubsets.Rmd",239,1,"style","Variable and function name style should be snake_case or symbols.","anomalyModelList <- ListModels(anomProject)","object_name_linter" +"vignettes/ComparingSubsets.Rmd",247,1,"style","Variable and function name style should be snake_case or symbols.","anomalyLeaderboard <- readRDS(""anomalyModelList.rds"")","object_name_linter" +"vignettes/ComparingSubsets.Rmd",248,1,"style","Variable and function name style should be snake_case or symbols.","anomalyLeaderFrame <- as.data.frame(anomalyLeaderboard, simple = FALSE)","object_name_linter" +"vignettes/ComparingSubsets.Rmd",249,1,"style","Variable and function name style should be snake_case or symbols.","plotPct <- max(anomalyLeaderFrame$samplePct)","object_name_linter" +"vignettes/ComparingSubsets.Rmd",250,81,"style","Lines should not be more than 80 characters.","plot(anomalyLeaderboard, pct = plotPct, orderDecreasing = TRUE, xlim = c(0, 0.45))","line_length_linter" +"vignettes/ComparingSubsets.Rmd",251,81,"style","Lines should not be more than 80 characters.","abline(v = min(anomalyLeaderFrame$LogLoss.validation), lty = 2, lwd = 2, col = ""magenta"")","line_length_linter" +"vignettes/ComparingSubsets.Rmd",258,1,"style","Variable and function name style should be snake_case or symbols.","AAUC <- anomalyLeaderFrame$AUC.validation","object_name_linter" +"vignettes/ComparingSubsets.Rmd",259,1,"style","Variable and function name style should be snake_case or symbols.","samplePct <- anomalyLeaderFrame$samplePct","object_name_linter" +"vignettes/ComparingSubsets.Rmd",262,1,"style","Variable and function name style should be snake_case or symbols.","Index64 <- which(samplePct == sizes[3])","object_name_linter" +"vignettes/ComparingSubsets.Rmd",264,1,"style","Variable and function name style should be snake_case or symbols.","Index32 <- which(samplePct == sizes[2])","object_name_linter" +"vignettes/ComparingSubsets.Rmd",266,1,"style","Variable and function name style should be snake_case or symbols.","Index16 <- which(samplePct == sizes[1])","object_name_linter" +"vignettes/ComparingSubsets.Rmd",275,1,"style","Variable and function name style should be snake_case or symbols.","anomAUCDeltaFrame <- readRDS(""anomAUCDeltaFrame.rds"")","object_name_linter" +"vignettes/ComparingSubsets.Rmd",276,1,"style","Variable and function name style should be snake_case or symbols.","bestIndex <- which.min(anomalyLeaderFrame$LogLoss.validation)","object_name_linter" +"vignettes/ComparingSubsets.Rmd",277,1,"style","Variable and function name style should be snake_case or symbols.","bestExpModel <- as.character(anomalyLeaderFrame$expandedModel)[bestIndex]","object_name_linter" +"vignettes/ComparingSubsets.Rmd",278,1,"style","Variable and function name style should be snake_case or symbols.","bestRow <- which(anomAUCDeltaFrame$expandedModel == bestExpModel)","object_name_linter" +"vignettes/ComparingSubsets.Rmd",282,14,"style","Put spaces around all infix operators."," what=c(0, 1, 1, 1), ylim=c(-0.1, 0.1))","infix_spaces_linter" +"vignettes/ComparingSubsets.Rmd",282,34,"style","Put spaces around all infix operators."," what=c(0, 1, 1, 1), ylim=c(-0.1, 0.1))","infix_spaces_linter" +"vignettes/ComparingSubsets.Rmd",283,81,"style","Lines should not be more than 80 characters.","points(seq(1, 7, 1), anomAUCDeltaFrame[bestRow, 1:7], pch = 16, col = ""limegreen"", cex = 1.5)","line_length_linter" +"vignettes/ComplianceDocumentation.Rmd",26,1,"style","Variable and function name style should be snake_case or symbols.","apiToken <- """"","object_name_linter" +"vignettes/ComplianceDocumentation.Rmd",59,81,"style","Lines should not be more than 80 characters.","UploadComplianceDocTemplate(name = ""myNewTemplate"", filename = ""path/to/modified_file.json"")","line_length_linter" +"vignettes/ComplianceDocumentation.Rmd",67,81,"style","Lines should not be more than 80 characters."," ""regularText"" = ""This dataset had a lot of Missing Values. See the chart below: {{missingValues}}"",","line_length_linter" +"vignettes/ComplianceDocumentation.Rmd",70,81,"style","Lines should not be more than 80 characters."," ""regularText"" = ""{{blueprintDiagram}} /n Blueprint for this model"",","line_length_linter" +"vignettes/ComplianceDocumentation.Rmd",72,81,"style","Lines should not be more than 80 characters.","UploadComplianceDocTemplate(name = ""myNewTemplateFromSections"", sections = sections)","line_length_linter" +"vignettes/ComplianceDocumentation.Rmd",78,1,"style","Variable and function name style should be snake_case or symbols.","myTemplate <- ListComplianceDocTemplates(namePart = ""myNewTemplateFromSections"")[[1]]","object_name_linter" +"vignettes/ComplianceDocumentation.Rmd",78,81,"style","Lines should not be more than 80 characters.","myTemplate <- ListComplianceDocTemplates(namePart = ""myNewTemplateFromSections"")[[1]]","line_length_linter" +"vignettes/ComplianceDocumentation.Rmd",87,1,"style","Variable and function name style should be snake_case or symbols.","myTemplate <- ListComplianceDocTemplates(namePart = ""myNewTemplate"")[[1]]","object_name_linter" +"vignettes/DatetimePartitionedProjects.Rmd",26,81,"style","Lines should not be more than 80 characters.","lending <- read.csv(""https://s3.amazonaws.com/datarobot_public_datasets/10K_Lending_Club_Loans.csv"")","line_length_linter" +"vignettes/DatetimePartitionedProjects.Rmd",27,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""earliest_cr_line"",","line_length_linter" +"vignettes/DatetimePartitionedProjects.Rmd",43,81,"style","Lines should not be more than 80 characters."," ""1989-12-01"", ConstructDurationString(days = 100))","line_length_linter" +"vignettes/DatetimePartitionedProjects.Rmd",44,81,"style","Lines should not be more than 80 characters.","backtest[[2]] <- CreateBacktestSpecification(1, ConstructDurationString(), ""1999-10-01"",","line_length_linter" +"vignettes/DatetimePartitionedProjects.Rmd",45,81,"style","Lines should not be more than 80 characters."," ConstructDurationString(days = 100))","line_length_linter" +"vignettes/DatetimePartitionedProjects.Rmd",67,81,"style","Lines should not be more than 80 characters.","# Retrieve a datetime model. There is now a new retrieval function specific to datetime partitioning","line_length_linter" +"vignettes/DatetimePartitionedProjects.Rmd",71,1,"style","Variable and function name style should be snake_case or symbols.","scoreJobId <- ScoreBacktests(dt_model)","object_name_linter" +"vignettes/DatetimePartitionedProjects.Rmd",75,1,"style","Variable and function name style should be snake_case or symbols.","dtModelWithBt <- GetDatetimeModel(proj, dt_model$modelId)","object_name_linter" +"vignettes/DatetimePartitionedProjects.Rmd",78,81,"style","Lines should not be more than 80 characters.","# One has to request a `Frozen` model to keep the hyper-parameters static and avoid lookahead bias.","line_length_linter" +"vignettes/DatetimePartitionedProjects.Rmd",79,81,"style","Lines should not be more than 80 characters.","# Within the context of deployment, this can be used to retrain a resulting model on more recent data.","line_length_linter" +"vignettes/DatetimePartitionedProjects.Rmd",80,81,"style","Lines should not be more than 80 characters.","UpdateProject(proj, holdoutUnlocked = TRUE) # If retraining on 100% of the data, we need to unlock the holdout set.","line_length_linter" +"vignettes/DatetimePartitionedProjects.Rmd",81,1,"style","Variable and function name style should be snake_case or symbols.","modelJobId_frozen <- RequestFrozenDatetimeModel(dt_model,","object_name_linter" +"vignettes/DatetimePartitionedProjects.Rmd",82,81,"style","Lines should not be more than 80 characters."," trainingStartDate = as.Date(""1950/12/1""),","line_length_linter" +"vignettes/DatetimePartitionedProjects.Rmd",83,81,"style","Lines should not be more than 80 characters."," trainingEndDate = as.Date(""1998/3/1""))","line_length_linter" +"vignettes/DatetimePartitionedProjects.Rmd",87,1,"style","Variable and function name style should be snake_case or symbols.","modelJobId <- RequestNewDatetimeModel(proj, bps[[1]], trainingRowCount = 100)","object_name_linter" +"vignettes/DatetimePartitionedProjects.Rmd",91,1,"style","Variable and function name style should be snake_case or symbols.","modelJobId <- RequestNewDatetimeModel(proj, bps[[1]],","object_name_linter" +"vignettes/DatetimePartitionedProjects.Rmd",92,81,"style","Lines should not be more than 80 characters."," trainingDuration = ConstructDurationString(months=10))","line_length_linter" +"vignettes/DatetimePartitionedProjects.Rmd",92,90,"style","Put spaces around all infix operators."," trainingDuration = ConstructDurationString(months=10))","infix_spaces_linter" +"vignettes/Deployment.Rmd",31,1,"style","Variable and function name style should be snake_case or symbols.","predictionServer <- ListPredictionServers()[[1]]","object_name_linter" +"vignettes/Deployment.Rmd",34,81,"style","Lines should not be more than 80 characters."," description = ""A new deployment for demo purposes"",","line_length_linter" +"vignettes/Deployment.Rmd",83,1,"style","Variable and function name style should be snake_case or symbols.","newModel <- ListModels(project)[[2]]","object_name_linter" +"vignettes/Deployment.Rmd",96,1,"style","Variable and function name style should be snake_case or symbols.","newModel <- ListModels(project)[[2]]","object_name_linter" +"vignettes/IntroductionToDataRobot.Rmd",49,81,"style","Lines should not be more than 80 characters.","ConnectToDataRobot(endpoint = ""YOUR-ENDPOINT-HERE"", token = ""YOUR-API_TOKEN-HERE"")","line_length_linter" +"vignettes/IntroductionToDataRobot.Rmd",111,1,"style","Variable and function name style should be snake_case or symbols.","listOfBostonModels <- readRDS(""listOfBostonModels.rds"")","object_name_linter" +"vignettes/IntroductionToDataRobot.Rmd",112,1,"style","Variable and function name style should be snake_case or symbols.","fullFrame <- as.data.frame(listOfBostonModels, simple = FALSE)","object_name_linter" +"vignettes/IntroductionToDataRobot.Rmd",118,1,"style","Variable and function name style should be snake_case or symbols.","listOfBostonModels <- ListModels(project)","object_name_linter" +"vignettes/IntroductionToDataRobot.Rmd",153,1,"style","Variable and function name style should be snake_case or symbols.","modelFrame <- as.data.frame(listOfBostonModels)","object_name_linter" +"vignettes/IntroductionToDataRobot.Rmd",183,1,"style","Variable and function name style should be snake_case or symbols.","bestModel <- GetRecommendedModel(project)","object_name_linter" +"vignettes/IntroductionToDataRobot.Rmd",184,1,"style","Variable and function name style should be snake_case or symbols.","bestPredictions <- Predict(bestModel, Boston)","object_name_linter" +"vignettes/IntroductionToDataRobot.Rmd",202,1,"style","Variable and function name style should be snake_case or symbols.","bestPredictions <- readRDS(""bestPredictions.rds"")","object_name_linter" +"vignettes/IntroductionToDataRobot.Rmd",203,33,"style","Put spaces around all infix operators.","plot(medv, bestPredictions, xlab=""Observed medv value"", ylab=""Predicted medv value"",","infix_spaces_linter" +"vignettes/IntroductionToDataRobot.Rmd",203,61,"style","Put spaces around all infix operators.","plot(medv, bestPredictions, xlab=""Observed medv value"", ylab=""Predicted medv value"",","infix_spaces_linter" +"vignettes/IntroductionToDataRobot.Rmd",203,81,"style","Lines should not be more than 80 characters.","plot(medv, bestPredictions, xlab=""Observed medv value"", ylab=""Predicted medv value"",","line_length_linter" +"vignettes/Multiclass.Rmd",26,1,"style","Variable and function name style should be snake_case or symbols.","apiToken <- """"","object_name_linter" +"vignettes/Multiclass.Rmd",92,1,"style","Variable and function name style should be snake_case or symbols.","confusionChart <- GetConfusionChart(model, source = DataPartition$VALIDATION)","object_name_linter" +"vignettes/PartialDependence.Rmd",31,1,"style","Variable and function name style should be snake_case or symbols.","concreteFrame <- read.csv(system.file(""extdata"", ""concreteData.csv"", package = ""datarobot""))","object_name_linter" +"vignettes/PartialDependence.Rmd",31,81,"style","Lines should not be more than 80 characters.","concreteFrame <- read.csv(system.file(""extdata"", ""concreteData.csv"", package = ""datarobot""))","line_length_linter" +"vignettes/PartialDependence.Rmd",43,1,"style","Variable and function name style should be snake_case or symbols.","myDRProject <- StartProject(concreteFrame, ""ConcreteProject"", target = ""strength"", wait = TRUE)","object_name_linter" +"vignettes/PartialDependence.Rmd",43,81,"style","Lines should not be more than 80 characters.","myDRProject <- StartProject(concreteFrame, ""ConcreteProject"", target = ""strength"", wait = TRUE)","line_length_linter" +"vignettes/PartialDependence.Rmd",48,1,"style","Variable and function name style should be snake_case or symbols.","concreteModels <- readRDS(""concreteModels.rds"")","object_name_linter" +"vignettes/PartialDependence.Rmd",49,1,"style","Variable and function name style should be snake_case or symbols.","fullFrame <- as.data.frame(concreteModels, simple = FALSE)","object_name_linter" +"vignettes/PartialDependence.Rmd",50,1,"style","Variable and function name style should be snake_case or symbols.","modelsFrame <- as.data.frame(concreteModels)","object_name_linter" +"vignettes/PartialDependence.Rmd",56,1,"style","Variable and function name style should be snake_case or symbols.","concreteModels <- ListModels(myDRProject)","object_name_linter" +"vignettes/PartialDependence.Rmd",80,1,"style","Variable and function name style should be snake_case or symbols.","poorCol <- c(""black"", ""red"", rep(""black"", 13))","object_name_linter" +"vignettes/PartialDependence.Rmd",99,1,"style","Variable and function name style should be snake_case or symbols.","ridgeRows <- grep(""Ridge"", modelsFrame$modelType)","object_name_linter" +"vignettes/PartialDependence.Rmd",104,1,"style","Variable and function name style should be snake_case or symbols.","goodCol <- c(rep(""black"", 3), ""red"", rep(""black"", 6), ""red"", rep(""black"", 3), ""red"")","object_name_linter" +"vignettes/PartialDependence.Rmd",104,81,"style","Lines should not be more than 80 characters.","goodCol <- c(rep(""black"", 3), ""red"", rep(""black"", 6), ""red"", rep(""black"", 3), ""red"")","line_length_linter" +"vignettes/PartialDependence.Rmd",156,1,"style","Variable and function name style should be snake_case or symbols.","FullAverageDataset <- function(covarFrame, refCovar, numGrid, plotRange = NULL) {","object_name_linter" +"vignettes/PartialDependence.Rmd",156,32,"style","Variable and function name style should be snake_case or symbols.","FullAverageDataset <- function(covarFrame, refCovar, numGrid, plotRange = NULL) {","object_name_linter" +"vignettes/PartialDependence.Rmd",156,44,"style","Variable and function name style should be snake_case or symbols.","FullAverageDataset <- function(covarFrame, refCovar, numGrid, plotRange = NULL) {","object_name_linter" +"vignettes/PartialDependence.Rmd",156,54,"style","Variable and function name style should be snake_case or symbols.","FullAverageDataset <- function(covarFrame, refCovar, numGrid, plotRange = NULL) {","object_name_linter" +"vignettes/PartialDependence.Rmd",156,63,"style","Variable and function name style should be snake_case or symbols.","FullAverageDataset <- function(covarFrame, refCovar, numGrid, plotRange = NULL) {","object_name_linter" +"vignettes/PartialDependence.Rmd",156,81,"style","Lines should not be more than 80 characters.","FullAverageDataset <- function(covarFrame, refCovar, numGrid, plotRange = NULL) {","line_length_linter" +"vignettes/PartialDependence.Rmd",158,3,"style","Variable and function name style should be snake_case or symbols."," refIndex <- which(covars == refCovar)","object_name_linter" +"vignettes/PartialDependence.Rmd",159,3,"style","Variable and function name style should be snake_case or symbols."," refVar <- covarFrame[, refIndex]","object_name_linter" +"vignettes/PartialDependence.Rmd",168,3,"style","Variable and function name style should be snake_case or symbols."," outFrame <- covarFrame","object_name_linter" +"vignettes/PartialDependence.Rmd",169,3,"style","Variable and function name style should be snake_case or symbols."," outFrame[, refIndex] <- grid[1]","object_name_linter" +"vignettes/PartialDependence.Rmd",171,5,"style","Variable and function name style should be snake_case or symbols."," upFrame <- covarFrame","object_name_linter" +"vignettes/PartialDependence.Rmd",172,5,"style","Variable and function name style should be snake_case or symbols."," upFrame[, refIndex] <- grid[i]","object_name_linter" +"vignettes/PartialDependence.Rmd",173,5,"style","Variable and function name style should be snake_case or symbols."," outFrame <- rbind.data.frame(outFrame, upFrame)","object_name_linter" +"vignettes/PartialDependence.Rmd",184,1,"style","Variable and function name style should be snake_case or symbols.","PDPbuilder <- function(covarFrame, refCovar, listOfModels,","object_name_linter" +"vignettes/PartialDependence.Rmd",184,24,"style","Variable and function name style should be snake_case or symbols.","PDPbuilder <- function(covarFrame, refCovar, listOfModels,","object_name_linter" +"vignettes/PartialDependence.Rmd",184,36,"style","Variable and function name style should be snake_case or symbols.","PDPbuilder <- function(covarFrame, refCovar, listOfModels,","object_name_linter" +"vignettes/PartialDependence.Rmd",184,46,"style","Variable and function name style should be snake_case or symbols.","PDPbuilder <- function(covarFrame, refCovar, listOfModels,","object_name_linter" +"vignettes/PartialDependence.Rmd",185,24,"style","Variable and function name style should be snake_case or symbols."," numGrid = 100, plotRange = NULL) {","object_name_linter" +"vignettes/PartialDependence.Rmd",185,39,"style","Variable and function name style should be snake_case or symbols."," numGrid = 100, plotRange = NULL) {","object_name_linter" +"vignettes/PartialDependence.Rmd",186,3,"style","Variable and function name style should be snake_case or symbols."," augmentedFrame <- FullAverageDataset(covarFrame, refCovar,","object_name_linter" +"vignettes/PartialDependence.Rmd",188,3,"style","Variable and function name style should be snake_case or symbols."," nModels <- length(listOfModels)","object_name_linter" +"vignettes/PartialDependence.Rmd",191,3,"style","Variable and function name style should be snake_case or symbols."," yHat <- Predict(model, augmentedFrame)","object_name_linter" +"vignettes/PartialDependence.Rmd",192,3,"style","Variable and function name style should be snake_case or symbols."," hatFrame <- augmentedFrame","object_name_linter" +"vignettes/PartialDependence.Rmd",193,3,"style","Variable and function name style should be snake_case or symbols."," hatFrame$prediction <- yHat","object_name_linter" +"vignettes/PartialDependence.Rmd",194,3,"style","Variable and function name style should be snake_case or symbols."," hatSum <- summaryBy(list(c(""prediction""), c(refCovar)), data = hatFrame, FUN = mean)","object_name_linter" +"vignettes/PartialDependence.Rmd",194,13,"warning","no visible global function definition for β€˜summaryBy’"," hatSum <- summaryBy(list(c(""prediction""), c(refCovar)), data = hatFrame, FUN = mean)","object_usage_linter" +"vignettes/PartialDependence.Rmd",194,81,"style","Lines should not be more than 80 characters."," hatSum <- summaryBy(list(c(""prediction""), c(refCovar)), data = hatFrame, FUN = mean)","line_length_linter" +"vignettes/PartialDependence.Rmd",195,12,"style","Variable and function name style should be snake_case or symbols."," colnames(hatSum)[2] <- model$modelType","object_name_linter" +"vignettes/PartialDependence.Rmd",199,5,"style","Variable and function name style should be snake_case or symbols."," yHat <- Predict(model, augmentedFrame)","object_name_linter" +"vignettes/PartialDependence.Rmd",200,5,"style","Variable and function name style should be snake_case or symbols."," hatFrame <- augmentedFrame","object_name_linter" +"vignettes/PartialDependence.Rmd",201,5,"style","Variable and function name style should be snake_case or symbols."," hatFrame$prediction <- yHat","object_name_linter" +"vignettes/PartialDependence.Rmd",202,5,"style","Variable and function name style should be snake_case or symbols."," upSum <- summaryBy(list(c(""prediction""), c(refCovar)), data = hatFrame, FUN = mean)","object_name_linter" +"vignettes/PartialDependence.Rmd",202,14,"warning","no visible global function definition for β€˜summaryBy’"," upSum <- summaryBy(list(c(""prediction""), c(refCovar)), data = hatFrame, FUN = mean)","object_usage_linter" +"vignettes/PartialDependence.Rmd",202,81,"style","Lines should not be more than 80 characters."," upSum <- summaryBy(list(c(""prediction""), c(refCovar)), data = hatFrame, FUN = mean)","line_length_linter" +"vignettes/PartialDependence.Rmd",203,14,"style","Variable and function name style should be snake_case or symbols."," colnames(upSum)[2] <- model$modelType","object_name_linter" +"vignettes/PartialDependence.Rmd",204,5,"style","Variable and function name style should be snake_case or symbols."," hatSum <- merge(hatSum, upSum)","object_name_linter" +"vignettes/PartialDependence.Rmd",215,1,"style","Variable and function name style should be snake_case or symbols.","modelList <- list(concreteModels[[1]], concreteModels[[5]],","object_name_linter" +"vignettes/PartialDependence.Rmd",217,1,"style","Variable and function name style should be snake_case or symbols.","agePDPframe <- PDPbuilder(concreteFrame[, 1:8], ""age"", modelList)","object_name_linter" +"vignettes/PartialDependence.Rmd",223,1,"style","Variable and function name style should be snake_case or symbols.","PDPlot <- function(PDframe, Response, ltypes,","object_name_linter" +"vignettes/PartialDependence.Rmd",223,20,"style","Variable and function name style should be snake_case or symbols.","PDPlot <- function(PDframe, Response, ltypes,","object_name_linter" +"vignettes/PartialDependence.Rmd",223,29,"style","Variable and function name style should be snake_case or symbols.","PDPlot <- function(PDframe, Response, ltypes,","object_name_linter" +"vignettes/PartialDependence.Rmd",224,20,"style","Variable and function name style should be snake_case or symbols."," lColors, ...) {","object_name_linter" +"vignettes/PartialDependence.Rmd",225,3,"style","Variable and function name style should be snake_case or symbols."," Rng <- range(Response)","object_name_linter" +"vignettes/PartialDependence.Rmd",226,3,"style","Variable and function name style should be snake_case or symbols."," nModels <- ncol(PDframe) - 1","object_name_linter" +"vignettes/PartialDependence.Rmd",227,3,"style","Variable and function name style should be snake_case or symbols."," modelNames <- colnames(PDframe)[2: (nModels + 1)]","object_name_linter" +"vignettes/PartialDependence.Rmd",228,40,"style","Put spaces around all infix operators."," plot(PDframe[, 1], PDframe[, 2], ylim=Rng, type = ""l"",","infix_spaces_linter" +"vignettes/PartialDependence.Rmd",232,22,"style","Put spaces around all infix operators."," abline(h = Rng, lty=3, lwd=2, col=""black"")","infix_spaces_linter" +"vignettes/PartialDependence.Rmd",232,29,"style","Put spaces around all infix operators."," abline(h = Rng, lty=3, lwd=2, col=""black"")","infix_spaces_linter" +"vignettes/PartialDependence.Rmd",232,36,"style","Put spaces around all infix operators."," abline(h = Rng, lty=3, lwd=2, col=""black"")","infix_spaces_linter" +"vignettes/PartialDependence.Rmd",245,10,"style","Put spaces around all infix operators.","par(mfrow=c(1, 1))","infix_spaces_linter" +"vignettes/PartialDependence.Rmd",246,1,"style","Variable and function name style should be snake_case or symbols.","agePDPframe <- readRDS(""agePDPframe.rds"")","object_name_linter" +"vignettes/PartialDependence.Rmd",247,1,"style","Variable and function name style should be snake_case or symbols.","Response <- concreteFrame$strength","object_name_linter" +"vignettes/PartialDependence.Rmd",249,1,"style","Variable and function name style should be snake_case or symbols.","lColors <- c(""limegreen"", ""black"", ""blue"", ""magenta"")","object_name_linter" +"vignettes/PartialDependence.Rmd",256,10,"style","Put spaces around all infix operators.","par(mfrow=c(1, 1))","infix_spaces_linter" +"vignettes/PartialDependence.Rmd",257,1,"style","Variable and function name style should be snake_case or symbols.","cementPDPframe <- readRDS(""cementPDPframe.rds"")","object_name_linter" +"vignettes/PartialDependence.Rmd",264,10,"style","Put spaces around all infix operators.","par(mfrow=c(1, 1))","infix_spaces_linter" +"vignettes/PartialDependence.Rmd",265,1,"style","Variable and function name style should be snake_case or symbols.","waterPDPframe <- readRDS(""waterPDPframe.rds"")","object_name_linter" +"vignettes/PartialDependence.Rmd",272,10,"style","Put spaces around all infix operators.","par(mfrow=c(1, 1))","infix_spaces_linter" +"vignettes/PartialDependence.Rmd",273,1,"style","Variable and function name style should be snake_case or symbols.","blastPDPframe <- readRDS(""blastPDPframe.rds"")","object_name_linter" +"vignettes/PredictionExplanations.Rmd",144,1,"error","Missing chunk end for chunk (maybe starting at line 144).","```{r results = ""asis"", message = FALSE, warning = FALSE, eval = FALSE}",NA +"vignettes/RatingTables.Rmd",26,1,"style","Variable and function name style should be snake_case or symbols.","apiToken <- """"","object_name_linter" +"vignettes/RatingTables.Rmd",36,1,"style","Variable and function name style should be snake_case or symbols.","projectId <- ""59dab74bbd2a54035786bfc0""","object_name_linter" +"vignettes/RatingTables.Rmd",37,1,"style","Variable and function name style should be snake_case or symbols.","ratingTables <- ListRatingTables(projectId)","object_name_linter" +"vignettes/RatingTables.Rmd",38,1,"style","Variable and function name style should be snake_case or symbols.","ratingTable <- ratingTables[[1]]","object_name_linter" +"vignettes/RatingTables.Rmd",43,1,"style","Variable and function name style should be snake_case or symbols.","ratingTable <- readRDS(""ratingTable.rds"")","object_name_linter" +"vignettes/RatingTables.Rmd",50,1,"style","Variable and function name style should be snake_case or symbols.","projectId <- ""59dab74bbd2a54035786bfc0""","object_name_linter" +"vignettes/RatingTables.Rmd",51,1,"style","Variable and function name style should be snake_case or symbols.","ratingTableModels <- ListRatingTableModels(projectId)","object_name_linter" +"vignettes/RatingTables.Rmd",52,1,"style","Variable and function name style should be snake_case or symbols.","ratingTableModel <- ratingTableModels[[1]]","object_name_linter" +"vignettes/RatingTables.Rmd",53,1,"style","Variable and function name style should be snake_case or symbols.","ratingTableId <- ratingTableModel$ratingTableId","object_name_linter" +"vignettes/RatingTables.Rmd",54,1,"style","Variable and function name style should be snake_case or symbols.","ratingTable <- GetRatingTable(projectId, ratingTableId)","object_name_linter" +"vignettes/RatingTables.Rmd",59,1,"style","Variable and function name style should be snake_case or symbols.","ratingTable <- readRDS(""ratingTable.rds"")","object_name_linter" +"vignettes/RatingTables.Rmd",66,1,"style","Variable and function name style should be snake_case or symbols.","projectId <- ""59dab74bbd2a54035786bfc0""","object_name_linter" +"vignettes/RatingTables.Rmd",67,1,"style","Variable and function name style should be snake_case or symbols.","modelId <- ""59dd0b01d9575702bec96e4""","object_name_linter" +"vignettes/RatingTables.Rmd",68,1,"style","Variable and function name style should be snake_case or symbols.","ratingTableModel <- GetRatingTableModel(projectId, modelId)","object_name_linter" +"vignettes/RatingTables.Rmd",69,1,"style","Variable and function name style should be snake_case or symbols.","ratingTableId <- ratingTableModel$ratingTableId","object_name_linter" +"vignettes/RatingTables.Rmd",70,1,"style","Variable and function name style should be snake_case or symbols.","ratingTable <- GetRatingTable(projectId, ratingTableId)","object_name_linter" +"vignettes/RatingTables.Rmd",75,1,"style","Variable and function name style should be snake_case or symbols.","ratingTable <- readRDS(""ratingTable.rds"")","object_name_linter" +"vignettes/RatingTables.Rmd",94,1,"style","Variable and function name style should be snake_case or symbols.","newRatingTableJobId <- CreateRatingTable(project,","object_name_linter" +"vignettes/RatingTables.Rmd",98,1,"style","Variable and function name style should be snake_case or symbols.","newRatingTable <- GetRatingTableFromJobId(project, newRatingTableJobId)","object_name_linter" +"vignettes/RatingTables.Rmd",103,1,"style","Variable and function name style should be snake_case or symbols.","ratingTable <- readRDS(""ratingTable.rds"")","object_name_linter" +"vignettes/RatingTables.Rmd",113,1,"style","Variable and function name style should be snake_case or symbols.","newModelJobId <- RequestNewRatingTableModel(project, newRatingTable)","object_name_linter" +"vignettes/RatingTables.Rmd",114,1,"style","Variable and function name style should be snake_case or symbols.","newRatingTableModel <- GetRatingTableModelFromJobId(project, newModelJobId)","object_name_linter" +"vignettes/RatingTables.Rmd",119,1,"style","Variable and function name style should be snake_case or symbols.","newRatingTableModel <- readRDS(""ratingTableModel.RDS"")","object_name_linter" +"vignettes/TimeSeries.Rmd",67,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""timestamp"",","line_length_linter" +"vignettes/TimeSeries.Rmd",69,81,"style","Lines should not be more than 80 characters.","StartProject(dataSource = data, target = ""target"", partition = partition, metric = ""RMSE"")","line_length_linter" +"vignettes/TimeSeries.Rmd",86,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""timestamp"",","line_length_linter" +"vignettes/TimeSeries.Rmd",87,81,"style","Lines should not be more than 80 characters."," featureDerivationWindowStart = -24,","line_length_linter" +"vignettes/TimeSeries.Rmd",88,81,"style","Lines should not be more than 80 characters."," featureDerivationWindowEnd = -12,","line_length_linter" +"vignettes/TimeSeries.Rmd",104,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""timestamp"",","line_length_linter" +"vignettes/TimeSeries.Rmd",136,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""timestamp"",","line_length_linter" +"vignettes/TimeSeries.Rmd",138,81,"style","Lines should not be more than 80 characters."," featureSettings = list(""featureName"" = ""holiday"",","line_length_linter" +"vignettes/TimeSeries.Rmd",139,81,"style","Lines should not be more than 80 characters."," ""knownInAdvance"" = TRUE))","line_length_linter" +"vignettes/TimeSeries.Rmd",150,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""timestamp"",","line_length_linter" +"vignettes/TimeSeries.Rmd",152,81,"style","Lines should not be more than 80 characters."," featureSettings = list(list(""featureName"" = ""holiday"",","line_length_linter" +"vignettes/TimeSeries.Rmd",153,81,"style","Lines should not be more than 80 characters."," ""knownInAdvance"" = TRUE),","line_length_linter" +"vignettes/TimeSeries.Rmd",154,81,"style","Lines should not be more than 80 characters."," list(""featureName"" = ""weekend"",","line_length_linter" +"vignettes/TimeSeries.Rmd",155,81,"style","Lines should not be more than 80 characters."," ""knownInAdvance"" = TRUE)))","line_length_linter" +"vignettes/TimeSeries.Rmd",186,81,"style","Lines should not be more than 80 characters.","data <- read.csv(system.file(""extdata"", ""multiseries.csv"", package = ""datarobot""))","line_length_linter" +"vignettes/TimeSeries.Rmd",187,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""timestamp"",","line_length_linter" +"vignettes/TimeSeries.Rmd",189,81,"style","Lines should not be more than 80 characters."," multiseriesIdColumns = ""series_id"")","line_length_linter" +"vignettes/TimeSeries.Rmd",219,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""timestamp"",","line_length_linter" +"vignettes/TimeSeries.Rmd",221,81,"style","Lines should not be more than 80 characters."," featureSettings = list(list(""featureName"" = ""sales"",","line_length_linter" +"vignettes/TimeSeries.Rmd",222,81,"style","Lines should not be more than 80 characters."," ""doNotDerive"" = TRUE)))","line_length_linter" +"vignettes/TrainingPredictions.Rmd",26,1,"style","Variable and function name style should be snake_case or symbols.","trainingPredictions <- GetTrainingPredictionsForModel(model, dataSubset = DataSubset$All)","object_name_linter" +"vignettes/TrainingPredictions.Rmd",26,81,"style","Lines should not be more than 80 characters.","trainingPredictions <- GetTrainingPredictionsForModel(model, dataSubset = DataSubset$All)","line_length_linter" +"vignettes/TrainingPredictions.Rmd",27,81,"style","Lines should not be more than 80 characters.","kable(head(trainingPredictions), longtable = TRUE, booktabs = TRUE, row.names = TRUE)","line_length_linter" +"vignettes/TrainingPredictions.Rmd",32,1,"style","Variable and function name style should be snake_case or symbols.","trainingPredictions <- readRDS(""trainingPredictions.rds"")","object_name_linter" +"vignettes/TrainingPredictions.Rmd",33,81,"style","Lines should not be more than 80 characters.","kable(head(trainingPredictions), longtable = TRUE, booktabs = TRUE, row.names = TRUE)","line_length_linter" +"vignettes/TrainingPredictions.Rmd",41,1,"style","Variable and function name style should be snake_case or symbols.","jobId <- RequestTrainingPredictions(model, dataSubset = DataSubset$All)","object_name_linter" +"vignettes/TrainingPredictions.Rmd",43,1,"style","Variable and function name style should be snake_case or symbols.","trainingPredictions <- GetTrainingPredictionsFromJobId(projectId, jobId) # blocks until job complete","object_name_linter" +"vignettes/TrainingPredictions.Rmd",43,81,"style","Lines should not be more than 80 characters.","trainingPredictions <- GetTrainingPredictionsFromJobId(projectId, jobId) # blocks until job complete","line_length_linter" +"vignettes/TrainingPredictions.Rmd",44,81,"style","Lines should not be more than 80 characters.","kable(head(trainingPredictions), longtable = TRUE, booktabs = TRUE, row.names = TRUE)","line_length_linter" +"vignettes/TrainingPredictions.Rmd",49,1,"style","Variable and function name style should be snake_case or symbols.","trainingPredictions <- readRDS(""trainingPredictions.rds"")","object_name_linter" +"vignettes/TrainingPredictions.Rmd",50,81,"style","Lines should not be more than 80 characters.","kable(head(trainingPredictions), longtable = TRUE, booktabs = TRUE, row.names = TRUE)","line_length_linter" +"vignettes/TrainingPredictions.Rmd",56,1,"style","Variable and function name style should be snake_case or symbols.","trainingPredictions <- ListTrainingPredictions(projectId)","object_name_linter" +"vignettes/TrainingPredictions.Rmd",57,1,"style","Variable and function name style should be snake_case or symbols.","trainingPredictionId <- trainingPredictions[[1]]$id","object_name_linter" +"vignettes/TrainingPredictions.Rmd",58,1,"style","Variable and function name style should be snake_case or symbols.","trainingPrediction <- GetTrainingPredictions(projectId, trainingPredictionId)","object_name_linter" +"vignettes/TrainingPredictions.Rmd",59,81,"style","Lines should not be more than 80 characters.","kable(head(trainingPrediction), longtable = TRUE, booktabs = TRUE, row.names = TRUE)","line_length_linter" +"vignettes/TrainingPredictions.Rmd",63,1,"style","Variable and function name style should be snake_case or symbols.","trainingPrediction <- readRDS(""trainingPrediction.rds"")","object_name_linter" +"vignettes/TrainingPredictions.Rmd",64,81,"style","Lines should not be more than 80 characters.","kable(head(trainingPrediction), longtable = TRUE, booktabs = TRUE, row.names = TRUE)","line_length_linter" +"vignettes/TrainingPredictions.Rmd",73,81,"style","Lines should not be more than 80 characters.","DownloadTrainingPredictions(projectId, trainingPredictionId, ""trainingPredictions.csv"")","line_length_linter" +"vignettes/VariableImportance.Rmd",60,81,"style","Lines should not be more than 80 characters.","friedman <- read.csv(system.file(""extdata"", ""Friedman1.csv.gz"", package = ""datarobot""))","line_length_linter" +"vignettes/VariableImportance.Rmd",61,1,"style","Variable and function name style should be snake_case or symbols.","originalProject <- StartProject(friedman, ""OriginalProject"", target = ""Y"", wait = TRUE)","object_name_linter" +"vignettes/VariableImportance.Rmd",61,81,"style","Lines should not be more than 80 characters.","originalProject <- StartProject(friedman, ""OriginalProject"", target = ""Y"", wait = TRUE)","line_length_linter" +"vignettes/VariableImportance.Rmd",62,1,"style","Variable and function name style should be snake_case or symbols.","originalModels <- ListModels(originalProject)","object_name_linter" +"vignettes/VariableImportance.Rmd",70,1,"style","Variable and function name style should be snake_case or symbols.","PermuteColumn <- function(originalFile, colName, permutedFile, iseed = 317) {","object_name_linter" +"vignettes/VariableImportance.Rmd",70,27,"style","Variable and function name style should be snake_case or symbols.","PermuteColumn <- function(originalFile, colName, permutedFile, iseed = 317) {","object_name_linter" +"vignettes/VariableImportance.Rmd",70,41,"style","Variable and function name style should be snake_case or symbols.","PermuteColumn <- function(originalFile, colName, permutedFile, iseed = 317) {","object_name_linter" +"vignettes/VariableImportance.Rmd",70,50,"style","Variable and function name style should be snake_case or symbols.","PermuteColumn <- function(originalFile, colName, permutedFile, iseed = 317) {","object_name_linter" +"vignettes/VariableImportance.Rmd",72,3,"style","Variable and function name style should be snake_case or symbols."," originalFile <- system.file(""extdata"", originalFile, package = ""datarobot"")","object_name_linter" +"vignettes/VariableImportance.Rmd",74,3,"style","Variable and function name style should be snake_case or symbols."," varNames <- colnames(dframe)","object_name_linter" +"vignettes/VariableImportance.Rmd",75,3,"style","Variable and function name style should be snake_case or symbols."," colIndex <- which(varNames == colName)","object_name_linter" +"vignettes/VariableImportance.Rmd",76,15,"style","Commas should never have a space before."," x <- dframe[ ,colIndex]","commas_linter" +"vignettes/VariableImportance.Rmd",76,15,"style","Do not place spaces after square brackets."," x <- dframe[ ,colIndex]","spaces_inside_linter" +"vignettes/VariableImportance.Rmd",76,17,"style","Commas should always have a space after."," x <- dframe[ ,colIndex]","commas_linter" +"vignettes/VariableImportance.Rmd",78,3,"style","Variable and function name style should be snake_case or symbols."," outFrame <- dframe","object_name_linter" +"vignettes/VariableImportance.Rmd",79,3,"style","Variable and function name style should be snake_case or symbols."," outFrame[ ,colIndex] <- y","object_name_linter" +"vignettes/VariableImportance.Rmd",79,12,"style","Commas should never have a space before."," outFrame[ ,colIndex] <- y","commas_linter" +"vignettes/VariableImportance.Rmd",79,12,"style","Do not place spaces after square brackets."," outFrame[ ,colIndex] <- y","spaces_inside_linter" +"vignettes/VariableImportance.Rmd",79,14,"style","Commas should always have a space after."," outFrame[ ,colIndex] <- y","commas_linter" +"vignettes/VariableImportance.Rmd",80,46,"style","Put spaces around all infix operators."," write.csv(outFrame, permutedFile, row.names=FALSE)","infix_spaces_linter" +"vignettes/VariableImportance.Rmd",87,1,"style","Variable and function name style should be snake_case or symbols.","modelList <- list(n = 11)","object_name_linter" +"vignettes/VariableImportance.Rmd",88,1,"style","Variable and function name style should be snake_case or symbols.","modelList[[1]] <- originalModels","object_name_linter" +"vignettes/VariableImportance.Rmd",89,1,"style","Variable and function name style should be snake_case or symbols.","permFile <- tempfile(fileext = ""permFile.csv"")","object_name_linter" +"vignettes/VariableImportance.Rmd",91,3,"style","Variable and function name style should be snake_case or symbols."," varName <- paste(""X"",i,sep="""")","object_name_linter" +"vignettes/VariableImportance.Rmd",91,24,"style","Commas should always have a space after."," varName <- paste(""X"",i,sep="""")","commas_linter" +"vignettes/VariableImportance.Rmd",91,26,"style","Commas should always have a space after."," varName <- paste(""X"",i,sep="""")","commas_linter" +"vignettes/VariableImportance.Rmd",91,29,"style","Put spaces around all infix operators."," varName <- paste(""X"",i,sep="""")","infix_spaces_linter" +"vignettes/VariableImportance.Rmd",93,3,"style","Variable and function name style should be snake_case or symbols."," projName <- paste(""PermProject"", varName, sep = """")","object_name_linter" +"vignettes/VariableImportance.Rmd",94,3,"style","Variable and function name style should be snake_case or symbols."," permProject <- StartProject(permFile, projectName = projName, target = ""Y"", wait = TRUE)","object_name_linter" +"vignettes/VariableImportance.Rmd",94,81,"style","Lines should not be more than 80 characters."," permProject <- StartProject(permFile, projectName = projName, target = ""Y"", wait = TRUE)","line_length_linter" +"vignettes/VariableImportance.Rmd",95,3,"style","Variable and function name style should be snake_case or symbols."," modelList[[i+1]] <- ListModels(permProject)","object_name_linter" +"vignettes/VariableImportance.Rmd",95,15,"style","Put spaces around all infix operators."," modelList[[i+1]] <- ListModels(permProject)","infix_spaces_linter" +"vignettes/VariableImportance.Rmd",101,1,"style","Variable and function name style should be snake_case or symbols.","modelList <- readRDS(""PermutationModelList.rds"")","object_name_linter" +"vignettes/VariableImportance.Rmd",116,1,"style","Variable and function name style should be snake_case or symbols.","PermutationMerge <- function(compositeList, matchPct = NULL, metricNames, matchMetric = NULL) {","object_name_linter" +"vignettes/VariableImportance.Rmd",116,30,"style","Variable and function name style should be snake_case or symbols.","PermutationMerge <- function(compositeList, matchPct = NULL, metricNames, matchMetric = NULL) {","object_name_linter" +"vignettes/VariableImportance.Rmd",116,45,"style","Variable and function name style should be snake_case or symbols.","PermutationMerge <- function(compositeList, matchPct = NULL, metricNames, matchMetric = NULL) {","object_name_linter" +"vignettes/VariableImportance.Rmd",116,62,"style","Variable and function name style should be snake_case or symbols.","PermutationMerge <- function(compositeList, matchPct = NULL, metricNames, matchMetric = NULL) {","object_name_linter" +"vignettes/VariableImportance.Rmd",116,75,"style","Variable and function name style should be snake_case or symbols.","PermutationMerge <- function(compositeList, matchPct = NULL, metricNames, matchMetric = NULL) {","object_name_linter" +"vignettes/VariableImportance.Rmd",116,81,"style","Lines should not be more than 80 characters.","PermutationMerge <- function(compositeList, matchPct = NULL, metricNames, matchMetric = NULL) {","line_length_linter" +"vignettes/VariableImportance.Rmd",124,5,"style","Variable and function name style should be snake_case or symbols."," projectMetric <- compositeList[[1]][[1]]$projectMetric","object_name_linter" +"vignettes/VariableImportance.Rmd",125,5,"style","Variable and function name style should be snake_case or symbols."," matchMetric <- paste(projectMetric, ""validation"", sep = ""."")","object_name_linter" +"vignettes/VariableImportance.Rmd",127,3,"style","Variable and function name style should be snake_case or symbols."," getCols <- c(""modelType"", ""expandedModel"", ""samplePct"", ""blueprintId"", matchMetric)","object_name_linter" +"vignettes/VariableImportance.Rmd",127,81,"style","Lines should not be more than 80 characters."," getCols <- c(""modelType"", ""expandedModel"", ""samplePct"", ""blueprintId"", matchMetric)","line_length_linter" +"vignettes/VariableImportance.Rmd",128,3,"style","Variable and function name style should be snake_case or symbols."," outFrame <- df[index, getCols]","object_name_linter" +"vignettes/VariableImportance.Rmd",129,3,"style","Variable and function name style should be snake_case or symbols."," keepCols <- getCols","object_name_linter" +"vignettes/VariableImportance.Rmd",130,3,"style","Variable and function name style should be snake_case or symbols."," keepCols[5] <- metricNames[1]","object_name_linter" +"vignettes/VariableImportance.Rmd",131,12,"style","Variable and function name style should be snake_case or symbols."," colnames(outFrame) <- keepCols","object_name_linter" +"vignettes/VariableImportance.Rmd",136,5,"style","Variable and function name style should be snake_case or symbols."," upFrame <- df[index, c(""blueprintId"", matchMetric)]","object_name_linter" +"vignettes/VariableImportance.Rmd",137,14,"style","Variable and function name style should be snake_case or symbols."," colnames(upFrame) <- c(""blueprintId"", metricNames[i])","object_name_linter" +"vignettes/VariableImportance.Rmd",138,5,"style","Variable and function name style should be snake_case or symbols."," outFrame <- merge(outFrame, upFrame, by = ""blueprintId"")","object_name_linter" +"vignettes/VariableImportance.Rmd",147,1,"style","Variable and function name style should be snake_case or symbols.","metricNames <- c(""originalRMSE"", paste(""X"", seq(1, 10, 1), ""RMSE"", sep = """"))","object_name_linter" +"vignettes/VariableImportance.Rmd",148,1,"style","Variable and function name style should be snake_case or symbols.","mergeFrame <- PermutationMerge(modelList, 16, metricNames)","object_name_linter" +"vignettes/VariableImportance.Rmd",156,1,"style","Variable and function name style should be snake_case or symbols.","BeanNames <- c(""None"", paste(""X"", seq(1, 10, 1), sep = """"))","object_name_linter" +"vignettes/VariableImportance.Rmd",167,1,"style","Variable and function name style should be snake_case or symbols.","ComputeDeltas <- function(mergeFrame, refCol, permNames, shiftNames) {","object_name_linter" +"vignettes/VariableImportance.Rmd",167,27,"style","Variable and function name style should be snake_case or symbols.","ComputeDeltas <- function(mergeFrame, refCol, permNames, shiftNames) {","object_name_linter" +"vignettes/VariableImportance.Rmd",167,39,"style","Variable and function name style should be snake_case or symbols.","ComputeDeltas <- function(mergeFrame, refCol, permNames, shiftNames) {","object_name_linter" +"vignettes/VariableImportance.Rmd",167,47,"style","Variable and function name style should be snake_case or symbols.","ComputeDeltas <- function(mergeFrame, refCol, permNames, shiftNames) {","object_name_linter" +"vignettes/VariableImportance.Rmd",167,58,"style","Variable and function name style should be snake_case or symbols.","ComputeDeltas <- function(mergeFrame, refCol, permNames, shiftNames) {","object_name_linter" +"vignettes/VariableImportance.Rmd",168,3,"style","Variable and function name style should be snake_case or symbols."," allNames <- colnames(mergeFrame)","object_name_linter" +"vignettes/VariableImportance.Rmd",169,3,"style","Variable and function name style should be snake_case or symbols."," refIndex <- which(allNames == refCol)","object_name_linter" +"vignettes/VariableImportance.Rmd",170,3,"style","Variable and function name style should be snake_case or symbols."," xRef <- mergeFrame[, refIndex]","object_name_linter" +"vignettes/VariableImportance.Rmd",171,3,"style","Variable and function name style should be snake_case or symbols."," permCols <- which(allNames %in% permNames)","object_name_linter" +"vignettes/VariableImportance.Rmd",172,3,"style","Variable and function name style should be snake_case or symbols."," xPerm <- mergeFrame[, permCols]","object_name_linter" +"vignettes/VariableImportance.Rmd",176,3,"style","Variable and function name style should be snake_case or symbols."," newIndex <- which(colnames(deltas) == ""New"")","object_name_linter" +"vignettes/VariableImportance.Rmd",185,1,"style","Variable and function name style should be snake_case or symbols.","allNames <- colnames(mergeFrame)","object_name_linter" +"vignettes/VariableImportance.Rmd",186,1,"style","Variable and function name style should be snake_case or symbols.","refCol <- allNames[5]","object_name_linter" +"vignettes/VariableImportance.Rmd",187,1,"style","Variable and function name style should be snake_case or symbols.","permNames <- allNames[6:15]","object_name_linter" +"vignettes/VariableImportance.Rmd",188,1,"style","Variable and function name style should be snake_case or symbols.","shiftNames <- paste(""X"", seq(1, 10, 1), sep = """")","object_name_linter" +"vignettes/VariableImportance.Rmd",189,1,"style","Variable and function name style should be snake_case or symbols.","deltaFrame <- ComputeDeltas(mergeFrame, refCol, permNames, shiftNames)","object_name_linter" +"vignettes/VariableImportance.Rmd",193,10,"style","Put spaces around all infix operators.","par(mfrow=c(1, 1))","infix_spaces_linter" +"vignettes/VariableImportance.Rmd",198,1,"style","Variable and function name style should be snake_case or symbols.","bestRow <- which.min(deltaFrame$originalRMSE)","object_name_linter" +"vignettes/VariableImportance.Rmd",199,1,"style","Variable and function name style should be snake_case or symbols.","bestModel <- mergeFrame$modelType[bestRow]","object_name_linter" +"vignettes/VariableImportance.Rmd",200,81,"style","Lines should not be more than 80 characters.","points(seq(1, 10, 1), deltaFrame[bestRow, 1:10], pch = 16, col = ""limegreen"", cex = 1.5)","line_length_linter" +"vignettes/VariableImportance.Rmd",219,1,"style","Variable and function name style should be snake_case or symbols.","varImpSummary <- function(deltaFrame, refCol, oneIndex) {","object_name_linter" +"vignettes/VariableImportance.Rmd",219,27,"style","Variable and function name style should be snake_case or symbols.","varImpSummary <- function(deltaFrame, refCol, oneIndex) {","object_name_linter" +"vignettes/VariableImportance.Rmd",219,39,"style","Variable and function name style should be snake_case or symbols.","varImpSummary <- function(deltaFrame, refCol, oneIndex) {","object_name_linter" +"vignettes/VariableImportance.Rmd",219,47,"style","Variable and function name style should be snake_case or symbols.","varImpSummary <- function(deltaFrame, refCol, oneIndex) {","object_name_linter" +"vignettes/VariableImportance.Rmd",221,3,"style","Variable and function name style should be snake_case or symbols."," refIndex <- which(vars == refCol)","object_name_linter" +"vignettes/VariableImportance.Rmd",222,3,"style","Variable and function name style should be snake_case or symbols."," refValue <- deltaFrame[, refIndex]","object_name_linter" +"vignettes/VariableImportance.Rmd",223,11,"style","Put spaces around all infix operators."," wts <- 1/refValue # Performance-weights = reciprocal fitting measure","infix_spaces_linter" +"vignettes/VariableImportance.Rmd",224,3,"style","Variable and function name style should be snake_case or symbols."," deltasOnly <- deltaFrame[, -refIndex]","object_name_linter" +"vignettes/VariableImportance.Rmd",225,3,"style","Variable and function name style should be snake_case or symbols."," thisModel <- as.numeric(deltasOnly[oneIndex, ])","object_name_linter" +"vignettes/VariableImportance.Rmd",226,34,"style","Put spaces around all infix operators."," avg <- apply(deltasOnly, MARGIN=2, mean)","infix_spaces_linter" +"vignettes/VariableImportance.Rmd",227,3,"style","Variable and function name style should be snake_case or symbols."," WtAvgFunction <- function(x, w) { sum(w * x) / sum(w) }","object_name_linter" +"vignettes/VariableImportance.Rmd",227,35,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," WtAvgFunction <- function(x, w) { sum(w * x) / sum(w) }","brace_linter" +"vignettes/VariableImportance.Rmd",227,57,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," WtAvgFunction <- function(x, w) { sum(w * x) / sum(w) }","brace_linter" +"vignettes/VariableImportance.Rmd",228,3,"style","Variable and function name style should be snake_case or symbols."," wtAvg <- apply(deltasOnly, MARGIN = 2, WtAvgFunction, wts)","object_name_linter" +"vignettes/VariableImportance.Rmd",229,3,"style","Variable and function name style should be snake_case or symbols."," varImpFrame <- data.frame(average = avg,","object_name_linter" +"vignettes/VariableImportance.Rmd",239,1,"style","Variable and function name style should be snake_case or symbols.","varImp <- varImpSummary(deltaFrame, ""originalRMSE"", bestRow)","object_name_linter" +"vignettes/VariableImportance.Rmd",241,1,"style","Variable and function name style should be snake_case or symbols.","wtAvg <- round(varImp$weightedAverage, digits = 3)","object_name_linter" diff --git a/.dev/revdep_emails/datarobot/email-body b/.dev/revdep_emails/datarobot/email-body new file mode 100644 index 000000000..93af736c5 --- /dev/null +++ b/.dev/revdep_emails/datarobot/email-body @@ -0,0 +1,29 @@ +Hello AJ Alon! Thank you for using {lintr} in your package {datarobot}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cran/datarobot (hash: d9f4f286f1d16fdd872e670febdce76910730909) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 172s on CRAN vs. 147s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/datastructures/attachments/datastructures.failure b/.dev/revdep_emails/datastructures/attachments/datastructures.failure new file mode 100644 index 000000000..c3d4a1db0 --- /dev/null +++ b/.dev/revdep_emails/datastructures/attachments/datastructures.failure @@ -0,0 +1 @@ +object 'absolute_paths_linter' not found diff --git a/.dev/revdep_emails/datastructures/email-body b/.dev/revdep_emails/datastructures/email-body new file mode 100644 index 000000000..229573b02 --- /dev/null +++ b/.dev/revdep_emails/datastructures/email-body @@ -0,0 +1,29 @@ +Hello Simon Dirmeier! Thank you for using {lintr} in your package {datastructures}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/dirmeier/datastructures (hash: c69faa25d7eb5094e20a7410e5bcab44fed4eef9) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 9s on CRAN vs. 0s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/describer/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/describer/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..c18888fb2 --- /dev/null +++ b/.dev/revdep_emails/describer/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,2 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/describe.R",83,1,"style","Variable and function name style should be snake_case.","describe.data.frame <- function(.x) {","object_name_linter" diff --git a/.dev/revdep_emails/describer/email-body b/.dev/revdep_emails/describer/email-body new file mode 100644 index 000000000..399f7eeb1 --- /dev/null +++ b/.dev/revdep_emails/describer/email-body @@ -0,0 +1,29 @@ +Hello Paul Hendricks! Thank you for using {lintr} in your package {describer}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/paulhendricks/describer (hash: bc72c7b9538747c17159ef40656a859a1b295dc9) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 3s on CRAN vs. 1s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/devtools/email-body b/.dev/revdep_emails/devtools/email-body new file mode 100644 index 000000000..57e445dcc --- /dev/null +++ b/.dev/revdep_emails/devtools/email-body @@ -0,0 +1,29 @@ +Hello Jennifer Bryan! Thank you for using {lintr} in your package {devtools}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/r-lib/devtools (hash: dd960cc75c5650d7fb9fbfed33fb1b57cc0de758) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 0s on CRAN vs. 3s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/diffusr/attachments/diffusr.failure b/.dev/revdep_emails/diffusr/attachments/diffusr.failure new file mode 100644 index 000000000..c3d4a1db0 --- /dev/null +++ b/.dev/revdep_emails/diffusr/attachments/diffusr.failure @@ -0,0 +1 @@ +object 'absolute_paths_linter' not found diff --git a/.dev/revdep_emails/diffusr/email-body b/.dev/revdep_emails/diffusr/email-body new file mode 100644 index 000000000..8f9f02c2d --- /dev/null +++ b/.dev/revdep_emails/diffusr/email-body @@ -0,0 +1,29 @@ +Hello Simon Dirmeier! Thank you for using {lintr} in your package {diffusr}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/dirmeier/diffusr (hash: c3005d42f186f0c736c0dfe094a713c05e0c2ad5) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 3s on CRAN vs. 0s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/dittodb/attachments/dittodb.warnings b/.dev/revdep_emails/dittodb/attachments/dittodb.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/dittodb/attachments/dittodb.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/dittodb/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/dittodb/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..596ce57ed --- /dev/null +++ b/.dev/revdep_emails/dittodb/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,728 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/nycflights13-sql.R",50,41,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (inherits(con, ""SQLiteConnection"") | schema == """") {","vector_logic_linter" +"vignettes/dittodb/nycflights/conInfo-.R",1,69,"style","Trailing whitespace is superfluous.","list(host = ""127.0.0.1"", username = ""travis"", dbname = ""nycflights"", ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/conInfo-.R",2,94,"style","Trailing whitespace is superfluous."," con.type = ""127.0.0.1 via TCP/IP"", db.version = ""10.4.12-MariaDB-1:10.4.12+maria~bionic"", ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/SELECT-16d120.R",1,64,"style","Trailing whitespace is superfluous.","structure(list(day = 1:31, mean_delay = c(0x1.55fd54de872a1p+5, ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/SELECT-16d120.R",2,66,"style","Trailing whitespace is superfluous.","0x1.59e435941788dp+5, 0x1.0f393c4c771f6p+5, 0x1.baeff05b9e3cap+4, ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/SELECT-16d120.R",3,66,"style","Trailing whitespace is superfluous.","0x1.1c90412a948cbp+5, 0x1.e78c809868c81p+4, 0x1.67eea7da1dc83p+5, ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/SELECT-16d120.R",4,66,"style","Trailing whitespace is superfluous.","0x1.c1cf68f8013cfp+5, 0x1.603062afefb64p+5, 0x1.a4022947a53a4p+5, ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/SELECT-16d120.R",5,66,"style","Trailing whitespace is superfluous.","0x1.4ee3566690b4fp+5, 0x1.544397c49e8f1p+5, 0x1.444be7f3df2b9p+5, ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/SELECT-16d120.R",6,66,"style","Trailing whitespace is superfluous.","0x1.13e1aaa03ab5cp+5, 0x1.c2b1018fed867p+4, 0x1.0024cd47277d8p+5, ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/SELECT-16d120.R",7,66,"style","Trailing whitespace is superfluous.","0x1.45ed38b2dce19p+5, 0x1.615182d6f26c8p+5, 0x1.4b4858bf824f1p+5, ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/SELECT-16d120.R",8,66,"style","Trailing whitespace is superfluous.","0x1.ef6ff9df0ef05p+4, 0x1.e34fb5df73593p+4, 0x1.7919380ff74a9p+5, ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/SELECT-16d120.R",9,66,"style","Trailing whitespace is superfluous.","0x1.63e23337f7ce1p+5, 0x1.56d7c319729fap+5, 0x1.593dde5542ad9p+5, ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/SELECT-16d120.R",10,66,"style","Trailing whitespace is superfluous.","0x1.1016cdd7d9ab7p+5, 0x1.5c258f74b99bdp+5, 0x1.90ab3046fb0abp+5, ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/SELECT-e53189.R",1,65,"style","Trailing whitespace is superfluous.","structure(list(month = 1:12, mean_delay = c(0x1.13d1e5a46fdcp+5, ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/SELECT-e53189.R",2,66,"style","Trailing whitespace is superfluous.","0x1.0d837f713f91bp+5, 0x1.4492c49ce57bcp+5, 0x1.55eaa80cc1cf3p+5, ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/SELECT-e53189.R",3,65,"style","Trailing whitespace is superfluous.","0x1.4f163c59bf3a3p+5, 0x1.ade7fa6ccb7dp+5, 0x1.af9cb5a5cabccp+5, ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/SELECT-e53189.R",4,65,"style","Trailing whitespace is superfluous.","0x1.3c1a8138c6202p+5, 0x1.3671c4fbc61bp+5, 0x1.d0961ced931dbp+4, ","trailing_whitespace_linter" +"vignettes/dittodb/nycflights/SELECT-e53189.R",5,86,"style","Trailing whitespace is superfluous.","0x1.b7c0e577c0e57p+4, 0x1.3dd1671e576e9p+5)), class = ""data.frame"", row.names = c(NA, ","trailing_whitespace_linter" +"vignettes/travelling-old/resultInfo-6f7e1a.R",1,69,"style","Trailing whitespace is superfluous.","list(statement = ""SELECT * FROM \""flights\"" AS \""zzz13\"" WHERE 0=1"", ","trailing_whitespace_linter" +"vignettes/travelling-old/resultInfo-6f7e1a.R",2,70,"style","Trailing whitespace is superfluous."," isSelect = 1L, rowsAffected = -1L, rowCount = 0L, completed = 0L, ","trailing_whitespace_linter" +"vignettes/travelling-old/resultInfo-6f7e1a.R",3,66,"style","Trailing whitespace is superfluous."," fieldDescription = list(list(name = c(""year"", ""month"", ""day"", ","trailing_whitespace_linter" +"vignettes/travelling-old/resultInfo-6f7e1a.R",4,77,"style","Trailing whitespace is superfluous."," ""dep_time"", ""sched_dep_time"", ""dep_delay"", ""arr_time"", ""sched_arr_time"", ","trailing_whitespace_linter" +"vignettes/travelling-old/resultInfo-6f7e1a.R",5,67,"style","Trailing whitespace is superfluous."," ""arr_delay"", ""carrier"", ""flight"", ""tailnum"", ""origin"", ""dest"", ","trailing_whitespace_linter" +"vignettes/travelling-old/resultInfo-6f7e1a.R",6,76,"style","Trailing whitespace is superfluous."," ""air_time"", ""distance"", ""hour"", ""minute"", ""time_hour""), Sclass = c(13L, ","trailing_whitespace_linter" +"vignettes/travelling-old/resultInfo-6f7e1a.R",7,64,"style","Trailing whitespace is superfluous."," 13L, 13L, 13L, 13L, 14L, 13L, 13L, 14L, 16L, 13L, 16L, 16L, ","trailing_whitespace_linter" +"vignettes/travelling-old/resultInfo-6f7e1a.R",8,64,"style","Trailing whitespace is superfluous."," 16L, 14L, 14L, 14L, 14L, 16L), type = c(23L, 23L, 23L, 23L, ","trailing_whitespace_linter" +"vignettes/travelling-old/resultInfo-6f7e1a.R",9,62,"style","Trailing whitespace is superfluous."," 23L, 701L, 23L, 23L, 701L, 25L, 23L, 25L, 25L, 25L, 701L, ","trailing_whitespace_linter" +"vignettes/travelling-old/resultInfo-6f7e1a.R",10,62,"style","Trailing whitespace is superfluous."," 701L, 701L, 701L, 1184L), len = c(4L, 4L, 4L, 4L, 4L, 8L, ","trailing_whitespace_linter" +"vignettes/travelling-old/resultInfo-6f7e1a.R",11,61,"style","Trailing whitespace is superfluous."," 4L, 4L, 8L, -1L, 4L, -1L, -1L, -1L, 8L, 8L, 8L, 8L, 8L), ","trailing_whitespace_linter" +"vignettes/travelling-old/resultInfo-6f7e1a.R",12,62,"style","Trailing whitespace is superfluous."," precision = c(-1L, -1L, -1L, -1L, -1L, -1L, -1L, -1L, ","trailing_whitespace_linter" +"vignettes/travelling-old/resultInfo-6f7e1a.R",14,61,"style","Trailing whitespace is superfluous."," ), scale = c(-1L, -1L, -1L, -1L, -1L, -1L, -1L, -1L, ","trailing_whitespace_linter" +"vignettes/travelling-old/resultInfo-6f7e1a.R",16,64,"style","Trailing whitespace is superfluous."," ), nullOK = c(TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, ","trailing_whitespace_linter" +"vignettes/travelling-old/resultInfo-6f7e1a.R",17,62,"style","Trailing whitespace is superfluous."," TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",1,67,"style","Trailing whitespace is superfluous.","structure(list(tailnum = c(""N912XJ"", ""N645JB"", ""N904WN"", ""N3BWAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",2,70,"style","Trailing whitespace is superfluous.","""N3CJAA"", ""N14972"", ""N667UA"", ""N998AT"", ""N521JB"", ""N16559"", ""N14186"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",3,70,"style","Trailing whitespace is superfluous.","""N16170"", ""N789JB"", ""N409WN"", ""N593JB"", ""N11535"", ""N505AA"", ""N8928A"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",4,70,"style","Trailing whitespace is superfluous.","""N3DPAA"", ""N34222"", ""N639VA"", ""N480AA"", ""N511MQ"", ""N77518"", ""N697DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",5,70,"style","Trailing whitespace is superfluous.","""N87527"", ""N652SW"", ""N651JB"", ""N640AA"", ""N304DQ"", ""N643JB"", ""N988DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",6,70,"style","Trailing whitespace is superfluous.","""N231JB"", ""N14542"", ""N531JB"", ""N14573"", ""N76519"", ""N13161"", ""N567UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",7,70,"style","Trailing whitespace is superfluous.","""N201LV"", ""N27962"", ""N198JB"", ""N520MQ"", ""N689MQ"", ""N369NW"", ""N8432A"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",8,70,"style","Trailing whitespace is superfluous.","""N14902"", ""N8EGMQ"", ""N336NB"", ""N3FJAA"", ""N905DL"", ""N628VA"", ""N12136"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",9,70,"style","Trailing whitespace is superfluous.","""N550WN"", ""N353SW"", ""N844VA"", ""N738US"", ""N371NB"", ""N431WN"", ""N11206"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",10,69,"style","Trailing whitespace is superfluous.","""N412WN"", ""N832UA"", ""N14993"", ""N495UA"", ""N3759"", ""N314US"", ""N14231"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",11,70,"style","Trailing whitespace is superfluous.","""N176DN"", ""N363NB"", ""N3AHAA"", ""N5DMAA"", ""N764US"", ""N802MQ"", ""N33209"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",12,70,"style","Trailing whitespace is superfluous.","""N38451"", ""N14219"", ""N320US"", ""N8903A"", ""N3FCAA"", ""N682MQ"", ""N672DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",13,70,"style","Trailing whitespace is superfluous.","""N173US"", ""N691CA"", ""N33103"", ""N210WN"", ""N8877A"", ""N638JB"", ""N558UW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",14,70,"style","Trailing whitespace is superfluous.","""N820AS"", ""N479UA"", ""N180US"", ""N334JB"", ""N33292"", ""N513UA"", ""N775JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",15,70,"style","Trailing whitespace is superfluous.","""N528MQ"", ""N955DL"", ""N405UA"", ""N377NW"", ""N611QX"", ""N7732A"", ""N320AA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",16,70,"style","Trailing whitespace is superfluous.","""N11192"", ""N3769L"", ""N622VA"", ""N338AA"", ""N504UA"", ""N7739A"", ""N841UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",17,70,"style","Trailing whitespace is superfluous.","""N987AT"", ""N11113"", ""N14106"", ""N903WN"", ""N3CGAA"", ""N621VA"", ""N477AA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",18,70,"style","Trailing whitespace is superfluous.","""N837UA"", ""N339NB"", ""N374DA"", ""N8869B"", ""N284JB"", ""N924DL"", ""N8775A"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",19,70,"style","Trailing whitespace is superfluous.","""N836UA"", ""N324JB"", ""N833UA"", ""N13553"", ""N999DN"", ""N3763D"", ""N12996"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",20,70,"style","Trailing whitespace is superfluous.","""N513MQ"", ""N722US"", ""N14904"", ""N591AA"", ""N539MQ"", ""N14977"", ""N12924"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",21,70,"style","Trailing whitespace is superfluous.","""N358NB"", ""N877AS"", ""N554UA"", ""N76514"", ""N203JB"", ""N12135"", ""N387SW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",22,70,"style","Trailing whitespace is superfluous.","""N27722"", ""N444UA"", ""N469UA"", ""N575UA"", ""N3AUAA"", ""N306JB"", ""N24128"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",23,70,"style","Trailing whitespace is superfluous.","""N617MQ"", ""N642DL"", ""N595UA"", ""N588JB"", ""N3HSAA"", ""N915DE"", ""N3HTAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",24,70,"style","Trailing whitespace is superfluous.","""N592UA"", ""N37253"", ""N629JB"", ""N585UA"", ""N265WN"", ""N4XRAA"", ""N941DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",25,70,"style","Trailing whitespace is superfluous.","""N838VA"", ""N267AT"", ""N3JXAA"", ""N523UA"", ""N912DL"", ""N707TW"", ""N3GRAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",26,70,"style","Trailing whitespace is superfluous.","""N934WN"", ""N370SW"", ""N17133"", ""N594JB"", ""N11119"", ""N8942A"", ""N524JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",27,70,"style","Trailing whitespace is superfluous.","""N608QX"", ""N534JB"", ""N21130"", ""N534MQ"", ""N14105"", ""N659DL"", ""N18102"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",28,70,"style","Trailing whitespace is superfluous.","""N470UA"", ""N7714B"", ""N535MQ"", ""N910DE"", ""N921WN"", ""N918DL"", ""N703TW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",29,70,"style","Trailing whitespace is superfluous.","""N998DL"", ""N8982A"", ""N735MQ"", ""N76065"", ""N354NW"", ""N13994"", ""N644JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",30,70,"style","Trailing whitespace is superfluous.","""N282WN"", ""N722MQ"", ""N502UA"", ""N13202"", ""N66057"", ""N26545"", ""N37474"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",31,70,"style","Trailing whitespace is superfluous.","""N527AA"", ""N544AA"", ""N24212"", ""N935XJ"", ""N352AA"", ""N920AT"", ""N630JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",32,70,"style","Trailing whitespace is superfluous.","""N79402"", ""N8305E"", ""N849VA"", ""N477WN"", ""N603JB"", ""N8907A"", ""N4UCAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",33,70,"style","Trailing whitespace is superfluous.","""N535UW"", ""N8560F"", ""N17984"", ""N11189"", ""N709EV"", ""N727SW"", ""N3GLAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",34,69,"style","Trailing whitespace is superfluous.","""N7726A"", ""N3765"", ""N14959"", ""N796SW"", ""N325US"", ""N11165"", ""N3KBAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",35,69,"style","Trailing whitespace is superfluous.","""N4WVAA"", ""N713EV"", ""N3ASAA"", ""N8541D"", ""N744P"", ""N444WN"", ""N33294"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",36,70,"style","Trailing whitespace is superfluous.","""N476UA"", ""N845VA"", ""N950DL"", ""N937XJ"", ""N741SA"", ""N562UW"", ""N417UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",37,70,"style","Trailing whitespace is superfluous.","""N3ERAA"", ""N14179"", ""N684MQ"", ""N8800G"", ""N37252"", ""N11187"", ""N547JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",38,70,"style","Trailing whitespace is superfluous.","""N510JB"", ""N592JB"", ""N12569"", ""N16149"", ""N585AA"", ""N714CB"", ""N517MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",39,70,"style","Trailing whitespace is superfluous.","""N3HUAA"", ""N366NW"", ""N5EMAA"", ""N723EV"", ""N66051"", ""N961AT"", ""N365NW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",40,70,"style","Trailing whitespace is superfluous.","""N248WN"", ""N269WN"", ""N18557"", ""N390AA"", ""N18120"", ""N344AA"", ""N805UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",41,70,"style","Trailing whitespace is superfluous.","""N76529"", ""N661MQ"", ""N16713"", ""N426UA"", ""N356NW"", ""N3736C"", ""N27733"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",42,70,"style","Trailing whitespace is superfluous.","""N328AA"", ""N466UA"", ""N547AA"", ""N3FKAA"", ""N345NW"", ""N983DL"", ""N410UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",43,70,"style","Trailing whitespace is superfluous.","""N794JB"", ""N181UW"", ""N76516"", ""N75426"", ""N232WN"", ""N5DNAA"", ""N675DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",44,70,"style","Trailing whitespace is superfluous.","""N23721"", ""N624VA"", ""N604LR"", ""N830MQ"", ""N914DL"", ""N361NB"", ""N458UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",45,70,"style","Trailing whitespace is superfluous.","""N379DA"", ""N633DL"", ""N947DL"", ""N401WN"", ""N261AT"", ""N3FHAA"", ""N591JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",46,70,"style","Trailing whitespace is superfluous.","""N77066"", ""N601AW"", ""N702TW"", ""N8554A"", ""N15912"", ""N37466"", ""N331NW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",47,70,"style","Trailing whitespace is superfluous.","""N605LR"", ""N706JB"", ""N518UA"", ""N721MQ"", ""N695DL"", ""N14116"", ""N840VA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",48,70,"style","Trailing whitespace is superfluous.","""N904XJ"", ""N526JB"", ""N285WN"", ""N633VA"", ""N519AA"", ""N364NW"", ""N719EV"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",49,70,"style","Trailing whitespace is superfluous.","""N942MQ"", ""N476WN"", ""N529VA"", ""N3CKAA"", ""N533UA"", ""N372NW"", ""N529JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",50,70,"style","Trailing whitespace is superfluous.","""N504JB"", ""N705TW"", ""N121UW"", ""N16178"", ""N733SA"", ""N515MQ"", ""N195UW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",51,70,"style","Trailing whitespace is superfluous.","""N663MQ"", ""N328NW"", ""N8964E"", ""N625VA"", ""N852VA"", ""N340NW"", ""N544MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",52,70,"style","Trailing whitespace is superfluous.","""N327NB"", ""N6EAMQ"", ""N163US"", ""N11176"", ""N13989"", ""N585JB"", ""N374JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",53,70,"style","Trailing whitespace is superfluous.","""N8736A"", ""N370NW"", ""N717TW"", ""N6704Z"", ""N760JB"", ""N14148"", ""N3CYAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",54,70,"style","Trailing whitespace is superfluous.","""N14543"", ""N5DYAA"", ""N8936A"", ""N599JB"", ""N329AA"", ""N749US"", ""N324AA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",55,70,"style","Trailing whitespace is superfluous.","""N600LR"", ""N951FR"", ""N611MQ"", ""N4UBAA"", ""N690DL"", ""N758SW"", ""N338NB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",56,70,"style","Trailing whitespace is superfluous.","""N534UA"", ""N920DL"", ""N550NW"", ""N455UA"", ""N907MQ"", ""N358NW"", ""N850MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",57,70,"style","Trailing whitespace is superfluous.","""N419UA"", ""N3DHAA"", ""N984DL"", ""N39728"", ""N8790A"", ""N337AT"", ""N979DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",58,70,"style","Trailing whitespace is superfluous.","""N3FVAA"", ""N3CTAA"", ""N324US"", ""N730EV"", ""N41104"", ""N765SW"", ""N76515"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",59,70,"style","Trailing whitespace is superfluous.","""N3GSAA"", ""N8698A"", ""N76528"", ""N173AT"", ""N509MQ"", ""N805MQ"", ""N724MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",60,70,"style","Trailing whitespace is superfluous.","""N938DL"", ""N201FR"", ""N433UA"", ""N712EV"", ""N853VA"", ""N564JB"", ""N438UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",61,70,"style","Trailing whitespace is superfluous.","""N747SA"", ""N561JB"", ""N29906"", ""N387DA"", ""N924XJ"", ""N913DL"", ""N11127"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",62,70,"style","Trailing whitespace is superfluous.","""N326US"", ""N8696C"", ""N722TW"", ""N481AA"", ""N543UW"", ""N675AW"", ""N302NB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",63,70,"style","Trailing whitespace is superfluous.","""N270WN"", ""N482AA"", ""N632SW"", ""N310NW"", ""N77530"", ""N4WNAA"", ""N950UW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",64,70,"style","Trailing whitespace is superfluous.","""N828AS"", ""N296PQ"", ""N19554"", ""N963DL"", ""N893AT"", ""N530VA"", ""N827UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",65,70,"style","Trailing whitespace is superfluous.","""N76502"", ""N68453"", ""N24729"", ""N641VA"", ""N553UA"", ""N510UW"", ""N627JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",66,70,"style","Trailing whitespace is superfluous.","""N821MQ"", ""N506JB"", ""N3BGAA"", ""N18101"", ""N3KEAA"", ""N16918"", ""N844MH"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",67,70,"style","Trailing whitespace is superfluous.","""N402UA"", ""N550UW"", ""N758US"", ""N391DA"", ""N662JB"", ""N908XJ"", ""N801UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",68,70,"style","Trailing whitespace is superfluous.","""N649MQ"", ""N466WN"", ""N8646A"", ""N241WN"", ""N18223"", ""N17245"", ""N14731"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",69,70,"style","Trailing whitespace is superfluous.","""N16147"", ""N990DL"", ""N993DL"", ""N639AA"", ""N29717"", ""N934XJ"", ""N996DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",70,70,"style","Trailing whitespace is superfluous.","""N913XJ"", ""N562JB"", ""N5EHAA"", ""N582AA"", ""N839UA"", ""N4XVAA"", ""N178JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",71,70,"style","Trailing whitespace is superfluous.","""N445WN"", ""N915AT"", ""N214FR"", ""N891AT"", ""N8532G"", ""N239JB"", ""N948DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",72,70,"style","Trailing whitespace is superfluous.","""N915WN"", ""N827AS"", ""N4XCAA"", ""N645MQ"", ""N834AS"", ""N5CAAA"", ""N11547"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",73,70,"style","Trailing whitespace is superfluous.","""N351NB"", ""N927AT"", ""N463WN"", ""N452UA"", ""N29129"", ""N14562"", ""N899AT"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",74,70,"style","Trailing whitespace is superfluous.","""N913DE"", ""N437UA"", ""N354JB"", ""N501AA"", ""N842UA"", ""N827MQ"", ""N408WN"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",75,70,"style","Trailing whitespace is superfluous.","""N803UA"", ""N355NW"", ""N283JB"", ""N507MQ"", ""N508AA"", ""N509JB"", ""N176AT"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",76,70,"style","Trailing whitespace is superfluous.","""N627VA"", ""N715JB"", ""N348NW"", ""N3BAAA"", ""N8683B"", ""N13716"", ""N646JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",77,70,"style","Trailing whitespace is superfluous.","""N936DL"", ""N78438"", ""N3BDAA"", ""N638VA"", ""N507JB"", ""N403UA"", ""N16234"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",78,70,"style","Trailing whitespace is superfluous.","""N932XJ"", ""N784JB"", ""N297WN"", ""N902MQ"", ""N959UW"", ""N228JB"", ""N521VA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",79,70,"style","Trailing whitespace is superfluous.","""N3HGAA"", ""N906AT"", ""N267JB"", ""N507UA"", ""N612JB"", ""N17730"", ""N564UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",80,70,"style","Trailing whitespace is superfluous.","""N399DA"", ""N351JB"", ""N349NW"", ""N555LV"", ""N504MQ"", ""N16561"", ""N25134"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",81,70,"style","Trailing whitespace is superfluous.","""N607LR"", ""N833AY"", ""N615AA"", ""N607JB"", ""N3EPAA"", ""N577UA"", ""N324NB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",82,70,"style","Trailing whitespace is superfluous.","""N8930E"", ""N519JB"", ""N458WN"", ""N754EV"", ""N911DA"", ""N21129"", ""N16709"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",83,70,"style","Trailing whitespace is superfluous.","""N339JB"", ""N997AT"", ""N927LR"", ""N4XXAA"", ""N946DL"", ""N3HEAA"", ""N36444"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",84,70,"style","Trailing whitespace is superfluous.","""N16541"", ""N776WN"", ""N574UA"", ""N75435"", ""N14570"", ""N323JB"", ""N8933B"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",85,70,"style","Trailing whitespace is superfluous.","""N34110"", ""N17126"", ""N771SA"", ""N820AY"", ""N715UW"", ""N710EV"", ""N940DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",86,70,"style","Trailing whitespace is superfluous.","""N8598B"", ""N705JB"", ""N8506C"", ""N807JB"", ""N394DA"", ""N634VA"", ""N348JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",87,70,"style","Trailing whitespace is superfluous.","""N3DSAA"", ""N355JB"", ""N8972E"", ""N293PQ"", ""N3DUAA"", ""N13133"", ""N14950"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",88,70,"style","Trailing whitespace is superfluous.","""N524MQ"", ""N904DL"", ""N27190"", ""N8960A"", ""N484UA"", ""N624JB"", ""N3AJAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",89,70,"style","Trailing whitespace is superfluous.","""N930XJ"", ""N77520"", ""N335AA"", ""N635VA"", ""N8940E"", ""N849MQ"", ""N713SW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",90,70,"style","Trailing whitespace is superfluous.","""N75433"", ""N316JB"", ""N12900"", ""N768SW"", ""N972DL"", ""N3FSAA"", ""N346NB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",91,70,"style","Trailing whitespace is superfluous.","""N908MQ"", ""N3JCAA"", ""N950WN"", ""N959AT"", ""N842MQ"", ""N3GDAA"", ""N8315C"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",92,70,"style","Trailing whitespace is superfluous.","""N624AG"", ""N14118"", ""N446UA"", ""N752EV"", ""N172DN"", ""N457UW"", ""N7735A"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",93,70,"style","Trailing whitespace is superfluous.","""N430UA"", ""N14905"", ""N805JB"", ""N580UA"", ""N545UA"", ""N709TW"", ""N601LR"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",94,70,"style","Trailing whitespace is superfluous.","""N218FR"", ""N404UA"", ""N23139"", ""N497UA"", ""N257WN"", ""N17138"", ""N959DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",95,70,"style","Trailing whitespace is superfluous.","""N652DL"", ""N351NW"", ""N603DL"", ""N569UA"", ""N855UA"", ""N329NW"", ""N735SA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",96,70,"style","Trailing whitespace is superfluous.","""N995DL"", ""N38467"", ""N563JB"", ""N3KPAA"", ""N472UA"", ""N75861"", ""N4WSAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",97,70,"style","Trailing whitespace is superfluous.","""N16963"", ""N583AA"", ""N13979"", ""N12567"", ""N539AA"", ""N927XJ"", ""N571JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",98,70,"style","Trailing whitespace is superfluous.","""N519UA"", ""N353AT"", ""N640JB"", ""N11536"", ""N597UA"", ""N79279"", ""N3EFAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",99,70,"style","Trailing whitespace is superfluous.","""N15574"", ""N636JB"", ""N528VA"", ""N3APAA"", ""N14953"", ""N486AA"", ""N991DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",100,70,"style","Trailing whitespace is superfluous.","""N514MQ"", ""N14203"", ""N928DN"", ""N11109"", ""N8839E"", ""N184US"", ""N76504"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",101,70,"style","Trailing whitespace is superfluous.","""N425UA"", ""N631VA"", ""N15980"", ""N3GJAA"", ""N764SW"", ""N353NB"", ""N982DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",102,70,"style","Trailing whitespace is superfluous.","""N825AS"", ""N508JB"", ""N598JB"", ""N3ANAA"", ""N342NW"", ""N746JB"", ""N9EAMQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",103,70,"style","Trailing whitespace is superfluous.","""N708EV"", ""N296JB"", ""N231WN"", ""N8580A"", ""N328JB"", ""N555UA"", ""N380DA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",104,70,"style","Trailing whitespace is superfluous.","""N423UA"", ""N522UA"", ""N222WN"", ""N336AA"", ""N332AA"", ""N292JB"", ""N588UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",105,70,"style","Trailing whitespace is superfluous.","""N8733G"", ""N767UW"", ""N809UA"", ""N244WN"", ""N933LR"", ""N525UA"", ""N929DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",106,70,"style","Trailing whitespace is superfluous.","""N608JB"", ""N14991"", ""N187JB"", ""N980AT"", ""N527VA"", ""N17169"", ""N978DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",107,70,"style","Trailing whitespace is superfluous.","""N625AA"", ""N316NB"", ""N492UA"", ""N944UW"", ""N3FPAA"", ""N3CHAA"", ""N922DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",108,70,"style","Trailing whitespace is superfluous.","""N656JB"", ""N4YTAA"", ""N41135"", ""N566JB"", ""N138EV"", ""N676CA"", ""N813UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",109,70,"style","Trailing whitespace is superfluous.","""N12122"", ""N14214"", ""N3CXAA"", ""N37471"", ""N375NC"", ""N527MQ"", ""N13964"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",110,70,"style","Trailing whitespace is superfluous.","""N11181"", ""N5FGAA"", ""N3GCAA"", ""N946UW"", ""N808UA"", ""N835AS"", ""N737MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",111,70,"style","Trailing whitespace is superfluous.","""N362NW"", ""N673UA"", ""N838MQ"", ""N687MQ"", ""N3BCAA"", ""N435WN"", ""N5CGAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",112,70,"style","Trailing whitespace is superfluous.","""N73276"", ""N667AW"", ""N3750D"", ""N15910"", ""N374NW"", ""N247JB"", ""N516AS"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",113,70,"style","Trailing whitespace is superfluous.","""N707EV"", ""N777QC"", ""N579JB"", ""N337JB"", ""N464UA"", ""N8604C"", ""N847UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",114,70,"style","Trailing whitespace is superfluous.","""N400WN"", ""N3741S"", ""N15973"", ""N13538"", ""N39416"", ""N3DCAA"", ""N416UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",115,70,"style","Trailing whitespace is superfluous.","""N779JB"", ""N16976"", ""N494WN"", ""N807UA"", ""N929XJ"", ""N12195"", ""N3JDAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",116,70,"style","Trailing whitespace is superfluous.","""N1EAMQ"", ""N937DL"", ""N16151"", ""N576UA"", ""N17244"", ""N639MQ"", ""N13958"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",117,70,"style","Trailing whitespace is superfluous.","""N7738A"", ""N6716C"", ""N754UW"", ""N73299"", ""N185UW"", ""N3BRAA"", ""N8797A"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",118,70,"style","Trailing whitespace is superfluous.","""N8409N"", ""N3764D"", ""N954DL"", ""N13718"", ""N15985"", ""N318JB"", ""N197UW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",119,70,"style","Trailing whitespace is superfluous.","""N34111"", ""N509AY"", ""N13913"", ""N553UW"", ""N917WN"", ""N930DL"", ""N3749D"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",120,70,"style","Trailing whitespace is superfluous.","""N3748Y"", ""N218WN"", ""N73251"", ""N13124"", ""N507MJ"", ""N11150"", ""N519MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",121,70,"style","Trailing whitespace is superfluous.","""N928DL"", ""N819UA"", ""N917XJ"", ""N18556"", ""N8674A"", ""N520JB"", ""N8908D"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",122,70,"style","Trailing whitespace is superfluous.","""N910XJ"", ""N811MQ"", ""N609SW"", ""N12167"", ""N12564"", ""N485UA"", ""N556UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",123,70,"style","Trailing whitespace is superfluous.","""N657JB"", ""N18220"", ""N7741C"", ""N431UA"", ""N963WN"", ""N73275"", ""N368JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",124,70,"style","Trailing whitespace is superfluous.","""N12540"", ""N925DL"", ""N8745B"", ""N302DQ"", ""N935WN"", ""N236JB"", ""N16571"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",125,70,"style","Trailing whitespace is superfluous.","""N762US"", ""N912DE"", ""N77431"", ""N308DE"", ""N343NB"", ""N823UA"", ""N331NB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",126,70,"style","Trailing whitespace is superfluous.","""N558JB"", ""N8317M"", ""N75436"", ""N446WN"", ""N465UA"", ""N167US"", ""N587NW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",127,69,"style","Trailing whitespace is superfluous.","""N658JB"", ""N212WN"", ""N3733Z"", ""N3JUAA"", ""N531MQ"", ""N3735D"", ""N1603"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",128,70,"style","Trailing whitespace is superfluous.","""N700GS"", ""N332NW"", ""N516JB"", ""N5ETAA"", ""N4WMAA"", ""N397DA"", ""N13969"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",129,70,"style","Trailing whitespace is superfluous.","""N919DL"", ""N835VA"", ""N706SW"", ""N339AA"", ""N523UW"", ""N16732"", ""N183DN"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",130,70,"style","Trailing whitespace is superfluous.","""N486UA"", ""N12160"", ""N14117"", ""N76505"", ""N623VA"", ""N11565"", ""N3761R"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",131,70,"style","Trailing whitespace is superfluous.","""N710TW"", ""N960DL"", ""N827JB"", ""N314NB"", ""N221WN"", ""N811UA"", ""N76265"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",132,70,"style","Trailing whitespace is superfluous.","""N523JB"", ""N4YDAA"", ""N345NB"", ""N942WN"", ""N848VA"", ""N632MQ"", ""N606JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",133,70,"style","Trailing whitespace is superfluous.","""N925AT"", ""N482WN"", ""N480UA"", ""N3FNAA"", ""N443UA"", ""N502MJ"", ""N950AT"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",134,70,"style","Trailing whitespace is superfluous.","""N13132"", ""N535JB"", ""N894AT"", ""N15572"", ""N761RR"", ""N919DE"", ""N930AT"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",135,70,"style","Trailing whitespace is superfluous.","""N804UA"", ""N360NB"", ""N919FJ"", ""N529UA"", ""N3754A"", ""N512MQ"", ""N928AT"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",136,70,"style","Trailing whitespace is superfluous.","""N78501"", ""N392DA"", ""N857MQ"", ""N8828D"", ""N14237"", ""N766JB"", ""N461UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",137,70,"style","Trailing whitespace is superfluous.","""N744EV"", ""N3JMAA"", ""N615JB"", ""N835UA"", ""N503MQ"", ""N11548"", ""N830UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",138,70,"style","Trailing whitespace is superfluous.","""N487WN"", ""N480WN"", ""N348NB"", ""N922WN"", ""N812UA"", ""N327NW"", ""N12921"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",139,70,"style","Trailing whitespace is superfluous.","""N39418"", ""N292WN"", ""N810MQ"", ""N626VA"", ""N274JB"", ""N815MQ"", ""N565JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",140,70,"style","Trailing whitespace is superfluous.","""N18114"", ""N294WN"", ""N14923"", ""N467UA"", ""N925XJ"", ""N5PBMQ"", ""N21144"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",141,70,"style","Trailing whitespace is superfluous.","""N965DL"", ""N3GWAA"", ""N565AA"", ""N671DN"", ""N820UA"", ""N3JTAA"", ""N14125"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",142,70,"style","Trailing whitespace is superfluous.","""N344AT"", ""N663DN"", ""N615QX"", ""N558UA"", ""N928XJ"", ""N73256"", ""N411UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",143,70,"style","Trailing whitespace is superfluous.","""N515AA"", ""N961DL"", ""N11164"", ""N329NB"", ""N852MQ"", ""N341NW"", ""N339NW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",144,70,"style","Trailing whitespace is superfluous.","""N739GB"", ""N435UA"", ""N319NB"", ""N344NB"", ""N511UA"", ""N3JAAA"", ""N973DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",145,70,"style","Trailing whitespace is superfluous.","""N294PQ"", ""N830AS"", ""N11544"", ""N951DL"", ""N636MQ"", ""N67171"", ""N5CEAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",146,70,"style","Trailing whitespace is superfluous.","""N989DL"", ""N37413"", ""N522AA"", ""N841AY"", ""N3758Y"", ""N14168"", ""N613JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",147,70,"style","Trailing whitespace is superfluous.","""N12175"", ""N563UA"", ""N36476"", ""N3EXAA"", ""N909EV"", ""N320NB"", ""N36272"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",148,70,"style","Trailing whitespace is superfluous.","""N378NW"", ""N12201"", ""N13975"", ""N396DA"", ""N75429"", ""N3757D"", ""N937AT"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",149,70,"style","Trailing whitespace is superfluous.","""N939DL"", ""N553AA"", ""N317NB"", ""N7734H"", ""N310DE"", ""N76523"", ""N442UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",150,70,"style","Trailing whitespace is superfluous.","""N57852"", ""N37409"", ""N964AT"", ""N13566"", ""N525MQ"", ""N718EV"", ""N279JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",151,70,"style","Trailing whitespace is superfluous.","""N510MQ"", ""N738MQ"", ""N17185"", ""N406UA"", ""N247WN"", ""N3JEAA"", ""N944DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",152,70,"style","Trailing whitespace is superfluous.","""N670DN"", ""N918XJ"", ""N605JB"", ""N38454"", ""N27724"", ""N945DL"", ""N477UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",153,70,"style","Trailing whitespace is superfluous.","""N3AEMQ"", ""N276AT"", ""N753EV"", ""N16703"", ""N19966"", ""N13955"", ""N8458A"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",154,70,"style","Trailing whitespace is superfluous.","""N674DL"", ""N750EV"", ""N29917"", ""N8923A"", ""N546MQ"", ""N761ND"", ""N921AT"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",155,70,"style","Trailing whitespace is superfluous.","""N905WN"", ""N711MQ"", ""N515MJ"", ""N290AT"", ""N391CA"", ""N748EV"", ""N13965"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",156,70,"style","Trailing whitespace is superfluous.","""N27200"", ""N566UA"", ""N4XEAA"", ""N708JB"", ""N249JB"", ""N546AA"", ""N836VA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",157,70,"style","Trailing whitespace is superfluous.","""N634JB"", ""N176PQ"", ""N258JB"", ""N27239"", ""N459WN"", ""N16954"", ""N388DA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",158,70,"style","Trailing whitespace is superfluous.","""N467WN"", ""N653JB"", ""N179UW"", ""N560UW"", ""N318US"", ""N508UA"", ""N906DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",159,70,"style","Trailing whitespace is superfluous.","""N329JB"", ""N476AA"", ""N24706"", ""N21537"", ""N836AS"", ""N13978"", ""N902DE"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",160,70,"style","Trailing whitespace is superfluous.","""N936XJ"", ""N821UA"", ""N512UA"", ""N586JB"", ""N679DA"", ""N330NB"", ""N57111"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",161,70,"style","Trailing whitespace is superfluous.","""N13903"", ""N14916"", ""N14188"", ""N8659B"", ""N918FJ"", ""N723SW"", ""N906WN"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",162,70,"style","Trailing whitespace is superfluous.","""N382DA"", ""N634AA"", ""N491WN"", ""N11155"", ""N635JB"", ""N817UA"", ""N901XJ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",163,70,"style","Trailing whitespace is superfluous.","""N11121"", ""N660DL"", ""N493AA"", ""N969DL"", ""N589UA"", ""N526AA"", ""N662DN"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",164,70,"style","Trailing whitespace is superfluous.","""N474AA"", ""N946AT"", ""N81449"", ""N932WN"", ""N436UA"", ""N990AT"", ""N955AT"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",165,70,"style","Trailing whitespace is superfluous.","""N513AA"", ""N384AA"", ""N565UW"", ""N590JB"", ""N934DL"", ""N8623A"", ""N793JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",166,70,"style","Trailing whitespace is superfluous.","""N365AA"", ""N317US"", ""N794SW"", ""N8970D"", ""N3JVAA"", ""N202FR"", ""N155DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",167,70,"style","Trailing whitespace is superfluous.","""N8444F"", ""N656AW"", ""N8971A"", ""N557UA"", ""N319AA"", ""N816MQ"", ""N722EV"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",168,70,"style","Trailing whitespace is superfluous.","""N932DL"", ""N725MQ"", ""N913WN"", ""N4YJAA"", ""N14180"", ""N563UW"", ""N699DL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",169,70,"style","Trailing whitespace is superfluous.","""N37293"", ""N8894A"", ""N283AT"", ""N437AA"", ""N995AT"", ""N554NW"", ""N297PQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",170,70,"style","Trailing whitespace is superfluous.","""N75858"", ""N515UA"", ""N14174"", ""N16999"", ""N8943A"", ""N223WN"", ""N914XJ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",171,70,"style","Trailing whitespace is superfluous.","""N921DL"", ""N920XJ"", ""N490AA"", ""N810UA"", ""N452UW"", ""N34460"", ""N3EDAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",172,70,"style","Trailing whitespace is superfluous.","""N335NB"", ""N403WN"", ""N481WN"", ""N610DL"", ""N3755D"", ""N26549"", ""N832AS"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",173,70,"style","Trailing whitespace is superfluous.","""N966AT"", ""N821JB"", ""N3FWAA"", ""N907DL"", ""N721UW"", ""N566AA"", ""N787SA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",174,70,"style","Trailing whitespace is superfluous.","""N274WN"", ""N301NB"", ""N14974"", ""N692DL"", ""N804MQ"", ""N376NW"", ""N16217"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",175,70,"style","Trailing whitespace is superfluous.","""N11191"", ""N37465"", ""N326NB"", ""N526UA"", ""N388SW"", ""N558AA"", ""N524VA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",176,70,"style","Trailing whitespace is superfluous.","""N949AT"", ""N945AT"", ""N818UA"", ""N828UA"", ""N16911"", ""N197JB"", ""N417WN"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",177,70,"style","Trailing whitespace is superfluous.","""N698MQ"", ""N949UW"", ""N21154"", ""N523VA"", ""N13997"", ""N687DL"", ""N916DE"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",178,70,"style","Trailing whitespace is superfluous.","""N16987"", ""N546UA"", ""N736MQ"", ""N968AT"", ""N633JB"", ""N8968E"", ""N849UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",179,70,"style","Trailing whitespace is superfluous.","""N239WN"", ""N12142"", ""N370AA"", ""N12967"", ""N822UA"", ""N906DE"", ""N8709A"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",180,70,"style","Trailing whitespace is superfluous.","""N530MQ"", ""N717MQ"", ""N506MJ"", ""N32404"", ""N16961"", ""N825UA"", ""N14177"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",181,68,"style","Trailing whitespace is superfluous.","""N3753"", ""N855MQ"", ""N3767"", ""N494AA"", ""N508MQ"", ""N365NB"", ""N723MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",182,70,"style","Trailing whitespace is superfluous.","""N357NB"", ""N503JB"", ""N39423"", ""N374AA"", ""N319US"", ""N750UW"", ""N4YCAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",183,70,"style","Trailing whitespace is superfluous.","""N532MQ"", ""N383DN"", ""N3JSAA"", ""N463UA"", ""N763JB"", ""N420WN"", ""N327AA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",184,70,"style","Trailing whitespace is superfluous.","""N832AY"", ""N418UA"", ""N36207"", ""N14228"", ""N948UW"", ""N439UA"", ""N559JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",185,70,"style","Trailing whitespace is superfluous.","""N356AA"", ""N229JB"", ""N307DQ"", ""N54711"", ""N903XJ"", ""N263AV"", ""N312US"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",186,70,"style","Trailing whitespace is superfluous.","""N900DE"", ""N554JB"", ""N347NW"", ""N826UA"", ""N5EAAA"", ""N432UA"", ""N910FJ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",187,70,"style","Trailing whitespace is superfluous.","""N717EV"", ""N814UA"", ""N964WN"", ""N777NC"", ""N3762Y"", ""N514UA"", ""N26123"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",188,70,"style","Trailing whitespace is superfluous.","""N216JB"", ""N428UA"", ""N361VA"", ""N665JB"", ""N962DL"", ""N701GS"", ""N902XJ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",189,70,"style","Trailing whitespace is superfluous.","""N338NW"", ""N560UA"", ""N960AT"", ""N922XJ"", ""N689DL"", ""N7715E"", ""N16919"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",190,70,"style","Trailing whitespace is superfluous.","""N906MQ"", ""N473WN"", ""N623JB"", ""N353NW"", ""N835MQ"", ""N963DN"", ""N204FR"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",191,70,"style","Trailing whitespace is superfluous.","""N593UA"", ""N809JB"", ""N632VA"", ""N8794B"", ""N854VA"", ""N76503"", ""N37263"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",192,70,"style","Trailing whitespace is superfluous.","""N37281"", ""N323NB"", ""N605QX"", ""N3DGAA"", ""N542AA"", ""N3JRAA"", ""N3GNAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",193,70,"style","Trailing whitespace is superfluous.","""N571AA"", ""N595JB"", ""N232PQ"", ""N184DN"", ""N8673D"", ""N238JB"", ""N34137"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",194,70,"style","Trailing whitespace is superfluous.","""N14143"", ""N496AA"", ""N360NW"", ""N429UA"", ""N650MQ"", ""N569JB"", ""N650AW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",195,70,"style","Trailing whitespace is superfluous.","""N729JB"", ""N298JB"", ""N278AT"", ""N309DE"", ""N906XJ"", ""N3738B"", ""N387AA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",196,70,"style","Trailing whitespace is superfluous.","""N11199"", ""N407UA"", ""N17146"", ""N3GEAA"", ""N838UA"", ""N355NB"", ""N8525B"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",197,70,"style","Trailing whitespace is superfluous.","""N640VA"", ""N16701"", ""N503AA"", ""N975DL"", ""N8475B"", ""N401UA"", ""N11140"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",198,70,"style","Trailing whitespace is superfluous.","""N78285"", ""N13908"", ""N36247"", ""N12552"", ""N967DL"", ""N629VA"", ""N817MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",199,70,"style","Trailing whitespace is superfluous.","""N5DCAA"", ""N445UA"", ""N8884E"", ""N286WN"", ""N978AT"", ""N538UA"", ""N183JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",200,70,"style","Trailing whitespace is superfluous.","""N3CAAA"", ""N3BTAA"", ""N751EV"", ""N631MQ"", ""N393AA"", ""N573UA"", ""N14568"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",201,70,"style","Trailing whitespace is superfluous.","""N635AA"", ""N4XJAA"", ""N192DN"", ""N16951"", ""N518MQ"", ""N3CCAA"", ""N353JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",202,69,"style","Trailing whitespace is superfluous.","""N3766"", ""N13123"", ""N483UA"", ""N373JB"", ""N5CHAA"", ""N206JB"", ""N295PQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",203,70,"style","Trailing whitespace is superfluous.","""N10575"", ""N903DE"", ""N21197"", ""N0EGMQ"", ""N15710"", ""N334NB"", ""N26215"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",204,70,"style","Trailing whitespace is superfluous.","""N612QX"", ""N923FJ"", ""N5DBAA"", ""N273JB"", ""N284AT"", ""N505UA"", ""N3KCAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",205,70,"style","Trailing whitespace is superfluous.","""N505JB"", ""N540US"", ""N3CWAA"", ""N16981"", ""N13949"", ""N8938A"", ""N14153"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",206,70,"style","Trailing whitespace is superfluous.","""N510MJ"", ""N17560"", ""N3760C"", ""N456UA"", ""N968DL"", ""N35407"", ""N626MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",207,70,"style","Trailing whitespace is superfluous.","""N361NW"", ""N770UW"", ""N69059"", ""N366AA"", ""N536JB"", ""N8888D"", ""N304JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",208,70,"style","Trailing whitespace is superfluous.","""N669AW"", ""N716UW"", ""N36915"", ""N851UA"", ""N711HK"", ""N526MQ"", ""N989AT"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",209,70,"style","Trailing whitespace is superfluous.","""N31131"", ""N4YAAA"", ""N3772H"", ""N659JB"", ""N740UW"", ""N484WN"", ""N196DN"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",210,70,"style","Trailing whitespace is superfluous.","""N654UA"", ""N201AA"", ""N3AAAA"", ""N33284"", ""N15986"", ""N916DL"", ""N3BYAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",211,70,"style","Trailing whitespace is superfluous.","""N326AT"", ""N552JB"", ""N712JB"", ""N38443"", ""N527JB"", ""N195DN"", ""N756US"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",212,70,"style","Trailing whitespace is superfluous.","""N8913A"", ""N920DE"", ""N840AY"", ""N13970"", ""N724SW"", ""N25705"", ""N337NW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",213,70,"style","Trailing whitespace is superfluous.","""N911DE"", ""N970DL"", ""N527UA"", ""N818MQ"", ""N15983"", ""N709SW"", ""N578UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",214,70,"style","Trailing whitespace is superfluous.","""N376AA"", ""N13992"", ""N538CA"", ""N833AS"", ""N487UA"", ""N661JB"", ""N5FFAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",215,70,"style","Trailing whitespace is superfluous.","""N599AA"", ""N935AT"", ""N562UA"", ""N206FR"", ""N928MQ"", ""N4YGAA"", ""N3HRAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",216,70,"style","Trailing whitespace is superfluous.","""N587AS"", ""N37287"", ""N845UA"", ""N762SW"", ""N509UA"", ""N372DA"", ""N14171"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",217,70,"style","Trailing whitespace is superfluous.","""N4YUAA"", ""N17229"", ""N6711M"", ""N8672A"", ""N829UA"", ""N895AT"", ""N441WN"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",218,70,"style","Trailing whitespace is superfluous.","""N13914"", ""N738EV"", ""N552UW"", ""N415UA"", ""N482UA"", ""N767NC"", ""N328NB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",219,70,"style","Trailing whitespace is superfluous.","""N570UA"", ""N587JB"", ""N8577D"", ""N759EV"", ""N713TW"", ""N322US"", ""N422UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",220,70,"style","Trailing whitespace is superfluous.","""N8976E"", ""N441UA"", ""N665MQ"", ""N13118"", ""N363NW"", ""N915XJ"", ""N784SW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",221,70,"style","Trailing whitespace is superfluous.","""N976DL"", ""N8501F"", ""N8808H"", ""N910WN"", ""N942AT"", ""N947UW"", ""N48901"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",222,70,"style","Trailing whitespace is superfluous.","""N489UA"", ""N12114"", ""N12957"", ""N923XJ"", ""N507AY"", ""N169UW"", ""N3737C"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",223,70,"style","Trailing whitespace is superfluous.","""N819AY"", ""N38473"", ""N5CPAA"", ""N537JB"", ""N450WN"", ""N18243"", ""N17115"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",224,70,"style","Trailing whitespace is superfluous.","""N14998"", ""N22971"", ""N235WN"", ""N667DN"", ""N713MQ"", ""N716EV"", ""N648JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",225,70,"style","Trailing whitespace is superfluous.","""N24702"", ""N73283"", ""N956AT"", ""N12563"", ""N955WN"", ""N8310C"", ""N14920"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",226,70,"style","Trailing whitespace is superfluous.","""N945UW"", ""N528AA"", ""N741UW"", ""N5EGAA"", ""N12172"", ""N460WN"", ""N521US"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",227,70,"style","Trailing whitespace is superfluous.","""N33203"", ""N943DL"", ""N12109"", ""N649AW"", ""N333NW"", ""N216FR"", ""N179JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",228,70,"style","Trailing whitespace is superfluous.","""N931WN"", ""N3FLAA"", ""N11551"", ""N305AS"", ""N8886A"", ""N37290"", ""N523MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",229,70,"style","Trailing whitespace is superfluous.","""N907DE"", ""N13750"", ""N14558"", ""N758EV"", ""N933AT"", ""N685DA"", ""N265JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",230,70,"style","Trailing whitespace is superfluous.","""N12166"", ""N652JB"", ""N988AT"", ""N734MQ"", ""N994AT"", ""N457UA"", ""N951UW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",231,70,"style","Trailing whitespace is superfluous.","""N76288"", ""N8533D"", ""N740EV"", ""N395DN"", ""N843VA"", ""N133EV"", ""N657MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",232,70,"style","Trailing whitespace is superfluous.","""N371CA"", ""N8492C"", ""N843UA"", ""N594AA"", ""N425AA"", ""N641DL"", ""N741EV"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",233,70,"style","Trailing whitespace is superfluous.","""N537UA"", ""N909XJ"", ""N618JB"", ""N3746H"", ""N804JB"", ""N926XJ"", ""N405WN"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",234,70,"style","Trailing whitespace is superfluous.","""N131EV"", ""N568JB"", ""N983AT"", ""N658MQ"", ""N424AA"", ""N277WN"", ""N359NW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",235,70,"style","Trailing whitespace is superfluous.","""N398CA"", ""N298WN"", ""N3FDAA"", ""N695CA"", ""N3JHAA"", ""N8946A"", ""N506MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",236,70,"style","Trailing whitespace is superfluous.","""N606MQ"", ""N854UA"", ""N346JB"", ""N621JB"", ""N807MQ"", ""N655JB"", ""N307JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",237,70,"style","Trailing whitespace is superfluous.","""N342AA"", ""N322NB"", ""N713UW"", ""N206WN"", ""N37298"", ""N522MQ"", ""N3FYAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",238,70,"style","Trailing whitespace is superfluous.","""N7811F"", ""N587UA"", ""N556JB"", ""N971DL"", ""N3EMAA"", ""N760US"", ""N102UW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",239,70,"style","Trailing whitespace is superfluous.","""N208FR"", ""N716SW"", ""N918DE"", ""N755EV"", ""N517JB"", ""N14960"", ""N73259"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",240,70,"style","Trailing whitespace is superfluous.","""N452WN"", ""N16546"", ""N905XJ"", ""N6712B"", ""N77510"", ""N13995"", ""N3GHAA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",241,70,"style","Trailing whitespace is superfluous.","""N3EVAA"", ""N824UA"", ""N30401"", ""N12221"", ""N12922"", ""N751UW"", ""N78448"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",242,70,"style","Trailing whitespace is superfluous.","""N969AT"", ""N349NB"", ""N15555"", ""N14198"", ""N337NB"", ""N472WN"", ""N386DA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",243,70,"style","Trailing whitespace is superfluous.","""N589JB"", ""N939WN"", ""N651AW"", ""N846UA"", ""N637JB"", ""N909DL"", ""N543AA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",244,70,"style","Trailing whitespace is superfluous.","""N281JB"", ""N628MQ"", ""N4XBAA"", ""N135EV"", ""N12116"", ""N317JB"", ""N583JB"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",245,70,"style","Trailing whitespace is superfluous.","""N3CFAA"", ""N447WN"", ""N846MQ"", ""N460UA"", ""N340NB"", ""N33714"", ""N717JL"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",246,70,"style","Trailing whitespace is superfluous.","""N912WN"", ""N972AT"", ""N834UA"", ""N11137"", ""N35271"", ""N364NB"", ""N33262"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",247,70,"style","Trailing whitespace is superfluous.","""N604QX"", ""N422WN"", ""N190JB"", ""N916XJ"", ""N570JB"", ""N8423C"", ""N14952"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",248,70,"style","Trailing whitespace is superfluous.","""N851NW"", ""N333NB"", ""N352NB"", ""N561UA"", ""N104UW"", ""N542UW"", ""N544UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",249,70,"style","Trailing whitespace is superfluous.","""N910DL"", ""N500MQ"", ""N87507"", ""N815UA"", ""N308AT"", ""N717SA"", ""N907XJ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",250,70,"style","Trailing whitespace is superfluous.","""N12163"", ""N162UW"", ""N174DN"", ""N14907"", ""N371NW"", ""N33286"", ""N720MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",251,70,"style","Trailing whitespace is superfluous.","""N227WN"", ""N13968"", ""N323AA"", ""N668UA"", ""N923AT"", ""N731SA"", ""N727TW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",252,70,"style","Trailing whitespace is superfluous.","""N14162"", ""N565UA"", ""N483WN"", ""N786NC"", ""N3771K"", ""N200WN"", ""N800AY"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",253,70,"style","Trailing whitespace is superfluous.","""N11107"", ""N922EV"", ""N828AW"", ""N3GKAA"", ""N597JB"", ""N24211"", ""N791SW"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",254,70,"style","Trailing whitespace is superfluous.","""N174US"", ""N623DL"", ""N757LV"", ""N935DL"", ""N16183"", ""N79521"", ""N812MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",255,70,"style","Trailing whitespace is superfluous.","""N852UA"", ""N737US"", ""N673MQ"", ""N796JB"", ""N769US"", ""N921XJ"", ""N943AT"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",256,70,"style","Trailing whitespace is superfluous.","""N8588D"", ""N823AY"", ""N795SW"", ""N38727"", ""N77430"", ""N960WN"", ""N844MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",257,70,"style","Trailing whitespace is superfluous.","""N751SW"", ""N522VA"", ""N5FJAA"", ""N724EV"", ""N943WN"", ""N750SA"", ""N323US"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",258,70,"style","Trailing whitespace is superfluous.","""N14704"", ""N13988"", ""N464WN"", ""N931DL"", ""N514AA"", ""N12157"", ""N309US"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",259,69,"style","Trailing whitespace is superfluous.","""N266JB"", ""N203FR"", ""N806JB"", ""N931XJ"", ""N501MQ"", ""N6702"", ""N37420"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",260,70,"style","Trailing whitespace is superfluous.","""N10156"", ""N505MQ"", ""N87513"", ""N8495B"", ""N233LV"", ""N720EV"", ""N812AY"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",261,70,"style","Trailing whitespace is superfluous.","""N933XJ"", ""N496WN"", ""N580JB"", ""N927DA"", ""N3730B"", ""N658AW"", ""N474UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",262,70,"style","Trailing whitespace is superfluous.","""N3BEAA"", ""N192JB"", ""N850UA"", ""N506AA"", ""N802UA"", ""N556UW"", ""N373AA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",263,70,"style","Trailing whitespace is superfluous.","""N584JB"", ""N806UA"", ""N600QX"", ""N426WN"", ""N23708"", ""N371DA"", ""N824MQ"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",264,70,"style","Trailing whitespace is superfluous.","""N917DE"", ""N17128"", ""N415WN"", ""N22909"", ""N381DN"", ""N411WN"", ""N829AS"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",265,70,"style","Trailing whitespace is superfluous.","""N77296"", ""N607AT"", ""N384HA"", ""N840UA"", ""N684WN"", ""N8965E"", ""N541UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",266,70,"style","Trailing whitespace is superfluous.","""N184JB"", ""N205FR"", ""N672AW"", ""N839VA"", ""N389DA"", ""N956WN"", ""N17108"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",267,70,"style","Trailing whitespace is superfluous.","""N641JB"", ""N3GMAA"", ""N176UW"", ""N303DQ"", ""N5FNAA"", ""N826AS"", ""N451UA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",268,70,"style","Trailing whitespace is superfluous.","""N642VA"", ""N380AA"", ""N373NW"", ""N649JB"", ""N543MQ"", ""N571UA"", ""N487AA"", ","trailing_whitespace_linter" +"vignettes/travelling-old/SELECT-cb2164.R",269,70,"style","Trailing whitespace is superfluous.","""N676AW"", ""N630MQ"", ""N354AT"", ""N8325D"", ""N345AA"", ""N344NW"", ""N602LR"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",1,63,"style","Trailing whitespace is superfluous.","structure(list(oid = c(16L, 17L, 18L, 19L, 20L, 21L, 22L, 23L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",2,61,"style","Trailing whitespace is superfluous.","24L, 25L, 26L, 27L, 28L, 29L, 30L, 71L, 75L, 81L, 83L, 114L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",3,63,"style","Trailing whitespace is superfluous.","142L, 194L, 3361L, 3402L, 5017L, 32L, 5069L, 600L, 601L, 602L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",4,66,"style","Trailing whitespace is superfluous.","603L, 604L, 628L, 700L, 701L, 705L, 718L, 790L, 829L, 869L, 650L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",5,62,"style","Trailing whitespace is superfluous.","774L, 1033L, 1042L, 1043L, 1082L, 1083L, 1114L, 1184L, 1186L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",6,63,"style","Trailing whitespace is superfluous.","1266L, 1560L, 1562L, 1700L, 1790L, 2202L, 2203L, 2204L, 2205L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",7,63,"style","Trailing whitespace is superfluous.","4191L, 2206L, 4096L, 4089L, 2950L, 3220L, 3614L, 3642L, 3615L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",8,63,"style","Trailing whitespace is superfluous.","3734L, 3769L, 3802L, 4072L, 2970L, 5038L, 3904L, 3906L, 3908L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",9,63,"style","Trailing whitespace is superfluous.","3910L, 3912L, 3926L, 2249L, 2287L, 2275L, 2276L, 2277L, 2278L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",10,62,"style","Trailing whitespace is superfluous.","2279L, 3838L, 2280L, 2281L, 2283L, 2776L, 3500L, 3115L, 325L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",11,62,"style","Trailing whitespace is superfluous.","3310L, 269L, 3831L, 5077L, 5078L, 5079L, 5080L, 1000L, 1001L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",12,63,"style","Trailing whitespace is superfluous.","1002L, 1003L, 1016L, 1005L, 1006L, 1007L, 1008L, 1009L, 1028L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",13,67,"style","Trailing whitespace is superfluous.","1010L, 1011L, 1012L, 1013L, 199L, 143L, 271L, 1017L, 1018L, 1019L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",14,66,"style","Trailing whitespace is superfluous.","1020L, 1027L, 629L, 1021L, 1022L, 719L, 791L, 1040L, 1041L, 651L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",15,62,"style","Trailing whitespace is superfluous.","775L, 1034L, 1014L, 1015L, 1182L, 1183L, 1115L, 1185L, 1187L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",16,63,"style","Trailing whitespace is superfluous.","1270L, 1561L, 1563L, 1231L, 2201L, 2207L, 2208L, 2209L, 2210L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",17,63,"style","Trailing whitespace is superfluous.","4192L, 2211L, 4097L, 4090L, 2951L, 3221L, 3643L, 3644L, 3645L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",18,63,"style","Trailing whitespace is superfluous.","3735L, 3770L, 3807L, 4073L, 2949L, 5039L, 3905L, 3907L, 3909L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",19,68,"style","Trailing whitespace is superfluous.","3911L, 3913L, 3927L, 1263L, 12000L, 12001L, 12002L, 12003L, 12004L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",20,64,"style","Trailing whitespace is superfluous.","12005L, 12006L, 12007L, 12008L, 12009L, 12010L, 12011L, 12012L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",21,64,"style","Trailing whitespace is superfluous.","12013L, 12014L, 12015L, 12016L, 12017L, 12018L, 12019L, 12020L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",22,63,"style","Trailing whitespace is superfluous.","12021L, 12022L, 12023L, 12024L, 12025L, 1248L, 12026L, 12027L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",23,62,"style","Trailing whitespace is superfluous.","2842L, 2843L, 12028L, 12029L, 12030L, 12031L, 12032L, 12033L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",24,64,"style","Trailing whitespace is superfluous.","12034L, 12035L, 12036L, 12037L, 12038L, 12039L, 12040L, 12041L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",25,63,"style","Trailing whitespace is superfluous.","12042L, 12043L, 12044L, 4066L, 12045L, 12046L, 12047L, 12048L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",26,63,"style","Trailing whitespace is superfluous.","12049L, 12050L, 12051L, 6101L, 12052L, 12053L, 12054L, 12055L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",27,64,"style","Trailing whitespace is superfluous.","12056L, 12057L, 12058L, 12059L, 12060L, 12061L, 12062L, 12063L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",28,64,"style","Trailing whitespace is superfluous.","12064L, 12065L, 12066L, 12067L, 12068L, 12069L, 12070L, 12071L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",29,64,"style","Trailing whitespace is superfluous.","12072L, 12073L, 12074L, 12075L, 12076L, 12077L, 12078L, 12079L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",30,64,"style","Trailing whitespace is superfluous.","12080L, 12081L, 12082L, 12083L, 12084L, 12085L, 12086L, 12088L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",31,64,"style","Trailing whitespace is superfluous.","12092L, 12096L, 12099L, 12102L, 12106L, 12110L, 12114L, 12118L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",32,64,"style","Trailing whitespace is superfluous.","12122L, 12126L, 12130L, 12134L, 12138L, 12142L, 12145L, 12148L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",33,64,"style","Trailing whitespace is superfluous.","12151L, 12155L, 12159L, 12162L, 12166L, 12171L, 12174L, 12177L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",34,64,"style","Trailing whitespace is superfluous.","12180L, 12183L, 12186L, 12189L, 12193L, 12197L, 12201L, 12204L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",35,64,"style","Trailing whitespace is superfluous.","12208L, 12211L, 12215L, 12218L, 12221L, 12225L, 12228L, 12231L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",36,64,"style","Trailing whitespace is superfluous.","12235L, 12238L, 12241L, 12245L, 12248L, 12251L, 12255L, 12259L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",37,64,"style","Trailing whitespace is superfluous.","12262L, 12265L, 12268L, 12271L, 12274L, 12278L, 12282L, 12285L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",38,64,"style","Trailing whitespace is superfluous.","12289L, 12293L, 12296L, 12299L, 12303L, 12307L, 12311L, 12315L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",39,64,"style","Trailing whitespace is superfluous.","12319L, 12323L, 13124L, 13123L, 13127L, 13126L, 13129L, 13128L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",40,64,"style","Trailing whitespace is superfluous.","13131L, 13134L, 13133L, 13136L, 13135L, 13139L, 13143L, 13146L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",41,64,"style","Trailing whitespace is superfluous.","13150L, 13154L, 13158L, 13162L, 13166L, 13170L, 13174L, 13178L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",42,64,"style","Trailing whitespace is superfluous.","13182L, 13186L, 13190L, 13194L, 13198L, 13202L, 13206L, 13210L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",43,64,"style","Trailing whitespace is superfluous.","13213L, 13217L, 13221L, 13225L, 13228L, 13232L, 13235L, 13239L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",44,64,"style","Trailing whitespace is superfluous.","13242L, 13246L, 13248L, 13251L, 13253L, 13256L, 13258L, 13261L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",45,64,"style","Trailing whitespace is superfluous.","13263L, 13266L, 13270L, 13274L, 13277L, 13281L, 13285L, 13289L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",46,64,"style","Trailing whitespace is superfluous.","13293L, 13297L, 13300L, 13304L, 13307L, 13311L, 13315L, 13319L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",47,64,"style","Trailing whitespace is superfluous.","13323L, 13327L, 13331L, 13335L, 13339L, 13342L, 13345L, 13348L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",48,64,"style","Trailing whitespace is superfluous.","13351L, 13355L, 13358L, 13361L, 13365L, 13368L, 13371L, 13375L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",49,64,"style","Trailing whitespace is superfluous.","13379L, 16483L, 16482L, 16485L, 16489L, 16488L, 16491L, 16495L, ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",51,64,"style","Trailing whitespace is superfluous.","), typname = c(""bool"", ""bytea"", ""char"", ""name"", ""int8"", ""int2"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",52,62,"style","Trailing whitespace is superfluous.","""int2vector"", ""int4"", ""regproc"", ""text"", ""oid"", ""tid"", ""xid"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",53,70,"style","Trailing whitespace is superfluous.","""cid"", ""oidvector"", ""pg_type"", ""pg_attribute"", ""pg_proc"", ""pg_class"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",54,66,"style","Trailing whitespace is superfluous.","""json"", ""xml"", ""pg_node_tree"", ""pg_ndistinct"", ""pg_dependencies"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",55,66,"style","Trailing whitespace is superfluous.","""pg_mcv_list"", ""pg_ddl_command"", ""xid8"", ""point"", ""lseg"", ""path"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",56,67,"style","Trailing whitespace is superfluous.","""box"", ""polygon"", ""line"", ""float4"", ""float8"", ""unknown"", ""circle"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",57,69,"style","Trailing whitespace is superfluous.","""money"", ""macaddr"", ""inet"", ""cidr"", ""macaddr8"", ""aclitem"", ""bpchar"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",58,67,"style","Trailing whitespace is superfluous.","""varchar"", ""date"", ""time"", ""timestamp"", ""timestamptz"", ""interval"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",59,67,"style","Trailing whitespace is superfluous.","""timetz"", ""bit"", ""varbit"", ""numeric"", ""refcursor"", ""regprocedure"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",60,65,"style","Trailing whitespace is superfluous.","""regoper"", ""regoperator"", ""regclass"", ""regcollation"", ""regtype"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",61,70,"style","Trailing whitespace is superfluous.","""regrole"", ""regnamespace"", ""uuid"", ""pg_lsn"", ""tsvector"", ""gtsvector"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",62,62,"style","Trailing whitespace is superfluous.","""tsquery"", ""regconfig"", ""regdictionary"", ""jsonb"", ""jsonpath"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",63,68,"style","Trailing whitespace is superfluous.","""txid_snapshot"", ""pg_snapshot"", ""int4range"", ""numrange"", ""tsrange"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",64,71,"style","Trailing whitespace is superfluous.","""tstzrange"", ""daterange"", ""int8range"", ""record"", ""_record"", ""cstring"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",65,75,"style","Trailing whitespace is superfluous.","""any"", ""anyarray"", ""void"", ""trigger"", ""event_trigger"", ""language_handler"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",66,67,"style","Trailing whitespace is superfluous.","""internal"", ""anyelement"", ""anynonarray"", ""anyenum"", ""fdw_handler"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",67,67,"style","Trailing whitespace is superfluous.","""index_am_handler"", ""tsm_handler"", ""table_am_handler"", ""anyrange"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",68,64,"style","Trailing whitespace is superfluous.","""anycompatible"", ""anycompatiblearray"", ""anycompatiblenonarray"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",69,68,"style","Trailing whitespace is superfluous.","""anycompatiblerange"", ""_bool"", ""_bytea"", ""_char"", ""_name"", ""_int8"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",70,62,"style","Trailing whitespace is superfluous.","""_int2"", ""_int2vector"", ""_int4"", ""_regproc"", ""_text"", ""_oid"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",71,64,"style","Trailing whitespace is superfluous.","""_tid"", ""_xid"", ""_cid"", ""_oidvector"", ""_json"", ""_xml"", ""_xid8"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",72,68,"style","Trailing whitespace is superfluous.","""_point"", ""_lseg"", ""_path"", ""_box"", ""_polygon"", ""_line"", ""_float4"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",73,62,"style","Trailing whitespace is superfluous.","""_float8"", ""_circle"", ""_money"", ""_macaddr"", ""_inet"", ""_cidr"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",74,66,"style","Trailing whitespace is superfluous.","""_macaddr8"", ""_aclitem"", ""_bpchar"", ""_varchar"", ""_date"", ""_time"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",75,62,"style","Trailing whitespace is superfluous.","""_timestamp"", ""_timestamptz"", ""_interval"", ""_timetz"", ""_bit"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",76,66,"style","Trailing whitespace is superfluous.","""_varbit"", ""_numeric"", ""_refcursor"", ""_regprocedure"", ""_regoper"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",77,70,"style","Trailing whitespace is superfluous.","""_regoperator"", ""_regclass"", ""_regcollation"", ""_regtype"", ""_regrole"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",78,64,"style","Trailing whitespace is superfluous.","""_regnamespace"", ""_uuid"", ""_pg_lsn"", ""_tsvector"", ""_gtsvector"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",79,67,"style","Trailing whitespace is superfluous.","""_tsquery"", ""_regconfig"", ""_regdictionary"", ""_jsonb"", ""_jsonpath"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",80,61,"style","Trailing whitespace is superfluous.","""_txid_snapshot"", ""_pg_snapshot"", ""_int4range"", ""_numrange"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",81,66,"style","Trailing whitespace is superfluous.","""_tsrange"", ""_tstzrange"", ""_daterange"", ""_int8range"", ""_cstring"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",82,73,"style","Trailing whitespace is superfluous.","""pg_attrdef"", ""pg_constraint"", ""pg_inherits"", ""pg_index"", ""pg_operator"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",83,62,"style","Trailing whitespace is superfluous.","""pg_opfamily"", ""pg_opclass"", ""pg_am"", ""pg_amop"", ""pg_amproc"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",84,76,"style","Trailing whitespace is superfluous.","""pg_language"", ""pg_largeobject_metadata"", ""pg_largeobject"", ""pg_aggregate"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",85,61,"style","Trailing whitespace is superfluous.","""pg_statistic_ext"", ""pg_statistic_ext_data"", ""pg_statistic"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",86,66,"style","Trailing whitespace is superfluous.","""pg_rewrite"", ""pg_trigger"", ""pg_event_trigger"", ""pg_description"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",87,68,"style","Trailing whitespace is superfluous.","""pg_cast"", ""pg_enum"", ""pg_namespace"", ""pg_conversion"", ""pg_depend"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",88,67,"style","Trailing whitespace is superfluous.","""pg_database"", ""pg_db_role_setting"", ""pg_tablespace"", ""pg_authid"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",89,70,"style","Trailing whitespace is superfluous.","""pg_auth_members"", ""pg_shdepend"", ""pg_shdescription"", ""pg_ts_config"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",90,68,"style","Trailing whitespace is superfluous.","""pg_ts_config_map"", ""pg_ts_dict"", ""pg_ts_parser"", ""pg_ts_template"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",91,64,"style","Trailing whitespace is superfluous.","""pg_extension"", ""pg_foreign_data_wrapper"", ""pg_foreign_server"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",92,77,"style","Trailing whitespace is superfluous.","""pg_user_mapping"", ""pg_foreign_table"", ""pg_policy"", ""pg_replication_origin"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",93,67,"style","Trailing whitespace is superfluous.","""pg_default_acl"", ""pg_init_privs"", ""pg_seclabel"", ""pg_shseclabel"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",94,68,"style","Trailing whitespace is superfluous.","""pg_collation"", ""pg_partitioned_table"", ""pg_range"", ""pg_transform"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",95,74,"style","Trailing whitespace is superfluous.","""pg_sequence"", ""pg_publication"", ""pg_publication_rel"", ""pg_subscription"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",96,74,"style","Trailing whitespace is superfluous.","""pg_subscription_rel"", ""pg_toast_2600"", ""pg_toast_2604"", ""pg_toast_3456"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",97,67,"style","Trailing whitespace is superfluous.","""pg_toast_2606"", ""pg_toast_826"", ""pg_toast_2609"", ""pg_toast_3466"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",98,68,"style","Trailing whitespace is superfluous.","""pg_toast_3079"", ""pg_toast_2328"", ""pg_toast_1417"", ""pg_toast_3118"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",99,68,"style","Trailing whitespace is superfluous.","""pg_toast_3394"", ""pg_toast_2612"", ""pg_toast_2615"", ""pg_toast_3350"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",100,68,"style","Trailing whitespace is superfluous.","""pg_toast_3256"", ""pg_toast_1255"", ""pg_toast_2618"", ""pg_toast_3596"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",101,68,"style","Trailing whitespace is superfluous.","""pg_toast_2619"", ""pg_toast_3381"", ""pg_toast_3429"", ""pg_toast_2620"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",102,68,"style","Trailing whitespace is superfluous.","""pg_toast_3600"", ""pg_toast_1247"", ""pg_toast_1418"", ""pg_toast_1260"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",103,68,"style","Trailing whitespace is superfluous.","""pg_toast_1262"", ""pg_toast_2964"", ""pg_toast_6000"", ""pg_toast_2396"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",104,63,"style","Trailing whitespace is superfluous.","""pg_toast_3592"", ""pg_toast_6100"", ""pg_toast_1213"", ""pg_roles"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",105,63,"style","Trailing whitespace is superfluous.","""pg_shadow"", ""pg_group"", ""pg_user"", ""pg_policies"", ""pg_rules"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",106,70,"style","Trailing whitespace is superfluous.","""pg_views"", ""pg_tables"", ""pg_matviews"", ""pg_indexes"", ""pg_sequences"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",107,65,"style","Trailing whitespace is superfluous.","""pg_stats"", ""pg_stats_ext"", ""pg_publication_tables"", ""pg_locks"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",108,76,"style","Trailing whitespace is superfluous.","""pg_cursors"", ""pg_available_extensions"", ""pg_available_extension_versions"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",109,63,"style","Trailing whitespace is superfluous.","""pg_prepared_xacts"", ""pg_prepared_statements"", ""pg_seclabels"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",110,79,"style","Trailing whitespace is superfluous.","""pg_settings"", ""pg_file_settings"", ""pg_hba_file_rules"", ""pg_timezone_abbrevs"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",111,80,"style","Trailing whitespace is superfluous.","""pg_timezone_names"", ""pg_config"", ""pg_shmem_allocations"", ""pg_stat_all_tables"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",112,76,"style","Trailing whitespace is superfluous.","""pg_stat_xact_all_tables"", ""pg_stat_sys_tables"", ""pg_stat_xact_sys_tables"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",113,75,"style","Trailing whitespace is superfluous.","""pg_stat_user_tables"", ""pg_stat_xact_user_tables"", ""pg_statio_all_tables"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",114,72,"style","Trailing whitespace is superfluous.","""pg_statio_sys_tables"", ""pg_statio_user_tables"", ""pg_stat_all_indexes"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",115,72,"style","Trailing whitespace is superfluous.","""pg_stat_sys_indexes"", ""pg_stat_user_indexes"", ""pg_statio_all_indexes"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",116,78,"style","Trailing whitespace is superfluous.","""pg_statio_sys_indexes"", ""pg_statio_user_indexes"", ""pg_statio_all_sequences"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",117,75,"style","Trailing whitespace is superfluous.","""pg_statio_sys_sequences"", ""pg_statio_user_sequences"", ""pg_stat_activity"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",118,63,"style","Trailing whitespace is superfluous.","""pg_stat_replication"", ""pg_stat_slru"", ""pg_stat_wal_receiver"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",119,81,"style","Trailing whitespace is superfluous.","""pg_stat_subscription"", ""pg_stat_ssl"", ""pg_stat_gssapi"", ""pg_replication_slots"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",120,76,"style","Trailing whitespace is superfluous.","""pg_stat_database"", ""pg_stat_database_conflicts"", ""pg_stat_user_functions"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",121,71,"style","Trailing whitespace is superfluous.","""pg_stat_xact_user_functions"", ""pg_stat_archiver"", ""pg_stat_bgwriter"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",122,83,"style","Trailing whitespace is superfluous.","""pg_stat_progress_analyze"", ""pg_stat_progress_vacuum"", ""pg_stat_progress_cluster"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",123,64,"style","Trailing whitespace is superfluous.","""pg_stat_progress_create_index"", ""pg_stat_progress_basebackup"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",124,71,"style","Trailing whitespace is superfluous.","""pg_user_mappings"", ""pg_replication_origin_status"", ""cardinal_number"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",125,75,"style","Trailing whitespace is superfluous.","""_cardinal_number"", ""character_data"", ""_character_data"", ""sql_identifier"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",126,68,"style","Trailing whitespace is superfluous.","""_sql_identifier"", ""information_schema_catalog_name"", ""time_stamp"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",127,62,"style","Trailing whitespace is superfluous.","""_time_stamp"", ""yes_or_no"", ""_yes_or_no"", ""applicable_roles"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",128,69,"style","Trailing whitespace is superfluous.","""administrable_role_authorizations"", ""attributes"", ""character_sets"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",129,69,"style","Trailing whitespace is superfluous.","""check_constraint_routine_usage"", ""check_constraints"", ""collations"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",130,64,"style","Trailing whitespace is superfluous.","""collation_character_set_applicability"", ""column_column_usage"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",131,64,"style","Trailing whitespace is superfluous.","""column_domain_usage"", ""column_privileges"", ""column_udt_usage"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",132,64,"style","Trailing whitespace is superfluous.","""columns"", ""constraint_column_usage"", ""constraint_table_usage"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",133,70,"style","Trailing whitespace is superfluous.","""domain_constraints"", ""domain_udt_usage"", ""domains"", ""enabled_roles"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",134,61,"style","Trailing whitespace is superfluous.","""key_column_usage"", ""parameters"", ""referential_constraints"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",135,67,"style","Trailing whitespace is superfluous.","""role_column_grants"", ""routine_privileges"", ""role_routine_grants"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",136,71,"style","Trailing whitespace is superfluous.","""routines"", ""schemata"", ""sequences"", ""sql_features"", ""pg_toast_13245"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",137,76,"style","Trailing whitespace is superfluous.","""sql_implementation_info"", ""pg_toast_13250"", ""sql_parts"", ""pg_toast_13255"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",138,73,"style","Trailing whitespace is superfluous.","""sql_sizing"", ""pg_toast_13260"", ""table_constraints"", ""table_privileges"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",139,73,"style","Trailing whitespace is superfluous.","""role_table_grants"", ""tables"", ""transforms"", ""triggered_update_columns"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",140,69,"style","Trailing whitespace is superfluous.","""triggers"", ""udt_privileges"", ""role_udt_grants"", ""usage_privileges"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",141,64,"style","Trailing whitespace is superfluous.","""role_usage_grants"", ""user_defined_types"", ""view_column_usage"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",142,75,"style","Trailing whitespace is superfluous.","""view_routine_usage"", ""view_table_usage"", ""views"", ""data_type_privileges"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",143,64,"style","Trailing whitespace is superfluous.","""element_types"", ""_pg_foreign_table_columns"", ""column_options"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",144,61,"style","Trailing whitespace is superfluous.","""_pg_foreign_data_wrappers"", ""foreign_data_wrapper_options"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",145,74,"style","Trailing whitespace is superfluous.","""foreign_data_wrappers"", ""_pg_foreign_servers"", ""foreign_server_options"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",146,66,"style","Trailing whitespace is superfluous.","""foreign_servers"", ""_pg_foreign_tables"", ""foreign_table_options"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",147,63,"style","Trailing whitespace is superfluous.","""foreign_tables"", ""_pg_user_mappings"", ""user_mapping_options"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",148,72,"style","Trailing whitespace is superfluous.","""user_mappings"", ""airlines"", ""_airlines"", ""pg_toast_16481"", ""airports"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",149,72,"style","Trailing whitespace is superfluous.","""_airports"", ""pg_toast_16487"", ""flights"", ""_flights"", ""pg_toast_16493"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-526b8c.R",150,62,"style","Trailing whitespace is superfluous.","""planes"", ""_planes"", ""pg_toast_16499"", ""weather"", ""_weather"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-90cd6a.R",1,72,"style","Trailing whitespace is superfluous.","structure(list(year = integer(0), month = integer(0), day = integer(0), ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-90cd6a.R",2,80,"style","Trailing whitespace is superfluous."," dep_time = integer(0), sched_dep_time = integer(0), dep_delay = numeric(0), ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-90cd6a.R",3,80,"style","Trailing whitespace is superfluous."," arr_time = integer(0), sched_arr_time = integer(0), arr_delay = numeric(0), ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-90cd6a.R",4,73,"style","Trailing whitespace is superfluous."," carrier = character(0), flight = integer(0), tailnum = character(0), ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-90cd6a.R",5,71,"style","Trailing whitespace is superfluous."," origin = character(0), dest = character(0), air_time = numeric(0), ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-90cd6a.R",6,67,"style","Trailing whitespace is superfluous."," distance = numeric(0), hour = numeric(0), minute = numeric(0), ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",1,67,"style","Trailing whitespace is superfluous.","structure(list(tailnum = c(""N912XJ"", ""N645JB"", ""N904WN"", ""N3BWAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",2,70,"style","Trailing whitespace is superfluous.","""N3CJAA"", ""N14972"", ""N667UA"", ""N521JB"", ""N998AT"", ""N16559"", ""N14186"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",3,70,"style","Trailing whitespace is superfluous.","""N16170"", ""N789JB"", ""N593JB"", ""N409WN"", ""N11535"", ""N505AA"", ""N8928A"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",4,70,"style","Trailing whitespace is superfluous.","""N3DPAA"", ""N34222"", ""N639VA"", ""N480AA"", ""N77518"", ""N511MQ"", ""N697DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",5,70,"style","Trailing whitespace is superfluous.","""N87527"", ""N652SW"", ""N651JB"", ""N640AA"", ""N304DQ"", ""N988DL"", ""N643JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",6,70,"style","Trailing whitespace is superfluous.","""N231JB"", ""N14542"", ""N531JB"", ""N14573"", ""N76519"", ""N13161"", ""N567UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",7,70,"style","Trailing whitespace is superfluous.","""N201LV"", ""N27962"", ""N198JB"", ""N520MQ"", ""N689MQ"", ""N369NW"", ""N8432A"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",8,70,"style","Trailing whitespace is superfluous.","""N14902"", ""N8EGMQ"", ""N3FJAA"", ""N336NB"", ""N905DL"", ""N12136"", ""N628VA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",9,70,"style","Trailing whitespace is superfluous.","""N550WN"", ""N844VA"", ""N353SW"", ""N738US"", ""N371NB"", ""N431WN"", ""N11206"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",10,69,"style","Trailing whitespace is superfluous.","""N412WN"", ""N832UA"", ""N14993"", ""N495UA"", ""N3759"", ""N314US"", ""N14231"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",11,70,"style","Trailing whitespace is superfluous.","""N176DN"", ""N363NB"", ""N3AHAA"", ""N5DMAA"", ""N764US"", ""N802MQ"", ""N33209"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",12,70,"style","Trailing whitespace is superfluous.","""N38451"", ""N14219"", ""N320US"", ""N8903A"", ""N682MQ"", ""N672DL"", ""N3FCAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",13,70,"style","Trailing whitespace is superfluous.","""N173US"", ""N691CA"", ""N33103"", ""N210WN"", ""N8877A"", ""N638JB"", ""N558UW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",14,70,"style","Trailing whitespace is superfluous.","""N820AS"", ""N479UA"", ""N180US"", ""N334JB"", ""N33292"", ""N513UA"", ""N775JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",15,70,"style","Trailing whitespace is superfluous.","""N528MQ"", ""N955DL"", ""N405UA"", ""N377NW"", ""N611QX"", ""N7732A"", ""N320AA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",16,70,"style","Trailing whitespace is superfluous.","""N11192"", ""N3769L"", ""N622VA"", ""N338AA"", ""N504UA"", ""N7739A"", ""N841UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",17,70,"style","Trailing whitespace is superfluous.","""N987AT"", ""N11113"", ""N14106"", ""N903WN"", ""N3CGAA"", ""N621VA"", ""N477AA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",18,70,"style","Trailing whitespace is superfluous.","""N837UA"", ""N339NB"", ""N374DA"", ""N8869B"", ""N284JB"", ""N924DL"", ""N8775A"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",19,70,"style","Trailing whitespace is superfluous.","""N836UA"", ""N324JB"", ""N833UA"", ""N13553"", ""N999DN"", ""N3763D"", ""N12996"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",20,70,"style","Trailing whitespace is superfluous.","""N513MQ"", ""N722US"", ""N14904"", ""N591AA"", ""N539MQ"", ""N14977"", ""N12924"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",21,70,"style","Trailing whitespace is superfluous.","""N358NB"", ""N877AS"", ""N554UA"", ""N203JB"", ""N76514"", ""N12135"", ""N387SW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",22,70,"style","Trailing whitespace is superfluous.","""N27722"", ""N444UA"", ""N469UA"", ""N575UA"", ""N3AUAA"", ""N306JB"", ""N24128"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",23,70,"style","Trailing whitespace is superfluous.","""N617MQ"", ""N595UA"", ""N642DL"", ""N588JB"", ""N3HSAA"", ""N915DE"", ""N3HTAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",24,70,"style","Trailing whitespace is superfluous.","""N592UA"", ""N37253"", ""N629JB"", ""N585UA"", ""N265WN"", ""N4XRAA"", ""N941DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",25,70,"style","Trailing whitespace is superfluous.","""N838VA"", ""N267AT"", ""N3JXAA"", ""N523UA"", ""N912DL"", ""N3GRAA"", ""N707TW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",26,70,"style","Trailing whitespace is superfluous.","""N934WN"", ""N370SW"", ""N17133"", ""N594JB"", ""N11119"", ""N8942A"", ""N524JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",27,70,"style","Trailing whitespace is superfluous.","""N608QX"", ""N534JB"", ""N21130"", ""N534MQ"", ""N659DL"", ""N18102"", ""N14105"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",28,70,"style","Trailing whitespace is superfluous.","""N470UA"", ""N7714B"", ""N535MQ"", ""N910DE"", ""N921WN"", ""N918DL"", ""N703TW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",29,70,"style","Trailing whitespace is superfluous.","""N998DL"", ""N8982A"", ""N735MQ"", ""N76065"", ""N354NW"", ""N13994"", ""N644JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",30,70,"style","Trailing whitespace is superfluous.","""N282WN"", ""N722MQ"", ""N502UA"", ""N13202"", ""N66057"", ""N26545"", ""N37474"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",31,70,"style","Trailing whitespace is superfluous.","""N527AA"", ""N544AA"", ""N24212"", ""N935XJ"", ""N352AA"", ""N920AT"", ""N630JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",32,70,"style","Trailing whitespace is superfluous.","""N79402"", ""N8305E"", ""N849VA"", ""N477WN"", ""N603JB"", ""N8907A"", ""N4UCAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",33,70,"style","Trailing whitespace is superfluous.","""N535UW"", ""N8560F"", ""N17984"", ""N11189"", ""N709EV"", ""N727SW"", ""N3GLAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",34,69,"style","Trailing whitespace is superfluous.","""N7726A"", ""N3765"", ""N14959"", ""N796SW"", ""N325US"", ""N11165"", ""N3KBAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",35,69,"style","Trailing whitespace is superfluous.","""N4WVAA"", ""N713EV"", ""N3ASAA"", ""N8541D"", ""N444WN"", ""N744P"", ""N33294"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",36,70,"style","Trailing whitespace is superfluous.","""N476UA"", ""N845VA"", ""N950DL"", ""N937XJ"", ""N741SA"", ""N562UW"", ""N417UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",37,70,"style","Trailing whitespace is superfluous.","""N3ERAA"", ""N14179"", ""N684MQ"", ""N8800G"", ""N37252"", ""N11187"", ""N547JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",38,70,"style","Trailing whitespace is superfluous.","""N510JB"", ""N12569"", ""N592JB"", ""N16149"", ""N585AA"", ""N714CB"", ""N517MQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",39,70,"style","Trailing whitespace is superfluous.","""N3HUAA"", ""N366NW"", ""N5EMAA"", ""N723EV"", ""N66051"", ""N961AT"", ""N365NW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",40,70,"style","Trailing whitespace is superfluous.","""N269WN"", ""N248WN"", ""N18557"", ""N390AA"", ""N18120"", ""N344AA"", ""N805UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",41,70,"style","Trailing whitespace is superfluous.","""N76529"", ""N16713"", ""N661MQ"", ""N426UA"", ""N3736C"", ""N356NW"", ""N27733"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",42,70,"style","Trailing whitespace is superfluous.","""N328AA"", ""N466UA"", ""N547AA"", ""N3FKAA"", ""N345NW"", ""N983DL"", ""N410UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",43,70,"style","Trailing whitespace is superfluous.","""N794JB"", ""N181UW"", ""N76516"", ""N75426"", ""N232WN"", ""N5DNAA"", ""N675DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",44,70,"style","Trailing whitespace is superfluous.","""N23721"", ""N624VA"", ""N830MQ"", ""N604LR"", ""N914DL"", ""N361NB"", ""N458UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",45,70,"style","Trailing whitespace is superfluous.","""N379DA"", ""N633DL"", ""N947DL"", ""N401WN"", ""N261AT"", ""N3FHAA"", ""N591JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",46,70,"style","Trailing whitespace is superfluous.","""N77066"", ""N702TW"", ""N601AW"", ""N8554A"", ""N15912"", ""N37466"", ""N331NW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",47,70,"style","Trailing whitespace is superfluous.","""N605LR"", ""N706JB"", ""N518UA"", ""N695DL"", ""N721MQ"", ""N14116"", ""N840VA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",48,70,"style","Trailing whitespace is superfluous.","""N904XJ"", ""N526JB"", ""N285WN"", ""N633VA"", ""N519AA"", ""N364NW"", ""N942MQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",49,70,"style","Trailing whitespace is superfluous.","""N719EV"", ""N476WN"", ""N529VA"", ""N3CKAA"", ""N533UA"", ""N372NW"", ""N529JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",50,70,"style","Trailing whitespace is superfluous.","""N504JB"", ""N705TW"", ""N121UW"", ""N16178"", ""N515MQ"", ""N733SA"", ""N195UW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",51,70,"style","Trailing whitespace is superfluous.","""N328NW"", ""N663MQ"", ""N8964E"", ""N625VA"", ""N852VA"", ""N544MQ"", ""N327NB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",52,70,"style","Trailing whitespace is superfluous.","""N6EAMQ"", ""N340NW"", ""N163US"", ""N11176"", ""N13989"", ""N585JB"", ""N374JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",53,70,"style","Trailing whitespace is superfluous.","""N8736A"", ""N370NW"", ""N717TW"", ""N6704Z"", ""N760JB"", ""N14148"", ""N3CYAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",54,70,"style","Trailing whitespace is superfluous.","""N14543"", ""N5DYAA"", ""N329AA"", ""N8936A"", ""N599JB"", ""N749US"", ""N324AA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",55,70,"style","Trailing whitespace is superfluous.","""N600LR"", ""N951FR"", ""N611MQ"", ""N690DL"", ""N758SW"", ""N4UBAA"", ""N338NB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",56,70,"style","Trailing whitespace is superfluous.","""N534UA"", ""N550NW"", ""N455UA"", ""N920DL"", ""N907MQ"", ""N358NW"", ""N850MQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",57,70,"style","Trailing whitespace is superfluous.","""N419UA"", ""N3DHAA"", ""N984DL"", ""N39728"", ""N8790A"", ""N337AT"", ""N979DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",58,70,"style","Trailing whitespace is superfluous.","""N3FVAA"", ""N3CTAA"", ""N324US"", ""N730EV"", ""N41104"", ""N765SW"", ""N76515"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",59,70,"style","Trailing whitespace is superfluous.","""N3GSAA"", ""N8698A"", ""N173AT"", ""N76528"", ""N509MQ"", ""N805MQ"", ""N938DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",60,70,"style","Trailing whitespace is superfluous.","""N724MQ"", ""N201FR"", ""N433UA"", ""N712EV"", ""N853VA"", ""N564JB"", ""N438UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",61,70,"style","Trailing whitespace is superfluous.","""N747SA"", ""N561JB"", ""N29906"", ""N387DA"", ""N924XJ"", ""N913DL"", ""N11127"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",62,70,"style","Trailing whitespace is superfluous.","""N326US"", ""N8696C"", ""N722TW"", ""N481AA"", ""N543UW"", ""N675AW"", ""N302NB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",63,70,"style","Trailing whitespace is superfluous.","""N270WN"", ""N482AA"", ""N632SW"", ""N310NW"", ""N77530"", ""N4WNAA"", ""N950UW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",64,70,"style","Trailing whitespace is superfluous.","""N828AS"", ""N296PQ"", ""N19554"", ""N963DL"", ""N530VA"", ""N827UA"", ""N893AT"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",65,70,"style","Trailing whitespace is superfluous.","""N76502"", ""N68453"", ""N641VA"", ""N24729"", ""N553UA"", ""N510UW"", ""N627JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",66,70,"style","Trailing whitespace is superfluous.","""N821MQ"", ""N3BGAA"", ""N506JB"", ""N18101"", ""N16918"", ""N3KEAA"", ""N402UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",67,70,"style","Trailing whitespace is superfluous.","""N844MH"", ""N550UW"", ""N758US"", ""N391DA"", ""N662JB"", ""N908XJ"", ""N801UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",68,70,"style","Trailing whitespace is superfluous.","""N649MQ"", ""N466WN"", ""N8646A"", ""N241WN"", ""N18223"", ""N17245"", ""N14731"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",69,70,"style","Trailing whitespace is superfluous.","""N16147"", ""N990DL"", ""N993DL"", ""N639AA"", ""N29717"", ""N934XJ"", ""N996DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",70,70,"style","Trailing whitespace is superfluous.","""N913XJ"", ""N562JB"", ""N5EHAA"", ""N582AA"", ""N839UA"", ""N4XVAA"", ""N445WN"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",71,70,"style","Trailing whitespace is superfluous.","""N178JB"", ""N915AT"", ""N214FR"", ""N891AT"", ""N8532G"", ""N239JB"", ""N948DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",72,70,"style","Trailing whitespace is superfluous.","""N915WN"", ""N827AS"", ""N4XCAA"", ""N5CAAA"", ""N834AS"", ""N645MQ"", ""N11547"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",73,70,"style","Trailing whitespace is superfluous.","""N351NB"", ""N927AT"", ""N463WN"", ""N452UA"", ""N29129"", ""N14562"", ""N899AT"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",74,70,"style","Trailing whitespace is superfluous.","""N437UA"", ""N913DE"", ""N354JB"", ""N842UA"", ""N501AA"", ""N827MQ"", ""N408WN"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",75,70,"style","Trailing whitespace is superfluous.","""N803UA"", ""N355NW"", ""N283JB"", ""N507MQ"", ""N508AA"", ""N509JB"", ""N627VA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",76,70,"style","Trailing whitespace is superfluous.","""N176AT"", ""N348NW"", ""N715JB"", ""N3BAAA"", ""N8683B"", ""N13716"", ""N646JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",77,70,"style","Trailing whitespace is superfluous.","""N936DL"", ""N78438"", ""N3BDAA"", ""N638VA"", ""N507JB"", ""N403UA"", ""N16234"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",78,70,"style","Trailing whitespace is superfluous.","""N932XJ"", ""N784JB"", ""N297WN"", ""N902MQ"", ""N959UW"", ""N228JB"", ""N521VA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",79,70,"style","Trailing whitespace is superfluous.","""N906AT"", ""N3HGAA"", ""N267JB"", ""N507UA"", ""N612JB"", ""N564UA"", ""N17730"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",80,70,"style","Trailing whitespace is superfluous.","""N399DA"", ""N351JB"", ""N349NW"", ""N555LV"", ""N16561"", ""N504MQ"", ""N25134"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",81,70,"style","Trailing whitespace is superfluous.","""N607LR"", ""N833AY"", ""N615AA"", ""N607JB"", ""N3EPAA"", ""N324NB"", ""N577UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",82,70,"style","Trailing whitespace is superfluous.","""N8930E"", ""N519JB"", ""N458WN"", ""N754EV"", ""N911DA"", ""N21129"", ""N16709"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",83,70,"style","Trailing whitespace is superfluous.","""N339JB"", ""N997AT"", ""N4XXAA"", ""N927LR"", ""N946DL"", ""N3HEAA"", ""N36444"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",84,70,"style","Trailing whitespace is superfluous.","""N16541"", ""N776WN"", ""N574UA"", ""N75435"", ""N14570"", ""N323JB"", ""N8933B"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",85,70,"style","Trailing whitespace is superfluous.","""N34110"", ""N17126"", ""N771SA"", ""N820AY"", ""N715UW"", ""N710EV"", ""N940DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",86,70,"style","Trailing whitespace is superfluous.","""N8598B"", ""N705JB"", ""N8506C"", ""N807JB"", ""N394DA"", ""N634VA"", ""N348JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",87,70,"style","Trailing whitespace is superfluous.","""N3DSAA"", ""N355JB"", ""N8972E"", ""N293PQ"", ""N3DUAA"", ""N13133"", ""N14950"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",88,70,"style","Trailing whitespace is superfluous.","""N524MQ"", ""N904DL"", ""N27190"", ""N8960A"", ""N484UA"", ""N624JB"", ""N3AJAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",89,70,"style","Trailing whitespace is superfluous.","""N930XJ"", ""N77520"", ""N335AA"", ""N635VA"", ""N8940E"", ""N849MQ"", ""N713SW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",90,70,"style","Trailing whitespace is superfluous.","""N75433"", ""N316JB"", ""N12900"", ""N768SW"", ""N972DL"", ""N3FSAA"", ""N346NB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",91,70,"style","Trailing whitespace is superfluous.","""N908MQ"", ""N3JCAA"", ""N950WN"", ""N959AT"", ""N842MQ"", ""N3GDAA"", ""N8315C"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",92,70,"style","Trailing whitespace is superfluous.","""N624AG"", ""N14118"", ""N446UA"", ""N752EV"", ""N172DN"", ""N457UW"", ""N7735A"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",93,70,"style","Trailing whitespace is superfluous.","""N430UA"", ""N14905"", ""N805JB"", ""N580UA"", ""N545UA"", ""N709TW"", ""N601LR"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",94,70,"style","Trailing whitespace is superfluous.","""N218FR"", ""N404UA"", ""N23139"", ""N497UA"", ""N257WN"", ""N17138"", ""N959DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",95,70,"style","Trailing whitespace is superfluous.","""N652DL"", ""N351NW"", ""N603DL"", ""N855UA"", ""N569UA"", ""N329NW"", ""N735SA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",96,70,"style","Trailing whitespace is superfluous.","""N995DL"", ""N38467"", ""N563JB"", ""N3KPAA"", ""N75861"", ""N472UA"", ""N4WSAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",97,70,"style","Trailing whitespace is superfluous.","""N16963"", ""N583AA"", ""N13979"", ""N12567"", ""N539AA"", ""N927XJ"", ""N571JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",98,70,"style","Trailing whitespace is superfluous.","""N519UA"", ""N353AT"", ""N640JB"", ""N11536"", ""N597UA"", ""N79279"", ""N3EFAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",99,70,"style","Trailing whitespace is superfluous.","""N15574"", ""N636JB"", ""N14953"", ""N3APAA"", ""N528VA"", ""N486AA"", ""N514MQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",100,70,"style","Trailing whitespace is superfluous.","""N991DL"", ""N14203"", ""N928DN"", ""N11109"", ""N8839E"", ""N184US"", ""N76504"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",101,70,"style","Trailing whitespace is superfluous.","""N425UA"", ""N631VA"", ""N15980"", ""N3GJAA"", ""N764SW"", ""N353NB"", ""N982DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",102,70,"style","Trailing whitespace is superfluous.","""N825AS"", ""N508JB"", ""N598JB"", ""N342NW"", ""N3ANAA"", ""N746JB"", ""N9EAMQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",103,70,"style","Trailing whitespace is superfluous.","""N296JB"", ""N708EV"", ""N231WN"", ""N8580A"", ""N328JB"", ""N555UA"", ""N380DA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",104,70,"style","Trailing whitespace is superfluous.","""N423UA"", ""N522UA"", ""N222WN"", ""N336AA"", ""N292JB"", ""N332AA"", ""N588UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",105,70,"style","Trailing whitespace is superfluous.","""N8733G"", ""N809UA"", ""N767UW"", ""N244WN"", ""N933LR"", ""N525UA"", ""N608JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",106,70,"style","Trailing whitespace is superfluous.","""N929DL"", ""N14991"", ""N187JB"", ""N980AT"", ""N527VA"", ""N17169"", ""N978DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",107,70,"style","Trailing whitespace is superfluous.","""N625AA"", ""N316NB"", ""N492UA"", ""N944UW"", ""N3FPAA"", ""N922DL"", ""N3CHAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",108,70,"style","Trailing whitespace is superfluous.","""N656JB"", ""N4YTAA"", ""N41135"", ""N566JB"", ""N138EV"", ""N676CA"", ""N813UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",109,70,"style","Trailing whitespace is superfluous.","""N12122"", ""N14214"", ""N3CXAA"", ""N37471"", ""N375NC"", ""N527MQ"", ""N13964"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",110,70,"style","Trailing whitespace is superfluous.","""N11181"", ""N5FGAA"", ""N3GCAA"", ""N946UW"", ""N808UA"", ""N835AS"", ""N737MQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",111,70,"style","Trailing whitespace is superfluous.","""N673UA"", ""N362NW"", ""N838MQ"", ""N687MQ"", ""N3BCAA"", ""N435WN"", ""N5CGAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",112,70,"style","Trailing whitespace is superfluous.","""N73276"", ""N667AW"", ""N3750D"", ""N15910"", ""N374NW"", ""N247JB"", ""N516AS"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",113,70,"style","Trailing whitespace is superfluous.","""N707EV"", ""N777QC"", ""N579JB"", ""N337JB"", ""N464UA"", ""N8604C"", ""N847UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",114,70,"style","Trailing whitespace is superfluous.","""N400WN"", ""N3741S"", ""N15973"", ""N13538"", ""N3DCAA"", ""N39416"", ""N779JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",115,70,"style","Trailing whitespace is superfluous.","""N16976"", ""N416UA"", ""N807UA"", ""N494WN"", ""N929XJ"", ""N12195"", ""N3JDAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",116,70,"style","Trailing whitespace is superfluous.","""N1EAMQ"", ""N937DL"", ""N16151"", ""N576UA"", ""N17244"", ""N639MQ"", ""N13958"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",117,70,"style","Trailing whitespace is superfluous.","""N7738A"", ""N754UW"", ""N6716C"", ""N73299"", ""N185UW"", ""N3BRAA"", ""N8797A"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",118,70,"style","Trailing whitespace is superfluous.","""N8409N"", ""N3764D"", ""N954DL"", ""N13718"", ""N15985"", ""N318JB"", ""N197UW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",119,70,"style","Trailing whitespace is superfluous.","""N34111"", ""N509AY"", ""N13913"", ""N553UW"", ""N917WN"", ""N930DL"", ""N3749D"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",120,70,"style","Trailing whitespace is superfluous.","""N218WN"", ""N73251"", ""N3748Y"", ""N13124"", ""N11150"", ""N507MJ"", ""N519MQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",121,70,"style","Trailing whitespace is superfluous.","""N819UA"", ""N928DL"", ""N917XJ"", ""N18556"", ""N8674A"", ""N520JB"", ""N8908D"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",122,70,"style","Trailing whitespace is superfluous.","""N910XJ"", ""N811MQ"", ""N609SW"", ""N12167"", ""N12564"", ""N485UA"", ""N556UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",123,70,"style","Trailing whitespace is superfluous.","""N657JB"", ""N18220"", ""N7741C"", ""N431UA"", ""N963WN"", ""N73275"", ""N368JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",124,70,"style","Trailing whitespace is superfluous.","""N12540"", ""N925DL"", ""N8745B"", ""N302DQ"", ""N935WN"", ""N236JB"", ""N16571"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",125,70,"style","Trailing whitespace is superfluous.","""N762US"", ""N912DE"", ""N77431"", ""N308DE"", ""N343NB"", ""N823UA"", ""N331NB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",126,70,"style","Trailing whitespace is superfluous.","""N558JB"", ""N8317M"", ""N75436"", ""N446WN"", ""N465UA"", ""N167US"", ""N587NW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",127,70,"style","Trailing whitespace is superfluous.","""N658JB"", ""N212WN"", ""N3733Z"", ""N531MQ"", ""N3JUAA"", ""N3735D"", ""N700GS"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",128,69,"style","Trailing whitespace is superfluous.","""N1603"", ""N332NW"", ""N5ETAA"", ""N516JB"", ""N4WMAA"", ""N397DA"", ""N13969"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",129,70,"style","Trailing whitespace is superfluous.","""N919DL"", ""N835VA"", ""N706SW"", ""N339AA"", ""N523UW"", ""N16732"", ""N486UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",130,70,"style","Trailing whitespace is superfluous.","""N183DN"", ""N12160"", ""N14117"", ""N76505"", ""N623VA"", ""N11565"", ""N3761R"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",131,70,"style","Trailing whitespace is superfluous.","""N710TW"", ""N960DL"", ""N827JB"", ""N314NB"", ""N221WN"", ""N811UA"", ""N76265"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",132,70,"style","Trailing whitespace is superfluous.","""N523JB"", ""N4YDAA"", ""N345NB"", ""N942WN"", ""N848VA"", ""N632MQ"", ""N606JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",133,70,"style","Trailing whitespace is superfluous.","""N925AT"", ""N482WN"", ""N480UA"", ""N3FNAA"", ""N443UA"", ""N502MJ"", ""N950AT"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",134,70,"style","Trailing whitespace is superfluous.","""N894AT"", ""N13132"", ""N535JB"", ""N15572"", ""N761RR"", ""N919DE"", ""N930AT"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",135,70,"style","Trailing whitespace is superfluous.","""N804UA"", ""N360NB"", ""N919FJ"", ""N529UA"", ""N3754A"", ""N512MQ"", ""N928AT"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",136,70,"style","Trailing whitespace is superfluous.","""N78501"", ""N392DA"", ""N857MQ"", ""N8828D"", ""N14237"", ""N766JB"", ""N461UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",137,70,"style","Trailing whitespace is superfluous.","""N744EV"", ""N3JMAA"", ""N615JB"", ""N835UA"", ""N503MQ"", ""N11548"", ""N830UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",138,70,"style","Trailing whitespace is superfluous.","""N487WN"", ""N480WN"", ""N348NB"", ""N922WN"", ""N812UA"", ""N327NW"", ""N12921"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",139,70,"style","Trailing whitespace is superfluous.","""N39418"", ""N292WN"", ""N810MQ"", ""N626VA"", ""N274JB"", ""N815MQ"", ""N565JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",140,70,"style","Trailing whitespace is superfluous.","""N18114"", ""N294WN"", ""N14923"", ""N467UA"", ""N925XJ"", ""N5PBMQ"", ""N21144"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",141,70,"style","Trailing whitespace is superfluous.","""N965DL"", ""N3GWAA"", ""N671DN"", ""N565AA"", ""N820UA"", ""N3JTAA"", ""N14125"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",142,70,"style","Trailing whitespace is superfluous.","""N344AT"", ""N663DN"", ""N615QX"", ""N558UA"", ""N928XJ"", ""N73256"", ""N411UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",143,70,"style","Trailing whitespace is superfluous.","""N515AA"", ""N961DL"", ""N11164"", ""N329NB"", ""N852MQ"", ""N341NW"", ""N339NW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",144,70,"style","Trailing whitespace is superfluous.","""N739GB"", ""N435UA"", ""N319NB"", ""N511UA"", ""N344NB"", ""N3JAAA"", ""N973DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",145,70,"style","Trailing whitespace is superfluous.","""N294PQ"", ""N830AS"", ""N11544"", ""N951DL"", ""N636MQ"", ""N67171"", ""N5CEAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",146,70,"style","Trailing whitespace is superfluous.","""N989DL"", ""N37413"", ""N522AA"", ""N841AY"", ""N3758Y"", ""N14168"", ""N613JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",147,70,"style","Trailing whitespace is superfluous.","""N12175"", ""N563UA"", ""N36476"", ""N3EXAA"", ""N320NB"", ""N909EV"", ""N36272"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",148,70,"style","Trailing whitespace is superfluous.","""N378NW"", ""N12201"", ""N396DA"", ""N13975"", ""N75429"", ""N937AT"", ""N3757D"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",149,70,"style","Trailing whitespace is superfluous.","""N939DL"", ""N553AA"", ""N317NB"", ""N7734H"", ""N310DE"", ""N76523"", ""N442UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",150,70,"style","Trailing whitespace is superfluous.","""N57852"", ""N37409"", ""N964AT"", ""N525MQ"", ""N13566"", ""N718EV"", ""N279JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",151,70,"style","Trailing whitespace is superfluous.","""N510MQ"", ""N738MQ"", ""N17185"", ""N406UA"", ""N247WN"", ""N3JEAA"", ""N944DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",152,70,"style","Trailing whitespace is superfluous.","""N670DN"", ""N918XJ"", ""N605JB"", ""N27724"", ""N38454"", ""N945DL"", ""N477UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",153,70,"style","Trailing whitespace is superfluous.","""N3AEMQ"", ""N276AT"", ""N753EV"", ""N16703"", ""N19966"", ""N8458A"", ""N13955"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",154,70,"style","Trailing whitespace is superfluous.","""N674DL"", ""N750EV"", ""N29917"", ""N8923A"", ""N546MQ"", ""N761ND"", ""N921AT"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",155,70,"style","Trailing whitespace is superfluous.","""N905WN"", ""N711MQ"", ""N515MJ"", ""N290AT"", ""N391CA"", ""N748EV"", ""N13965"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",156,70,"style","Trailing whitespace is superfluous.","""N566UA"", ""N27200"", ""N4XEAA"", ""N708JB"", ""N249JB"", ""N546AA"", ""N836VA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",157,70,"style","Trailing whitespace is superfluous.","""N634JB"", ""N176PQ"", ""N258JB"", ""N27239"", ""N459WN"", ""N16954"", ""N388DA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",158,70,"style","Trailing whitespace is superfluous.","""N467WN"", ""N653JB"", ""N179UW"", ""N560UW"", ""N318US"", ""N508UA"", ""N906DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",159,70,"style","Trailing whitespace is superfluous.","""N329JB"", ""N476AA"", ""N24706"", ""N21537"", ""N836AS"", ""N13978"", ""N902DE"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",160,70,"style","Trailing whitespace is superfluous.","""N936XJ"", ""N821UA"", ""N512UA"", ""N586JB"", ""N679DA"", ""N57111"", ""N330NB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",161,70,"style","Trailing whitespace is superfluous.","""N13903"", ""N14916"", ""N14188"", ""N8659B"", ""N918FJ"", ""N723SW"", ""N906WN"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",162,70,"style","Trailing whitespace is superfluous.","""N382DA"", ""N634AA"", ""N491WN"", ""N11155"", ""N817UA"", ""N635JB"", ""N901XJ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",163,70,"style","Trailing whitespace is superfluous.","""N11121"", ""N660DL"", ""N493AA"", ""N969DL"", ""N589UA"", ""N526AA"", ""N662DN"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",164,70,"style","Trailing whitespace is superfluous.","""N474AA"", ""N946AT"", ""N81449"", ""N932WN"", ""N436UA"", ""N990AT"", ""N955AT"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",165,70,"style","Trailing whitespace is superfluous.","""N513AA"", ""N384AA"", ""N565UW"", ""N934DL"", ""N8623A"", ""N590JB"", ""N793JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",166,70,"style","Trailing whitespace is superfluous.","""N365AA"", ""N317US"", ""N794SW"", ""N8970D"", ""N3JVAA"", ""N202FR"", ""N155DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",167,70,"style","Trailing whitespace is superfluous.","""N8444F"", ""N656AW"", ""N557UA"", ""N8971A"", ""N319AA"", ""N816MQ"", ""N722EV"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",168,70,"style","Trailing whitespace is superfluous.","""N932DL"", ""N725MQ"", ""N913WN"", ""N4YJAA"", ""N14180"", ""N563UW"", ""N699DL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",169,70,"style","Trailing whitespace is superfluous.","""N37293"", ""N8894A"", ""N283AT"", ""N437AA"", ""N995AT"", ""N297PQ"", ""N554NW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",170,70,"style","Trailing whitespace is superfluous.","""N75858"", ""N515UA"", ""N14174"", ""N16999"", ""N8943A"", ""N223WN"", ""N914XJ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",171,70,"style","Trailing whitespace is superfluous.","""N921DL"", ""N920XJ"", ""N490AA"", ""N810UA"", ""N452UW"", ""N3EDAA"", ""N34460"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",172,70,"style","Trailing whitespace is superfluous.","""N335NB"", ""N403WN"", ""N481WN"", ""N610DL"", ""N3755D"", ""N26549"", ""N832AS"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",173,70,"style","Trailing whitespace is superfluous.","""N966AT"", ""N821JB"", ""N3FWAA"", ""N907DL"", ""N721UW"", ""N566AA"", ""N787SA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",174,70,"style","Trailing whitespace is superfluous.","""N274WN"", ""N301NB"", ""N14974"", ""N692DL"", ""N804MQ"", ""N376NW"", ""N16217"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",175,70,"style","Trailing whitespace is superfluous.","""N11191"", ""N37465"", ""N326NB"", ""N526UA"", ""N388SW"", ""N558AA"", ""N524VA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",176,70,"style","Trailing whitespace is superfluous.","""N949AT"", ""N945AT"", ""N818UA"", ""N828UA"", ""N16911"", ""N197JB"", ""N417WN"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",177,70,"style","Trailing whitespace is superfluous.","""N698MQ"", ""N949UW"", ""N21154"", ""N523VA"", ""N13997"", ""N687DL"", ""N916DE"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",178,70,"style","Trailing whitespace is superfluous.","""N16987"", ""N546UA"", ""N736MQ"", ""N968AT"", ""N633JB"", ""N8968E"", ""N849UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",179,70,"style","Trailing whitespace is superfluous.","""N239WN"", ""N12142"", ""N370AA"", ""N12967"", ""N822UA"", ""N906DE"", ""N8709A"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",180,70,"style","Trailing whitespace is superfluous.","""N530MQ"", ""N717MQ"", ""N506MJ"", ""N32404"", ""N16961"", ""N825UA"", ""N14177"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",181,68,"style","Trailing whitespace is superfluous.","""N3753"", ""N855MQ"", ""N3767"", ""N494AA"", ""N508MQ"", ""N365NB"", ""N723MQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",182,70,"style","Trailing whitespace is superfluous.","""N357NB"", ""N503JB"", ""N39423"", ""N374AA"", ""N750UW"", ""N319US"", ""N4YCAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",183,70,"style","Trailing whitespace is superfluous.","""N532MQ"", ""N3JSAA"", ""N383DN"", ""N463UA"", ""N763JB"", ""N420WN"", ""N327AA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",184,70,"style","Trailing whitespace is superfluous.","""N832AY"", ""N418UA"", ""N36207"", ""N14228"", ""N948UW"", ""N439UA"", ""N356AA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",185,70,"style","Trailing whitespace is superfluous.","""N229JB"", ""N559JB"", ""N307DQ"", ""N54711"", ""N903XJ"", ""N263AV"", ""N312US"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",186,70,"style","Trailing whitespace is superfluous.","""N900DE"", ""N554JB"", ""N347NW"", ""N826UA"", ""N5EAAA"", ""N432UA"", ""N910FJ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",187,70,"style","Trailing whitespace is superfluous.","""N814UA"", ""N717EV"", ""N964WN"", ""N777NC"", ""N3762Y"", ""N26123"", ""N514UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",188,70,"style","Trailing whitespace is superfluous.","""N216JB"", ""N428UA"", ""N361VA"", ""N962DL"", ""N665JB"", ""N701GS"", ""N902XJ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",189,70,"style","Trailing whitespace is superfluous.","""N338NW"", ""N560UA"", ""N960AT"", ""N922XJ"", ""N689DL"", ""N7715E"", ""N16919"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",190,70,"style","Trailing whitespace is superfluous.","""N473WN"", ""N906MQ"", ""N623JB"", ""N353NW"", ""N835MQ"", ""N963DN"", ""N204FR"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",191,70,"style","Trailing whitespace is superfluous.","""N593UA"", ""N632VA"", ""N8794B"", ""N809JB"", ""N854VA"", ""N76503"", ""N37263"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",192,70,"style","Trailing whitespace is superfluous.","""N37281"", ""N323NB"", ""N3DGAA"", ""N542AA"", ""N605QX"", ""N3JRAA"", ""N3GNAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",193,70,"style","Trailing whitespace is superfluous.","""N571AA"", ""N595JB"", ""N232PQ"", ""N8673D"", ""N184DN"", ""N238JB"", ""N34137"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",194,70,"style","Trailing whitespace is superfluous.","""N14143"", ""N496AA"", ""N360NW"", ""N429UA"", ""N650MQ"", ""N569JB"", ""N650AW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",195,70,"style","Trailing whitespace is superfluous.","""N729JB"", ""N298JB"", ""N278AT"", ""N309DE"", ""N906XJ"", ""N3738B"", ""N387AA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",196,70,"style","Trailing whitespace is superfluous.","""N11199"", ""N407UA"", ""N17146"", ""N3GEAA"", ""N838UA"", ""N355NB"", ""N8525B"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",197,70,"style","Trailing whitespace is superfluous.","""N640VA"", ""N16701"", ""N503AA"", ""N975DL"", ""N8475B"", ""N401UA"", ""N11140"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",198,70,"style","Trailing whitespace is superfluous.","""N78285"", ""N13908"", ""N36247"", ""N12552"", ""N629VA"", ""N967DL"", ""N817MQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",199,70,"style","Trailing whitespace is superfluous.","""N5DCAA"", ""N445UA"", ""N8884E"", ""N286WN"", ""N978AT"", ""N538UA"", ""N183JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",200,70,"style","Trailing whitespace is superfluous.","""N3BTAA"", ""N751EV"", ""N3CAAA"", ""N631MQ"", ""N393AA"", ""N573UA"", ""N14568"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",201,70,"style","Trailing whitespace is superfluous.","""N635AA"", ""N4XJAA"", ""N192DN"", ""N16951"", ""N518MQ"", ""N3CCAA"", ""N353JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",202,69,"style","Trailing whitespace is superfluous.","""N3766"", ""N13123"", ""N483UA"", ""N5CHAA"", ""N373JB"", ""N206JB"", ""N295PQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",203,70,"style","Trailing whitespace is superfluous.","""N10575"", ""N21197"", ""N903DE"", ""N0EGMQ"", ""N15710"", ""N334NB"", ""N26215"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",204,70,"style","Trailing whitespace is superfluous.","""N612QX"", ""N923FJ"", ""N5DBAA"", ""N273JB"", ""N284AT"", ""N505UA"", ""N3KCAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",205,70,"style","Trailing whitespace is superfluous.","""N505JB"", ""N540US"", ""N13949"", ""N3CWAA"", ""N16981"", ""N8938A"", ""N14153"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",206,70,"style","Trailing whitespace is superfluous.","""N510MJ"", ""N17560"", ""N3760C"", ""N456UA"", ""N968DL"", ""N626MQ"", ""N361NW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",207,70,"style","Trailing whitespace is superfluous.","""N35407"", ""N770UW"", ""N69059"", ""N366AA"", ""N536JB"", ""N8888D"", ""N304JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",208,70,"style","Trailing whitespace is superfluous.","""N669AW"", ""N716UW"", ""N36915"", ""N851UA"", ""N711HK"", ""N526MQ"", ""N989AT"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",209,70,"style","Trailing whitespace is superfluous.","""N31131"", ""N4YAAA"", ""N3772H"", ""N659JB"", ""N740UW"", ""N484WN"", ""N196DN"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",210,70,"style","Trailing whitespace is superfluous.","""N654UA"", ""N201AA"", ""N3AAAA"", ""N33284"", ""N15986"", ""N916DL"", ""N3BYAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",211,70,"style","Trailing whitespace is superfluous.","""N326AT"", ""N552JB"", ""N712JB"", ""N38443"", ""N527JB"", ""N195DN"", ""N756US"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",212,70,"style","Trailing whitespace is superfluous.","""N8913A"", ""N920DE"", ""N840AY"", ""N13970"", ""N724SW"", ""N25705"", ""N337NW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",213,70,"style","Trailing whitespace is superfluous.","""N911DE"", ""N970DL"", ""N527UA"", ""N818MQ"", ""N709SW"", ""N15983"", ""N578UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",214,70,"style","Trailing whitespace is superfluous.","""N376AA"", ""N13992"", ""N833AS"", ""N538CA"", ""N661JB"", ""N487UA"", ""N5FFAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",215,70,"style","Trailing whitespace is superfluous.","""N599AA"", ""N935AT"", ""N562UA"", ""N206FR"", ""N928MQ"", ""N4YGAA"", ""N3HRAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",216,70,"style","Trailing whitespace is superfluous.","""N587AS"", ""N37287"", ""N845UA"", ""N762SW"", ""N509UA"", ""N372DA"", ""N14171"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",217,70,"style","Trailing whitespace is superfluous.","""N4YUAA"", ""N6711M"", ""N17229"", ""N8672A"", ""N895AT"", ""N829UA"", ""N441WN"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",218,70,"style","Trailing whitespace is superfluous.","""N13914"", ""N738EV"", ""N552UW"", ""N482UA"", ""N415UA"", ""N767NC"", ""N328NB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",219,70,"style","Trailing whitespace is superfluous.","""N570UA"", ""N587JB"", ""N8577D"", ""N759EV"", ""N713TW"", ""N322US"", ""N422UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",220,70,"style","Trailing whitespace is superfluous.","""N8976E"", ""N441UA"", ""N665MQ"", ""N13118"", ""N363NW"", ""N915XJ"", ""N784SW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",221,70,"style","Trailing whitespace is superfluous.","""N976DL"", ""N8501F"", ""N910WN"", ""N8808H"", ""N942AT"", ""N947UW"", ""N48901"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",222,70,"style","Trailing whitespace is superfluous.","""N489UA"", ""N12114"", ""N12957"", ""N923XJ"", ""N507AY"", ""N169UW"", ""N3737C"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",223,70,"style","Trailing whitespace is superfluous.","""N819AY"", ""N38473"", ""N5CPAA"", ""N537JB"", ""N450WN"", ""N18243"", ""N17115"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",224,70,"style","Trailing whitespace is superfluous.","""N14998"", ""N22971"", ""N667DN"", ""N235WN"", ""N713MQ"", ""N716EV"", ""N648JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",225,70,"style","Trailing whitespace is superfluous.","""N24702"", ""N73283"", ""N956AT"", ""N12563"", ""N955WN"", ""N8310C"", ""N14920"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",226,70,"style","Trailing whitespace is superfluous.","""N945UW"", ""N528AA"", ""N741UW"", ""N5EGAA"", ""N12172"", ""N460WN"", ""N521US"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",227,70,"style","Trailing whitespace is superfluous.","""N33203"", ""N943DL"", ""N12109"", ""N649AW"", ""N333NW"", ""N216FR"", ""N179JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",228,70,"style","Trailing whitespace is superfluous.","""N931WN"", ""N3FLAA"", ""N11551"", ""N305AS"", ""N8886A"", ""N37290"", ""N523MQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",229,70,"style","Trailing whitespace is superfluous.","""N907DE"", ""N13750"", ""N14558"", ""N758EV"", ""N933AT"", ""N685DA"", ""N265JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",230,70,"style","Trailing whitespace is superfluous.","""N12166"", ""N652JB"", ""N734MQ"", ""N994AT"", ""N988AT"", ""N457UA"", ""N951UW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",231,70,"style","Trailing whitespace is superfluous.","""N76288"", ""N8533D"", ""N740EV"", ""N395DN"", ""N843VA"", ""N133EV"", ""N657MQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",232,70,"style","Trailing whitespace is superfluous.","""N371CA"", ""N8492C"", ""N843UA"", ""N594AA"", ""N425AA"", ""N641DL"", ""N741EV"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",233,70,"style","Trailing whitespace is superfluous.","""N537UA"", ""N909XJ"", ""N618JB"", ""N3746H"", ""N926XJ"", ""N804JB"", ""N405WN"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",234,70,"style","Trailing whitespace is superfluous.","""N131EV"", ""N568JB"", ""N983AT"", ""N658MQ"", ""N424AA"", ""N277WN"", ""N359NW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",235,70,"style","Trailing whitespace is superfluous.","""N398CA"", ""N298WN"", ""N3FDAA"", ""N695CA"", ""N3JHAA"", ""N8946A"", ""N506MQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",236,70,"style","Trailing whitespace is superfluous.","""N606MQ"", ""N346JB"", ""N854UA"", ""N621JB"", ""N807MQ"", ""N342AA"", ""N322NB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",237,70,"style","Trailing whitespace is superfluous.","""N655JB"", ""N307JB"", ""N713UW"", ""N206WN"", ""N37298"", ""N522MQ"", ""N3FYAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",238,70,"style","Trailing whitespace is superfluous.","""N7811F"", ""N556JB"", ""N587UA"", ""N971DL"", ""N760US"", ""N102UW"", ""N208FR"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",239,70,"style","Trailing whitespace is superfluous.","""N3EMAA"", ""N716SW"", ""N918DE"", ""N755EV"", ""N517JB"", ""N14960"", ""N73259"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",240,70,"style","Trailing whitespace is superfluous.","""N452WN"", ""N16546"", ""N905XJ"", ""N77510"", ""N6712B"", ""N13995"", ""N3GHAA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",241,70,"style","Trailing whitespace is superfluous.","""N3EVAA"", ""N824UA"", ""N30401"", ""N12221"", ""N12922"", ""N751UW"", ""N78448"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",242,70,"style","Trailing whitespace is superfluous.","""N969AT"", ""N349NB"", ""N15555"", ""N337NB"", ""N14198"", ""N472WN"", ""N386DA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",243,70,"style","Trailing whitespace is superfluous.","""N589JB"", ""N939WN"", ""N651AW"", ""N846UA"", ""N637JB"", ""N909DL"", ""N543AA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",244,70,"style","Trailing whitespace is superfluous.","""N281JB"", ""N628MQ"", ""N4XBAA"", ""N12116"", ""N135EV"", ""N317JB"", ""N583JB"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",245,70,"style","Trailing whitespace is superfluous.","""N3CFAA"", ""N447WN"", ""N846MQ"", ""N460UA"", ""N340NB"", ""N33714"", ""N717JL"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",246,70,"style","Trailing whitespace is superfluous.","""N912WN"", ""N972AT"", ""N834UA"", ""N11137"", ""N35271"", ""N364NB"", ""N33262"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",247,70,"style","Trailing whitespace is superfluous.","""N604QX"", ""N422WN"", ""N190JB"", ""N916XJ"", ""N570JB"", ""N8423C"", ""N14952"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",248,70,"style","Trailing whitespace is superfluous.","""N851NW"", ""N333NB"", ""N352NB"", ""N561UA"", ""N104UW"", ""N542UW"", ""N544UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",249,70,"style","Trailing whitespace is superfluous.","""N910DL"", ""N87507"", ""N500MQ"", ""N815UA"", ""N308AT"", ""N717SA"", ""N907XJ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",250,70,"style","Trailing whitespace is superfluous.","""N12163"", ""N162UW"", ""N174DN"", ""N14907"", ""N371NW"", ""N33286"", ""N720MQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",251,70,"style","Trailing whitespace is superfluous.","""N227WN"", ""N13968"", ""N323AA"", ""N668UA"", ""N731SA"", ""N923AT"", ""N727TW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",252,70,"style","Trailing whitespace is superfluous.","""N14162"", ""N565UA"", ""N483WN"", ""N786NC"", ""N3771K"", ""N200WN"", ""N800AY"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",253,70,"style","Trailing whitespace is superfluous.","""N11107"", ""N922EV"", ""N828AW"", ""N3GKAA"", ""N24211"", ""N597JB"", ""N791SW"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",254,70,"style","Trailing whitespace is superfluous.","""N174US"", ""N623DL"", ""N757LV"", ""N935DL"", ""N16183"", ""N79521"", ""N812MQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",255,70,"style","Trailing whitespace is superfluous.","""N852UA"", ""N673MQ"", ""N737US"", ""N796JB"", ""N769US"", ""N921XJ"", ""N943AT"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",256,70,"style","Trailing whitespace is superfluous.","""N8588D"", ""N823AY"", ""N795SW"", ""N38727"", ""N77430"", ""N960WN"", ""N844MQ"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",257,70,"style","Trailing whitespace is superfluous.","""N751SW"", ""N522VA"", ""N5FJAA"", ""N724EV"", ""N943WN"", ""N750SA"", ""N323US"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",258,70,"style","Trailing whitespace is superfluous.","""N14704"", ""N13988"", ""N464WN"", ""N931DL"", ""N514AA"", ""N12157"", ""N309US"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",259,69,"style","Trailing whitespace is superfluous.","""N266JB"", ""N203FR"", ""N806JB"", ""N931XJ"", ""N501MQ"", ""N6702"", ""N37420"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",260,70,"style","Trailing whitespace is superfluous.","""N10156"", ""N505MQ"", ""N87513"", ""N8495B"", ""N233LV"", ""N720EV"", ""N812AY"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",261,70,"style","Trailing whitespace is superfluous.","""N933XJ"", ""N496WN"", ""N580JB"", ""N927DA"", ""N3730B"", ""N658AW"", ""N474UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",262,70,"style","Trailing whitespace is superfluous.","""N3BEAA"", ""N192JB"", ""N850UA"", ""N506AA"", ""N802UA"", ""N556UW"", ""N373AA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",263,70,"style","Trailing whitespace is superfluous.","""N584JB"", ""N806UA"", ""N426WN"", ""N23708"", ""N600QX"", ""N824MQ"", ""N371DA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",264,70,"style","Trailing whitespace is superfluous.","""N917DE"", ""N17128"", ""N415WN"", ""N22909"", ""N381DN"", ""N411WN"", ""N829AS"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",265,70,"style","Trailing whitespace is superfluous.","""N77296"", ""N607AT"", ""N384HA"", ""N840UA"", ""N684WN"", ""N8965E"", ""N541UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",266,70,"style","Trailing whitespace is superfluous.","""N184JB"", ""N205FR"", ""N672AW"", ""N839VA"", ""N389DA"", ""N17108"", ""N956WN"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",267,70,"style","Trailing whitespace is superfluous.","""N641JB"", ""N3GMAA"", ""N176UW"", ""N303DQ"", ""N826AS"", ""N5FNAA"", ""N451UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",268,70,"style","Trailing whitespace is superfluous.","""N642VA"", ""N380AA"", ""N373NW"", ""N649JB"", ""N543MQ"", ""N487AA"", ""N571UA"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",269,70,"style","Trailing whitespace is superfluous.","""N630MQ"", ""N676AW"", ""N8325D"", ""N354AT"", ""N345AA"", ""N344NW"", ""N602LR"", ","trailing_whitespace_linter" +"vignettes/travelling/SELECT-cb2164.R",270,72,"style","Trailing whitespace is superfluous.","""N952AT"", ""N637VA"", ""N663JB"")), class = ""data.frame"", row.names = c(NA, ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/dittodb/email-body b/.dev/revdep_emails/dittodb/email-body new file mode 100644 index 000000000..a10309050 --- /dev/null +++ b/.dev/revdep_emails/dittodb/email-body @@ -0,0 +1,29 @@ +Hello Jonathan Keane! Thank you for using {lintr} in your package {dittodb}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/ropensci/dittodb (hash: 94372d7b1c34cbd3da62c13f8b3ddaf90198188b) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 27s on CRAN vs. 19s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/dupree/attachments/dupree.warnings b/.dev/revdep_emails/dupree/attachments/dupree.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/dupree/attachments/dupree.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/dupree/email-body b/.dev/revdep_emails/dupree/email-body new file mode 100644 index 000000000..dec21ff72 --- /dev/null +++ b/.dev/revdep_emails/dupree/email-body @@ -0,0 +1,29 @@ +Hello Russ Hyde! Thank you for using {lintr} in your package {dupree}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/russHyde/dupree (hash: d1b30dd4ae4cc3c2b198943e37d829d3e9c02b35) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 10s on CRAN vs. 7s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/dyn.log/attachments/dyn.log.warnings b/.dev/revdep_emails/dyn.log/attachments/dyn.log.warnings new file mode 100644 index 000000000..df8107787 --- /dev/null +++ b/.dev/revdep_emails/dyn.log/attachments/dyn.log.warnings @@ -0,0 +1,68 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Trying to remove β€˜dummy_linter’, which is not in `defaults`. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. diff --git a/.dev/revdep_emails/dyn.log/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/dyn.log/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..f65babc57 --- /dev/null +++ b/.dev/revdep_emails/dyn.log/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,2 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/dispatch.R",123,39,"style","Commas should never have a space before."," args = rlang::pairlist2(msg = ,","commas_linter" diff --git a/.dev/revdep_emails/dyn.log/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/dyn.log/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..92c6447c3 --- /dev/null +++ b/.dev/revdep_emails/dyn.log/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,69 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/config.R",99,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(variable) |","vector_logic_linter" +"R/config.R",100,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," nchar(variable) == 0 |","vector_logic_linter" +"R/config.R",126,23,"style","Compound semicolons are discouraged. Replace them by a newline."," envir <- globalenv(); objs <- ls(envir)","semicolon_linter" +"R/config.R",220,5,"warning","local variable β€˜new_layout’ assigned but may not be used"," new_layout <- new_log_layout(","object_usage_linter" +"R/layout.R",125,12,"warning","1:(...) is likely to be wrong in the empty edge case. Use seq_len() instead."," range <- 1:(length(detail$formats))","seq_linter" +"tests/testthat/helper-objects.R",28,18,"style","Compound semicolons are discouraged. Replace them by a newline."," a <- ""test""; b <- 123; c <- 100L","semicolon_linter" +"tests/testthat/helper-objects.R",28,28,"style","Compound semicolons are discouraged. Replace them by a newline."," a <- ""test""; b <- 123; c <- 100L","semicolon_linter" +"tests/testthat/helper-objects.R",61,26,"style","Compound semicolons are discouraged. Replace them by a newline."," a <- ""derived test""; b <- 321; c <- 200L","semicolon_linter" +"tests/testthat/helper-objects.R",61,36,"style","Compound semicolons are discouraged. Replace them by a newline."," a <- ""derived test""; b <- 321; c <- 200L","semicolon_linter" +"tests/testthat/helper-objects.R",84,26,"style","Compound semicolons are discouraged. Replace them by a newline."," a <- ""derived test""; b <- 321; c <- 200L","semicolon_linter" +"tests/testthat/helper-objects.R",84,36,"style","Compound semicolons are discouraged. Replace them by a newline."," a <- ""derived test""; b <- 321; c <- 200L","semicolon_linter" +"tests/testthat/test-dispatch.R",28,18,"style","Compound semicolons are discouraged. Replace them by a newline."," var1 <- ""abc""; var2 <- 123; var3 <- 0.7535651","semicolon_linter" +"tests/testthat/test-dispatch.R",28,31,"style","Compound semicolons are discouraged. Replace them by a newline."," var1 <- ""abc""; var2 <- 123; var3 <- 0.7535651","semicolon_linter" +"tests/testthat/test-dispatch.R",62,18,"style","Compound semicolons are discouraged. Replace them by a newline."," var1 <- ""abc""; var2 <- 123; var3 <- 0.7535651","semicolon_linter" +"tests/testthat/test-dispatch.R",62,31,"style","Compound semicolons are discouraged. Replace them by a newline."," var1 <- ""abc""; var2 <- 123; var3 <- 0.7535651","semicolon_linter" +"tests/testthat/test-dispatch.R",100,18,"style","Compound semicolons are discouraged. Replace them by a newline."," var1 <- ""abc""; var2 <- 123; var3 <- 0.7535651","semicolon_linter" +"tests/testthat/test-dispatch.R",100,31,"style","Compound semicolons are discouraged. Replace them by a newline."," var1 <- ""abc""; var2 <- 123; var3 <- 0.7535651","semicolon_linter" +"vignettes/Configuration.Rmd",31,1,"style","Variable and function name style should be snake_case or symbols.","old.hooks <- fansi::set_knit_hooks(knitr::knit_hooks)","object_name_linter" +"vignettes/Configuration.Rmd",96,34,"style","Trailing whitespace is superfluous.","file.copy(from = configs$default, ","trailing_whitespace_linter" +"vignettes/Configuration.Rmd",125,1,"style","Variable and function name style should be snake_case or symbols.","TestObject <- R6::R6Class(","object_name_linter" +"vignettes/Configuration.Rmd",146,18,"style","Compound semicolons are discouraged. Replace them by a newline."," a <- ""test""; b <- 123; c <- 100L","semicolon_linter" +"vignettes/Configuration.Rmd",146,28,"style","Compound semicolons are discouraged. Replace them by a newline."," a <- ""test""; b <- 123; c <- 100L","semicolon_linter" +"vignettes/Configuration.Rmd",168,1,"style","Variable and function name style should be snake_case or symbols.","DerivedTestObject <- R6::R6Class(","object_name_linter" +"vignettes/Configuration.Rmd",178,26,"style","Compound semicolons are discouraged. Replace them by a newline."," a <- ""derived test""; b <- 321; c <- 200L","semicolon_linter" +"vignettes/Configuration.Rmd",178,36,"style","Compound semicolons are discouraged. Replace them by a newline."," a <- ""derived test""; b <- 321; c <- 200L","semicolon_linter" +"vignettes/Formats.Rmd",33,1,"style","Variable and function name style should be snake_case or symbols.","old.hooks <- fansi::set_knit_hooks(knitr::knit_hooks)","object_name_linter" +"vignettes/Formats.Rmd",79,15,"style","Only use double-quotes."," seperator = '-',","single_quotes_linter" +"vignettes/Formats.Rmd",83,14,"style","Compound semicolons are discouraged. Replace them by a newline.","var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","semicolon_linter" +"vignettes/Formats.Rmd",83,27,"style","Compound semicolons are discouraged. Replace them by a newline.","var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","semicolon_linter" +"vignettes/Formats.Rmd",107,15,"style","Only use double-quotes."," seperator = ' ',","single_quotes_linter" +"vignettes/Formats.Rmd",111,14,"style","Compound semicolons are discouraged. Replace them by a newline.","var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","semicolon_linter" +"vignettes/Formats.Rmd",111,27,"style","Compound semicolons are discouraged. Replace them by a newline.","var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","semicolon_linter" +"vignettes/Formats.Rmd",147,24,"style","Commas should always have a space after.","exec_context <- test(1,2,3)","commas_linter" +"vignettes/Formats.Rmd",147,26,"style","Commas should always have a space after.","exec_context <- test(1,2,3)","commas_linter" +"vignettes/Formats.Rmd",171,40,"style","Only use double-quotes."," new_fmt_metric(crayon::green$bold, 'sysname'),","single_quotes_linter" +"vignettes/Formats.Rmd",172,41,"style","Only use double-quotes."," new_fmt_metric(crayon::blue$yellow, 'release'),","single_quotes_linter" +"vignettes/Formats.Rmd",175,46,"style","Only use double-quotes."," new_fmt_timestamp(crayon::silver$italic, '[%x %H:%M:%S]'),","single_quotes_linter" +"vignettes/Formats.Rmd",176,43,"style","Only use double-quotes."," new_fmt_literal(crayon::magenta$bold, 'fn('),","single_quotes_linter" +"vignettes/Formats.Rmd",177,46,"style","Only use double-quotes."," new_fmt_exec_scope(crayon::magenta$bold, 'calling_fn'),","single_quotes_linter" +"vignettes/Formats.Rmd",178,43,"style","Only use double-quotes."," new_fmt_literal(crayon::magenta$bold, ')'),","single_quotes_linter" +"vignettes/Formats.Rmd",181,52,"style","Only use double-quotes."," new_fmt_exec_scope(crayon::bgYellow$blue$bold, 'call_stack')","single_quotes_linter" +"vignettes/Formats.Rmd",183,15,"style","Only use double-quotes."," seperator = '-',","single_quotes_linter" +"vignettes/Formats.Rmd",184,17,"style","Only use double-quotes."," association = 'ex-sysexec-cs-layout'","single_quotes_linter" +"vignettes/Formats.Rmd",190,7,"warning","local variable β€˜var1’ assigned but may not be used"," var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","object_usage_linter" +"vignettes/Formats.Rmd",190,20,"style","Compound semicolons are discouraged. Replace them by a newline."," var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","semicolon_linter" +"vignettes/Formats.Rmd",190,22,"warning","local variable β€˜var2’ assigned but may not be used"," var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","object_usage_linter" +"vignettes/Formats.Rmd",190,33,"style","Compound semicolons are discouraged. Replace them by a newline."," var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","semicolon_linter" +"vignettes/Formats.Rmd",190,35,"warning","local variable β€˜var3’ assigned but may not be used"," var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","object_usage_linter" +"vignettes/Formats.Rmd",192,7,"warning","no visible binding for global variable β€˜Logger’"," Logger$debug(""my log message - var1: '{var1}', var2: '{var2}', var3: '{var3}'"",","object_usage_linter" +"vignettes/Formats.Rmd",193,29,"style","Only use double-quotes."," layout = 'ex-sysexec-cs-layout')","single_quotes_linter" +"vignettes/Layouts.Rmd",32,23,"style","Put spaces around all infix operators.","options(crayon.enabled=TRUE)","infix_spaces_linter" +"vignettes/Layouts.Rmd",36,1,"style","Variable and function name style should be snake_case or symbols.","old.hooks <- fansi::set_knit_hooks(knitr::knit_hooks)","object_name_linter" +"vignettes/Layouts.Rmd",70,22,"style","Trailing whitespace is superfluous."," new_fmt_log_msg() ","trailing_whitespace_linter" +"vignettes/Layouts.Rmd",108,15,"style","Only use double-quotes."," seperator = '-',","single_quotes_linter" +"vignettes/Layouts.Rmd",117,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/Layouts.Rmd",118,7,"warning","local variable β€˜var1’ assigned but may not be used"," var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","object_usage_linter" +"vignettes/Layouts.Rmd",118,20,"style","Compound semicolons are discouraged. Replace them by a newline."," var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","semicolon_linter" +"vignettes/Layouts.Rmd",118,22,"warning","local variable β€˜var2’ assigned but may not be used"," var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","object_usage_linter" +"vignettes/Layouts.Rmd",118,33,"style","Compound semicolons are discouraged. Replace them by a newline."," var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","semicolon_linter" +"vignettes/Layouts.Rmd",118,35,"warning","local variable β€˜var3’ assigned but may not be used"," var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","object_usage_linter" +"vignettes/Layouts.Rmd",119,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/Layouts.Rmd",120,7,"warning","no visible binding for global variable β€˜Logger’"," Logger$debug(""my log message - var1: '{var1}', var2: '{var2}', var3: '{var3}'"", ","object_usage_linter" +"vignettes/Layouts.Rmd",120,86,"style","Trailing whitespace is superfluous."," Logger$debug(""my log message - var1: '{var1}', var2: '{var2}', var3: '{var3}'"", ","trailing_whitespace_linter" +"vignettes/Layouts.Rmd",121,29,"style","Only use double-quotes."," layout = 'log-with-callstack')","single_quotes_linter" +"vignettes/Levels.Rmd",25,23,"style","Put spaces around all infix operators.","options(crayon.enabled=TRUE)","infix_spaces_linter" +"vignettes/Levels.Rmd",27,1,"style","Variable and function name style should be snake_case or symbols.","old.hooks <- fansi::set_knit_hooks(knitr::knit_hooks)","object_name_linter" +"vignettes/Levels.Rmd",66,14,"style","Compound semicolons are discouraged. Replace them by a newline.","var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","semicolon_linter" +"vignettes/Levels.Rmd",66,27,"style","Compound semicolons are discouraged. Replace them by a newline.","var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","semicolon_linter" diff --git a/.dev/revdep_emails/dyn.log/email-body b/.dev/revdep_emails/dyn.log/email-body new file mode 100644 index 000000000..d0d88ff4c --- /dev/null +++ b/.dev/revdep_emails/dyn.log/email-body @@ -0,0 +1,29 @@ +Hello Brandon Moretz! Thank you for using {lintr} in your package {dyn.log}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/bmoretz/dyn.log (hash: d5f7548e1e96c372b47505617ce4d59341016c7e) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 24s on CRAN vs. 15s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/edgarWebR/attachments/edgarWebR.warnings b/.dev/revdep_emails/edgarWebR/attachments/edgarWebR.warnings new file mode 100644 index 000000000..61d9875d5 --- /dev/null +++ b/.dev/revdep_emails/edgarWebR/attachments/edgarWebR.warnings @@ -0,0 +1,2 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Trying to remove β€˜absolute_paths_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/edgarWebR/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/edgarWebR/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..1df85e4c8 --- /dev/null +++ b/.dev/revdep_emails/edgarWebR/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,19916 @@ +"filename","line_number","column_number","type","message","line","linter" +"data-raw/sic_codes.R",43,58,"style","Use FALSE instead of the symbol F."," group = group_name, stringsAsFactors = F)","T_and_F_symbol_linter" +"data-raw/sic_codes.R",47,26,"style","Use FALSE instead of the symbol F.","})), stringsAsFactors = F)","T_and_F_symbol_linter" +"data-raw/sic_codes.R",58,42,"style","Use FALSE instead of the symbol F."," stringsAsFactors = F)","T_and_F_symbol_linter" +"data-raw/sic_codes.R",62,53,"style","Commas should always have a space after."," substr(majors$sic[startsWith(majors$sic, ""0"")], 2,4)","commas_linter" +"data-raw/sic_codes.R",69,42,"style","Use FALSE instead of the symbol F."," stringsAsFactors = F)","T_and_F_symbol_linter" +"data-raw/sic_codes.R",78,43,"style","Use FALSE instead of the symbol F."," stringsAsFactors = F)","T_and_F_symbol_linter" +"data-raw/sic_codes.R",79,36,"style","Commas should always have a space after.","sec_sic <- sec_sic[2:nrow(sec_sic),]","commas_linter" +"data-raw/sic_codes.R",85,62,"style","Use TRUE instead of the symbol T."," by.x = ""major_code"", by.y = ""sic"", all.x = T)","T_and_F_symbol_linter" +"data-raw/sic_codes.R",87,62,"style","Use TRUE instead of the symbol T."," by.x = ""group_code"", by.y = ""sic"", all.x = T)","T_and_F_symbol_linter" +"R/browse_edgar.R",20,32,"style","Put spaces around all infix operators."," before="""",","infix_spaces_linter" +"R/browse_edgar.R",33,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (res$status != ""200"" | res$headers[""content-type""] != ""application/atom+xml"") {","vector_logic_linter" +"R/browse_edgar.R",34,53,"style","Trailing semicolons are not needed."," stop(paste0(""Could not find company: "", ticker));","semicolon_linter" +"R/company_details.R",26,32,"style","Put spaces around all infix operators."," before="""",","infix_spaces_linter" +"R/company_filings.R",24,32,"style","Put spaces around all infix operators."," before="""",","infix_spaces_linter" +"R/effectiveness.R",47,57,"style","Use TRUE instead of the symbol T."," res$type <- sub("" Statements"", """", res$type, fixed = T)","T_and_F_symbol_linter" +"R/effectiveness.R",48,66,"style","Use TRUE instead of the symbol T."," res$division <- sub(""Division of "", """", res$division, fixed = T)","T_and_F_symbol_linter" +"R/parse_filing.R",39,30,"style","Use TRUE instead of the symbol T."," doc <- get_doc(x, clean = T)","T_and_F_symbol_linter" +"R/parse_filing.R",130,43,"style","Use FALSE instead of the symbol F."," stringsAsFactors = F)","T_and_F_symbol_linter" +"R/parse_filing.R",153,40,"style","Use FALSE instead of the symbol F."," include.raw = F,","T_and_F_symbol_linter" +"R/parse_filing.R",154,41,"style","Use FALSE instead of the symbol F."," include.path = F) {","T_and_F_symbol_linter" +"R/parse_filing.R",325,75,"style","Use FALSE instead of the symbol F."," result <- replicate(length(return_cols) + 2, character(), simplify = F)","T_and_F_symbol_linter" +"R/parse_filing.R",350,25,"style","Use TRUE instead of the symbol T."," ignore.case = T)","T_and_F_symbol_linter" +"R/parse_filing.R",366,42,"style","Use TRUE instead of the symbol T."," ignore.case = T)","T_and_F_symbol_linter" +"R/parse_submission.R",58,48,"style","Use TRUE instead of the symbol T."," include.binary = T,","T_and_F_symbol_linter" +"R/parse_submission.R",59,49,"style","Use TRUE instead of the symbol T."," include.content = T) {","T_and_F_symbol_linter" +"R/parse_submission.R",66,17,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.secdoc & (nchar(res) > 8e6)) {","vector_logic_linter" +"R/parse_submission.R",79,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (!is.secdoc & file.exists(res)) {","vector_logic_linter" +"R/parse_submission.R",130,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.binary & !include.binary) {","vector_logic_linter" +"R/parse_submission.R",148,59,"style","Use TRUE instead of the symbol T."," include.binary = T,","T_and_F_symbol_linter" +"R/parse_submission.R",149,60,"style","Use TRUE instead of the symbol T."," include.content = T) {","T_and_F_symbol_linter" +"R/parse_submission.R",153,44,"style","Use FALSE instead of the symbol F."," stringsAsFactors = F)","T_and_F_symbol_linter" +"R/parse_submission.R",156,15,"style","Use FALSE instead of the symbol F."," in.text <- F","T_and_F_symbol_linter" +"R/parse_submission.R",157,17,"style","Use FALSE instead of the symbol F."," is.binary <- F","T_and_F_symbol_linter" +"R/parse_submission.R",160,52,"style","Use FALSE instead of the symbol F."," while (length(l <- readLines(con, n = 1, warn = F)) > 0) {","T_and_F_symbol_linter" +"R/parse_submission.R",163,21,"style","Use FALSE instead of the symbol F."," in.text <- F","T_and_F_symbol_linter" +"R/parse_submission.R",166,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (text.line == 1 & startsWith(l, ""begin "")) {","vector_logic_linter" +"R/parse_submission.R",167,25,"style","Use TRUE instead of the symbol T."," is.binary <- T","T_and_F_symbol_linter" +"R/parse_submission.R",169,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (include.content & (!is.binary || include.binary)) {","vector_logic_linter" +"R/parse_submission.R",187,61,"style","Use FALSE instead of the symbol F."," result <- rbind(result, file.row, stringsAsFactors = F)","T_and_F_symbol_linter" +"R/parse_submission.R",192,19,"style","Use TRUE instead of the symbol T."," in.text <- T","T_and_F_symbol_linter" +"R/parse_submission.R",193,21,"style","Use FALSE instead of the symbol F."," is.binary <- F","T_and_F_symbol_linter" +"R/parse_submission.R",206,54,"style","Use TRUE instead of the symbol T."," txt.lines <- unlist(strsplit(txt, ""\n"", fixed = T))","T_and_F_symbol_linter" +"R/parse_submission.R",216,20,"style","Use FALSE instead of the symbol F."," prior.long <- c(F, (txt.length == 1023 | txt.length == 1025)[-length(txt.length)])","T_and_F_symbol_linter" +"R/utils.R",61,47,"style","Use TRUE instead of the symbol T."," grepl(""^(http|ftp)s?://"", x, ignore.case = T)","T_and_F_symbol_linter" +"R/utils.R",64,33,"style","Use FALSE instead of the symbol F.","get_doc <- function(x, clean = F) {","T_and_F_symbol_linter" +"R/utils.R",77,20,"style","Use TRUE instead of the symbol T."," }, silent = T)","T_and_F_symbol_linter" +"R/utils.R",89,20,"style","Use TRUE instead of the symbol T."," }, silent = T)","T_and_F_symbol_linter" +"R/utils.R",161,23,"style","Use TRUE instead of the symbol T.","), ncol = 2, byrow = T)","T_and_F_symbol_linter" +"R/utils.R",298,24,"style","Use TRUE instead of the symbol T."," fixed = T)","T_and_F_symbol_linter" +"R/utils.R",306,46,"style","Use TRUE instead of the symbol T."," x <- gsub(""
"", ""
"", x, fixed = T)","T_and_F_symbol_linter" +"R/utils.R",308,44,"style","Use TRUE instead of the symbol T."," x <- gsub(""
"", "" "", x, ignore.case = T)","T_and_F_symbol_linter" +"R/utils.R",309,45,"style","Use TRUE instead of the symbol T."," x <- gsub(""
"", "" "", x, ignore.case = T)","T_and_F_symbol_linter" +"R/utils.R",310,46,"style","Use TRUE instead of the symbol T."," x <- gsub("""", "" "", x, ignore.case = T)","T_and_F_symbol_linter" +"R/utils.R",323,28,"style","Use TRUE instead of the symbol T."," free = T)","T_and_F_symbol_linter" +"R/utils.R",327,88,"style","Use TRUE instead of the symbol T."," count(*)) and normalize-space() = '']""), free = T)","T_and_F_symbol_linter" +"R/utils.R",331,67,"style","Use TRUE instead of the symbol T."," xml2::xml_remove(xml2::xml_find_all(doc, ""//header""), free = T)","T_and_F_symbol_linter" +"tests/dev_tests/parse_to_html.R",3,34,"style","Use FALSE instead of the symbol F.","library(dplyr, warn.conflicts = F)","T_and_F_symbol_linter" +"tests/dev_tests/parse_to_html.R",56,55,"style","Use TRUE instead of the symbol T."," include.raw = T,","T_and_F_symbol_linter" +"tests/dev_tests/parse_to_html.R",57,56,"style","Use TRUE instead of the symbol T."," include.path = T)","T_and_F_symbol_linter" +"tests/dev_tests/parse_to_html.R",78,43,"style","Use TRUE instead of the symbol T.","doc <- edgarWebR:::get_doc(href, clean = T)","T_and_F_symbol_linter" +"tests/dev_tests/parse_to_html.R",82,55,"style","Use TRUE instead of the symbol T.","res <- build_parts(edgarWebR:::get_doc(href, clean = T), ""//text"")","T_and_F_symbol_linter" +"tests/testthat/helper_mock.R",36,38,"warning","Conditional expressions require scalar logical operators (&& and ||)","} else if (ewr_mock_bypass == ""true"" | !ewr_has_mocks) {","vector_logic_linter" +"tests/testthat/test_parse_filing.R",15,16,"style","Use TRUE instead of the symbol T."," }, silent = T)","T_and_F_symbol_linter" +"tests/testthat/test_parse_filing.R",20,85,"style","Use TRUE instead of the symbol T."," plain.words <- length(tokenizers::tokenize_words(xml2::xml_text(doc), simplify = T))","T_and_F_symbol_linter" +"tests/testthat/test_parse_filing.R",170,37,"style","Use FALSE instead of the symbol F."," ignore.case = F), ]","T_and_F_symbol_linter" +"vignettes/edgarWebR.Rmd",17,35,"style","Use TRUE instead of the symbol T.","knitr::opts_chunk$set(collapse = T, comment = ""#>"")","T_and_F_symbol_linter" +"vignettes/edgarWebR.Rmd",19,23,"style","Put spaces around all infix operators.","library(dplyr, quietly=TRUE)","infix_spaces_linter" +"vignettes/edgarWebR.Rmd",20,23,"style","Put spaces around all infix operators.","library(purrr, quietly=TRUE)","infix_spaces_linter" +"vignettes/edgarWebR.Rmd",102,29,"style","`%>%` should always have a space before it and a new line after it, unless the full pipeline fits on one line."," group_by(type) %>% summarize(","pipe_continuation_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1,121,"style","Lines should not be more than 120 characters.","structure(list(url = ""/browse-edgar?action=getcompany&CIK=EA&owner=exclude&type=10-&dateb=&start=0&count=100&output=atom"", ","line_length_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1,123,"style","Trailing whitespace is superfluous.","structure(list(url = ""/browse-edgar?action=getcompany&CIK=EA&owner=exclude&type=10-&dateb=&start=0&count=100&output=atom"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2,78,"style","Trailing whitespace is superfluous."," status_code = 200L, headers = structure(list(`content-encoding` = ""gzip"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3,68,"style","Trailing whitespace is superfluous."," `content-type` = ""application/atom+xml"", server = ""Apache"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4,80,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff"", `x-frame-options` = ""SAMEORIGIN"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5,73,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `content-length` = ""8015"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6,78,"style","Trailing whitespace is superfluous."," `cache-control` = ""no-cache"", date = ""Mon, 20 Jan 2020 17:54:21 GMT"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7,61,"style","Trailing whitespace is superfluous."," connection = ""keep-alive"", vary = ""Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8,88,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000 ; includeSubDomains ; preload"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10,69,"style","Trailing whitespace is superfluous."," )), all_headers = list(list(status = 200L, version = ""HTTP/1.1"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11,62,"style","Trailing whitespace is superfluous."," headers = structure(list(`content-encoding` = ""gzip"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12,72,"style","Trailing whitespace is superfluous."," `content-type` = ""application/atom+xml"", server = ""Apache"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13,84,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff"", `x-frame-options` = ""SAMEORIGIN"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",14,77,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `content-length` = ""8015"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",15,82,"style","Trailing whitespace is superfluous."," `cache-control` = ""no-cache"", date = ""Mon, 20 Jan 2020 17:54:21 GMT"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",16,65,"style","Trailing whitespace is superfluous."," connection = ""keep-alive"", vary = ""Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",17,118,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000 ; includeSubDomains ; preload""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",18,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",19,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",20,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",21,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",22,65,"style","Trailing whitespace is superfluous."," content = as.raw(c(0x3c, 0x3f, 0x78, 0x6d, 0x6c, 0x20, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",23,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x73, 0x69, 0x6f, 0x6e, 0x3d, 0x22, 0x31, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",24,64,"style","Trailing whitespace is superfluous."," 0x30, 0x22, 0x20, 0x65, 0x6e, 0x63, 0x6f, 0x64, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",25,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3d, 0x22, 0x49, 0x53, 0x4f, 0x2d, 0x38, 0x38, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",26,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x22, 0x20, 0x3f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",27,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x65, 0x65, 0x64, 0x20, 0x78, 0x6d, 0x6c, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",28,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",29,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x77, 0x33, 0x2e, 0x6f, 0x72, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",30,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x32, 0x30, 0x30, 0x35, 0x2f, 0x41, 0x74, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",31,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",32,64,"style","Trailing whitespace is superfluous."," 0x74, 0x68, 0x6f, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",33,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6d, 0x61, 0x69, 0x6c, 0x3e, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",34,64,"style","Trailing whitespace is superfluous."," 0x65, 0x62, 0x6d, 0x61, 0x73, 0x74, 0x65, 0x72, 0x40, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",35,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x3c, 0x2f, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",36,64,"style","Trailing whitespace is superfluous."," 0x61, 0x69, 0x6c, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",37,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x57, 0x65, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",38,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x73, 0x74, 0x65, 0x72, 0x3c, 0x2f, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",39,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",40,64,"style","Trailing whitespace is superfluous."," 0x61, 0x75, 0x74, 0x68, 0x6f, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",41,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",42,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x66, 0x6f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",43,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",44,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",45,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",46,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",47,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",48,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",49,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x79, 0x3e, 0x52, 0x45, 0x44, 0x57, 0x4f, 0x4f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",50,64,"style","Trailing whitespace is superfluous."," 0x44, 0x20, 0x43, 0x49, 0x54, 0x59, 0x3c, 0x2f, 0x63, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",51,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",52,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x74, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",53,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x43, 0x41, 0x3c, 0x2f, 0x73, 0x74, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",54,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",55,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x74, 0x72, 0x65, 0x65, 0x74, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",56,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x39, 0x20, 0x52, 0x45, 0x44, 0x57, 0x4f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",57,64,"style","Trailing whitespace is superfluous."," 0x4f, 0x44, 0x20, 0x53, 0x48, 0x4f, 0x52, 0x45, 0x53, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",58,64,"style","Trailing whitespace is superfluous."," 0x50, 0x41, 0x52, 0x4b, 0x57, 0x41, 0x59, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",59,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x65, 0x65, 0x74, 0x31, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",60,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",61,64,"style","Trailing whitespace is superfluous."," 0x69, 0x70, 0x3e, 0x39, 0x34, 0x30, 0x36, 0x35, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",62,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x69, 0x70, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",63,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x61, 0x64, 0x64, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",64,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",65,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",66,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x62, 0x75, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",67,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x65, 0x73, 0x73, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",68,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",69,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x79, 0x3e, 0x52, 0x45, 0x44, 0x57, 0x4f, 0x4f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",70,64,"style","Trailing whitespace is superfluous."," 0x44, 0x20, 0x43, 0x49, 0x54, 0x59, 0x3c, 0x2f, 0x63, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",71,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",72,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x70, 0x68, 0x6f, 0x6e, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",73,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x36, 0x35, 0x30, 0x2d, 0x36, 0x32, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",74,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x3c, 0x2f, 0x70, 0x68, 0x6f, 0x6e, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",75,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",76,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x74, 0x61, 0x74, 0x65, 0x3e, 0x43, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",77,64,"style","Trailing whitespace is superfluous."," 0x41, 0x3c, 0x2f, 0x73, 0x74, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",78,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",79,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x74, 0x72, 0x65, 0x65, 0x74, 0x31, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",80,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x20, 0x52, 0x45, 0x44, 0x57, 0x4f, 0x4f, 0x44, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",81,64,"style","Trailing whitespace is superfluous."," 0x20, 0x53, 0x48, 0x4f, 0x52, 0x45, 0x53, 0x20, 0x50, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",82,64,"style","Trailing whitespace is superfluous."," 0x52, 0x4b, 0x57, 0x41, 0x59, 0x3c, 0x2f, 0x73, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",83,64,"style","Trailing whitespace is superfluous."," 0x65, 0x65, 0x74, 0x31, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",84,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x7a, 0x69, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",85,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x39, 0x34, 0x30, 0x36, 0x35, 0x3c, 0x2f, 0x7a, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",86,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",87,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",88,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",89,64,"style","Trailing whitespace is superfluous."," 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, 0x73, 0x65, 0x73, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",90,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",91,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x67, 0x6e, 0x65, 0x64, 0x2d, 0x73, 0x69, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",92,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x37, 0x33, 0x37, 0x32, 0x3c, 0x2f, 0x61, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",93,64,"style","Trailing whitespace is superfluous."," 0x69, 0x67, 0x6e, 0x65, 0x64, 0x2d, 0x73, 0x69, 0x63, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",94,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",95,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x67, 0x6e, 0x65, 0x64, 0x2d, 0x73, 0x69, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",96,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x65, 0x73, 0x63, 0x3e, 0x53, 0x45, 0x52, 0x56, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",97,64,"style","Trailing whitespace is superfluous."," 0x49, 0x43, 0x45, 0x53, 0x2d, 0x50, 0x52, 0x45, 0x50, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",98,64,"style","Trailing whitespace is superfluous."," 0x43, 0x4b, 0x41, 0x47, 0x45, 0x44, 0x20, 0x53, 0x4f, 0x46, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",99,64,"style","Trailing whitespace is superfluous."," 0x54, 0x57, 0x41, 0x52, 0x45, 0x3c, 0x2f, 0x61, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",100,64,"style","Trailing whitespace is superfluous."," 0x69, 0x67, 0x6e, 0x65, 0x64, 0x2d, 0x73, 0x69, 0x63, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",101,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x73, 0x63, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",102,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x73, 0x73, 0x69, 0x67, 0x6e, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",103,64,"style","Trailing whitespace is superfluous."," 0x64, 0x2d, 0x73, 0x69, 0x63, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",104,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",105,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",106,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",107,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",108,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",109,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",110,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x53, 0x49, 0x43, 0x3d, 0x37, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",111,64,"style","Trailing whitespace is superfluous."," 0x37, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",112,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",113,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",114,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x61, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",115,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6e, 0x65, 0x64, 0x2d, 0x73, 0x69, 0x63, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",116,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",117,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x69, 0x6b, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",118,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x3c, 0x2f, 0x63, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",119,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",120,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",121,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",122,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",123,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",124,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",125,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",126,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",127,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x43, 0x49, 0x4b, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",128,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",129,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",130,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",131,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",132,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",133,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",134,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x65, 0x64, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",135,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x45, 0x4c, 0x45, 0x43, 0x54, 0x52, 0x4f, 0x4e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",136,64,"style","Trailing whitespace is superfluous."," 0x49, 0x43, 0x20, 0x41, 0x52, 0x54, 0x53, 0x20, 0x49, 0x4e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",137,64,"style","Trailing whitespace is superfluous."," 0x43, 0x2e, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",138,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x64, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",139,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",140,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x6c, 0x2d, 0x79, 0x65, 0x61, 0x72, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",141,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x3e, 0x30, 0x33, 0x33, 0x31, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",142,64,"style","Trailing whitespace is superfluous."," 0x69, 0x73, 0x63, 0x61, 0x6c, 0x2d, 0x79, 0x65, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",143,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x6e, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",144,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",145,64,"style","Trailing whitespace is superfluous."," 0x79, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x73, 0x20, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",146,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x22, 0x31, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",147,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",148,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",149,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",150,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x30, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",151,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3c, 0x2f, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",152,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",153,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x45, 0x4c, 0x45, 0x43, 0x54, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",154,64,"style","Trailing whitespace is superfluous."," 0x52, 0x4f, 0x4e, 0x49, 0x43, 0x20, 0x41, 0x52, 0x54, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",155,64,"style","Trailing whitespace is superfluous."," 0x20, 0x49, 0x4e, 0x43, 0x3c, 0x2f, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",156,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",157,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x6e, 0x61, 0x6d, 0x65, 0x73, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",158,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",159,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x72, 0x6c, 0x79, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",160,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",161,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x66, 0x66, 0x69, 0x63, 0x65, 0x3e, 0x4f, 0x66, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",162,64,"style","Trailing whitespace is superfluous."," 0x69, 0x63, 0x65, 0x20, 0x6f, 0x66, 0x20, 0x54, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",163,64,"style","Trailing whitespace is superfluous."," 0x68, 0x6e, 0x6f, 0x6c, 0x6f, 0x67, 0x79, 0x3c, 0x2f, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",164,64,"style","Trailing whitespace is superfluous."," 0x66, 0x66, 0x69, 0x63, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",165,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x74, 0x61, 0x74, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",166,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6f, 0x63, 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x3e, 0x43, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",167,64,"style","Trailing whitespace is superfluous."," 0x41, 0x3c, 0x2f, 0x73, 0x74, 0x61, 0x74, 0x65, 0x2d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",168,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x63, 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",169,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x74, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",170,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6c, 0x6f, 0x63, 0x61, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",171,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",172,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",173,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",174,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",175,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",176,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",177,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",178,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x74, 0x65, 0x3d, 0x43, 0x41, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",179,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",180,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",181,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",182,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x74, 0x61, 0x74, 0x65, 0x2d, 0x6c, 0x6f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",183,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",184,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",185,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x74, 0x65, 0x2d, 0x6f, 0x66, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",186,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x72, 0x70, 0x6f, 0x72, 0x61, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",187,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3e, 0x44, 0x45, 0x3c, 0x2f, 0x73, 0x74, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",188,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6f, 0x66, 0x2d, 0x69, 0x6e, 0x63, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",189,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",190,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",191,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x2d, 0x69, 0x6e, 0x66, 0x6f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",192,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",193,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",194,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",195,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",196,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",197,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",198,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",199,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",200,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",201,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",202,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",203,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",204,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",205,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",206,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",207,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",208,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x32, 0x39, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",209,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",210,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",211,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",212,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",213,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",214,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",215,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",216,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",217,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",218,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",219,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",220,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",221,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",222,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",223,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",224,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",225,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",226,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",227,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",228,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",229,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",230,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",231,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",232,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",233,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",234,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",235,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",236,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",237,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",238,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",239,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",240,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",241,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",242,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",243,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",244,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",245,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",246,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x32, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",247,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",248,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x31, 0x32, 0x39, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",249,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",250,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",251,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",252,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",253,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",254,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",255,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",256,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",257,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x39, 0x31, 0x31, 0x39, 0x34, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",258,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",259,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",260,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",261,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",262,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",263,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",264,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",265,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",266,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",267,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",268,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",269,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",270,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",271,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",272,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",273,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",274,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",275,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",276,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",277,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",278,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",279,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",280,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",281,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x31, 0x32, 0x39, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",282,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",283,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",284,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",285,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",286,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",287,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",288,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",289,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",290,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",291,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",292,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",293,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",294,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",295,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",296,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",297,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",298,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",299,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",300,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",301,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x31, 0x39, 0x30, 0x30, 0x30, 0x31, 0x32, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",302,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",303,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",304,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",305,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",306,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",307,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",308,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",309,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",310,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",311,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",312,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",313,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",314,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x39, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",315,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",316,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",317,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",318,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",319,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x32, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",320,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",321,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",322,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x33, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",323,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",324,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",325,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",326,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",327,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",328,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",329,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",330,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",331,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",332,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",333,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x35, 0x54, 0x31, 0x39, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",334,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x3a, 0x32, 0x33, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",335,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",336,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",337,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",338,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",339,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",340,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",341,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",342,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",343,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",344,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",345,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",346,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",347,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",348,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",349,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",350,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",351,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",352,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",353,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",354,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x34, 0x39, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",355,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",356,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",357,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",358,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",359,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",360,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",361,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",362,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",363,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",364,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",365,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",366,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",367,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",368,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",369,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",370,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",371,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",372,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",373,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",374,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",375,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",376,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",377,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",378,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",379,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",380,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",381,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",382,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",383,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",384,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",385,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",386,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",387,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",388,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",389,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",390,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",391,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x31, 0x39, 0x30, 0x30, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",392,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",393,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",394,64,"style","Trailing whitespace is superfluous."," 0x34, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",395,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",396,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",397,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",398,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",399,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",400,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",401,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",402,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",403,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x32, 0x33, 0x31, 0x35, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",404,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",405,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",406,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",407,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",409,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",410,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",411,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",412,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",413,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",414,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",415,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",416,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",417,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",418,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",419,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",420,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",421,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",422,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",423,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",424,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",425,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",426,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",427,64,"style","Trailing whitespace is superfluous."," 0x34, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",428,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",429,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",430,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",431,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",432,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",433,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",434,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",435,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",436,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",437,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",438,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",439,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",440,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",441,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",442,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",443,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",444,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",445,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",446,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x39, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",447,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x34, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",448,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",449,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",450,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",451,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",452,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",453,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",454,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",455,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",456,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",457,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",458,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",459,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",460,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x36, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",461,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",462,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",463,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",464,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",465,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x34, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",466,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",467,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",468,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",469,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",470,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",471,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",472,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",473,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",474,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",475,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",476,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",477,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",478,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",479,64,"style","Trailing whitespace is superfluous."," 0x36, 0x54, 0x31, 0x36, 0x3a, 0x31, 0x38, 0x3a, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",480,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",481,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",482,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",483,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",484,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",485,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",486,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",487,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",488,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",489,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",490,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",491,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",492,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",493,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",494,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",495,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",496,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",497,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",498,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",499,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x39, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",500,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",501,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",502,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",503,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",504,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",505,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",506,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",507,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",508,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",509,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",510,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",511,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",512,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",513,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",514,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",515,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",516,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",517,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",518,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",519,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",520,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",521,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",522,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",523,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",524,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",525,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",526,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",527,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",528,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",529,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",530,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",531,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",532,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",533,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",534,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",535,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",536,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",537,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x31, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",538,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",539,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x39, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",540,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",541,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",542,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",543,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",544,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",545,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",546,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",547,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",548,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x39, 0x38, 0x35, 0x31, 0x38, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",549,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",550,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",551,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",552,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",553,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",554,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",555,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",556,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",557,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",558,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",559,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",560,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x36, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",561,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",562,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",563,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",564,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",565,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",566,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",567,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",568,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",569,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",570,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",571,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",572,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",573,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",574,64,"style","Trailing whitespace is superfluous."," 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",575,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",576,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",577,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",578,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",579,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",580,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",581,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",582,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",583,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",584,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",585,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",586,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",587,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",588,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",589,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",590,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",591,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",592,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",593,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x39, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",594,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",595,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",596,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",597,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",598,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",599,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",600,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",601,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",602,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",603,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",604,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",605,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",606,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",607,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x34, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",608,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",609,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",610,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",611,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",612,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",613,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",614,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",615,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",616,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",617,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",618,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",619,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",620,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",621,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",622,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",623,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",624,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",625,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",626,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",627,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x33, 0x54, 0x32, 0x30, 0x3a, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",628,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x35, 0x34, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",629,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",630,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",631,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",632,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",633,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",634,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",635,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",636,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",637,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",638,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",639,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",640,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",641,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",642,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",643,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",644,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",645,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",646,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",647,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",648,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",649,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",650,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",651,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",652,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",653,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",654,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",655,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",656,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",657,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",658,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",659,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",660,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",661,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",662,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",663,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",664,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",665,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",666,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",667,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",668,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",669,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",670,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",671,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",672,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",673,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",674,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",675,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",676,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",677,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",678,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",679,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",680,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",681,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",682,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",683,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",684,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",685,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x31, 0x39, 0x30, 0x30, 0x30, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",686,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",687,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",688,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",689,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",690,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",691,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",692,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",693,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",694,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",695,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",696,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",697,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x38, 0x32, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",698,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",699,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",700,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",701,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",702,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",703,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",704,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",705,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",706,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",707,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",708,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",709,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",710,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",711,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",712,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",713,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",714,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",715,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",716,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",717,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",718,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",719,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",720,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",721,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",722,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",723,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",724,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",725,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",726,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",727,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",728,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",729,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",730,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",731,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",732,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x34, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",733,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",734,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",735,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",736,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",737,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",738,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",739,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",740,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x39, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",741,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",742,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",743,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",744,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",745,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",746,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",747,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",748,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",749,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",750,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",751,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",752,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",753,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",754,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",755,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",756,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",757,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",758,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",759,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",760,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",761,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",762,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",763,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",764,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",765,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",766,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",767,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",768,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",769,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",770,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",771,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",772,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x54, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",773,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x3a, 0x32, 0x30, 0x3a, 0x32, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",774,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",775,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",776,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",777,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",778,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",779,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",780,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",781,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",782,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",783,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",784,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",785,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",786,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",787,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",788,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",789,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",790,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",791,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",792,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",793,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, 0x39, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",794,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",795,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",796,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",797,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",798,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",799,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",800,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",801,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",802,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",803,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",804,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",805,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",806,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",807,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",808,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",809,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",810,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",811,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",812,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",813,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",814,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",815,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",816,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",817,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",818,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",819,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",820,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",821,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",822,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",823,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",824,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",825,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",826,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",827,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",828,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",829,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",830,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x38, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",831,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",832,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",833,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",834,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",835,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",836,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",837,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",838,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",839,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",840,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",841,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",842,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x38, 0x31, 0x31, 0x36, 0x33, 0x33, 0x33, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",843,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",844,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",845,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",846,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",847,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",848,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",849,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",850,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",851,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",852,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",853,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",854,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",855,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",856,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",857,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",858,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",859,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",860,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",861,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",862,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",863,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",864,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",865,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",866,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",867,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",868,64,"style","Trailing whitespace is superfluous."," 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",869,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",870,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",871,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",872,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",873,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",874,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",875,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",876,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",877,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, 0x39, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",878,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",879,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",880,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",881,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",882,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",883,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",884,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",885,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",886,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x30, 0x30, 0x30, 0x30, 0x35, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",887,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",888,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",889,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",890,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",891,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",892,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",893,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",894,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",895,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",896,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",897,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",898,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",899,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",900,64,"style","Trailing whitespace is superfluous."," 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",901,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",902,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",903,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",904,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, 0x39, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",905,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",906,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",907,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x31, 0x33, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",908,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",909,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",910,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",911,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",912,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",913,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",914,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",915,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",916,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",917,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",918,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x36, 0x54, 0x31, 0x36, 0x3a, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",919,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x32, 0x36, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",920,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",921,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",922,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",923,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",924,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",925,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",926,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",927,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",928,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",929,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",930,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",931,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",932,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",933,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",934,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",935,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",936,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",937,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",938,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",939,64,"style","Trailing whitespace is superfluous."," 0x34, 0x35, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",940,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",941,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",942,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",943,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",944,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",945,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",946,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",947,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",948,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",949,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",950,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",951,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",952,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",953,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",954,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",955,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",956,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",957,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",958,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",959,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",960,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",961,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",962,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",963,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",964,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",965,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",966,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",967,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",968,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",969,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",970,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",971,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",972,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",973,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",974,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",975,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",976,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x38, 0x30, 0x30, 0x30, 0x30, 0x34, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",977,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",978,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",979,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",980,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",981,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",982,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",983,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",984,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",985,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",986,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",987,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x38, 0x39, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",988,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",989,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",990,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",991,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",992,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",993,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",994,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",995,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",996,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",997,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",998,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x32, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",999,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1000,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1001,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1002,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1003,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1004,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1005,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1006,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1007,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1008,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1009,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1010,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1011,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x35, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1012,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1013,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1014,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1015,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1016,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1017,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1018,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1019,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1020,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1021,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1022,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1023,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1024,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1025,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1026,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1027,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1028,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1029,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1030,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1031,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x31, 0x38, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1032,64,"style","Trailing whitespace is superfluous."," 0x34, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1033,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1034,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1035,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1036,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1037,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1038,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1039,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1040,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1041,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1042,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1043,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1044,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1045,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x30, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1046,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1047,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1048,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1049,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1050,64,"style","Trailing whitespace is superfluous."," 0x34, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1051,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1052,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1053,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1054,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1055,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1056,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1057,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1058,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1059,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1060,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1061,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1062,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1063,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x37, 0x54, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1064,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3a, 0x30, 0x33, 0x3a, 0x33, 0x30, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1065,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1066,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1067,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1068,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1069,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1070,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1071,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1072,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1073,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1074,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1075,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1076,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1077,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1078,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1079,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1080,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1081,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1082,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1083,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1084,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x32, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1085,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1086,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1087,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1088,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1089,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1090,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1091,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1092,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1093,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1094,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1095,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1096,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1097,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1098,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1099,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1100,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1101,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1102,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1103,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1104,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1105,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1106,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1107,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1108,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1109,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1110,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1111,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1112,64,"style","Trailing whitespace is superfluous."," 0x32, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1113,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1114,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1115,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1116,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1117,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1118,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1119,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1120,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1121,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x38, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1122,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1123,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1124,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1125,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1126,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1127,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1128,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1129,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1130,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1131,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1132,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1133,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x38, 0x35, 0x35, 0x34, 0x37, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1134,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1135,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1136,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1137,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1138,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1139,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1140,64,"style","Trailing whitespace is superfluous."," 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1141,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1142,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1143,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1144,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1145,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x31, 0x35, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1146,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1147,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1148,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1149,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1150,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1151,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1152,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1153,64,"style","Trailing whitespace is superfluous."," 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1154,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1155,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1156,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1157,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1158,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, 0x34, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1159,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1160,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1161,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1162,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1163,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1164,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1165,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1166,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1167,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1168,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1169,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1170,64,"style","Trailing whitespace is superfluous."," 0x32, 0x34, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1171,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1172,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1173,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1174,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1175,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1176,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1177,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1178,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x31, 0x38, 0x30, 0x30, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1179,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1180,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1181,64,"style","Trailing whitespace is superfluous."," 0x32, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1182,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1183,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1184,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1185,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1186,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1187,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1188,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1189,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1190,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1191,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1192,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x32, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1193,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1194,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1195,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1196,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1197,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1198,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1199,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x35, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1200,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1201,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1202,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1203,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1204,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1205,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1206,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1207,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1208,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1209,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1210,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1211,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1212,64,"style","Trailing whitespace is superfluous."," 0x32, 0x33, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1213,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1214,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1215,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1216,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1217,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1218,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1219,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1220,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1221,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1222,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1223,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1224,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1225,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1226,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1227,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1228,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1229,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1230,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1231,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1232,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1233,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1234,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1235,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1236,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1237,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1238,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1239,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1240,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1241,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1242,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1243,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1244,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1245,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1246,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1247,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1248,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1249,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1250,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1251,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1252,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1253,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1254,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1255,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1256,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1257,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1258,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1259,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1260,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1261,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1262,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1263,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1264,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1265,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1266,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1267,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1268,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1269,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1270,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x30, 0x30, 0x30, 0x30, 0x38, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1271,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1272,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x38, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1273,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1274,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1275,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1276,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1277,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1278,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1279,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1280,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1281,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x31, 0x38, 0x35, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1282,64,"style","Trailing whitespace is superfluous."," 0x36, 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1283,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1284,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1285,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1286,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1287,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1288,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1289,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1290,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1291,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1292,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1293,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1294,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1295,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1296,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1297,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1298,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1299,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1300,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1301,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1302,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1303,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1304,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1305,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1306,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1307,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1308,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1309,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1310,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1311,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1312,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1313,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1314,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1315,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1316,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1317,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1318,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1319,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1320,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1321,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1322,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1323,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1324,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1325,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x31, 0x38, 0x30, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1326,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1327,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1328,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1329,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1330,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1331,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1332,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1333,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1334,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1335,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1336,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1337,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1338,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1339,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1340,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1341,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1342,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1343,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1344,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1345,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1346,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1347,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1348,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1349,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1350,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1351,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1352,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1353,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1354,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1355,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1356,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1357,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1358,64,"style","Trailing whitespace is superfluous."," 0x32, 0x32, 0x3a, 0x32, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1359,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1360,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1361,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1362,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1363,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1364,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1365,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1366,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1367,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1368,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1369,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1370,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1371,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1372,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1373,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1374,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1375,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1376,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1377,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1378,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x38, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1379,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1380,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1381,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1382,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1383,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1384,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1385,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1386,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1387,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1388,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1389,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1390,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1391,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1392,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1393,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1394,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1395,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1396,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1397,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1398,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1399,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1400,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1401,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1402,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1403,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1404,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1405,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x37, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1406,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1407,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1409,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1410,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1411,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1412,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1413,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1414,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1415,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x31, 0x37, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1416,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1417,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1418,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1419,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1420,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1421,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1422,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1423,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1424,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1425,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1426,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1427,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x38, 0x30, 0x35, 0x32, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1428,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1429,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1430,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1431,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1432,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1433,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1434,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1435,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1436,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1437,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x39, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1438,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1439,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1440,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1441,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1442,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1443,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1444,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1445,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1446,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1447,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1448,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1449,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1450,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1451,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1452,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1453,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1454,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1455,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1456,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1457,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1458,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1459,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1460,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1461,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1462,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1463,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1464,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1465,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1466,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1467,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1468,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1469,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1470,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x37, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1471,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1472,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1473,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1474,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1475,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1476,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1477,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1478,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1479,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1480,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1481,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1482,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1483,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1484,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x37, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1485,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1486,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1487,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1488,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1489,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1490,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1491,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1492,64,"style","Trailing whitespace is superfluous."," 0x39, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1493,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1494,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1495,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1496,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1497,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1498,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1499,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1500,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1501,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1502,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x37, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x36, 0x54, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1503,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x3a, 0x35, 0x36, 0x3a, 0x33, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1504,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1505,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1506,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1507,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1508,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1509,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1510,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1511,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1512,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1513,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1514,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1515,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1516,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1517,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1518,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1519,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1520,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1521,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1522,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1523,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1524,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1525,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1526,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1527,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1528,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1529,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1530,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1531,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1532,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1533,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1534,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1535,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1536,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1537,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1538,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1539,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1540,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1541,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1542,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1543,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1544,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1545,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1546,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1547,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1548,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1549,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1550,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1551,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1552,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1553,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1554,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1555,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1556,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1557,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1558,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1559,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1560,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x37, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1561,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x36, 0x33, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1562,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1563,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x36, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1564,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1565,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1566,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1567,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1568,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1569,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1570,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1571,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1572,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x37, 0x31, 0x30, 0x31, 0x35, 0x35, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1573,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1574,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1575,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1576,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1577,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1578,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1579,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1580,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1581,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1582,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1583,64,"style","Trailing whitespace is superfluous."," 0x38, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1584,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1585,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1586,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1587,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1588,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1589,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1590,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1591,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1592,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1593,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1594,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1595,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1596,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x36, 0x33, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1597,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1598,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1599,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1600,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1601,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1602,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1603,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1604,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1605,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1606,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1607,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1608,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1609,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1610,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1611,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1612,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1613,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1614,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1615,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1616,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1617,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1618,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1619,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1620,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1621,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1622,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1623,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1624,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1625,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1626,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1627,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1628,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1629,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1630,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1631,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1632,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1633,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1634,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1635,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1636,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1637,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x38, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1638,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1639,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1640,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1641,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1642,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1643,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1644,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1645,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1646,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1647,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1648,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x54, 0x31, 0x37, 0x3a, 0x30, 0x35, 0x3a, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1649,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1650,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1651,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1652,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1653,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1654,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1655,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1656,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1657,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1658,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1659,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1660,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1661,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1662,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1663,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1664,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1665,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1666,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1667,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1668,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1669,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1670,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1671,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1672,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1673,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1674,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1675,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1676,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1677,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1678,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1679,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1680,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1681,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1682,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1683,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1684,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1685,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1686,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1687,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1688,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1689,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1690,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1691,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1692,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1693,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1694,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1695,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1696,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x34, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1697,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1698,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1699,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1700,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1701,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1702,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1703,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1704,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1705,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1706,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x30, 0x30, 0x30, 0x33, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1707,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1708,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x35, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1709,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1710,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1711,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1712,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1713,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1714,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1715,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1716,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1717,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x31, 0x37, 0x38, 0x36, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1718,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1719,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1720,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1721,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1722,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1723,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1724,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1725,64,"style","Trailing whitespace is superfluous."," 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1726,64,"style","Trailing whitespace is superfluous."," 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1727,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1728,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1729,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1730,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1731,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1732,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1733,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1734,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1735,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1736,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1737,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1738,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1739,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1740,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1741,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1742,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1743,64,"style","Trailing whitespace is superfluous."," 0x33, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1744,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1745,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1746,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1747,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1748,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1749,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1750,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1751,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1752,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1753,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1754,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x33, 0x35, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1755,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1756,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1757,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1758,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1759,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1760,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1761,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1762,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x37, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1763,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x33, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1764,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1765,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x33, 0x35, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1766,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1767,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1768,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1769,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1770,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1771,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1772,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1773,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1774,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1775,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1776,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x34, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1777,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1778,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1779,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1780,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1781,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x33, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1782,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1783,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1784,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1785,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1786,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1787,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1788,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1789,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1790,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1791,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1792,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1793,64,"style","Trailing whitespace is superfluous."," 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1794,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1795,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1796,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x34, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1797,64,"style","Trailing whitespace is superfluous."," 0x34, 0x31, 0x3a, 0x31, 0x32, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1798,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1799,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1800,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1801,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1802,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1803,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1804,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1805,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1806,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1807,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1808,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1809,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1810,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1811,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1812,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1813,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1814,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1815,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1816,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1817,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1818,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1819,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1820,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1821,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1822,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1823,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1824,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1825,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1826,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1827,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1828,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1829,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1830,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1831,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1832,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1833,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1834,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1835,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1836,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1837,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1838,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1839,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1840,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1841,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1842,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1843,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1844,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1845,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1846,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1847,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1848,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1849,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1850,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1851,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1852,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1853,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1854,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x31, 0x37, 0x30, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1855,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1856,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1857,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1858,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1859,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1860,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1861,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1862,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1863,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1864,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1865,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1866,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x39, 0x32, 0x37, 0x36, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1867,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1868,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1869,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1870,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1871,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1872,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1873,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1874,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1875,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1876,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x30, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1877,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1878,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1879,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1880,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1881,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1882,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1883,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1884,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1885,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1886,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1887,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1888,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1889,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1890,64,"style","Trailing whitespace is superfluous."," 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1891,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1892,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1893,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1894,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1895,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1896,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1897,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1898,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1899,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1900,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1901,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1902,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1903,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1904,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1905,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1906,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1907,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1908,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1909,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x37, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1910,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1911,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1912,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1913,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1914,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1915,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1916,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1917,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1918,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1919,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1920,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1921,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1922,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1923,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x37, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1924,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1925,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1926,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1927,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1928,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1929,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1930,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1931,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1932,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1933,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1934,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1935,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1936,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1937,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1938,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1939,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1940,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1941,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1942,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x36, 0x3a, 0x31, 0x38, 0x3a, 0x35, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1943,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1944,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1945,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1946,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1947,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1948,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1949,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1950,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1951,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1952,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1953,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1954,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1955,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1956,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1957,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1958,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1959,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1960,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1961,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1962,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x34, 0x39, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1963,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1964,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1965,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1966,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1967,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1968,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1969,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1970,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1971,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1972,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1973,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1974,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1975,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1976,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1977,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1978,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1979,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1980,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1981,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1982,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1983,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1984,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1985,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1986,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1987,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1988,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1989,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1990,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1991,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1992,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1993,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1994,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1995,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1996,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1997,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1998,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",1999,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x36, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2000,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x34, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2001,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2002,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x34, 0x39, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2003,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2004,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2005,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2006,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2007,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2008,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2009,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2010,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2011,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x31, 0x36, 0x31, 0x39, 0x38, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2012,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2013,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2014,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2015,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2016,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2017,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2018,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2019,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2020,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2021,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2022,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2023,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2024,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2025,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2026,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2027,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2028,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2029,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2030,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2031,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2032,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2033,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2034,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2035,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x34, 0x39, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2036,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2037,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2038,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2039,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2040,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2041,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2042,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2043,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2044,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2045,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2046,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x34, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2047,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2048,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2049,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2050,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2051,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2052,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2053,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2054,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2055,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x36, 0x30, 0x30, 0x30, 0x31, 0x34, 0x39, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2056,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2057,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x34, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2058,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2059,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2060,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2061,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2062,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2063,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2064,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2065,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2066,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2067,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2068,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2069,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2070,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2071,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2072,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2073,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x34, 0x39, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2074,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2075,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2076,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x30, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2077,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2078,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2079,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2080,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2081,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2082,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2083,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2084,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2085,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2086,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2087,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x38, 0x54, 0x31, 0x36, 0x3a, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2088,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3a, 0x34, 0x37, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2089,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2090,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2091,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2092,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2093,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2094,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2095,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2096,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2097,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2098,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2099,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2100,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2101,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2102,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2103,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2104,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2105,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2106,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2107,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2108,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x38, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2109,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2110,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2111,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2112,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2113,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2114,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2115,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2116,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2117,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2118,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2119,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2120,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2121,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2122,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2123,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2124,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2125,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2126,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2127,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2128,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2129,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2130,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2131,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2132,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2133,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2134,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2135,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2136,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2137,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2138,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2139,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2140,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2141,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2142,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2143,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2144,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2145,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x31, 0x36, 0x30, 0x30, 0x30, 0x31, 0x33, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2146,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2147,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2148,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2149,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2150,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2151,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2152,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2153,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2154,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2155,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2156,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2157,64,"style","Trailing whitespace is superfluous."," 0x38, 0x31, 0x38, 0x32, 0x37, 0x39, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2158,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2159,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2160,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2161,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2162,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2163,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2164,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2165,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2166,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2167,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x39, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2168,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2169,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2170,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2171,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2172,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2173,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2174,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2175,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2176,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2177,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2178,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2179,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2180,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x33, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2181,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2182,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2183,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2184,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2185,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2186,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2187,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2188,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2189,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2190,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2191,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2192,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2193,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2194,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2195,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2196,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2197,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2198,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2199,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2200,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x36, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2201,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2202,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2203,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2204,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2205,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2206,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2207,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2208,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2209,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2210,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2211,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2212,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2213,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2214,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2215,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2216,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2217,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2218,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2219,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2220,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2221,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2222,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2223,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2224,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2225,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2226,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2227,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2228,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2229,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2230,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2231,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2232,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, 0x54, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2233,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x32, 0x35, 0x3a, 0x34, 0x37, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2234,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2235,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2236,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2237,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2238,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2239,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2240,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2241,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2242,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2243,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2244,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2245,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2246,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2247,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2248,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2249,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2250,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2251,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2252,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2253,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x31, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2254,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2255,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2256,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2257,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2258,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2259,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2260,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2261,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2262,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2263,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2264,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2265,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2266,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2267,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2268,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2269,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2270,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2271,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2272,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2273,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2274,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2275,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2276,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2277,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2278,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2279,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2280,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2281,64,"style","Trailing whitespace is superfluous."," 0x32, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2282,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2283,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2284,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2285,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2286,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2287,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2288,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2289,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2290,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x36, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2291,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2292,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2293,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2294,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2295,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2296,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2297,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2298,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2299,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2300,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2301,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2302,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x36, 0x37, 0x39, 0x37, 0x33, 0x38, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2303,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2304,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2305,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2306,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2307,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2308,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2309,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2310,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2311,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2312,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2313,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2314,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x35, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2315,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2316,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2317,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2318,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2319,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2320,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2321,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2322,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2323,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2324,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2325,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2326,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2327,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x31, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2328,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2329,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2330,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2331,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2332,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2333,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2334,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2335,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2336,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2337,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2338,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2339,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2340,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2341,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2342,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2343,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2344,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2345,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2346,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2347,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x31, 0x36, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2348,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2349,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2350,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2351,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2352,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2353,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2354,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2355,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2356,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2357,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2358,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2359,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2360,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2361,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2362,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2363,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2364,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2365,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2366,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2367,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2368,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2369,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2370,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2371,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2372,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2373,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2374,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2375,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2376,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2377,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2378,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2379,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2380,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2381,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x36, 0x54, 0x31, 0x39, 0x3a, 0x34, 0x33, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2382,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2383,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2384,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2385,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2386,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2387,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2388,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2389,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2390,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2391,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2392,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2393,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2394,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2395,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2396,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2397,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2398,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2399,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2400,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2401,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2402,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2403,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2404,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2405,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2406,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2407,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2408,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2409,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2410,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2411,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2412,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2413,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2414,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2415,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2416,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2417,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2418,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2419,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2420,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2421,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2422,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2423,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2424,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2425,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2426,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2427,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2428,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2429,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2430,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2431,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2432,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2433,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2434,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2435,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2436,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2437,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2438,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2439,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x30, 0x30, 0x30, 0x30, 0x38, 0x36, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2440,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2441,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2442,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2443,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2444,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2445,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2446,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2447,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2448,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2449,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2450,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x36, 0x31, 0x33, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2451,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x32, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2452,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2453,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2454,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2455,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2456,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2457,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2458,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2459,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2460,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2461,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2462,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2463,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2464,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2465,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2466,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2467,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2468,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2469,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2470,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2471,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2472,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2473,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2474,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x36, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2475,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2476,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2477,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2478,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2479,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2480,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2481,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2482,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2483,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2484,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2485,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2486,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x36, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2487,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2488,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2489,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2490,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2491,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2492,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2493,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2494,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x31, 0x36, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2495,64,"style","Trailing whitespace is superfluous."," 0x38, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2496,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2497,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2498,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2499,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2500,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2501,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2502,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2503,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2504,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2505,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2506,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2507,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2508,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2509,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2510,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2511,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2512,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2513,64,"style","Trailing whitespace is superfluous."," 0x38, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2514,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2515,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2516,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2517,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2518,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2519,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2520,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2521,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2522,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2523,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2524,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2525,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2526,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x38, 0x54, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2527,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x33, 0x33, 0x3a, 0x34, 0x35, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2528,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2529,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2530,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2531,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2532,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2533,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2534,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2535,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2536,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2537,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2538,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2539,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2540,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2541,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2542,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2543,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2544,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2545,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2546,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2547,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x30, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2548,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2549,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2550,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2551,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2552,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2553,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2554,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2555,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2556,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2557,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2558,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2559,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2560,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2561,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2562,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2563,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2564,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2565,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2566,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2567,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2568,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2569,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2570,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2571,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2572,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2573,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2574,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2575,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2576,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2577,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2578,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2579,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2580,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2581,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2582,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2583,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2584,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2585,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x30, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2586,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2587,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2588,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2589,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2590,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2591,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2592,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2593,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2594,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2595,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2596,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x31, 0x32, 0x31, 0x39, 0x33, 0x39, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2597,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2598,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2599,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2600,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2601,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2602,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2603,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2604,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2605,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2606,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2607,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2608,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2609,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2610,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2611,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2612,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2613,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2614,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2615,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2616,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2617,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2618,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2619,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2620,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2621,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2622,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2623,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2624,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2625,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2626,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2627,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2628,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2629,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2630,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2631,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2632,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2633,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2634,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2635,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2636,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2637,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2638,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2639,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2640,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x30, 0x37, 0x30, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2641,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2642,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x30, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2643,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2644,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2645,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2646,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2647,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2648,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2649,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2650,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2651,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2652,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2653,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2654,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2655,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2656,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2657,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2658,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x30, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2659,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2660,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2661,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2662,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2663,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2664,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2665,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2666,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2667,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2668,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2669,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2670,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2671,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2672,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x36, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2673,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2674,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2675,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2676,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2677,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2678,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2679,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2680,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2681,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2682,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2683,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2684,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2685,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2686,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2687,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2688,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2689,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2690,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2691,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2692,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2693,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2694,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2695,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2696,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2697,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2698,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2699,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2700,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2701,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2702,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2703,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2704,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2705,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2706,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2707,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2708,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2709,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2710,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2711,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2712,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2713,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2714,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2715,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2716,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2717,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2718,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2719,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2720,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x31, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2721,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2722,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2723,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2724,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2725,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2726,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2727,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2728,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2729,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2730,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x30, 0x30, 0x30, 0x30, 0x35, 0x33, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2731,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2732,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, 0x33, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2733,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2734,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2735,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2736,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2737,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2738,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2739,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2740,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2741,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x35, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2742,64,"style","Trailing whitespace is superfluous."," 0x34, 0x34, 0x35, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2743,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2744,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2745,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2746,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2747,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2748,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2749,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2750,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2751,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2752,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x39, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2753,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2754,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2755,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2756,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2757,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2758,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2759,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2760,64,"style","Trailing whitespace is superfluous."," 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2761,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2762,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2763,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2764,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2765,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, 0x33, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2766,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2767,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2768,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2769,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2770,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2771,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2772,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2773,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2774,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2775,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2776,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2777,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2778,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2779,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2780,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2781,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2782,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2783,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2784,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2785,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x31, 0x35, 0x30, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2786,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2787,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2788,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2789,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2790,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2791,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2792,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2793,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2794,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2795,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2796,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2797,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2798,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2799,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x31, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2800,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2801,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2802,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2803,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2804,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2805,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2806,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x39, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2807,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2808,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2809,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2810,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2811,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2812,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2813,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2814,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2815,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2816,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2817,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x31, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2818,64,"style","Trailing whitespace is superfluous."," 0x34, 0x34, 0x3a, 0x30, 0x32, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2819,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2820,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2821,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2822,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2823,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2824,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2825,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2826,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2827,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2828,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2829,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2830,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2831,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2832,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2833,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2834,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2835,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2836,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2837,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2838,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x33, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2839,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2840,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2841,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2842,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2843,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2844,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2845,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2846,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2847,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2848,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2849,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2850,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2851,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2852,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2853,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2854,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2855,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2856,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2857,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2858,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2859,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2860,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2861,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2862,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2863,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2864,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2865,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2866,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2867,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2868,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2869,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2870,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2871,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2872,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2873,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2874,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2875,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x31, 0x35, 0x30, 0x30, 0x30, 0x30, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2876,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2877,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2878,64,"style","Trailing whitespace is superfluous."," 0x33, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2879,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2880,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2881,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2882,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2883,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2884,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2885,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2886,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2887,64,"style","Trailing whitespace is superfluous."," 0x38, 0x38, 0x33, 0x33, 0x32, 0x31, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2888,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2889,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2890,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2891,64,"style","Trailing whitespace is superfluous."," 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2892,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2893,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2894,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2895,64,"style","Trailing whitespace is superfluous."," 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2896,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2897,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2898,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2899,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2900,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2901,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2902,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2903,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2904,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2905,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2906,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2907,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2908,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2909,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2910,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2911,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2912,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x33, 0x33, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2913,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2914,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2915,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2916,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2917,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2918,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2919,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2920,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2921,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2922,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2923,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2924,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2925,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2926,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2927,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2928,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2929,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2930,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2931,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2932,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x30, 0x30, 0x30, 0x30, 0x33, 0x33, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2933,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2934,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2935,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2936,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2937,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2938,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2939,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2940,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2941,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2942,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2943,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2944,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2945,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2946,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2947,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2948,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2949,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2950,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2951,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2952,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2953,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x31, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2954,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2955,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2956,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2957,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2958,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2959,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2960,64,"style","Trailing whitespace is superfluous."," 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2961,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2962,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2963,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2964,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2965,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2966,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x36, 0x3a, 0x34, 0x36, 0x3a, 0x32, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2967,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2968,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2969,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2970,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2971,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2972,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2973,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2974,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2975,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2976,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2977,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2978,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2979,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2980,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2981,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2982,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2983,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2984,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2985,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2986,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2987,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2988,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2989,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2990,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2991,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2992,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2993,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2994,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2995,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2996,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2997,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2998,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",2999,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3000,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3001,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3002,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3003,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3004,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3005,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3006,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3007,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3008,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3009,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3010,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3011,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3012,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3013,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3014,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3015,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3016,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3017,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3018,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3019,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3020,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3021,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3022,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3023,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3024,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x32, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3025,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3026,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x31, 0x32, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3027,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3028,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3029,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3030,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3031,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3032,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3033,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3034,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3035,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x31, 0x35, 0x35, 0x37, 0x35, 0x38, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3036,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3037,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3038,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3039,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3040,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3041,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3042,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3043,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3044,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3045,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3046,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3047,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3048,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3049,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3050,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3051,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3052,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3053,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3054,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3055,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3056,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3057,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3058,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3059,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3060,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3061,64,"style","Trailing whitespace is superfluous."," 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3062,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3063,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3064,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3065,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3066,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3067,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3068,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3069,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3070,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x32, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3071,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3072,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3073,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3074,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3075,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3076,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3077,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3078,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3079,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x30, 0x30, 0x30, 0x30, 0x31, 0x32, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3080,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3081,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3082,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3083,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3084,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3085,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3086,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3087,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3088,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3089,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3090,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3091,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3092,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3093,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3094,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3095,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3096,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3097,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x32, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3098,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3099,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3100,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x31, 0x36, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3101,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3102,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3103,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3104,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3105,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3106,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3107,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3108,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3109,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3110,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3111,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x34, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3112,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x35, 0x38, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3113,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3114,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3115,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3116,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3117,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3118,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3119,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3120,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3121,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3122,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3123,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3124,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3125,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3126,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3127,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3128,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3129,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3130,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3131,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3132,64,"style","Trailing whitespace is superfluous."," 0x36, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3133,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3134,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3135,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3136,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3137,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3138,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3139,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3140,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3141,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3142,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3143,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3144,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3145,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3146,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3147,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3148,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3149,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3150,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3151,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3152,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3153,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3154,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3155,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3156,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3157,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3158,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3159,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3160,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3161,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3162,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3163,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3164,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3165,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3166,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3167,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3168,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3169,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x34, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3170,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3171,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3172,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3173,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3174,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3175,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3176,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3177,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3178,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3179,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3180,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x34, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3181,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x37, 0x39, 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3182,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3183,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3184,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3185,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3186,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3187,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3188,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3189,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3190,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3191,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x35, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3192,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3193,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3194,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3195,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3196,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3197,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3198,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3199,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3200,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3201,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3202,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3203,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3204,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3205,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3206,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3207,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3208,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3209,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3210,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3211,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3212,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3213,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3214,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3215,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3216,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x36, 0x33, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3217,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3218,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3219,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3220,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3221,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3222,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3223,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3224,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x34, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3225,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x33, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3226,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3227,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x36, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3228,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3229,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3230,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3231,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3232,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3233,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3234,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3235,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3236,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3237,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3238,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x34, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3239,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3240,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3241,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3242,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3243,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3244,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3245,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3246,64,"style","Trailing whitespace is superfluous."," 0x35, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3247,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3248,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3249,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3250,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3251,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3252,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3253,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3254,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3255,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3256,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x34, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x34, 0x54, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3257,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x3a, 0x34, 0x34, 0x3a, 0x34, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3258,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3259,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3260,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3261,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3262,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3263,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3264,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3265,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3266,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3267,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3268,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3269,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x4b, 0x2f, 0x41, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3270,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3271,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3272,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3273,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3274,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3275,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3276,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3277,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3278,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3279,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3280,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3281,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3282,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3283,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x6e, 0x64, 0x3e, 0x5b, 0x41, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3284,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x5d, 0x3c, 0x2f, 0x61, 0x6d, 0x65, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3285,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3286,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3287,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3288,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3289,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3290,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3291,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3292,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3293,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3294,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3295,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3296,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3297,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3298,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3299,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3300,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3301,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3302,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3303,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3304,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3305,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3306,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3307,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3308,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3309,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3310,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3311,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3312,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3313,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3314,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3315,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3316,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3317,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3318,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3319,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3320,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3321,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3322,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3323,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3324,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3325,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3326,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3327,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3328,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3329,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x34, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3330,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x31, 0x39, 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3331,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3332,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3333,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3334,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3335,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3336,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3337,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3338,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3339,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3340,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3341,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3342,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x34, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3343,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3344,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3345,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3346,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3347,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3348,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3349,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3350,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3351,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3352,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3353,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3354,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3355,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3356,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3357,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3358,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3359,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3360,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3361,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3362,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3363,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3364,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3365,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3366,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3367,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3368,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3369,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3370,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3371,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3372,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3373,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x31, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3374,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3375,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3376,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3377,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3378,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3379,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3380,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3381,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x39, 0x33, 0x34, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3382,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3383,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3384,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3385,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x41, 0x6d, 0x65, 0x6e, 0x64, 0x5d, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3386,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3387,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3388,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3389,64,"style","Trailing whitespace is superfluous."," 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3390,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3391,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3392,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3393,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3394,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x34, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3395,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x36, 0x3a, 0x33, 0x36, 0x3a, 0x34, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3396,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3397,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3398,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3399,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3400,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3401,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3402,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3403,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3404,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3405,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3406,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3407,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3409,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3410,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3411,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3412,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3413,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3414,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3415,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x39, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3416,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3417,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3418,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3419,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3420,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3421,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3422,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3423,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3424,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3425,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3426,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3427,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3428,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3429,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3430,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3431,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3432,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3433,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3434,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3435,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3436,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3437,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3438,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3439,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3440,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3441,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3442,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3443,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3444,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3445,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3446,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3447,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3448,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3449,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3450,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3451,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3452,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3453,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x33, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3454,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3455,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x33, 0x39, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3456,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3457,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3458,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3459,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3460,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3461,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3462,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3463,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3464,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x31, 0x34, 0x31, 0x30, 0x31, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3465,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3466,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3467,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3468,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3469,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3470,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3471,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3472,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3473,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3474,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3475,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3476,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3477,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3478,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3479,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3480,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3481,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3482,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3483,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3484,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3485,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3486,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3487,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3488,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x33, 0x39, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3489,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3490,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3491,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3492,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3493,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3494,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3495,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3496,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3497,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3498,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3499,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3500,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3501,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3502,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3503,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3504,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3505,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3506,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3507,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3508,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x34, 0x30, 0x30, 0x30, 0x30, 0x33, 0x39, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3509,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3510,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3511,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3512,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3513,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3514,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3515,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3516,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3517,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3518,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3519,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3520,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3521,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3522,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3523,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3524,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3525,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3526,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x39, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3527,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3528,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3529,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x33, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3530,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3531,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3532,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3533,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3534,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3535,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3536,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3537,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3538,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3539,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3540,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x30, 0x35, 0x54, 0x31, 0x36, 0x3a, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3541,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3a, 0x32, 0x34, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3542,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3543,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3544,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3545,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3546,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3547,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3548,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3549,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3550,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3551,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3552,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3553,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3554,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3555,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3556,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3557,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3558,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3559,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3560,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3561,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3562,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3563,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3564,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3565,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3566,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3567,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3568,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3569,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3570,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3571,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3572,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3573,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3574,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3575,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3576,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3577,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3578,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3579,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3580,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3581,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3582,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3583,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3584,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3585,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3586,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3587,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3588,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x34, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x31, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3589,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3590,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3591,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3592,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3593,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3594,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3595,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3596,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3597,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3598,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x31, 0x34, 0x30, 0x30, 0x30, 0x30, 0x32, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3599,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3600,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3601,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3602,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3603,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3604,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3605,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3606,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3607,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3608,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3609,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3610,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x32, 0x31, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3611,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3612,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3613,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3614,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3615,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3616,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3617,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3618,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3619,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3620,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3621,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3622,64,"style","Trailing whitespace is superfluous."," 0x32, 0x36, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3623,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3624,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3625,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3626,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3627,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3628,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3629,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3630,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3631,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3632,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3633,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3634,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3635,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x32, 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3636,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3637,64,"style","Trailing whitespace is superfluous."," 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3638,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3639,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3640,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3641,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3642,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3643,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3644,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3645,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3646,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3647,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3648,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3649,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3650,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3651,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3652,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3653,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3654,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3655,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x30, 0x30, 0x30, 0x30, 0x32, 0x34, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3656,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3657,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3658,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3659,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3660,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3661,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3662,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3663,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3664,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3665,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3666,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3667,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3668,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, 0x35, 0x2d, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3669,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3670,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3671,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3672,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3673,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, 0x34, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3674,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3675,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3676,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x36, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3677,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3678,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3679,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3680,64,"style","Trailing whitespace is superfluous."," 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3681,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3682,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3683,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3684,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3685,64,"style","Trailing whitespace is superfluous."," 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3686,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3687,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3688,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x34, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x31, 0x54, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3689,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x3a, 0x33, 0x38, 0x3a, 0x34, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3690,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3691,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3692,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3693,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3694,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3695,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3696,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3697,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3698,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3699,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3700,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3701,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3702,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3703,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3704,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3705,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3706,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3707,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3708,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3709,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x39, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3710,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3711,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3712,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3713,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3714,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3715,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3716,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3717,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3718,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3719,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3720,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3721,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3722,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3723,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3724,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3725,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3726,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3727,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3728,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3729,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3730,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3731,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3732,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3733,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3734,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3735,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3736,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3737,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3738,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3739,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3740,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3741,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3742,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3743,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3744,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3745,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3746,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x34, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3747,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3748,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3749,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3750,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3751,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3752,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3753,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3754,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3755,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3756,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3757,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3758,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x34, 0x35, 0x37, 0x32, 0x39, 0x30, 0x35, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3759,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3760,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3761,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3762,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3763,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3764,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3765,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3766,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3767,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3768,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3769,64,"style","Trailing whitespace is superfluous."," 0x35, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3770,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3771,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3772,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3773,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3774,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3775,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3776,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3777,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3778,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3779,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3780,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3781,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3782,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3783,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3784,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3785,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3786,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3787,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3788,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3789,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3790,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3791,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3792,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3793,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x39, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3794,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3795,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3796,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3797,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3798,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3799,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3800,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3801,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3802,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x30, 0x30, 0x30, 0x30, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3803,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3804,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x39, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3805,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3806,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3807,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3808,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3809,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3810,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3811,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3812,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3813,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3814,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3815,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3816,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3817,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3818,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3819,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3820,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x39, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3821,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3822,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3823,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x35, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3824,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3825,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3826,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3827,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3828,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3829,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3830,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3831,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3832,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3833,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3834,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x54, 0x31, 0x36, 0x3a, 0x34, 0x38, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3835,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3836,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3837,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3838,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3839,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3840,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3841,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3842,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3843,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3844,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3845,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3846,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3847,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3848,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3849,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3850,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3851,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3852,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3853,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3854,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3855,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3856,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3857,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3858,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3859,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3860,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3861,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3862,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3863,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3864,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3865,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3866,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3867,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3868,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3869,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3870,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3871,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3872,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3873,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3874,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3875,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3876,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3877,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3878,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3879,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3880,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3881,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3882,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x35, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3883,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3884,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3885,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3886,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3887,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3888,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3889,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3890,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3891,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3892,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x30, 0x30, 0x30, 0x30, 0x34, 0x32, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3893,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3894,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3895,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3896,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3897,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3898,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3899,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3900,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3901,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3902,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3903,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x33, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3904,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x38, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3905,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3906,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3907,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3908,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3909,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3910,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3911,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3912,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3913,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3914,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x35, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3915,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3916,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3917,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3918,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3919,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3920,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3921,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3922,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3923,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3924,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3925,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3926,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3927,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x32, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3928,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3929,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3930,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3931,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3932,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3933,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3934,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3935,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3936,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3937,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3938,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3939,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x32, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3940,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3941,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3942,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3943,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3944,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3945,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3946,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3947,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x31, 0x33, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3948,64,"style","Trailing whitespace is superfluous."," 0x34, 0x32, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3949,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3950,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3951,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3952,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3953,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3954,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3955,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3956,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3957,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3958,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3959,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3960,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x33, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3961,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3962,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3963,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3964,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3965,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3966,64,"style","Trailing whitespace is superfluous."," 0x34, 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3967,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3968,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3969,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3970,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3971,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3972,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3973,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3974,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3975,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3976,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3977,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3978,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3979,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x35, 0x54, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3980,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x33, 0x36, 0x3a, 0x35, 0x38, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3981,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3982,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3983,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3984,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3985,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3986,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3987,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3988,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3989,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3990,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3991,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3992,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3993,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3994,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3995,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3996,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3997,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3998,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",3999,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4000,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x33, 0x37, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4001,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4002,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4003,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4004,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4005,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4006,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4007,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4008,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4009,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4010,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4011,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4012,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4013,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4014,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4015,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4016,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4017,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4018,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4019,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4020,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4021,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4022,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4023,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4024,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4025,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4026,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4027,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4028,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4029,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4030,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4031,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4032,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4033,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4034,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4035,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4036,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4037,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x33, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4038,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x37, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4039,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4040,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x33, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4041,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4042,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4043,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4044,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4045,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4046,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4047,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4048,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4049,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x31, 0x30, 0x30, 0x36, 0x37, 0x39, 0x39, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4050,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4051,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4052,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4053,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4054,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4055,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4056,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4057,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4058,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4059,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4060,64,"style","Trailing whitespace is superfluous."," 0x39, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4061,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4062,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4063,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4064,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4065,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4066,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4067,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4068,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4069,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4070,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4071,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4072,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4073,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x33, 0x37, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4074,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4075,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4076,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4077,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4078,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4079,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4080,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4081,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4082,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4083,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4084,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x37, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4085,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4086,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4087,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4088,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4089,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4090,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4091,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4092,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4093,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x30, 0x30, 0x30, 0x33, 0x37, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4094,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4095,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x37, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4096,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4097,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4098,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4099,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4100,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4101,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4102,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4103,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4104,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4105,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4106,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4107,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4108,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4109,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4110,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4111,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x37, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4112,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4113,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4114,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x39, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4115,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4116,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4117,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4118,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4119,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4120,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4121,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4122,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4123,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4124,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4125,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x30, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4126,64,"style","Trailing whitespace is superfluous."," 0x34, 0x31, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4127,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4128,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4129,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4130,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4131,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4132,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4133,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4134,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4135,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4136,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4137,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4138,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4139,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4140,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4141,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4142,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4143,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4144,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4145,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4146,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4147,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4148,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4149,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4150,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4151,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4152,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4153,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4154,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4155,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4156,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4157,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4158,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4159,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4160,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4161,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4162,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4163,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4164,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4165,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4166,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4167,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4168,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4169,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4170,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4171,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4172,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4173,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x32, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4174,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4175,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4176,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4177,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4178,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4179,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4180,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4181,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4182,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4183,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x30, 0x30, 0x30, 0x30, 0x32, 0x32, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4184,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4185,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4186,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4187,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4188,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4189,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4190,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4191,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4192,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4193,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4194,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x33, 0x38, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4195,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4196,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4197,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4198,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4199,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4200,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4201,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4202,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4203,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4204,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4205,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4206,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x32, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4207,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4208,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4209,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4210,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4211,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4212,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4213,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4214,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4215,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4216,64,"style","Trailing whitespace is superfluous."," 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4217,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4218,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4219,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4220,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4221,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4222,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4223,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4224,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4225,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4226,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4227,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4228,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4229,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4230,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4231,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, 0x32, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4232,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4233,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4234,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4235,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4236,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4237,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4238,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4239,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4240,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x32, 0x32, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4241,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4242,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4243,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4244,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4245,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4246,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4247,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4248,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4249,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4250,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4251,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4252,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4253,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x32, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4254,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4255,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4256,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4257,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4258,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x32, 0x32, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4259,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4260,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4261,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4262,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4263,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4264,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4265,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4266,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4267,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4268,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4269,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4270,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4271,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4272,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4273,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x32, 0x54, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4274,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x32, 0x31, 0x3a, 0x35, 0x33, 0x2d, 0x30, 0x34, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4275,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4276,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4277,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4278,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4279,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4280,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4281,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4282,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4283,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4284,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4285,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4286,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4287,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4288,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4289,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4290,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4291,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4292,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4293,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4294,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4295,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4296,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4297,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4298,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4299,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4300,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4301,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4302,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4303,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4304,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4305,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4306,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4307,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4308,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4309,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4310,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4311,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4312,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4313,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4314,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4315,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4316,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4317,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4318,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4319,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4320,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4321,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4322,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4323,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4324,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4325,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4326,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4327,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4328,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4329,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4330,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4331,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x31, 0x33, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4332,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4333,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4334,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4335,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4336,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4337,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4338,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4339,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4340,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4341,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4342,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4343,64,"style","Trailing whitespace is superfluous."," 0x33, 0x35, 0x37, 0x34, 0x31, 0x34, 0x34, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4344,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4345,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4346,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4347,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4348,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4349,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4350,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4351,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4352,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4353,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4354,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4355,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4356,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4357,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4358,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4359,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4360,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4361,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4362,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4363,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4364,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4365,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4366,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4367,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4368,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4369,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4370,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4371,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4372,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4373,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4374,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4375,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4376,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4377,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4378,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x30, 0x37, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4379,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4380,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4381,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4382,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4383,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4384,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4385,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4386,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x33, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4387,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4388,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4389,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x30, 0x37, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4390,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4391,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4392,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4393,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4394,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4395,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4396,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4397,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4398,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4399,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4400,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x35, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4401,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4402,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4403,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4404,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4405,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4406,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4407,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4409,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4410,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4411,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4412,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4413,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4414,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4415,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4416,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4417,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4418,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4419,64,"style","Trailing whitespace is superfluous."," 0x35, 0x54, 0x31, 0x36, 0x3a, 0x31, 0x34, 0x3a, 0x33, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4420,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4421,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4422,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4423,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4424,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4425,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4426,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4427,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4428,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4429,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4430,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4431,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4432,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4433,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4434,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4435,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4436,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4437,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4438,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4439,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4440,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4441,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4442,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4443,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4444,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4445,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4446,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4447,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4448,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4449,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4450,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4451,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4452,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4453,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4454,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4455,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4456,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4457,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4458,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4459,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4460,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4461,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4462,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4463,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4464,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4465,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4466,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4467,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4468,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4469,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4470,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4471,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4472,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4473,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4474,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4475,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4476,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4477,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x31, 0x30, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4478,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4479,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x30, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4480,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4481,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4482,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4483,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4484,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4485,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4486,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4487,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4488,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x32, 0x31, 0x31, 0x38, 0x33, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4489,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4490,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4491,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4492,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4493,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4494,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4495,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4496,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4497,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4498,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4499,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4500,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4501,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4502,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4503,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4504,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4505,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4506,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4507,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4508,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4509,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4510,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4511,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4512,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4513,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4514,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4515,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4516,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4517,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4518,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4519,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4520,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4521,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4522,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4523,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4524,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4525,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4526,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4527,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4528,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4529,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4530,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4531,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4532,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x31, 0x32, 0x30, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4533,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4534,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4535,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4536,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4537,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4538,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4539,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4540,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4541,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4542,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4543,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4544,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4545,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x32, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4546,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4547,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4548,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4549,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4550,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4551,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4552,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4553,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x33, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4554,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4555,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4556,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4557,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4558,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4559,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4560,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4561,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4562,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4563,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4564,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x36, 0x54, 0x31, 0x37, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4565,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3a, 0x32, 0x33, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4566,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4567,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4568,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4569,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4570,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4571,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4572,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4573,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4574,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4575,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4576,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4577,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4578,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4579,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4580,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4581,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4582,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4583,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4584,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4585,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4586,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4587,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4588,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4589,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4590,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4591,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4592,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4593,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4594,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4595,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4596,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4597,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4598,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4599,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4600,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4601,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4602,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4603,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4604,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4605,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4606,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4607,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4608,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4609,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4610,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4611,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4612,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x32, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4613,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4614,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4615,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4616,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4617,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4618,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4619,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4620,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4621,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4622,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x31, 0x32, 0x30, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4623,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4624,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4625,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4626,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4627,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4628,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4629,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4630,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4631,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4632,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4633,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4634,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x37, 0x37, 0x38, 0x36, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4635,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4636,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4637,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4638,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4639,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4640,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4641,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4642,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4643,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4644,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4645,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4646,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4647,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4648,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4649,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4650,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4651,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4652,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4653,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4654,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4655,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4656,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4657,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4658,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4659,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4660,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4661,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4662,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4663,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4664,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4665,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4666,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4667,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4668,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4669,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x30, 0x34, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4670,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4671,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4672,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4673,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4674,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4675,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4676,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4677,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4678,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4679,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4680,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x30, 0x34, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4681,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4682,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4683,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4684,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4685,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4686,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4687,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4688,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4689,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4690,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4691,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x33, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4692,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4693,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4694,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4695,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4696,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4697,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4698,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4699,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4700,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4701,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4702,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4703,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4704,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4705,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4706,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4707,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4708,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4709,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x32, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4710,64,"style","Trailing whitespace is superfluous."," 0x33, 0x54, 0x31, 0x37, 0x3a, 0x32, 0x33, 0x3a, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4711,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4712,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4713,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4714,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4715,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4716,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4717,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4718,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4719,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4720,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4721,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4722,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4723,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4724,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4725,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4726,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4727,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4728,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4729,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4730,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x2d, 0x32, 0x34, 0x39, 0x33, 0x32, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4731,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4732,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4733,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4734,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4735,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4736,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4737,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4738,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4739,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4740,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4741,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4742,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4743,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4744,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4745,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4746,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4747,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4748,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4749,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4750,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4751,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4752,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4753,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4754,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4755,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4756,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4757,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4758,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4759,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4760,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4761,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4762,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4763,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4764,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4765,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4766,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4767,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4768,64,"style","Trailing whitespace is superfluous."," 0x32, 0x34, 0x39, 0x33, 0x32, 0x34, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4769,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4770,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x34, 0x39, 0x33, 0x32, 0x34, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4771,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4772,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4773,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4774,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4775,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4776,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4777,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4778,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4779,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x32, 0x38, 0x37, 0x31, 0x37, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4780,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4781,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4782,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4783,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4784,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4785,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4786,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4787,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4788,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4789,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4790,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4791,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4792,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4793,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4794,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4795,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4796,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4797,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4798,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4799,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4800,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4801,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4802,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4803,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4804,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x32, 0x34, 0x39, 0x33, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4805,64,"style","Trailing whitespace is superfluous."," 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4806,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4807,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4808,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4809,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4810,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4811,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4812,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4813,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4814,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4815,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4816,64,"style","Trailing whitespace is superfluous."," 0x34, 0x39, 0x33, 0x32, 0x34, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4817,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4818,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4819,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4820,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4821,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4822,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4823,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4824,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x32, 0x32, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4825,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x32, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4826,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4827,64,"style","Trailing whitespace is superfluous."," 0x34, 0x39, 0x33, 0x32, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4828,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4829,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4830,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4831,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4832,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4833,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4834,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4835,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4836,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4837,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4838,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x35, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4839,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4840,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4841,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4842,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x32, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4843,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x32, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4844,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4845,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4846,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4847,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4848,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4849,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4850,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4851,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4852,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4853,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4854,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4855,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4856,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4857,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4858,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x35, 0x54, 0x31, 0x36, 0x3a, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4859,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3a, 0x34, 0x35, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4860,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4861,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4862,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4863,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4864,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4865,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4866,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4867,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4868,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4869,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4870,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4871,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4872,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4873,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4874,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4875,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4876,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4877,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4878,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x34, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4879,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4880,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4881,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4882,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4883,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4884,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4885,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4886,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4887,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4888,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4889,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4890,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4891,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4892,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4893,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4894,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4895,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4896,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4897,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4898,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4899,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4900,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4901,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4902,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4903,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4904,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4905,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4906,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x32, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x37, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4907,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4908,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4909,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4910,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4911,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4912,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4913,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4914,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4915,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4916,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x32, 0x30, 0x34, 0x31, 0x36, 0x35, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4917,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4918,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x34, 0x31, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4919,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4920,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4921,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4922,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4923,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4924,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4925,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4926,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4927,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4928,64,"style","Trailing whitespace is superfluous."," 0x37, 0x34, 0x38, 0x38, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4929,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4930,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4931,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4932,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4933,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4934,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4935,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4936,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4937,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4938,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4939,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4940,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4941,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4942,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4943,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4944,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4945,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4946,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4947,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4948,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4949,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4950,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4951,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x2d, 0x30, 0x34, 0x31, 0x36, 0x35, 0x33, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4952,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4953,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4954,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4955,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4956,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4957,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4958,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4959,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4960,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4961,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4962,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x34, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4963,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x33, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4964,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4965,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4966,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4967,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4968,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4969,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4970,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4971,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x31, 0x32, 0x30, 0x34, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4972,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4973,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x34, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4974,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4975,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4976,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4977,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4978,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4979,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4980,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4981,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4982,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4983,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4984,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4985,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4986,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4987,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4988,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4989,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x34, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4990,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4991,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4992,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4993,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4994,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4995,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4996,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4997,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4998,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",4999,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5000,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5001,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5002,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5003,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x54, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5004,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x33, 0x30, 0x3a, 0x32, 0x37, 0x2d, 0x30, 0x35, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5005,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5006,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5007,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5008,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5009,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5010,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5011,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5012,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5013,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5014,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5015,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5016,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5017,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5018,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5019,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5020,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5021,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5022,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5023,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5024,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x32, 0x37, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5025,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5026,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5027,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5028,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5029,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5030,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5031,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5032,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5033,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5034,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5035,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5036,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5037,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5038,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5039,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5040,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5041,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5042,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5043,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5044,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5045,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5046,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5047,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5048,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5049,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5050,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5051,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5052,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5053,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5054,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5055,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5056,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5057,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5058,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5059,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5060,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5061,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x31, 0x31, 0x33, 0x30, 0x32, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5062,64,"style","Trailing whitespace is superfluous."," 0x37, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5063,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x33, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5064,64,"style","Trailing whitespace is superfluous."," 0x32, 0x37, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5065,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5066,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5067,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5068,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5069,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5070,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5071,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5072,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5073,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x31, 0x38, 0x38, 0x32, 0x38, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5074,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5075,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5076,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5077,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5078,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5079,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5080,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5081,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5082,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5083,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5084,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5085,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5086,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5087,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5088,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5089,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5090,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5091,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5092,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5093,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5094,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5095,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5096,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x33, 0x30, 0x32, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5097,64,"style","Trailing whitespace is superfluous."," 0x37, 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5098,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5099,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5100,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5101,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5102,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5103,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5104,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5105,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5106,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5107,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5108,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x32, 0x32, 0x37, 0x34, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5109,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5110,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5111,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5112,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5113,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5114,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5115,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5116,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5117,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x32, 0x37, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5118,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5119,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x32, 0x32, 0x37, 0x34, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5120,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5121,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5122,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5123,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5124,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5125,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5126,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5127,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5128,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5129,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5130,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x38, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5131,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5132,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5133,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5134,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5135,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x32, 0x37, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5136,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5137,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5138,64,"style","Trailing whitespace is superfluous."," 0x20, 0x38, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5139,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5140,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5141,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5142,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5143,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5144,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5145,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5146,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5147,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5148,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x31, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5149,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x36, 0x3a, 0x34, 0x33, 0x3a, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5150,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5151,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5152,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5153,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5154,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5155,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5156,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5157,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5158,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5159,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5160,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5161,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5162,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5163,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5164,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5165,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5166,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5167,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5168,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5169,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x32, 0x31, 0x36, 0x35, 0x33, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5170,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5171,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5172,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5173,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5174,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5175,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5176,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5177,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5178,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5179,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5180,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5181,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5182,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5183,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5184,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5185,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5186,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5187,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5188,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5189,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5190,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5191,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5192,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5193,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5194,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5195,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5196,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5197,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5198,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5199,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5200,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5201,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5202,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5203,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5204,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5205,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5206,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5207,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x35, 0x33, 0x30, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5208,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5209,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x36, 0x35, 0x33, 0x30, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5210,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5211,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5212,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5213,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5214,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5215,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5216,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5217,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5218,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x31, 0x31, 0x31, 0x30, 0x32, 0x31, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5219,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5220,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5221,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5222,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5223,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5224,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5225,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5226,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5227,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5228,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5229,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5230,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5231,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5232,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5233,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5234,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5235,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5236,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5237,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5238,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5239,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5240,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5241,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5242,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x35, 0x33, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5243,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5244,64,"style","Trailing whitespace is superfluous."," 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5245,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5246,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5247,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5248,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5249,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5250,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5251,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5252,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5253,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x32, 0x31, 0x36, 0x35, 0x33, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5254,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5255,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5256,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5257,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5258,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5259,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5260,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5261,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5262,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x32, 0x31, 0x36, 0x35, 0x33, 0x30, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5263,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5264,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x32, 0x31, 0x36, 0x35, 0x33, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5265,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5266,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5267,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5268,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5269,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5270,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5271,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5272,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5273,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5274,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5275,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5276,64,"style","Trailing whitespace is superfluous."," 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5277,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5278,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5279,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5280,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x32, 0x31, 0x36, 0x35, 0x33, 0x30, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5281,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5282,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5283,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5284,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5285,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5286,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5287,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5288,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5289,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5290,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5291,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5292,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5293,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5294,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x39, 0x54, 0x31, 0x36, 0x3a, 0x32, 0x31, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5295,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5296,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5297,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5298,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5299,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5300,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5301,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5302,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5303,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5304,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5305,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5306,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5307,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5308,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5309,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5310,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5311,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5312,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5313,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5314,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x39, 0x32, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5315,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5316,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5317,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5318,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5319,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5320,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5321,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5322,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5323,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5324,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5325,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5326,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5327,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5328,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5329,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5330,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5331,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5332,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5333,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5334,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5335,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5336,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5337,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5338,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5339,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5340,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5341,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5342,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x34, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5343,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5344,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5345,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5346,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5347,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5348,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5349,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5350,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5351,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5352,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x31, 0x34, 0x39, 0x32, 0x36, 0x32, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5353,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5354,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x31, 0x34, 0x39, 0x32, 0x36, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5355,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5356,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5357,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5358,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5359,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5360,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5361,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5362,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5363,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x31, 0x38, 0x36, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5364,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5365,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5366,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5367,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5368,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5369,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5370,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5371,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5372,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5373,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5374,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5375,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5376,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5377,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5378,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5379,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5380,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5381,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5382,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5383,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5384,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5385,64,"style","Trailing whitespace is superfluous."," 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5386,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5387,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5388,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5389,64,"style","Trailing whitespace is superfluous."," 0x32, 0x36, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5390,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5391,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5392,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5393,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5394,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5395,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5396,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5397,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5398,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5399,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5400,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x39, 0x32, 0x36, 0x32, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5401,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5402,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5403,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5404,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5405,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5406,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5407,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5408,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5409,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x39, 0x32, 0x36, 0x32, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5410,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5411,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x39, 0x32, 0x36, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5412,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5413,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5414,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5415,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5416,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5417,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5418,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5419,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5420,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5421,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5422,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x34, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5423,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5424,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5425,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5426,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5427,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x39, 0x32, 0x36, 0x32, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5428,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5429,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5430,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5431,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5432,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5433,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5434,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5435,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5436,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5437,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5438,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5439,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5440,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5441,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5442,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x34, 0x54, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5443,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x35, 0x36, 0x3a, 0x30, 0x32, 0x2d, 0x30, 0x34, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5444,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5445,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5446,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5447,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5448,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5449,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5450,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5451,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5452,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5453,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5454,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5455,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5456,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5457,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5458,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5459,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5460,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5461,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5462,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5463,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x39, 0x35, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5464,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5465,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5466,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5467,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5468,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5469,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5470,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5471,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5472,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5473,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5474,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5475,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5476,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5477,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5478,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5479,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5480,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5481,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5482,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5483,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5484,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5485,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5486,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5487,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5488,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5489,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5490,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5491,64,"style","Trailing whitespace is superfluous."," 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5492,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5493,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5494,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5495,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5496,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5497,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5498,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5499,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5500,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x31, 0x31, 0x30, 0x32, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5501,64,"style","Trailing whitespace is superfluous."," 0x35, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5502,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5503,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5504,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5505,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5506,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5507,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5508,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5509,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5510,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5511,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5512,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x37, 0x39, 0x35, 0x39, 0x31, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5513,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5514,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5515,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5516,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5517,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5518,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5519,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5520,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5521,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5522,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x35, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5523,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5524,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5525,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5526,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5527,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5528,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5529,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5530,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5531,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5532,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5533,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5534,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5535,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5536,64,"style","Trailing whitespace is superfluous."," 0x35, 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5537,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5538,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5539,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5540,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5541,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5542,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5543,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5544,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5545,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5546,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5547,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x35, 0x39, 0x35, 0x34, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5548,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5549,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5550,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5551,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5552,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5553,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5554,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5555,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5556,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x39, 0x35, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5557,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5558,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x35, 0x39, 0x35, 0x34, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5559,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5560,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5561,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5562,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5563,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5564,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5565,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5566,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5567,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5568,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5569,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x37, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5570,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5571,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5572,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5573,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5574,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x39, 0x35, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5575,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5576,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5577,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5578,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5579,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5580,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5581,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5582,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5583,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5584,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5585,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5586,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5587,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5588,64,"style","Trailing whitespace is superfluous."," 0x37, 0x54, 0x31, 0x37, 0x3a, 0x32, 0x35, 0x3a, 0x34, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5589,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5590,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5591,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5592,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5593,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5594,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5595,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5596,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5597,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5598,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5599,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5600,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5601,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5602,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5603,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5604,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5605,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5606,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5607,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5608,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x32, 0x35, 0x32, 0x31, 0x37, 0x31, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5609,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5610,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5611,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5612,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5613,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5614,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5615,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5616,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5617,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5618,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5619,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5620,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5621,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5622,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5623,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5624,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5625,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5626,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5627,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5628,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5629,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5630,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5631,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5632,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5633,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5634,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5635,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5636,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5637,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5638,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5639,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5640,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5641,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5642,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5643,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5644,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5645,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5646,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x32, 0x31, 0x37, 0x31, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5647,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5648,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x35, 0x32, 0x31, 0x37, 0x31, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5649,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5650,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5651,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5652,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5653,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5654,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5655,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5656,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5657,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x30, 0x31, 0x31, 0x37, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5658,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5659,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5660,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5661,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5662,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5663,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5664,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5665,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5666,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5667,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5668,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5669,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5670,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5671,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5672,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5673,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5674,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5675,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5676,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5677,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5678,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5679,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5680,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5681,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x35, 0x32, 0x31, 0x37, 0x31, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5682,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5683,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5684,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5685,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5686,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5687,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5688,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5689,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5690,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5691,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5692,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x35, 0x32, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5693,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5694,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5695,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5696,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5697,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5698,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5699,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5700,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5701,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x30, 0x32, 0x35, 0x32, 0x31, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5702,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5703,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x35, 0x32, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5704,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5705,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5706,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5707,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5708,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5709,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5710,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5711,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5712,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5713,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5714,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5715,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5716,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5717,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5718,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5719,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x35, 0x32, 0x31, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5720,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5721,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5722,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x33, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5723,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5724,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5725,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5726,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5727,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5728,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5729,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5730,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5731,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5732,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5733,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x38, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5734,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x3a, 0x32, 0x36, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5735,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5736,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5737,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5738,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5739,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5740,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5741,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5742,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5743,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5744,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5745,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5746,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5747,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5748,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5749,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5750,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5751,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5752,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5753,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5754,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x34, 0x38, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5755,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5756,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5757,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5758,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5759,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5760,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5761,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5762,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5763,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5764,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5765,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5766,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5767,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5768,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5769,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5770,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5771,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5772,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5773,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5774,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5775,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5776,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5777,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5778,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5779,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5780,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5781,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5782,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5783,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5784,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5785,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5786,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5787,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5788,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5789,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5790,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5791,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x30, 0x31, 0x38, 0x33, 0x34, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5792,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5793,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x31, 0x38, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5794,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5795,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5796,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5797,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5798,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5799,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5800,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5801,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5802,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5803,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x32, 0x30, 0x37, 0x32, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5804,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5805,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5806,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5807,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5808,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5809,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5810,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5811,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5812,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5813,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5814,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5815,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5816,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5817,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5818,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5819,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5820,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5821,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5822,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5823,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5824,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5825,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5826,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x31, 0x38, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5827,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5828,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5829,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5830,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5831,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5832,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5833,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5834,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5835,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5836,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5837,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5838,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x33, 0x34, 0x34, 0x38, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5839,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5840,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5841,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5842,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5843,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5844,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5845,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5846,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5847,64,"style","Trailing whitespace is superfluous."," 0x38, 0x33, 0x34, 0x34, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5848,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5849,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x33, 0x34, 0x34, 0x38, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5850,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5851,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5852,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5853,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5854,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5855,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5856,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5857,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5858,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5859,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5860,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5861,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5862,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5863,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5864,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5865,64,"style","Trailing whitespace is superfluous."," 0x38, 0x33, 0x34, 0x34, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5866,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5867,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5868,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5869,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5870,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5871,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5872,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5873,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5874,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5875,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5876,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5877,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5878,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5879,64,"style","Trailing whitespace is superfluous."," 0x39, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x37, 0x3a, 0x32, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5880,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5881,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5882,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5883,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5884,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5885,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5886,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5887,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5888,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5889,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5890,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5891,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5892,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5893,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5894,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5895,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5896,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5897,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5898,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5899,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x30, 0x30, 0x31, 0x35, 0x37, 0x39, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5900,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5901,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5902,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5903,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5904,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5905,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5906,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5907,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5908,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5909,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5910,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5911,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5912,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5913,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5914,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5915,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5916,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5917,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5918,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5919,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5920,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5921,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5922,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5923,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5924,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5925,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5926,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5927,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5928,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5929,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5930,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5931,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5932,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5933,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5934,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5935,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5936,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5937,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x35, 0x37, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5938,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x30, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5939,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x31, 0x35, 0x37, 0x39, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5940,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5941,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5942,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5943,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5944,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5945,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5946,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5947,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5948,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x30, 0x38, 0x36, 0x37, 0x34, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5949,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5950,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5951,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5952,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5953,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5954,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5955,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5956,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5957,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5958,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5959,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5960,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x35, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5961,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5962,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5963,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5964,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5965,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5966,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5967,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5968,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5969,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5970,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5971,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5972,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5973,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, 0x31, 0x35, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5974,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5975,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5976,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5977,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5978,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5979,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5980,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5981,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5982,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5983,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5984,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x30, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5985,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x37, 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5986,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5987,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5988,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5989,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5990,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5991,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5992,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5993,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x33, 0x30, 0x31, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5994,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5995,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x30, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5996,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x37, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5997,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5998,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",5999,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6000,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6001,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6002,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6003,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6004,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6005,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6006,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6007,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x38, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6008,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6009,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6010,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6011,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x30, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6012,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6013,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6014,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6015,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6016,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6017,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6018,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6019,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6020,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6021,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6022,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6023,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6024,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6025,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6026,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6027,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x38, 0x54, 0x31, 0x37, 0x3a, 0x31, 0x37, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6028,64,"style","Trailing whitespace is superfluous."," 0x33, 0x38, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6029,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6030,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6031,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6032,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6033,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6034,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6035,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6036,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6037,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6038,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6039,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6040,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6041,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6042,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6043,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6044,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6045,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6046,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6047,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x31, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6048,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6049,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6050,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6051,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6052,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6053,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x6d, 0x65, 0x6e, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6054,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x41, 0x6d, 0x65, 0x6e, 0x64, 0x5d, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6055,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x6e, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6056,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6057,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6058,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6059,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6060,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6061,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6062,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6063,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6064,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6065,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6066,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6067,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6068,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6069,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6070,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6071,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6072,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6073,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6074,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6075,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6076,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6077,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6078,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6079,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6080,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6081,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6082,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6083,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6084,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6085,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6086,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6087,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6088,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x30, 0x31, 0x30, 0x32, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6089,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6090,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x31, 0x30, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6091,64,"style","Trailing whitespace is superfluous."," 0x35, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6092,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6093,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6094,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6095,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6096,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x2f, 0x41, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6097,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6098,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6099,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6100,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x37, 0x38, 0x37, 0x39, 0x31, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6101,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6102,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6103,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6104,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6105,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6106,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6107,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6108,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6109,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6110,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6111,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6112,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6113,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6114,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6115,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6116,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6117,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6118,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6119,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6120,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x32, 0x30, 0x35, 0x32, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6121,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6122,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6123,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6124,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6125,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6126,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6127,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6128,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6129,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x32, 0x30, 0x35, 0x32, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6130,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6131,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x32, 0x30, 0x35, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6132,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6133,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6134,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6135,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6136,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6137,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6138,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6139,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6140,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6141,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6142,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6143,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6144,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6145,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6146,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6147,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x32, 0x30, 0x35, 0x32, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6148,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6149,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6150,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x37, 0x32, 0x33, 0x20, 0x4b, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6151,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6152,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6153,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x2f, 0x41, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6154,64,"style","Trailing whitespace is superfluous."," 0x41, 0x6d, 0x65, 0x6e, 0x64, 0x5d, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6155,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6156,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6157,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6158,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6159,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6160,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6161,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6162,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x30, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x31, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6163,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6164,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6165,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6166,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6167,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6168,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6169,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6170,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6171,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6172,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6173,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6174,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6175,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6176,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6177,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6178,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6179,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6180,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6181,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6182,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6183,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6184,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6185,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6186,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6187,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6188,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6189,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6190,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6191,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6192,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6193,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6194,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6195,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6196,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6197,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6198,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6199,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6200,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6201,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6202,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6203,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6204,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6205,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6206,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6207,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6208,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6209,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6210,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x39, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6211,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6212,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6213,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6214,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6215,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6216,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6217,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6218,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6219,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6220,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x32, 0x35, 0x38, 0x35, 0x36, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6221,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6222,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x35, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6223,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6224,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6225,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6226,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6227,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6228,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6229,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6230,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6231,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x30, 0x35, 0x38, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6232,64,"style","Trailing whitespace is superfluous."," 0x36, 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6233,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6234,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6235,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6236,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6237,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6238,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6239,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6240,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6241,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6242,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6243,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6244,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6245,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6246,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6247,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6248,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6249,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6250,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6251,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6252,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6253,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6254,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6255,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x35, 0x38, 0x35, 0x36, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6256,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6257,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6258,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6259,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6260,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6261,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6262,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6263,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6264,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6265,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6266,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6267,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6268,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6269,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6270,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6271,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6272,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6273,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6274,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6275,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x30, 0x30, 0x32, 0x35, 0x38, 0x35, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6276,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6277,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6278,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6279,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6280,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6281,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6282,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6283,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6284,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6285,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6286,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6287,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6288,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6289,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6290,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6291,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6292,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6293,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x35, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6294,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6295,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6296,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x33, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6297,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6298,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6299,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6300,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6301,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6302,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6303,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6304,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6305,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6306,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6307,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x39, 0x54, 0x31, 0x36, 0x3a, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6308,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x35, 0x32, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6309,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6310,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6311,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6312,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6313,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6314,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6315,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6316,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6317,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6318,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6319,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6320,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6321,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6322,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6323,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6324,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6325,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6326,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6327,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x32, 0x33, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6328,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6329,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6330,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6331,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6332,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6333,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6334,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6335,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6336,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6337,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6338,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6339,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6340,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6341,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6342,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6343,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6344,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6345,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6346,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6347,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6348,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6349,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6350,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6351,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6352,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6353,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6354,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6355,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6356,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6357,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6358,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6359,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6360,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6361,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6362,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6363,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6364,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6365,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x30, 0x39, 0x32, 0x33, 0x30, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6366,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6367,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x32, 0x33, 0x30, 0x37, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6368,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6369,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6370,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6371,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6372,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6373,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6374,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6375,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6376,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6377,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x32, 0x35, 0x38, 0x37, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6378,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6379,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6380,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6381,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6382,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6383,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6384,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6385,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6386,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6387,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x33, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6388,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6389,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6390,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6391,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6392,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6393,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6394,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6395,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6396,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6397,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6398,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6399,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6400,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x39, 0x2d, 0x32, 0x33, 0x30, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6401,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6402,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6403,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6404,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6405,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6406,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6407,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6408,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6409,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6410,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6411,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x32, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6412,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x38, 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6413,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6414,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6415,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6416,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6417,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6418,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6419,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6420,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, 0x32, 0x33, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6421,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6422,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x32, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6423,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x38, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6424,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6425,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6426,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6427,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6428,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6429,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6430,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6431,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6432,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6433,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6434,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x30, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6435,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6436,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6437,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6438,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x32, 0x33, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6439,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6440,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6441,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6442,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6443,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6444,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6445,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6446,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6447,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6448,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6449,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6450,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6451,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6452,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x30, 0x54, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6453,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x34, 0x39, 0x3a, 0x33, 0x36, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6454,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6455,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6456,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6457,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6458,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6459,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6460,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6461,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6462,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6463,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6464,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6465,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6466,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6467,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6468,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6469,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6470,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6471,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6472,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6473,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x30, 0x37, 0x35, 0x39, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6474,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6475,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6476,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6477,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6478,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6479,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6480,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6481,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6482,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6483,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6484,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6485,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6486,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6487,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6488,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6489,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6490,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6491,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6492,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6493,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6494,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6495,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6496,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6497,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6498,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6499,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6500,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6501,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6502,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6503,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6504,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6505,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6506,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6507,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6508,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6509,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6510,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, 0x31, 0x37, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6511,64,"style","Trailing whitespace is superfluous."," 0x37, 0x35, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6512,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6513,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x35, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6514,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6515,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6516,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6517,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6518,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6519,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6520,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6521,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6522,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x31, 0x30, 0x30, 0x30, 0x35, 0x35, 0x37, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6523,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6524,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6525,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6526,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6527,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6528,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6529,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6530,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6531,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6532,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6533,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6534,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6535,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6536,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6537,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6538,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6539,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6540,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6541,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6542,64,"style","Trailing whitespace is superfluous."," 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6543,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6544,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6545,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x31, 0x37, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6546,64,"style","Trailing whitespace is superfluous."," 0x37, 0x35, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6547,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6548,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6549,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6550,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6551,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6552,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6553,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6554,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6555,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6556,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6557,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x30, 0x37, 0x35, 0x39, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6558,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6559,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6560,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6561,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6562,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6563,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6564,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6565,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6566,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x30, 0x37, 0x35, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6567,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6568,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x30, 0x37, 0x35, 0x39, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6569,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6570,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6571,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6572,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6573,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6574,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6575,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6576,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6577,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6578,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6579,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x30, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6580,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6581,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6582,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6583,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6584,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x30, 0x37, 0x35, 0x39, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6585,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6586,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6587,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6588,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6589,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6590,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6591,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6592,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6593,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6594,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6595,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6596,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6597,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6598,64,"style","Trailing whitespace is superfluous."," 0x30, 0x54, 0x31, 0x36, 0x3a, 0x35, 0x31, 0x3a, 0x33, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6599,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6600,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6601,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6602,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6603,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6604,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6605,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6606,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6607,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6608,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6609,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6610,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6611,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6612,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6613,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6614,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6615,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6616,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6617,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6618,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x2d, 0x31, 0x31, 0x36, 0x38, 0x39, 0x35, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6619,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6620,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6621,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6622,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6623,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6624,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6625,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6626,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6627,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6628,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6629,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6630,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6631,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6632,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6633,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6634,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6635,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6636,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6637,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6638,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6639,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6640,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6641,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6642,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6643,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6644,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6645,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6646,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6647,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6648,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6649,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6650,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6651,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6652,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6653,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6654,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6655,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6656,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x36, 0x38, 0x39, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6657,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6658,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x36, 0x38, 0x39, 0x35, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6659,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6660,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6661,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6662,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6663,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6664,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6665,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6666,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6667,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x39, 0x38, 0x34, 0x36, 0x36, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6668,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6669,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6670,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6671,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6672,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6673,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6674,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6675,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6676,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6677,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6678,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6679,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x32, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6680,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6681,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6682,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6683,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6684,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6685,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6686,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6687,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6688,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x31, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6689,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6690,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6691,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6692,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6693,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6694,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6695,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6696,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6697,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, 0x31, 0x31, 0x36, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6698,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6699,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x31, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6700,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6701,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6702,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6703,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6704,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6705,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6706,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6707,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6708,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6709,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6710,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6711,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6712,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6713,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6714,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6715,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x31, 0x31, 0x36, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6716,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6717,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6718,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6719,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6720,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6721,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6722,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6723,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6724,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6725,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6726,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6727,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6728,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6729,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6730,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6731,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x54, 0x32, 0x30, 0x3a, 0x35, 0x38, 0x3a, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6732,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6733,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6734,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6735,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6736,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6737,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6738,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6739,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6740,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6741,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6742,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6743,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6744,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6745,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6746,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6747,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6748,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6749,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6750,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6751,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x39, 0x2d, 0x30, 0x31, 0x38, 0x39, 0x32, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6752,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6753,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6754,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6755,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6756,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6757,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6758,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6759,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6760,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6761,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6762,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6763,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6764,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6765,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6766,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6767,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6768,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6769,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6770,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6771,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6772,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6773,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6774,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6775,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6776,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6777,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6778,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6779,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x34, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6780,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6781,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6782,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6783,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6784,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6785,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6786,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6787,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6788,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6789,64,"style","Trailing whitespace is superfluous."," 0x39, 0x30, 0x31, 0x38, 0x39, 0x32, 0x31, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6790,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6791,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x31, 0x38, 0x39, 0x32, 0x31, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6792,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6793,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6794,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6795,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6796,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6797,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6798,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6799,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6800,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x39, 0x35, 0x36, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6801,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6802,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6803,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6804,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6805,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6806,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6807,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6808,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6809,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6810,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6811,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6812,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6813,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6814,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6815,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6816,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6817,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6818,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6819,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6820,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x2d, 0x30, 0x31, 0x38, 0x39, 0x32, 0x31, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6821,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6822,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6823,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6824,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6825,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6826,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6827,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6828,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6829,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x30, 0x31, 0x38, 0x39, 0x32, 0x31, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6830,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6831,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x2d, 0x30, 0x31, 0x38, 0x39, 0x32, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6832,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6833,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6834,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6835,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6836,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6837,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6838,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6839,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6840,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6841,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6842,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6843,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6844,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6845,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6846,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6847,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x31, 0x38, 0x39, 0x32, 0x31, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6848,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6849,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6850,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6851,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6852,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6853,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6854,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6855,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6856,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6857,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6858,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6859,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6860,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6861,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x54, 0x31, 0x37, 0x3a, 0x31, 0x33, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6862,64,"style","Trailing whitespace is superfluous."," 0x32, 0x36, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6863,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6864,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6865,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6866,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6867,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6868,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6869,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6870,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6871,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6872,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6873,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6874,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6875,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6876,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6877,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6878,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6879,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6880,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6881,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x31, 0x39, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6882,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6883,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6884,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6885,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6886,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6887,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6888,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6889,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6890,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6891,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6892,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6893,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6894,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6895,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6896,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6897,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6898,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6899,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6900,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6901,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6902,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6903,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6904,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6905,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6906,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6907,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6908,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6909,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x36, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6910,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6911,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6912,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6913,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6914,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6915,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6916,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6917,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6918,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6919,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x30, 0x31, 0x39, 0x36, 0x35, 0x31, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6920,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6921,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x30, 0x31, 0x39, 0x36, 0x35, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6922,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6923,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6924,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6925,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6926,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6927,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6928,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6929,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6930,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x38, 0x31, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6931,64,"style","Trailing whitespace is superfluous."," 0x36, 0x36, 0x33, 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6932,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6933,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6934,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6935,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6936,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6937,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6938,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6939,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6940,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6941,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x36, 0x30, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6942,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6943,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6944,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6945,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6946,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6947,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6948,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6949,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6950,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6951,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6952,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6953,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6954,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6955,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6956,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6957,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6958,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6959,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x30, 0x38, 0x30, 0x31, 0x39, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6960,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6961,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6962,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6963,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6964,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6965,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6966,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6967,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6968,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6969,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6970,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6971,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6972,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6973,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6974,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6975,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6976,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6977,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x31, 0x39, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6978,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6979,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6980,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6981,64,"style","Trailing whitespace is superfluous."," 0x30, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6982,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6983,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6984,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6985,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6986,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6987,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6988,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6989,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6990,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6991,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x36, 0x54, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6992,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x3a, 0x33, 0x35, 0x3a, 0x30, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6993,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6994,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6995,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6996,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6997,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6998,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",6999,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7000,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7001,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7002,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7003,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7004,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7005,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7006,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7007,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7008,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7009,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7010,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7011,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7012,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x33, 0x39, 0x39, 0x31, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7013,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7014,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7015,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7016,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7017,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7018,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7019,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7020,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7021,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7022,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7023,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7024,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7025,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7026,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7027,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7028,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7029,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7030,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7031,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7032,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7033,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7034,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7035,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7036,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7037,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7038,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7039,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x38, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7040,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7041,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7042,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7043,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7044,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7045,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7046,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7047,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7048,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7049,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x38, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7050,64,"style","Trailing whitespace is superfluous."," 0x33, 0x39, 0x39, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7051,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7052,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x39, 0x39, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7053,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7054,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7055,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7056,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7057,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7058,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7059,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7060,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7061,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x38, 0x39, 0x38, 0x38, 0x38, 0x36, 0x38, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7062,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7063,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7064,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7065,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7066,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7067,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7068,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7069,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7070,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7071,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7072,64,"style","Trailing whitespace is superfluous."," 0x35, 0x35, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7073,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7074,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7075,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7076,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7077,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7078,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7079,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7080,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7081,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x31, 0x33, 0x39, 0x39, 0x31, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7082,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7083,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7084,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7085,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7086,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7087,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7088,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7089,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7090,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x31, 0x33, 0x39, 0x39, 0x31, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7091,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7092,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x31, 0x33, 0x39, 0x39, 0x31, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7093,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7094,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7095,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7096,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7097,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7098,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7099,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7100,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7101,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7102,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7103,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7104,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7105,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7106,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7107,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7108,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x33, 0x39, 0x39, 0x31, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7109,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7110,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7111,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x36, 0x35, 0x35, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7112,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7113,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7114,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7115,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7116,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7117,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7118,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7119,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7120,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7121,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7122,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x34, 0x54, 0x31, 0x37, 0x3a, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7123,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x31, 0x39, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7124,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7125,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7126,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7127,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7128,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7129,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7130,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7131,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7132,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7133,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7134,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7135,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7136,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7137,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7138,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7139,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7140,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7141,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7142,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7143,64,"style","Trailing whitespace is superfluous."," 0x39, 0x30, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7144,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7145,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7146,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7147,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7148,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7149,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7150,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7151,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7152,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7153,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7154,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7155,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7156,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7157,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7158,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7159,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7160,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7161,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7162,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7163,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7164,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7165,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7166,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7167,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7168,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7169,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7170,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7171,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7172,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7173,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7174,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7175,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7176,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7177,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7178,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7179,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7180,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x38, 0x30, 0x30, 0x30, 0x32, 0x39, 0x30, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7181,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7182,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x32, 0x39, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7183,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7184,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7185,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7186,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7187,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7188,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7189,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7190,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7191,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x38, 0x38, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7192,64,"style","Trailing whitespace is superfluous."," 0x39, 0x30, 0x34, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7193,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7194,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7195,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7196,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7197,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7198,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7199,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7200,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7201,64,"style","Trailing whitespace is superfluous."," 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7202,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7203,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7204,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7205,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7206,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7207,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7208,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7209,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7210,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7211,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7212,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7213,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x32, 0x39, 0x30, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7214,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7215,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7216,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7217,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7218,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7219,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7220,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7221,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, 0x38, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7222,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x39, 0x30, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7223,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7224,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x32, 0x39, 0x30, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7225,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7226,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7227,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7228,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7229,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7230,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7231,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7232,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7233,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7234,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7235,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x33, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7236,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7237,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7238,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7239,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7240,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x39, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7241,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7242,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7243,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7244,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7245,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7246,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7247,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7248,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7249,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7250,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7251,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7252,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7253,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7254,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7255,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x33, 0x54, 0x31, 0x37, 0x3a, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7256,64,"style","Trailing whitespace is superfluous."," 0x37, 0x3a, 0x32, 0x34, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7257,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7258,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7259,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7260,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7261,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7262,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7263,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7264,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7265,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7266,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7267,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7268,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7269,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7270,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7271,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7272,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7273,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7274,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7275,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7276,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7277,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7278,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7279,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7280,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7281,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7282,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7283,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7284,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7285,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7286,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7287,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7288,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7289,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7290,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7291,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7292,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7293,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7294,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7295,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7296,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7297,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7298,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7299,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7300,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7301,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7302,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7303,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x35, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7304,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7305,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7306,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7307,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7308,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7309,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7310,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7311,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7312,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7313,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x30, 0x38, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7314,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7315,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7316,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7317,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7318,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7319,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7320,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7321,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7322,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7323,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7324,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x38, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7325,64,"style","Trailing whitespace is superfluous."," 0x37, 0x33, 0x36, 0x39, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7326,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7327,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7328,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7329,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7330,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7331,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7332,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7333,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7334,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7335,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x36, 0x32, 0x35, 0x20, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7336,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7337,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7338,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7339,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7340,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7341,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7342,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7343,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7344,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7345,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7346,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7347,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7348,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7349,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7350,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7351,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7352,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7353,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, 0x38, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7354,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7355,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7356,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7357,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7358,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7359,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7360,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7361,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7362,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7363,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7364,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7365,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7366,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7367,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x35, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7368,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7369,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7370,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7371,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7372,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7373,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7374,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7375,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7376,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7377,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7378,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7379,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7380,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7381,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7382,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7383,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7384,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7385,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7386,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x38, 0x3a, 0x33, 0x38, 0x3a, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7387,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7388,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7389,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7390,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7391,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7392,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7393,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7394,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7395,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7396,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7397,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7398,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7399,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7400,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7401,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7402,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7403,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7404,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7405,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7406,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x32, 0x33, 0x30, 0x30, 0x35, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7407,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7408,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7409,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7410,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7411,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7412,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7413,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7414,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7415,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7416,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7417,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7418,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7419,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7420,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7421,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7422,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7423,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7424,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7425,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7426,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7427,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7428,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7429,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7430,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7431,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7432,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7433,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7434,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7435,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7436,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7437,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7438,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7439,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7440,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7441,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7442,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7443,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x37, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7444,64,"style","Trailing whitespace is superfluous."," 0x32, 0x33, 0x30, 0x30, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7445,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7446,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x33, 0x30, 0x30, 0x35, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7447,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7448,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7449,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7450,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7451,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7452,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7453,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7454,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7455,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x37, 0x31, 0x32, 0x31, 0x38, 0x34, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7456,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7457,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7458,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7459,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7460,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7461,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7462,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7463,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7464,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7465,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7466,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x36, 0x37, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7467,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7468,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7469,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7470,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7471,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7472,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7473,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7474,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7475,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x32, 0x33, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7476,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7477,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7478,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7479,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7480,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7481,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7482,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7483,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7484,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x37, 0x30, 0x32, 0x33, 0x30, 0x30, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7485,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7486,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x32, 0x33, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7487,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7488,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7489,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7490,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7491,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7492,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7493,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7494,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7495,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7496,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7497,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7498,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7499,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7500,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7501,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7502,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x30, 0x32, 0x33, 0x30, 0x30, 0x35, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7503,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7504,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7505,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x36, 0x37, 0x36, 0x20, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7506,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7507,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7508,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7509,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7510,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7511,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7512,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7513,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7514,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7515,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7516,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x36, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7517,64,"style","Trailing whitespace is superfluous."," 0x34, 0x31, 0x3a, 0x30, 0x38, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7518,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7519,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7520,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7521,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7522,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7523,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7524,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7525,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7526,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7527,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7528,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7529,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7530,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7531,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7532,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7533,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7534,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7535,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7536,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7537,64,"style","Trailing whitespace is superfluous."," 0x36, 0x39, 0x39, 0x35, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7538,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7539,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7540,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7541,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7542,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7543,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7544,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7545,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7546,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7547,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7548,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7549,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7550,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7551,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7552,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7553,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7554,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7555,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7556,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7557,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7558,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7559,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7560,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7561,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7562,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7563,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7564,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x37, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7565,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7566,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7567,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7568,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7569,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7570,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7571,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7572,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7573,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7574,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x30, 0x37, 0x30, 0x31, 0x36, 0x39, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7575,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7576,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x36, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7577,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7578,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7579,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7580,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7581,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7582,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7583,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7584,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7585,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7586,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x32, 0x38, 0x33, 0x39, 0x31, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7587,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7588,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7589,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7590,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7591,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7592,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7593,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7594,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7595,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7596,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x37, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7597,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7598,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7599,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7600,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7601,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7602,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7603,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7604,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7605,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7606,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x39, 0x39, 0x35, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7607,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7608,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7609,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7610,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7611,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7612,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7613,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7614,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x37, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7615,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x39, 0x39, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7616,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7617,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x39, 0x39, 0x35, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7618,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7619,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7620,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7621,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7622,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7623,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7624,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7625,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7626,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7627,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7628,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x36, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7629,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7630,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7631,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7632,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7633,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x39, 0x39, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7634,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7635,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7636,64,"style","Trailing whitespace is superfluous."," 0x20, 0x38, 0x37, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7637,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7638,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7639,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7640,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7641,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7642,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7643,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7644,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7645,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7646,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7647,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x54, 0x31, 0x36, 0x3a, 0x34, 0x37, 0x3a, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7648,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7649,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7650,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7651,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7652,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7653,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7654,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7655,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7656,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7657,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7658,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7659,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7660,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7661,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7662,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7663,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7664,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7665,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7666,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7667,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x32, 0x35, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7668,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7669,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7670,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7671,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7672,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7673,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7674,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7675,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7676,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7677,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7678,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7679,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7680,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7681,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7682,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7683,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7684,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7685,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7686,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7687,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7688,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7689,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7690,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7691,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7692,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7693,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7694,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7695,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x33, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7696,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7697,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7698,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7699,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7700,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7701,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7702,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7703,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7704,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7705,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x31, 0x32, 0x35, 0x32, 0x38, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7706,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7707,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x31, 0x32, 0x35, 0x32, 0x38, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7708,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7709,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7710,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7711,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7712,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7713,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7714,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7715,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7716,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x37, 0x38, 0x38, 0x35, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7717,64,"style","Trailing whitespace is superfluous."," 0x38, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7718,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7719,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7720,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7721,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7722,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7723,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7724,64,"style","Trailing whitespace is superfluous."," 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7725,64,"style","Trailing whitespace is superfluous."," 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7726,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7727,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7728,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7729,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7730,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7731,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7732,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7733,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7734,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7735,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7736,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7737,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7738,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x32, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7739,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7740,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7741,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7742,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7743,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7744,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7745,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7746,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x37, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7747,64,"style","Trailing whitespace is superfluous."," 0x35, 0x32, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7748,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7749,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x32, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7750,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7751,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7752,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7753,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7754,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7755,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7756,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7757,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7758,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7759,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7760,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x33, 0x30, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7761,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7762,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7763,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7764,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7765,64,"style","Trailing whitespace is superfluous."," 0x35, 0x32, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7766,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7767,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7768,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7769,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7770,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7771,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7772,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7773,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7774,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7775,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7776,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7777,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7778,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7779,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7780,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x39, 0x54, 0x32, 0x31, 0x3a, 0x32, 0x36, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7781,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7782,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7783,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7784,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7785,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7786,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7787,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7788,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7789,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7790,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7791,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7792,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7793,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7794,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7795,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7796,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7797,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7798,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7799,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7800,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x30, 0x32, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7801,64,"style","Trailing whitespace is superfluous."," 0x37, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7802,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7803,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7804,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7805,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7806,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7807,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7808,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7809,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7810,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7811,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7812,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7813,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7814,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7815,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7816,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7817,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7818,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7819,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7820,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7821,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7822,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7823,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7824,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7825,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7826,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7827,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7828,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7829,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7830,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7831,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7832,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7833,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7834,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7835,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7836,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7837,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7838,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x30, 0x30, 0x32, 0x31, 0x33, 0x37, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7839,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7840,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x30, 0x30, 0x32, 0x31, 0x33, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7841,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7842,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7843,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7844,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7845,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7846,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7847,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7848,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7849,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x37, 0x35, 0x38, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7850,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7851,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7852,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7853,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7854,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7855,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7856,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7857,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7858,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7859,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7860,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x37, 0x35, 0x34, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7861,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7862,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7863,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7864,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7865,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7866,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7867,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7868,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7869,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x30, 0x32, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7870,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7871,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7872,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7873,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7874,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7875,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7876,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7877,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7878,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x30, 0x37, 0x30, 0x30, 0x32, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7879,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7880,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x30, 0x32, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7881,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7882,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7883,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7884,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7885,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7886,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7887,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7888,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7889,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7890,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7891,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7892,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7893,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7894,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7895,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7896,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x30, 0x32, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7897,64,"style","Trailing whitespace is superfluous."," 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7898,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7899,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, 0x35, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7900,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7901,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7902,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7903,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7904,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7905,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7906,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7907,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7908,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7909,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7910,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x54, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7911,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3a, 0x34, 0x38, 0x3a, 0x32, 0x33, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7912,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7913,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7914,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7915,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7916,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7917,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7918,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7919,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7920,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7921,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7922,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7923,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7924,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7925,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7926,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7927,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7928,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7929,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7930,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7931,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x30, 0x36, 0x32, 0x36, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7932,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7933,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7934,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7935,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7936,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7937,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7938,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7939,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7940,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7941,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7942,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7943,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7944,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7945,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7946,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7947,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7948,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7949,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7950,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7951,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7952,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7953,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7954,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7955,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7956,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7957,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7958,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x30, 0x36, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7959,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7960,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7961,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7962,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7963,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7964,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7965,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7966,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7967,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7968,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x36, 0x30, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7969,64,"style","Trailing whitespace is superfluous."," 0x36, 0x32, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7970,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7971,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x32, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7972,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7973,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7974,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7975,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7976,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7977,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7978,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7979,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7980,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x31, 0x31, 0x39, 0x31, 0x38, 0x39, 0x31, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7981,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7982,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7983,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7984,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7985,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7986,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7987,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7988,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7989,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7990,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7991,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7992,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7993,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7994,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7995,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7996,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7997,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7998,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",7999,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8000,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x32, 0x30, 0x36, 0x32, 0x36, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8001,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8002,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8003,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8004,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8005,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8006,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8007,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8008,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8009,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x32, 0x30, 0x36, 0x32, 0x36, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8010,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8011,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x32, 0x30, 0x36, 0x32, 0x36, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8012,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8013,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8014,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8015,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8016,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8017,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8018,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8019,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8020,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8021,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8022,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x36, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8023,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8024,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8025,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8026,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8027,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x30, 0x36, 0x32, 0x36, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8028,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8029,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8030,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x37, 0x34, 0x36, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8031,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8032,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8033,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8034,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8035,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8036,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8037,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8038,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8039,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8040,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x36, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8041,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x36, 0x54, 0x32, 0x31, 0x3a, 0x34, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8042,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8043,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8044,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8045,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8046,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8047,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8048,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8049,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8050,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8051,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8052,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8053,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8054,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8055,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8056,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8057,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8058,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8059,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8060,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8061,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, 0x35, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8062,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8063,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8064,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8065,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8066,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8067,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8068,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8069,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8070,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8071,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8072,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8073,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8074,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8075,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8076,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8077,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8078,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8079,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8080,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8081,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8082,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8083,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8084,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8085,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8086,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8087,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8088,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8089,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8090,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8091,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8092,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8093,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8094,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8095,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8096,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8097,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8098,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8099,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x36, 0x30, 0x31, 0x35, 0x32, 0x39, 0x31, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8100,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8101,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, 0x35, 0x32, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8102,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8103,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8104,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8105,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8106,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8107,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8108,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8109,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8110,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x36, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8111,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x36, 0x39, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8112,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8113,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8114,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8115,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8116,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8117,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8118,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8119,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8120,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8121,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x35, 0x36, 0x20, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8122,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8123,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8124,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8125,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8126,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8127,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8128,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8129,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8130,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8131,64,"style","Trailing whitespace is superfluous."," 0x35, 0x32, 0x39, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8132,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8133,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8134,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8135,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8136,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8137,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8138,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8139,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x36, 0x30, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8140,64,"style","Trailing whitespace is superfluous."," 0x32, 0x39, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8141,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8142,64,"style","Trailing whitespace is superfluous."," 0x35, 0x32, 0x39, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8143,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8144,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8145,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8146,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8147,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8148,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8149,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8150,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8151,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8152,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8153,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8154,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8155,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8156,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8157,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8158,64,"style","Trailing whitespace is superfluous."," 0x32, 0x39, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8159,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8160,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8161,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8162,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8163,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8164,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8165,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8166,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8167,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8168,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8169,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8170,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8171,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x36, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8172,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x36, 0x3a, 0x34, 0x34, 0x3a, 0x30, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8173,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8174,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8175,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8176,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8177,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8178,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8179,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8180,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8181,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8182,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8183,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8184,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8185,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8186,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8187,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8188,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8189,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8190,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8191,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8192,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x31, 0x31, 0x34, 0x30, 0x31, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8193,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8194,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8195,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8196,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8197,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8198,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8199,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8200,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8201,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8202,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8203,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8204,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8205,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8206,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8207,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8208,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8209,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8210,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8211,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8212,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8213,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8214,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8215,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8216,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8217,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8218,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8219,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x36, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8220,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x31, 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8221,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8222,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8223,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8224,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8225,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8226,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8227,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8228,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8229,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x36, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8230,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x34, 0x30, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8231,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8232,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x34, 0x30, 0x31, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8233,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8234,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8235,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8236,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8237,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8238,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8239,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8240,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8241,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x36, 0x38, 0x39, 0x38, 0x32, 0x38, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8242,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8243,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8244,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8245,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8246,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8247,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8248,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8249,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8250,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8251,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8252,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8253,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8254,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8255,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8256,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8257,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8258,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8259,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8260,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8261,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8262,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8263,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8264,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8265,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8266,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8267,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8268,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8269,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8270,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8271,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x30, 0x36, 0x30, 0x31, 0x31, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8272,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8273,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8274,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8275,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8276,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8277,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8278,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8279,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8280,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8281,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8282,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8283,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8284,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x36, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8285,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x31, 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8286,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8287,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8288,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8289,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, 0x31, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8290,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8291,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8292,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8293,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8294,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8295,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8296,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8297,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8298,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8299,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8300,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8301,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8302,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8303,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8304,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x36, 0x2d, 0x30, 0x36, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8305,64,"style","Trailing whitespace is superfluous."," 0x39, 0x54, 0x32, 0x31, 0x3a, 0x34, 0x34, 0x3a, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8306,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8307,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8308,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8309,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8310,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8311,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8312,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8313,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8314,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8315,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8316,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8317,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8318,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8319,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8320,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8321,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8322,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8323,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8324,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8325,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x2d, 0x30, 0x30, 0x32, 0x30, 0x37, 0x39, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8326,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8327,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8328,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8329,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8330,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8331,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8332,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8333,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8334,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8335,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8336,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8337,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8338,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8339,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8340,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8341,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8342,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8343,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8344,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8345,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8346,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8347,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8348,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8349,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8350,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8351,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8352,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8353,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8354,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8355,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8356,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8357,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8358,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8359,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8360,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8361,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8362,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8363,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x30, 0x37, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8364,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8365,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x32, 0x30, 0x37, 0x39, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8366,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8367,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8368,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8369,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8370,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8371,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8372,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8373,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8374,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x36, 0x35, 0x38, 0x36, 0x37, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8375,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8376,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8377,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8378,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8379,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8380,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8381,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8382,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8383,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8384,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8385,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8386,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8387,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8388,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8389,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8390,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8391,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8392,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8393,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8394,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x30, 0x32, 0x30, 0x37, 0x39, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8395,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8396,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8397,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8398,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8399,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8400,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8401,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8402,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8403,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x30, 0x32, 0x30, 0x37, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8404,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8405,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x30, 0x32, 0x30, 0x37, 0x39, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8406,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8407,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8408,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8409,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8410,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8411,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8412,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8413,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8414,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8415,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8416,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x36, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8417,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8418,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8419,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8420,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8421,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x32, 0x30, 0x37, 0x39, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8422,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8423,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8424,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8425,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8426,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8427,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8428,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8429,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8430,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8431,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8432,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8433,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8434,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x30, 0x36, 0x2d, 0x30, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8435,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x54, 0x31, 0x39, 0x3a, 0x30, 0x37, 0x3a, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8436,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8437,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8438,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8439,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8440,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8441,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8442,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8443,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8444,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8445,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8446,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8447,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8448,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8449,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8450,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8451,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8452,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8453,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8454,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8455,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x38, 0x35, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8456,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8457,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8458,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8459,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8460,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8461,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8462,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8463,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8464,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8465,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8466,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8467,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8468,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8469,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8470,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8471,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8472,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8473,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8474,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8475,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8476,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8477,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8478,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8479,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8480,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8481,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8482,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8483,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8484,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8485,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8486,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8487,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8488,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8489,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8490,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8491,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8492,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8493,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x38, 0x35, 0x33, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8494,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8495,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x30, 0x38, 0x35, 0x33, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8496,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8497,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8498,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8499,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8500,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8501,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8502,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8503,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8504,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x35, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8505,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8506,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8507,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8508,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8509,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8510,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8511,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8512,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8513,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8514,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8515,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x36, 0x36, 0x38, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8516,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8517,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8518,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8519,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8520,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8521,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8522,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8523,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8524,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8525,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8526,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8527,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8528,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8529,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8530,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8531,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8532,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8533,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x30, 0x35, 0x30, 0x30, 0x30, 0x38, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8534,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8535,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8536,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8537,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8538,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8539,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8540,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8541,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8542,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8543,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8544,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8545,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8546,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8547,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x31, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8548,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8549,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8550,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8551,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x38, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8552,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8553,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8554,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x36, 0x36, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8555,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8556,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8557,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8558,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8559,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8560,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8561,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8562,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8563,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8564,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8565,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x30, 0x54, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8566,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x34, 0x39, 0x3a, 0x32, 0x30, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8567,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8568,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8569,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8570,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8571,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8572,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8573,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8574,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8575,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8576,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8577,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8578,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8579,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8580,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8581,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8582,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8583,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8584,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8585,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8586,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x34, 0x36, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8587,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8588,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8589,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8590,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8591,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8592,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8593,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8594,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8595,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8596,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8597,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8598,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8599,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8600,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8601,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8602,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8603,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8604,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8605,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8606,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8607,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8608,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8609,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8610,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8611,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8612,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8613,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8614,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8615,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8616,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8617,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8618,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8619,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8620,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8621,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8622,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8623,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8624,64,"style","Trailing whitespace is superfluous."," 0x35, 0x34, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8625,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8626,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x34, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8627,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8628,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8629,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8630,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8631,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8632,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8633,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8634,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8635,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x39, 0x39, 0x36, 0x30, 0x33, 0x36, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8636,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8637,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8638,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8639,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8640,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8641,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8642,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8643,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8644,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8645,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8646,64,"style","Trailing whitespace is superfluous."," 0x38, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8647,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8648,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8649,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8650,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8651,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8652,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8653,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8654,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8655,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x35, 0x34, 0x36, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8656,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8657,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8658,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8659,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8660,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8661,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8662,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8663,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8664,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x34, 0x36, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8665,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8666,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x35, 0x34, 0x36, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8667,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8668,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8669,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8670,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8671,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8672,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8673,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8674,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8675,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8676,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8677,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8678,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8679,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8680,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8681,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8682,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x34, 0x36, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8683,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8684,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8685,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x38, 0x38, 0x38, 0x20, 0x4b, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8686,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8687,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8688,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8689,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8690,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8691,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8692,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8693,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8694,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8695,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8696,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x33, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x31, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8697,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8698,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8699,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8700,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8701,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8702,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8703,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8704,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8705,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8706,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8707,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8708,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8709,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8710,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8711,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8712,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8713,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8714,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8715,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8716,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8717,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8718,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8719,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8720,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8721,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8722,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8723,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8724,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8725,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8726,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8727,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8728,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8729,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8730,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8731,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8732,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8733,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8734,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8735,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8736,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8737,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8738,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8739,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8740,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8741,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8742,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8743,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8744,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x37, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8745,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8746,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8747,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8748,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8749,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8750,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8751,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8752,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8753,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8754,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x30, 0x30, 0x30, 0x34, 0x30, 0x36, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8755,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8756,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x34, 0x30, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8757,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8758,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8759,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8760,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8761,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8762,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8763,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8764,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8765,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x35, 0x38, 0x38, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8766,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8767,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8768,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8769,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8770,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8771,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8772,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8773,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8774,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8775,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8776,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8777,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8778,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8779,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8780,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8781,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8782,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8783,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8784,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8785,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8786,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8787,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x34, 0x30, 0x36, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8788,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8789,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8790,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8791,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8792,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8793,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8794,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8795,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8796,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x30, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8797,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8798,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x34, 0x30, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8799,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8800,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8801,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8802,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8803,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8804,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8805,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8806,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8807,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8808,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8809,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x37, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8810,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8811,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8812,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8813,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8814,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8815,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8816,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8817,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8818,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8819,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8820,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8821,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8822,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8823,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8824,64,"style","Trailing whitespace is superfluous."," 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8825,64,"style","Trailing whitespace is superfluous."," 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8826,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8827,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8828,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8829,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x37, 0x54, 0x31, 0x35, 0x3a, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8830,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x32, 0x38, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8831,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8832,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8833,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8834,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8835,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8836,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8837,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8838,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8839,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8840,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8841,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8842,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8843,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8844,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8845,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8846,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8847,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8848,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8849,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8850,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8851,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8852,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8853,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8854,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8855,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8856,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8857,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8858,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8859,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8860,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8861,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8862,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8863,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8864,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8865,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8866,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8867,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8868,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8869,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8870,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8871,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8872,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8873,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8874,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8875,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8876,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8877,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8878,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8879,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8880,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8881,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8882,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8883,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8884,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8885,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8886,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8887,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x35, 0x30, 0x30, 0x31, 0x39, 0x31, 0x33, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8888,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8889,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x31, 0x39, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8890,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8891,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8892,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8893,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8894,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8895,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8896,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8897,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8898,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x35, 0x35, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8899,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x37, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8900,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8901,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8902,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8903,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8904,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8905,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8906,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8907,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8908,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8909,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x35, 0x33, 0x34, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8910,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8911,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8912,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8913,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8914,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8915,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8916,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8917,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8918,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8919,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x33, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8920,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8921,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8922,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8923,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8924,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8925,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8926,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8927,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x30, 0x35, 0x30, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8928,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8929,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8930,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8931,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8932,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8933,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8934,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8935,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8936,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8937,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8938,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8939,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8940,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8941,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8942,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8943,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8944,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8945,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8946,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8947,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8948,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x35, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8949,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8950,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8951,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8952,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8953,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8954,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8955,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8956,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8957,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8958,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8959,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x32, 0x54, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8960,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x3a, 0x35, 0x31, 0x3a, 0x31, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8961,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8962,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8963,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8964,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8965,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8966,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8967,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8968,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8969,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8970,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8971,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8972,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8973,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8974,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8975,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8976,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8977,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8978,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8979,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8980,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x36, 0x32, 0x37, 0x30, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8981,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8982,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8983,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8984,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8985,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8986,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8987,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8988,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8989,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8990,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8991,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8992,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8993,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8994,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8995,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8996,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8997,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8998,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",8999,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9000,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9001,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9002,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9003,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9004,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9005,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9006,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9007,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x34, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9008,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9009,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9010,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9011,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9012,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9013,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9014,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9015,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9016,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9017,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x34, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9018,64,"style","Trailing whitespace is superfluous."," 0x36, 0x32, 0x37, 0x30, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9019,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9020,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x32, 0x37, 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9021,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9022,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9023,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9024,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9025,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9026,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9027,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9028,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9029,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x34, 0x31, 0x31, 0x31, 0x36, 0x38, 0x33, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9030,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9031,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9032,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9033,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9034,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9035,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9036,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9037,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9038,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9039,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9040,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x39, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9041,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9042,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9043,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9044,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9045,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9046,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9047,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9048,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9049,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x2d, 0x30, 0x31, 0x36, 0x32, 0x37, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9050,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9051,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9052,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9053,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9054,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9055,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9056,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9057,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9058,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x30, 0x31, 0x36, 0x32, 0x37, 0x30, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9059,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9060,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x2d, 0x30, 0x31, 0x36, 0x32, 0x37, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9061,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9062,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9063,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9064,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9065,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9066,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9067,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9068,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9069,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9070,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9071,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x30, 0x34, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9072,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9073,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9074,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9075,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9076,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x31, 0x36, 0x32, 0x37, 0x30, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9077,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9078,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9079,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x35, 0x31, 0x39, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9080,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9081,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9082,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9083,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9084,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9085,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9086,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9087,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9088,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9089,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9090,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x33, 0x54, 0x31, 0x36, 0x3a, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9091,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x31, 0x32, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9092,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9093,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9094,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9095,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9096,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9097,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9098,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9099,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9100,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9101,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9102,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9103,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9104,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9105,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9106,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9107,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9108,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9109,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9110,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9111,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9112,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9113,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9114,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9115,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9116,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9117,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9118,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9119,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9120,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9121,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9122,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9123,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9124,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9125,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9126,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9127,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9128,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9129,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9130,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9131,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9132,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9133,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9134,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9135,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9136,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x33, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9137,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9138,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9139,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9140,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9141,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9142,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9143,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9144,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9145,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9146,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x30, 0x31, 0x31, 0x31, 0x32, 0x34, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9147,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9148,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x2d, 0x30, 0x31, 0x31, 0x31, 0x32, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9149,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9150,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9151,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9152,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9153,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9154,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9155,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9156,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9157,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x34, 0x39, 0x34, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9158,64,"style","Trailing whitespace is superfluous."," 0x36, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9159,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9160,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9161,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9162,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9163,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9164,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9165,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9166,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9167,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9168,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9169,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9170,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9171,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9172,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9173,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9174,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9175,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9176,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9177,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x31, 0x31, 0x31, 0x32, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9178,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9179,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9180,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9181,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9182,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9183,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9184,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9185,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9186,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x34, 0x30, 0x31, 0x31, 0x31, 0x32, 0x34, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9187,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9188,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x31, 0x31, 0x31, 0x32, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9189,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9190,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9191,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9192,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9193,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9194,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9195,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9196,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9197,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9198,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9199,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x30, 0x34, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9200,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9201,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9202,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9203,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9204,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x2d, 0x30, 0x31, 0x31, 0x31, 0x32, 0x34, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9205,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9206,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9207,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9208,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9209,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9210,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9211,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9212,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9213,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9214,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9215,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9216,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9217,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9218,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x33, 0x54, 0x31, 0x33, 0x3a, 0x33, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9219,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x31, 0x35, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9220,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9221,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9222,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9223,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9224,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9225,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9226,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9227,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9228,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9229,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9230,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9231,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9232,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9233,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9234,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9235,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9236,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9237,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9238,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9239,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9240,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9241,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9242,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9243,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9244,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9245,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9246,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9247,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9248,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9249,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9250,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9251,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9252,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9253,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9254,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9255,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9256,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9257,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9258,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9259,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9260,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9261,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9262,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9263,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9264,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x34, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9265,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9266,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9267,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9268,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9269,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9270,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9271,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9272,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9273,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9274,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x30, 0x31, 0x30, 0x34, 0x36, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9275,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9276,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x30, 0x31, 0x30, 0x34, 0x36, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9277,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9278,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9279,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9280,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9281,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9282,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9283,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9284,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9285,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x34, 0x38, 0x35, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9286,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9287,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9288,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9289,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9290,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9291,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9292,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9293,64,"style","Trailing whitespace is superfluous."," 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9294,64,"style","Trailing whitespace is superfluous."," 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9295,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9296,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9297,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9298,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9299,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9300,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9301,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9302,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9303,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9304,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9305,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9306,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9307,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9308,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9309,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9310,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9311,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9312,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9313,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9314,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9315,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, 0x34, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9316,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9317,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9318,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9319,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9320,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9321,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9322,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9323,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9324,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9325,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9326,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9327,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9328,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9329,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x34, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9330,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9331,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9332,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9333,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9334,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9335,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9336,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9337,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9338,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9339,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9340,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9341,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9342,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9343,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9344,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9345,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9346,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9347,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9348,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x34, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9349,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x54, 0x31, 0x37, 0x3a, 0x32, 0x31, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9350,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9351,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9352,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9353,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9354,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9355,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9356,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9357,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9358,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9359,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9360,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9361,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9362,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9363,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9364,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9365,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9366,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9367,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9368,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9369,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9370,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9371,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9372,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9373,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9374,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9375,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9376,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9377,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9378,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9379,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9380,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9381,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9382,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9383,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9384,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9385,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9386,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9387,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9388,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9389,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9390,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9391,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9392,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9393,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9394,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9395,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x31, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9396,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9397,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9398,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9399,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9400,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9401,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9402,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9403,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9404,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9405,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x32, 0x33, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9406,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9407,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x35, 0x32, 0x33, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9408,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9409,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9410,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9411,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9412,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9413,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9414,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9415,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9416,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x34, 0x35, 0x38, 0x31, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9417,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9418,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9419,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9420,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9421,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9422,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9423,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9424,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9425,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9426,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9427,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x39, 0x34, 0x38, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9428,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9429,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9430,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9431,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9432,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9433,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9434,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9435,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9436,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x32, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9437,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9438,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9439,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9440,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9441,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9442,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9443,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9444,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9445,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x34, 0x30, 0x30, 0x30, 0x35, 0x32, 0x33, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9446,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9447,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x32, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9448,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9449,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9450,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9451,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9452,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9453,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9454,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9455,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9456,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9457,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9458,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x30, 0x34, 0x2d, 0x30, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9459,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9460,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9461,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9462,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9463,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x32, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9464,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9465,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9466,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x39, 0x34, 0x38, 0x20, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9467,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9468,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9469,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9470,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9471,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9472,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9473,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9474,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9475,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9476,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9477,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x30, 0x54, 0x31, 0x33, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9478,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x3a, 0x32, 0x38, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9479,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9480,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9481,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9482,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9483,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9484,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9485,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9486,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9487,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9488,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9489,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9490,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9491,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9492,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9493,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9494,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9495,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9496,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9497,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9498,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x34, 0x35, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9499,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9500,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9501,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9502,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9503,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9504,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9505,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9506,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9507,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9508,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9509,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9510,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9511,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9512,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9513,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9514,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9515,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9516,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9517,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9518,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9519,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9520,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9521,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9522,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9523,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x37, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9524,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9525,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9526,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9527,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9528,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9529,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9530,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9531,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9532,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9533,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x33, 0x30, 0x30, 0x35, 0x37, 0x34, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9534,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9535,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x37, 0x34, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9536,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9537,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9538,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9539,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9540,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9541,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9542,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9543,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9544,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x33, 0x39, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9545,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9546,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9547,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9548,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9549,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9550,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9551,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9552,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9553,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9554,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9555,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9556,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9557,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9558,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9559,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9560,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9561,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9562,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9563,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9564,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x37, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9565,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9566,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9567,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9568,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9569,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9570,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9571,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9572,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9573,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x30, 0x33, 0x30, 0x30, 0x35, 0x37, 0x34, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9574,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9575,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x37, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9576,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9577,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9578,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9579,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9580,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9581,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9582,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9583,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9584,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9585,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9586,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x33, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9587,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9588,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9589,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9590,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9591,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x37, 0x34, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9592,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9593,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9594,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x33, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9595,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9596,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9597,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9598,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9599,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9600,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9601,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9602,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9603,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9604,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x33, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9605,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x37, 0x54, 0x31, 0x35, 0x3a, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9606,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3a, 0x30, 0x35, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9607,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9608,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9609,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9610,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9611,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9612,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9613,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9614,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9615,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9616,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9617,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9618,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9619,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9620,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9621,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9622,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9623,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9624,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9625,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9626,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x37, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9627,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9628,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9629,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9630,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9631,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9632,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9633,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9634,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9635,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9636,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9637,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9638,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9639,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9640,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9641,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9642,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9643,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9644,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9645,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9646,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9647,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9648,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9649,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9650,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9651,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x31, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9652,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9653,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9654,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9655,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9656,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9657,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9658,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9659,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9660,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9661,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x30, 0x30, 0x34, 0x32, 0x35, 0x37, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9662,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9663,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x2d, 0x30, 0x30, 0x34, 0x32, 0x35, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9664,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9665,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9666,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9667,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9668,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9669,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9670,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9671,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9672,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x33, 0x38, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9673,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9674,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9675,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9676,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9677,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9678,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9679,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9680,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9681,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9682,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9683,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x34, 0x39, 0x38, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9684,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9685,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9686,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9687,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9688,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9689,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9690,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9691,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9692,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9693,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9694,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9695,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9696,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9697,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9698,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9699,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9700,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9701,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x30, 0x33, 0x30, 0x30, 0x34, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9702,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9703,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9704,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9705,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9706,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9707,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9708,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9709,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9710,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9711,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9712,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9713,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9714,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9715,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x31, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9716,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9717,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9718,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9719,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x34, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9720,64,"style","Trailing whitespace is superfluous."," 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9721,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9722,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x34, 0x39, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9723,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9724,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9725,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9726,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9727,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9728,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9729,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9730,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9731,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9732,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9733,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x31, 0x54, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9734,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3a, 0x30, 0x36, 0x3a, 0x34, 0x37, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9735,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9736,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9737,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9738,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9739,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9740,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9741,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9742,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9743,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9744,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9745,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9746,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9747,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9748,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9749,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9750,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9751,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9752,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9753,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9754,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x39, 0x33, 0x39, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9755,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9756,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9757,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9758,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9759,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9760,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9761,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9762,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9763,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9764,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9765,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9766,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9767,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9768,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9769,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9770,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9771,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9772,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9773,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9774,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9775,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9776,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9777,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9778,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9779,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x33, 0x2d, 0x30, 0x36, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9780,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9781,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9782,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9783,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9784,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9785,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9786,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9787,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9788,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9789,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x30, 0x33, 0x30, 0x30, 0x32, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9790,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9791,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x32, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9792,64,"style","Trailing whitespace is superfluous."," 0x33, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9793,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9794,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9795,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9796,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9797,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9798,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9799,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9800,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9801,64,"style","Trailing whitespace is superfluous."," 0x37, 0x33, 0x39, 0x35, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9802,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9803,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9804,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9805,64,"style","Trailing whitespace is superfluous."," 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9806,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9807,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9808,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9809,64,"style","Trailing whitespace is superfluous."," 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9810,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9811,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9812,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9813,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9814,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9815,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9816,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9817,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9818,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9819,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9820,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9821,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9822,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x30, 0x32, 0x39, 0x33, 0x39, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9823,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9824,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9825,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9826,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9827,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9828,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9829,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9830,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9831,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x30, 0x32, 0x39, 0x33, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9832,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9833,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x30, 0x32, 0x39, 0x33, 0x39, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9834,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9835,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9836,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9837,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9838,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9839,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9840,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9841,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9842,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9843,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9844,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x33, 0x2d, 0x30, 0x36, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9845,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9846,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9847,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9848,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9849,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x32, 0x39, 0x33, 0x39, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9850,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9851,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9852,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9853,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9854,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9855,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9856,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9857,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9858,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9859,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9860,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9861,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9862,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9863,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9864,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x36, 0x2d, 0x31, 0x30, 0x54, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9865,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x31, 0x35, 0x3a, 0x35, 0x38, 0x2d, 0x30, 0x34, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9866,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9867,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9868,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9869,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9870,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9871,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9872,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9873,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9874,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9875,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9876,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9877,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9878,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9879,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9880,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9881,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9882,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9883,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9884,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9885,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x36, 0x39, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9886,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9887,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9888,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9889,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9890,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9891,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9892,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9893,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9894,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9895,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9896,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9897,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9898,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9899,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9900,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9901,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9902,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9903,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9904,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9905,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9906,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9907,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9908,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9909,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9910,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x33, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x31, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9911,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9912,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9913,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9914,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9915,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9916,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9917,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9918,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9919,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9920,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x30, 0x33, 0x30, 0x30, 0x30, 0x36, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9921,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9922,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9923,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9924,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9925,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9926,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9927,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9928,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9929,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9930,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9931,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x33, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9932,64,"style","Trailing whitespace is superfluous."," 0x34, 0x39, 0x35, 0x39, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9933,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9934,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9935,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9936,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9937,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9938,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9939,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9940,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9941,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9942,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9943,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9944,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9945,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9946,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9947,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9948,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9949,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9950,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9951,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9952,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9953,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9954,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9955,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9956,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9957,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9958,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9959,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9960,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x30, 0x33, 0x30, 0x30, 0x30, 0x36, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9961,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9962,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9963,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9964,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9965,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9966,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9967,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9968,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9969,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9970,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9971,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9972,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9973,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9974,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x31, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9975,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9976,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9977,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9978,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9979,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9980,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9981,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9982,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9983,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9984,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9985,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9986,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9987,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9988,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9989,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9990,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9991,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9992,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x31, 0x54, 0x31, 0x33, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9993,64,"style","Trailing whitespace is superfluous."," 0x34, 0x33, 0x3a, 0x32, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9994,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9995,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9996,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9997,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9998,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",9999,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10000,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10001,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10002,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10003,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10004,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10005,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10006,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10007,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10008,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10009,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10010,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10011,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10012,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10013,64,"style","Trailing whitespace is superfluous."," 0x34, 0x39, 0x36, 0x30, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10014,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10015,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10016,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10017,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10018,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10019,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10020,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10021,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10022,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10023,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10024,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10025,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10026,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10027,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10028,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10029,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10030,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10031,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10032,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10033,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10034,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10035,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10036,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10037,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10038,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10039,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10040,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10041,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10042,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10043,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10044,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10045,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10046,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10047,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10048,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x32, 0x30, 0x30, 0x34, 0x39, 0x36, 0x30, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10049,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10050,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, 0x34, 0x39, 0x36, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10051,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10052,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10053,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10054,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10055,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10056,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10057,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10058,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10059,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x32, 0x38, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10060,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x34, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10061,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10062,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10063,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10064,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10065,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10066,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10067,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10068,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10069,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10070,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x39, 0x30, 0x32, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10071,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10072,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10073,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10074,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10075,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10076,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10077,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10078,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10079,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10080,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x30, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10081,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10082,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10083,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10084,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10085,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10086,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10087,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10088,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x30, 0x32, 0x30, 0x30, 0x34, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10089,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10090,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10091,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10092,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10093,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10094,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10095,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10096,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10097,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10098,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10099,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10100,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10101,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10102,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10103,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10104,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10105,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10106,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, 0x34, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10107,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10108,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10109,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x39, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10110,64,"style","Trailing whitespace is superfluous."," 0x32, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10111,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10112,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10113,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10114,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10115,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10116,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10117,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10118,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10119,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10120,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x38, 0x54, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10121,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x3a, 0x35, 0x31, 0x3a, 0x34, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10122,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10123,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10124,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10125,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10126,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10127,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10128,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10129,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10130,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10131,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10132,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10133,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10134,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10135,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10136,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10137,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10138,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10139,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10140,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x32, 0x31, 0x34, 0x30, 0x38, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10141,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x30, 0x37, 0x32, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10142,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10143,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10144,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10145,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10146,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10147,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10148,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10149,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10150,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10151,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10152,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10153,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10154,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10155,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10156,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10157,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10158,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10159,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10160,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10161,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10162,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10163,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10164,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10165,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10166,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x32, 0x2d, 0x30, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10167,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10168,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10169,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10170,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10171,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10172,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10173,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10174,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10175,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10176,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x30, 0x38, 0x30, 0x32, 0x30, 0x31, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10177,64,"style","Trailing whitespace is superfluous."," 0x32, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x32, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10178,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10179,64,"style","Trailing whitespace is superfluous."," 0x37, 0x32, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10180,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10181,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10182,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10183,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10184,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10185,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10186,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10187,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10188,64,"style","Trailing whitespace is superfluous."," 0x32, 0x37, 0x33, 0x31, 0x32, 0x38, 0x33, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10189,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10190,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10191,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10192,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10193,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10194,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10195,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10196,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10197,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10198,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10199,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10200,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10201,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10202,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10203,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10204,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10205,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10206,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10207,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x30, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10208,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x32, 0x34, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10209,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10210,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10211,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10212,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10213,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10214,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10215,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10216,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x34, 0x30, 0x38, 0x30, 0x32, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10217,64,"style","Trailing whitespace is superfluous."," 0x37, 0x32, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10218,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x30, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10219,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x32, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10220,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10221,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10222,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10223,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10224,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10225,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10226,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10227,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10228,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10229,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10230,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x33, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10231,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10232,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10233,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x30, 0x32, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10234,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10235,64,"style","Trailing whitespace is superfluous."," 0x37, 0x32, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10236,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10237,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10238,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10239,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10240,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10241,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10242,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10243,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10244,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10245,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10246,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10247,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10248,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x33, 0x54, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10249,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3a, 0x32, 0x35, 0x3a, 0x30, 0x38, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10250,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10251,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10252,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10253,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10254,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10255,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10256,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10257,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10258,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10259,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10260,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10261,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10262,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10263,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10264,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10265,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10266,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10267,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10268,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x30, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10269,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x38, 0x37, 0x37, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10270,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10271,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10272,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10273,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10274,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10275,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10276,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10277,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10278,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10279,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10280,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10281,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10282,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10283,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10284,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10285,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10286,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10287,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10288,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10289,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10290,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10291,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10292,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10293,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10294,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10295,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10296,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10297,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10298,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10299,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10300,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10301,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10302,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10303,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10304,64,"style","Trailing whitespace is superfluous."," 0x38, 0x37, 0x30, 0x30, 0x32, 0x30, 0x30, 0x32, 0x38, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10305,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10306,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10307,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10308,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10309,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10310,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10311,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10312,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10313,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10314,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10315,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10316,64,"style","Trailing whitespace is superfluous."," 0x36, 0x39, 0x31, 0x38, 0x32, 0x33, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10317,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10318,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10319,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10320,64,"style","Trailing whitespace is superfluous."," 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10321,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10322,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10323,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10324,64,"style","Trailing whitespace is superfluous."," 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10325,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10326,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10327,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10328,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x39, 0x30, 0x30, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10329,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10330,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10331,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10332,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10333,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10334,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10335,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10336,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10337,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, 0x32, 0x38, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10338,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10339,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10340,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10341,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10342,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10343,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10344,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10345,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10346,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x30, 0x30, 0x32, 0x38, 0x37, 0x37, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10347,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10348,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, 0x32, 0x38, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10349,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10350,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10351,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10352,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10353,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10354,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10355,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10356,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10357,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10358,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10359,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10360,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10361,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10362,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10363,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10364,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x30, 0x32, 0x38, 0x37, 0x37, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10365,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10366,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10367,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x39, 0x30, 0x30, 0x20, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10368,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10369,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10370,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10371,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10372,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10373,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10374,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10375,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10376,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10377,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10378,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10379,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x2d, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10380,64,"style","Trailing whitespace is superfluous."," 0x38, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x36, 0x3a, 0x32, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10381,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10382,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10383,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10384,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10385,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10386,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10387,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10388,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10389,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10390,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10391,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10392,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10393,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10394,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10395,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10396,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10397,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10398,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10399,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10400,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x38, 0x39, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10401,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10402,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10403,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10404,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10405,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10406,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10407,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10409,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10410,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10411,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10412,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10413,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10414,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10415,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10416,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10417,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10418,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10419,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10420,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10421,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10422,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10423,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10424,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10425,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x32, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10426,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10427,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10428,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10429,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10430,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10431,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10432,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10433,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10434,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10435,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x30, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10436,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10437,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10438,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x36, 0x38, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10439,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10440,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10441,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10442,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10443,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10444,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10445,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10446,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10447,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x32, 0x35, 0x34, 0x38, 0x38, 0x31, 0x36, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10448,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10449,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10450,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10451,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10452,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10453,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10454,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10455,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10456,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10457,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10458,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10459,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10460,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10461,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10462,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10463,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10464,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10465,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10466,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10467,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x38, 0x39, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10468,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10469,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10470,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10471,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10472,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10473,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10474,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10475,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10476,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x30, 0x36, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10477,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10478,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x38, 0x39, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10479,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10480,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10481,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10482,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10483,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10484,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10485,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10486,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10487,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10488,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10489,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x32, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10490,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10491,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10492,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10493,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10494,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x36, 0x38, 0x39, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10495,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10496,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10497,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x31, 0x35, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10498,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10499,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10500,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10501,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10502,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10503,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10504,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10505,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10506,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10507,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10508,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x31, 0x34, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10509,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10510,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10511,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10512,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10513,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10514,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10515,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10516,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10517,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10518,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10519,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10520,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10521,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10522,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10523,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10524,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10525,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10526,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10527,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10528,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10529,64,"style","Trailing whitespace is superfluous."," 0x32, 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10530,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10531,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10532,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10533,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10534,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10535,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10536,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10537,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10538,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10539,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10540,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10541,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10542,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10543,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10544,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10545,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10546,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10547,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10548,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10549,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10550,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10551,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10552,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10553,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10554,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10555,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10556,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10557,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10558,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10559,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10560,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10561,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10562,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10563,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10564,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x30, 0x32, 0x38, 0x32, 0x32, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10565,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10566,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x35, 0x30, 0x32, 0x38, 0x32, 0x32, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10567,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10568,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10569,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10570,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10571,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10572,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10573,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10574,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10575,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x31, 0x37, 0x38, 0x38, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10576,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10577,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10578,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10579,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10580,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10581,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10582,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10583,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10584,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10585,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10586,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x39, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10587,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10588,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10589,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10590,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10591,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10592,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10593,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10594,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10595,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x32, 0x38, 0x32, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10596,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10597,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10598,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10599,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10600,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10601,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10602,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10603,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10604,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x35, 0x30, 0x32, 0x38, 0x32, 0x32, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10605,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10606,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x32, 0x38, 0x32, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10607,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10608,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10609,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10610,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10611,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10612,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10613,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10614,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10615,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10616,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10617,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x30, 0x31, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10618,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10619,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10620,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10621,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10622,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x35, 0x30, 0x32, 0x38, 0x32, 0x32, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10623,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10624,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10625,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x36, 0x20, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10626,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10627,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10628,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10629,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10630,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10631,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10632,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10633,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10634,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10635,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10636,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x54, 0x30, 0x30, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10637,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10638,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10639,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10640,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10641,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10642,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10643,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10644,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10645,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10646,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10647,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10648,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10649,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10650,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10651,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10652,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10653,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10654,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10655,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10656,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x37, 0x30, 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10657,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10658,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10659,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10660,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10661,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10662,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10663,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10664,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10665,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10666,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10667,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10668,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10669,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10670,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10671,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10672,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10673,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10674,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10675,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10676,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10677,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10678,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10679,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10680,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10681,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10682,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10683,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10684,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10685,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10686,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10687,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10688,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10689,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10690,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10691,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10692,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x35, 0x30, 0x31, 0x36, 0x31, 0x31, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10693,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10694,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x31, 0x36, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10695,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10696,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10697,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10698,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10699,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10700,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10701,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10702,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10703,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x37, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10704,64,"style","Trailing whitespace is superfluous."," 0x34, 0x32, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10705,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10706,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10707,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10708,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10709,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10710,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10711,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10712,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10713,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10714,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x38, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10715,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10716,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10717,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10718,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10719,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10720,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10721,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10722,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10723,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10724,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10725,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10726,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10727,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10728,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10729,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10730,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10731,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10732,64,"style","Trailing whitespace is superfluous."," 0x38, 0x37, 0x30, 0x30, 0x31, 0x35, 0x30, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10733,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10734,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10735,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10736,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10737,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10738,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10739,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10740,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10741,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10742,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10743,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10744,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10745,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10746,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10747,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10748,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10749,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10750,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10751,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10752,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10753,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10754,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10755,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10756,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10757,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10758,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10759,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10760,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10761,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10762,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10763,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10764,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x34, 0x54, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10765,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10766,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10767,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10768,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10769,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10770,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10771,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10772,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10773,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10774,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10775,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10776,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10777,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10778,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10779,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10780,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10781,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10782,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10783,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10784,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10785,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x32, 0x35, 0x35, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10786,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10787,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10788,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10789,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10790,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10791,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10792,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10793,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10794,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10795,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10796,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10797,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10798,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10799,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10800,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10801,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10802,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10803,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10804,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10805,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10806,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10807,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10808,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10809,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10810,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x31, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10811,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10812,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10813,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10814,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10815,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10816,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10817,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10818,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10819,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10820,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x30, 0x31, 0x35, 0x30, 0x30, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10821,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10822,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10823,64,"style","Trailing whitespace is superfluous."," 0x35, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10824,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10825,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10826,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10827,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10828,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10829,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10830,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10831,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10832,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x36, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10833,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10834,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10835,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10836,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10837,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10838,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10839,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10840,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10841,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10842,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10843,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10844,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10845,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10846,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10847,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10848,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10849,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10850,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10851,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10852,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10853,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x35, 0x30, 0x30, 0x32, 0x35, 0x35, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10854,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10855,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10856,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10857,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10858,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10859,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10860,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10861,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10862,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x32, 0x35, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10863,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10864,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x35, 0x30, 0x30, 0x32, 0x35, 0x35, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10865,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10866,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10867,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10868,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10869,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10870,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10871,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10872,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10873,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10874,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10875,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x39, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10876,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10877,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10878,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10879,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10880,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x32, 0x35, 0x35, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10881,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10882,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10883,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10884,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10885,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10886,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10887,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10888,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10889,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10890,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10891,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10892,64,"style","Trailing whitespace is superfluous."," 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10893,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10894,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10895,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x39, 0x54, 0x30, 0x30, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10896,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10897,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10898,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10899,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10900,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10901,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10902,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10903,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10904,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10905,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10906,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10907,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10908,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10909,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10910,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10911,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10912,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10913,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10914,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10915,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x31, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10916,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x34, 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10917,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10918,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10919,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10920,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10921,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10922,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10923,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10924,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10925,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10926,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10927,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10928,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10929,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10930,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10931,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10932,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10933,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10934,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10935,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10936,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10937,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10938,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10939,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10940,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10941,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10942,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10943,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10944,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10945,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10946,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10947,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10948,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10949,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10950,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10951,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x30, 0x30, 0x30, 0x31, 0x34, 0x31, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10952,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10953,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x34, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10954,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10955,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10956,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10957,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10958,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10959,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10960,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10961,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10962,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x35, 0x33, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10963,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10964,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10965,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10966,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10967,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10968,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10969,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10970,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10971,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10972,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10973,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x33, 0x37, 0x35, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10974,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10975,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10976,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10977,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10978,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10979,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10980,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10981,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10982,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x31, 0x2d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10983,64,"style","Trailing whitespace is superfluous."," 0x34, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10984,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10985,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10986,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10987,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10988,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10989,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10990,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10991,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x30, 0x31, 0x30, 0x30, 0x30, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10992,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10993,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x31, 0x2d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10994,64,"style","Trailing whitespace is superfluous."," 0x34, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10995,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10996,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10997,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10998,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",10999,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11000,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11001,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11002,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11003,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11004,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11005,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x31, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11006,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11007,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11008,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11009,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x31, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11010,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11011,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11012,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x33, 0x37, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11013,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11014,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11015,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11016,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11017,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11018,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11019,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11020,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11021,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11022,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11023,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x33, 0x54, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11024,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11025,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11026,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11027,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11028,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11029,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11030,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11031,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11032,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11033,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11034,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11035,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11036,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11037,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11038,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11039,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11040,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11041,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11042,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11043,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11044,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x33, 0x38, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11045,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11046,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11047,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11048,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11049,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11050,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11051,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11052,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11053,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11054,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11055,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11056,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11057,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11058,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11059,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11060,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11061,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11062,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11063,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11064,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11065,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11066,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11067,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11068,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11069,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11070,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11071,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11072,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11073,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11074,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11075,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11076,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11077,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11078,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11079,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x30, 0x30, 0x30, 0x30, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11080,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11081,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11082,64,"style","Trailing whitespace is superfluous."," 0x33, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11083,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11084,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11085,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11086,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11087,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11088,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11089,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11090,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x37, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11091,64,"style","Trailing whitespace is superfluous."," 0x36, 0x33, 0x35, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11092,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11093,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11094,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11095,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11096,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11097,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11098,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11099,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11100,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11101,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x39, 0x33, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11102,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11103,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11104,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11105,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11106,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11107,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11108,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11109,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11110,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11111,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11112,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11113,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11114,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11115,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11116,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11117,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11118,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11119,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x30, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11120,64,"style","Trailing whitespace is superfluous."," 0x33, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11121,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11122,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11123,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11124,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11125,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11126,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11127,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11128,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11129,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11130,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11131,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11132,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11133,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11134,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11135,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11136,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11137,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11138,64,"style","Trailing whitespace is superfluous."," 0x33, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11139,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11140,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11141,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11142,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11143,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11144,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11145,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11146,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11147,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11148,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11149,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11150,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11151,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x54, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11152,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11153,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11154,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11155,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11156,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11157,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11158,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11159,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11160,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11161,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11162,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11163,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11164,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11165,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11166,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11167,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11168,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11169,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11170,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11171,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11172,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x39, 0x31, 0x36, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11173,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11174,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11175,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11176,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11177,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11178,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11179,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11180,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11181,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11182,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11183,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11184,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11185,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11186,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11187,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11188,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11189,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11190,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11191,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11192,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11193,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11194,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11195,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11196,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11197,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x30, 0x2d, 0x30, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11198,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11199,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11200,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11201,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11202,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11203,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11204,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11205,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11206,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11207,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x30, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11208,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11209,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11210,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11211,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11212,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11213,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11214,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11215,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11216,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11217,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11218,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11219,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x32, 0x37, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11220,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11221,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11222,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11223,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11224,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11225,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11226,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11227,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11228,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11229,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x39, 0x20, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11230,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11231,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11232,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11233,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11234,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11235,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11236,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11237,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11238,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11239,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x31, 0x36, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11240,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11241,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11242,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11243,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11244,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11245,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11246,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11247,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x35, 0x30, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11248,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11249,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11250,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x31, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11251,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11252,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11253,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11254,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11255,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11256,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11257,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11258,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11259,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11260,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11261,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11262,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11263,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11264,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11265,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11266,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11267,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11268,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11269,64,"style","Trailing whitespace is superfluous."," 0x34, 0x39, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11270,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11271,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11272,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11273,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11274,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11275,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11276,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11277,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11278,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11279,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x30, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11280,64,"style","Trailing whitespace is superfluous."," 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11281,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11282,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11283,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11284,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11285,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11286,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11287,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11288,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11289,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11290,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11291,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11292,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x2f, 0x41, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11293,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11294,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11295,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11296,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11297,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11298,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11299,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11300,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x38, 0x37, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11301,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11302,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11303,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11304,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x6e, 0x64, 0x3e, 0x5b, 0x41, 0x6d, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11305,64,"style","Trailing whitespace is superfluous."," 0x64, 0x5d, 0x3c, 0x2f, 0x61, 0x6d, 0x65, 0x6e, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11306,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11307,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11308,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11309,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11310,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11311,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11312,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11313,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11314,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11315,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11316,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11317,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11318,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11319,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11320,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11321,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11322,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11323,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11324,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11325,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11326,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11327,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11328,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11329,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x31, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11330,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11331,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11332,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11333,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11334,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11335,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11336,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11337,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11338,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11339,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x38, 0x37, 0x36, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11340,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11341,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x38, 0x37, 0x36, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11342,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11343,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11344,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11345,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11346,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x2f, 0x41, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11347,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11348,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11349,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11350,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x36, 0x39, 0x34, 0x33, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11351,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11352,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11353,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11354,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11355,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11356,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11357,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11358,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11359,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11360,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11361,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11362,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11363,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11364,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11365,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11366,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11367,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11368,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11369,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11370,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11371,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11372,64,"style","Trailing whitespace is superfluous."," 0x38, 0x37, 0x36, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11373,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11374,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11375,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11376,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11377,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11378,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11379,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11380,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x30, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11381,64,"style","Trailing whitespace is superfluous."," 0x37, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11382,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11383,64,"style","Trailing whitespace is superfluous."," 0x38, 0x37, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11384,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11385,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11386,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11387,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11388,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11389,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11390,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11391,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11392,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11393,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11394,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x31, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11395,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11396,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11397,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11398,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11399,64,"style","Trailing whitespace is superfluous."," 0x37, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11400,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11401,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11402,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11403,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11404,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11405,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x20, 0x5b, 0x41, 0x6d, 0x65, 0x6e, 0x64, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11406,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11407,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11408,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11409,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11410,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11411,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11412,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11413,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11414,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x30, 0x30, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11415,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11416,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11417,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11418,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11419,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11420,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11421,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11422,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11423,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11424,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11425,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11426,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11427,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11428,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11429,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11430,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11431,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11432,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11433,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11434,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11435,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x37, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11436,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11437,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11438,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11439,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11440,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11441,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11442,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11443,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11444,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11445,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11446,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11447,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11448,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11449,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11450,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11451,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11452,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11453,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11454,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11455,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11456,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11457,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11458,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11459,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11460,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11461,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11462,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11463,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11464,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11465,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11466,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11467,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11468,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11469,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11470,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11471,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x37, 0x37, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11472,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11473,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x37, 0x37, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11474,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11475,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11476,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11477,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11478,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11479,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11480,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11481,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11482,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x36, 0x36, 0x33, 0x39, 0x32, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11483,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11484,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11485,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11486,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11487,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11488,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11489,64,"style","Trailing whitespace is superfluous."," 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11490,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11491,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11492,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11493,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11494,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x34, 0x31, 0x32, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11495,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11496,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11497,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11498,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11499,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11500,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11501,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11502,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11503,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11504,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11505,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11506,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11507,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11508,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11509,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11510,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11511,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11512,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x30, 0x30, 0x30, 0x30, 0x30, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11513,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11514,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11515,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11516,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11517,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11518,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11519,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11520,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11521,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11522,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11523,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11524,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11525,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11526,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x32, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11527,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11528,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11529,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11530,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11531,64,"style","Trailing whitespace is superfluous."," 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11532,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11533,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x34, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11534,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11535,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11536,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11537,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11538,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11539,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11540,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11541,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11542,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11543,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11544,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11545,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x30, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11546,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x39, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11547,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11548,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11549,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11550,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11551,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11552,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11553,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11554,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11555,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11556,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11557,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11558,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11559,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11560,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11561,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11562,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11563,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11564,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11565,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11566,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11567,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11568,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11569,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11570,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11571,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11572,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11573,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11574,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11575,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11576,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11577,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11578,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11579,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11580,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11581,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11582,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11583,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11584,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11585,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11586,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11587,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11588,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11589,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11590,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11591,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11592,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x31, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11593,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11594,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11595,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11596,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11597,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11598,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11599,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11600,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11601,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11602,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x30, 0x30, 0x33, 0x34, 0x32, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11603,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11604,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11605,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11606,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11607,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11608,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11609,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11610,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11611,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x35, 0x34, 0x31, 0x38, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11612,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11613,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11614,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11615,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11616,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11617,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11618,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11619,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11620,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11621,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11622,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x35, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11623,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11624,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11625,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11626,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11627,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11628,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11629,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11630,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11631,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x33, 0x34, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11632,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11633,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11634,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11635,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11636,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11637,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11638,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11639,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11640,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11641,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11642,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11643,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11644,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11645,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11646,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11647,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11648,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11649,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11650,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11651,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11652,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11653,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11654,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11655,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11656,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11657,64,"style","Trailing whitespace is superfluous."," 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11658,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11659,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11660,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11661,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11662,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11663,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11664,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11665,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11666,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11667,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11668,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11669,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11670,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x34, 0x54, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11671,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11672,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11673,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11674,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11675,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11676,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11677,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11678,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11679,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11680,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11681,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11682,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11683,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11684,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11685,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11686,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11687,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11688,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11689,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11690,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11691,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x30, 0x31, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11692,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11693,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11694,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11695,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11696,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11697,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11698,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11699,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11700,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11701,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11702,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11703,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11704,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11705,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11706,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11707,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11708,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11709,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11710,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11711,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11712,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11713,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11714,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11715,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11716,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x39, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11717,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11718,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11719,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11720,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11721,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11722,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11723,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11724,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11725,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11726,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11727,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11728,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11729,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11730,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11731,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11732,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11733,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11734,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11735,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11736,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x37, 0x35, 0x34, 0x31, 0x38, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11737,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11738,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11739,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11740,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11741,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11742,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11743,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11744,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11745,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11746,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x32, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11747,64,"style","Trailing whitespace is superfluous."," 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11748,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11749,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11750,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11751,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11752,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11753,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11754,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11755,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11756,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x31, 0x30, 0x30, 0x31, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11757,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11758,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11759,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11760,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11761,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11762,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11763,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11764,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11765,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x30, 0x31, 0x30, 0x30, 0x31, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11766,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11767,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11768,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11769,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11770,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11771,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11772,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11773,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11774,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11775,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11776,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x39, 0x39, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11777,64,"style","Trailing whitespace is superfluous."," 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11778,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11779,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11780,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11781,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x30, 0x31, 0x30, 0x30, 0x31, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11782,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11783,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11784,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x34, 0x36, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11785,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11786,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11787,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11788,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11789,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11790,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11791,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11792,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11793,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11794,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11795,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x31, 0x35, 0x54, 0x30, 0x30, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11796,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11797,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11798,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11799,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11800,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11801,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11802,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11803,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11804,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11805,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11806,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11807,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11808,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11809,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11810,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11811,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11812,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11813,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11814,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11815,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11816,64,"style","Trailing whitespace is superfluous."," 0x37, 0x34, 0x35, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11817,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11818,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11819,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11820,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11821,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11822,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11823,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11824,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11825,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11826,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11827,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11828,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11829,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11830,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11831,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11832,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11833,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11834,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11835,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11836,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11837,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11838,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11839,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11840,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11841,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x32, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11842,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11843,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11844,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11845,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11846,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11847,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11848,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11849,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11850,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11851,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x37, 0x34, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11852,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11853,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11854,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11855,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11856,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11857,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11858,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11859,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11860,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x39, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11861,64,"style","Trailing whitespace is superfluous."," 0x38, 0x36, 0x33, 0x34, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11862,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11863,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11864,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11865,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11866,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11867,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11868,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11869,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11870,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11871,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x39, 0x31, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11872,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11873,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11874,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11875,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11876,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11877,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11878,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11879,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11880,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11881,64,"style","Trailing whitespace is superfluous."," 0x37, 0x34, 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11882,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11883,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11884,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11885,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11886,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11887,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11888,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11889,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11890,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x34, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11891,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11892,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11893,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11894,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11895,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11896,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11897,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11898,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11899,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11900,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11901,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x32, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11902,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11903,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11904,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11905,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11906,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x34, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11907,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11908,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11909,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11910,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11911,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11912,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11913,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11914,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11915,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11916,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11917,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11918,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11919,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x39, 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11920,64,"style","Trailing whitespace is superfluous."," 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11921,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11922,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11923,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11924,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11925,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11926,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11927,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11928,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11929,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11930,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11931,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11932,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11933,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11934,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11935,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11936,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11937,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11938,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11939,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11940,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x39, 0x39, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11941,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11942,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11943,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11944,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11945,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11946,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11947,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11948,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11949,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11950,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11951,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11952,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11953,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11954,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11955,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11956,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11957,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11958,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11959,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11960,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11961,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11962,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11963,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11964,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11965,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x39, 0x39, 0x39, 0x2d, 0x30, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11966,64,"style","Trailing whitespace is superfluous."," 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11967,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11968,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11969,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11970,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11971,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11972,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11973,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11974,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11975,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11976,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x39, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11977,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11978,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11979,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11980,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11981,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11982,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11983,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11984,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11985,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x39, 0x39, 0x36, 0x35, 0x35, 0x30, 0x36, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11986,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11987,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11988,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11989,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11990,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11991,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11992,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11993,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11994,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11995,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11996,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11997,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x31, 0x36, 0x20, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11998,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",11999,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12000,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12001,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12002,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12003,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12004,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12005,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12006,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12007,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x39, 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12008,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12009,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12010,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12011,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12012,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12013,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12014,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12015,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12016,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x39, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12017,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12018,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12019,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12020,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12021,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12022,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12023,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12024,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12025,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12026,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12027,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x39, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12028,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12029,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12030,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12031,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12032,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x39, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12033,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12034,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12035,64,"style","Trailing whitespace is superfluous."," 0x20, 0x37, 0x31, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12036,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12037,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12038,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12039,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12040,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12041,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12042,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12043,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12044,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12045,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12046,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12047,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x39, 0x54, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12048,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x34, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12049,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12050,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12051,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12052,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12053,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12054,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12055,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12056,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12057,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12058,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12059,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12060,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12061,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12062,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12063,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12064,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12065,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12066,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12067,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12068,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x30, 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12069,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12070,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12071,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12072,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12073,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12074,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12075,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12076,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12077,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12078,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12079,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12080,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12081,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12082,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12083,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12084,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12085,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12086,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12087,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12088,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12089,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12090,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12091,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12092,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12093,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x36, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12094,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12095,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12096,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12097,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12098,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12099,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12100,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12101,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12102,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12103,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12104,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12105,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12106,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12107,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12108,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12109,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12110,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12111,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12112,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12113,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x34, 0x32, 0x38, 0x31, 0x32, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12114,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12115,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12116,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12117,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12118,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12119,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12120,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12121,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12122,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12123,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12124,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12125,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12126,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12127,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12128,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12129,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12130,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12131,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12132,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12133,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x32, 0x30, 0x32, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12134,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12135,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12136,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12137,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12138,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12139,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12140,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12141,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12142,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x32, 0x30, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12143,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12144,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12145,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12146,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12147,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12148,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12149,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12150,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12151,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12152,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12153,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x39, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12154,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12155,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12156,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12157,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12158,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x32, 0x30, 0x32, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12159,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12160,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12161,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x31, 0x31, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12162,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12163,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12164,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12165,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12166,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12167,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12168,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12169,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12170,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12171,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12172,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x31, 0x36, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12173,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12174,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12175,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12176,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12177,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12178,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12179,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12180,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12181,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12182,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12183,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12184,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12185,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12186,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12187,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12188,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12189,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12190,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12191,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12192,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12193,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12194,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12195,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12196,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12197,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12198,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12199,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12200,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12201,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12202,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12203,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12204,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12205,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12206,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12207,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12208,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12209,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12210,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12211,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12212,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12213,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12214,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12215,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12216,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12217,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12218,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x33, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12219,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12220,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12221,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12222,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12223,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12224,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12225,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12226,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12227,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12228,64,"style","Trailing whitespace is superfluous."," 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x38, 0x39, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12229,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12230,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12231,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12232,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12233,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12234,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12235,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12236,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12237,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x38, 0x37, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12238,64,"style","Trailing whitespace is superfluous."," 0x38, 0x37, 0x39, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12239,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12240,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12241,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12242,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12243,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12244,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12245,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12246,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12247,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12248,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x30, 0x32, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12249,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12250,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12251,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12252,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12253,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12254,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12255,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12256,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12257,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12258,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12259,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12260,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12261,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12262,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12263,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12264,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12265,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12266,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12267,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12268,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12269,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12270,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12271,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12272,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12273,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12274,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12275,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12276,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12277,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12278,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x33, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12279,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12280,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12281,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12282,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12283,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12284,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12285,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12286,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x32, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12287,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12288,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12289,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12290,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12291,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12292,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12293,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12294,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12295,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12296,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x39, 0x39, 0x38, 0x2d, 0x31, 0x31, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12297,64,"style","Trailing whitespace is superfluous."," 0x33, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12298,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12299,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12300,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12301,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12302,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12303,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12304,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12305,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12306,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12307,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12308,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12309,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12310,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12311,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12312,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12313,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12314,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12315,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12316,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12317,64,"style","Trailing whitespace is superfluous."," 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x36, 0x37, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12318,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12319,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12320,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12321,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12322,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12323,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12324,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12325,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12326,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12327,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12328,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12329,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12330,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12331,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12332,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12333,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12334,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12335,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12336,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12337,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12338,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12339,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12340,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12341,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12342,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, 0x38, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12343,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12344,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12345,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12346,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12347,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12348,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12349,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12350,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12351,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12352,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12353,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x36, 0x36, 0x37, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12354,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12355,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12356,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12357,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12358,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12359,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12360,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12361,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12362,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x39, 0x38, 0x36, 0x38, 0x32, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12363,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12364,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12365,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12366,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12367,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12368,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12369,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12370,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12371,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12372,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12373,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x38, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12374,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12375,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12376,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12377,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12378,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12379,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12380,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12381,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12382,64,"style","Trailing whitespace is superfluous."," 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x36, 0x37, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12383,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12384,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12385,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12386,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12387,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12388,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12389,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12390,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12391,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x36, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12392,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12393,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12394,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12395,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12396,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12397,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12398,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12399,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12400,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12401,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12402,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, 0x38, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12403,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12404,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12405,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12406,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12407,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x36, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12409,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12410,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x38, 0x36, 0x20, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12411,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12412,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12413,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12414,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12415,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12416,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12417,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12418,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12419,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12420,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12421,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x31, 0x54, 0x30, 0x30, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12422,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12423,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12424,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12425,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12426,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12427,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12428,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12429,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12430,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12431,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12432,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12433,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12434,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12435,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12436,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12437,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12438,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12439,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12440,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12441,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12442,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x37, 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12443,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12444,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12445,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12446,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12447,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12448,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12449,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12450,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12451,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12452,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12453,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12454,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12455,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12456,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12457,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12458,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12459,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12460,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12461,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12462,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12463,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12464,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12465,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12466,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12467,64,"style","Trailing whitespace is superfluous."," 0x39, 0x38, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x36, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12468,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12469,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12470,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12471,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12472,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12473,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12474,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12475,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12476,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12477,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12478,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12479,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12480,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12481,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12482,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12483,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12484,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12485,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12486,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12487,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x35, 0x35, 0x31, 0x35, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12488,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12489,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12490,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12491,64,"style","Trailing whitespace is superfluous."," 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12492,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12493,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12494,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12495,64,"style","Trailing whitespace is superfluous."," 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12496,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12497,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12498,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12499,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x32, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12500,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12501,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12502,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12503,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12504,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12505,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12506,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12507,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12508,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12509,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12510,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12511,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12512,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12513,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12514,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12515,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12516,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12517,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12518,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12519,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12520,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12521,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12522,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12523,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12524,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12525,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12526,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12527,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12528,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12529,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x32, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12530,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12531,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12532,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12533,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12534,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12535,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12536,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x32, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12537,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12538,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12539,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12540,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12541,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12542,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12543,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12544,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12545,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12546,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12547,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12548,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x38, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12549,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x36, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12550,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12551,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12552,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12553,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12554,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12555,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12556,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12557,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12558,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12559,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12560,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12561,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12562,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12563,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12564,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12565,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12566,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12567,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12568,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x38, 0x34, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12569,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12570,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12571,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12572,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12573,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12574,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12575,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12576,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12577,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12578,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12579,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12580,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12581,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12582,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12583,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12584,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12585,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12586,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12587,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12588,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12589,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12590,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12591,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12592,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12593,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12594,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12595,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x31, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12596,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12597,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12598,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12599,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12600,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12601,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12602,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12603,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12604,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x39, 0x38, 0x34, 0x33, 0x30, 0x2d, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12605,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x31, 0x38, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12606,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12607,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12608,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12609,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12610,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12611,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12612,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12613,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12614,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x38, 0x35, 0x34, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12615,64,"style","Trailing whitespace is superfluous."," 0x38, 0x32, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12616,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12617,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12618,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12619,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12620,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12621,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12622,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12623,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12624,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12625,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x31, 0x33, 0x30, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12626,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12627,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12628,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12629,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12630,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12631,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12632,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12633,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x38, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12634,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12635,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12636,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12637,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12638,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12639,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12640,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12641,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12642,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12643,64,"style","Trailing whitespace is superfluous."," 0x34, 0x33, 0x30, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12644,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12645,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12646,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12647,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12648,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12649,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12650,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12651,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12652,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12653,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12654,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12655,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x37, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12656,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12657,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12658,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12659,64,"style","Trailing whitespace is superfluous."," 0x34, 0x33, 0x30, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12660,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12661,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12662,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12663,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12664,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12665,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12666,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12667,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12668,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12669,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12670,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12671,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12672,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12673,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x39, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12674,64,"style","Trailing whitespace is superfluous."," 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12675,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12676,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12677,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12678,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12679,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12680,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12681,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12682,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12683,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12684,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12685,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12686,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12687,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12688,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12689,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12690,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12691,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12692,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12693,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12694,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x30, 0x32, 0x32, 0x37, 0x36, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12695,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12696,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12697,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12698,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12699,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12700,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12701,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12702,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12703,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12704,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12705,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12706,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12707,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12708,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12709,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12710,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12711,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12712,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12713,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12714,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12715,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12716,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12717,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12718,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12719,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x39, 0x39, 0x37, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12720,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12721,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12722,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12723,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12724,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12725,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12726,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12727,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12728,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12729,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12730,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x32, 0x37, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12731,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12732,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12733,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12734,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12735,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12736,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12737,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12738,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12739,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x39, 0x37, 0x37, 0x32, 0x30, 0x32, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12740,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12741,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12742,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12743,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12744,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12745,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12746,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12747,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12748,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12749,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12750,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12751,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12752,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12753,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12754,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12755,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12756,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12757,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12758,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12759,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x30, 0x32, 0x32, 0x37, 0x36, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12760,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12761,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12762,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12763,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12764,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12765,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12766,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12767,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12768,64,"style","Trailing whitespace is superfluous."," 0x39, 0x37, 0x2d, 0x30, 0x30, 0x32, 0x32, 0x37, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12769,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12770,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12771,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12772,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12773,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12774,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12775,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12776,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12777,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12778,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12779,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x39, 0x39, 0x37, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12780,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12781,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12782,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12783,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12784,64,"style","Trailing whitespace is superfluous."," 0x39, 0x37, 0x2d, 0x30, 0x30, 0x32, 0x32, 0x37, 0x36, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12785,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12786,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12787,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x39, 0x35, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12788,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12789,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12790,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12791,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12792,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12793,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12794,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12795,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12796,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12797,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12798,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x31, 0x34, 0x54, 0x30, 0x30, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12799,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12800,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12801,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12802,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12803,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12804,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12805,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12806,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12807,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12808,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12809,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12810,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12811,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12812,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12813,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12814,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12815,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12816,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12817,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12818,64,"style","Trailing whitespace is superfluous."," 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12819,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x38, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12820,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12821,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12822,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12823,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12824,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12825,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12826,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12827,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12828,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12829,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12830,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12831,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12832,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12833,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12834,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12835,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12836,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12837,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12838,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12839,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12840,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12841,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12842,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12843,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12844,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12845,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12846,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12847,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12848,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12849,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12850,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12851,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12852,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12853,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12854,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x39, 0x37, 0x2d, 0x30, 0x30, 0x31, 0x34, 0x38, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12855,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12856,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12857,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12858,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12859,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12860,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12861,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12862,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12863,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x37, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12864,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x35, 0x35, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12865,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12866,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12867,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12868,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12869,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12870,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12871,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12872,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12873,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12874,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x33, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12875,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12876,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12877,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12878,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12879,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12880,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12881,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12882,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12883,64,"style","Trailing whitespace is superfluous."," 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12884,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12885,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12886,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12887,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12888,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12889,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12890,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12891,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12892,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12893,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x38, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12894,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12895,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12896,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12897,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12898,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12899,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12900,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12901,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12902,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12903,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12904,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12905,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12906,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12907,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12908,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12909,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x38, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12910,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12911,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12912,64,"style","Trailing whitespace is superfluous."," 0x38, 0x33, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12913,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12914,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12915,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12916,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12917,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12918,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12919,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12920,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12921,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12922,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x39, 0x37, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12923,64,"style","Trailing whitespace is superfluous."," 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12924,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12925,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12926,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12927,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12928,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12929,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12930,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12931,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12932,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12933,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12934,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12935,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12936,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12937,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12938,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12939,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12940,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12941,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12942,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12943,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x30, 0x31, 0x31, 0x39, 0x35, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12944,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12945,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12946,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12947,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12948,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12949,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12950,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12951,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12952,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12953,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12954,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12955,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12956,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12957,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12958,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12959,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12960,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12961,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12962,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12963,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12964,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12965,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12966,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12967,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12968,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x39, 0x39, 0x37, 0x2d, 0x30, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12969,64,"style","Trailing whitespace is superfluous."," 0x32, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12970,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12971,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12972,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12973,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12974,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12975,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12976,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12977,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12978,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12979,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12980,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12981,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12982,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12983,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12984,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12985,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12986,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12987,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12988,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x39, 0x37, 0x36, 0x32, 0x37, 0x38, 0x33, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12989,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12990,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12991,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12992,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12993,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12994,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12995,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12996,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12997,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12998,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",12999,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13000,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x35, 0x36, 0x38, 0x20, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13001,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13002,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13003,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13004,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13005,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13006,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13007,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13008,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13009,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13010,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13011,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13012,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13013,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13014,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13015,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13016,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13017,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13018,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13019,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13020,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13021,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13022,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13023,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13024,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13025,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13026,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13027,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13028,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13029,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13030,64,"style","Trailing whitespace is superfluous."," 0x39, 0x37, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x33, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13031,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13032,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13033,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13034,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13035,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13036,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13037,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13038,64,"style","Trailing whitespace is superfluous."," 0x20, 0x35, 0x36, 0x38, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13039,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13040,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13041,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13042,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13043,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13044,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13045,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13046,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13047,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13048,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13049,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13050,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x33, 0x54, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13051,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x34, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13052,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13053,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13054,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13055,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13056,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13057,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13058,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13059,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13060,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13061,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13062,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13063,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13064,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13065,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13066,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13067,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13068,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13069,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13070,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13071,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x37, 0x37, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13072,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13073,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13074,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13075,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13076,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13077,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13078,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13079,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13080,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13081,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13082,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13083,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13084,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13085,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13086,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13087,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13088,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13089,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13090,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13091,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13092,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13093,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13094,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13095,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13096,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13097,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13098,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13099,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13100,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13101,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13102,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13103,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13104,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13105,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13106,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x39, 0x37, 0x2d, 0x30, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13107,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13108,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13109,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13110,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13111,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13112,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13113,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13114,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13115,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13116,64,"style","Trailing whitespace is superfluous."," 0x37, 0x35, 0x33, 0x34, 0x37, 0x37, 0x36, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13117,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13118,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13119,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13120,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13121,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13122,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13123,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13124,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13125,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13126,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13127,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13128,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13129,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13130,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13131,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13132,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13133,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13134,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13135,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13136,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x32, 0x37, 0x37, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13137,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13138,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13139,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13140,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13141,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13142,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13143,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13144,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13145,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x32, 0x37, 0x37, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13146,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13147,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13148,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13149,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13150,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13151,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13152,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13153,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13154,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13155,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13156,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x39, 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13157,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13158,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13159,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13160,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13161,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x32, 0x37, 0x37, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13162,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13163,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13164,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x31, 0x38, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13165,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13166,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13167,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13168,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13169,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13170,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13171,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13172,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13173,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13174,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13175,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x31, 0x34, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13176,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13177,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13178,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13179,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13180,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13181,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13182,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13183,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13184,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13185,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13186,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13187,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13188,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13189,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13190,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13191,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13192,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13193,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13194,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13195,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13196,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13197,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13198,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13199,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13200,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13201,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13202,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13203,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13204,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13205,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13206,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13207,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13208,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13209,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13210,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13211,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13212,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13213,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13214,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13215,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13216,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13217,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13218,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13219,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13220,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13221,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13222,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13223,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13224,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13225,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13226,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13227,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13228,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13229,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13230,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13231,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x39, 0x32, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13232,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13233,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13234,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13235,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13236,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13237,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13238,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13239,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13240,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x36, 0x36, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13241,64,"style","Trailing whitespace is superfluous."," 0x34, 0x34, 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13242,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13243,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13244,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13245,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13246,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13247,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13248,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13249,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13250,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13251,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x37, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13252,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13253,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13254,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13255,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13256,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13257,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13258,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13259,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13260,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13261,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13262,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13263,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13264,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13265,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13266,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13267,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13268,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13269,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13270,64,"style","Trailing whitespace is superfluous."," 0x39, 0x32, 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13271,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13272,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13273,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13274,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13275,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13276,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13277,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13278,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13279,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13280,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13281,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13282,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13283,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13284,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13285,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13286,64,"style","Trailing whitespace is superfluous."," 0x39, 0x32, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13287,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13288,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13289,64,"style","Trailing whitespace is superfluous."," 0x37, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13290,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13291,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13292,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13293,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13294,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13295,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13296,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13297,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13298,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13299,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x36, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x54, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13300,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13301,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13302,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13303,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13304,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13305,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13306,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13307,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13308,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13309,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13310,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13311,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13312,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13313,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13314,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13315,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13316,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13317,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13318,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13319,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13320,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x36, 0x31, 0x35, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13321,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13322,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13323,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13324,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13325,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13326,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13327,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13328,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13329,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13330,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13331,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13332,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13333,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13334,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13335,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13336,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13337,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13338,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13339,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13340,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13341,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13342,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13343,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13344,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13345,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x39, 0x39, 0x36, 0x2d, 0x30, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13346,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13347,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13348,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13349,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13350,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13351,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13352,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13353,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13354,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13355,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13356,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x31, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13357,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13358,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13359,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13360,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13361,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13362,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13363,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13364,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13365,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x39, 0x36, 0x36, 0x31, 0x31, 0x39, 0x36, 0x36, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13366,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13367,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13368,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13369,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13370,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13371,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13372,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13373,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13374,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13375,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13376,64,"style","Trailing whitespace is superfluous."," 0x32, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13377,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13378,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13379,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13380,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13381,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13382,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13383,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13384,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13385,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x36, 0x31, 0x35, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13386,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13387,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13388,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13389,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13390,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13391,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13392,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13393,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13394,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x31, 0x35, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13395,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13396,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13397,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13398,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13399,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13400,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13401,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13402,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13403,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13404,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13405,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x39, 0x39, 0x36, 0x2d, 0x30, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13406,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13407,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13408,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13409,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13410,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x31, 0x35, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13411,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13412,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13413,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x37, 0x32, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13414,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13415,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13416,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13417,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13418,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13419,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13420,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13421,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13422,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13423,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x36, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13424,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x31, 0x34, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13425,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13426,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13427,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13428,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13429,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13430,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13431,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13432,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13433,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13434,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13435,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13436,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13437,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13438,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13439,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13440,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13441,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13442,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13443,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13444,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x31, 0x33, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13445,64,"style","Trailing whitespace is superfluous."," 0x36, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13446,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13447,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13448,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13449,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13450,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13451,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13452,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13453,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13454,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13455,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13456,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13457,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13458,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13459,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13460,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13461,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13462,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13463,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13464,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13465,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13466,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13467,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13468,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13469,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13470,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13471,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13472,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13473,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13474,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13475,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13476,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13477,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13478,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13479,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13480,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x2d, 0x30, 0x31, 0x33, 0x35, 0x36, 0x33, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13481,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13482,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13483,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13484,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13485,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13486,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13487,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13488,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13489,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x36, 0x35, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13490,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x37, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13491,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13492,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13493,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13494,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13495,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13496,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13497,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13498,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13499,64,"style","Trailing whitespace is superfluous."," 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13500,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13501,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13502,64,"style","Trailing whitespace is superfluous."," 0x39, 0x37, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13503,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13504,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13505,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13506,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13507,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13508,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13509,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13510,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13511,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x31, 0x33, 0x35, 0x36, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13512,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13513,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13514,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13515,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13516,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13517,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13518,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13519,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13520,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x2d, 0x30, 0x31, 0x33, 0x35, 0x36, 0x33, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13521,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13522,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13523,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13524,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13525,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13526,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13527,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13528,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13529,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13530,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13531,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x39, 0x39, 0x36, 0x2d, 0x30, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13532,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13533,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13534,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13535,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13536,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x2d, 0x30, 0x31, 0x33, 0x35, 0x36, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13537,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13538,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13539,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x37, 0x20, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13540,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13541,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13542,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13543,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13544,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13545,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13546,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13547,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13548,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13549,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13550,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13551,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x39, 0x39, 0x36, 0x2d, 0x30, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13552,64,"style","Trailing whitespace is superfluous."," 0x31, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13553,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13554,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13555,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13556,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13557,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13558,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13559,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13560,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13561,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13562,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13563,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13564,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13565,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13566,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13567,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13568,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13569,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13570,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13571,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13572,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x2d, 0x30, 0x30, 0x32, 0x35, 0x35, 0x31, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13573,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13574,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13575,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13576,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13577,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13578,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13579,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13580,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13581,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13582,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13583,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13584,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13585,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13586,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13587,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13588,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13589,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13590,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13591,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13592,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13593,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13594,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13595,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13596,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13597,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, 0x36, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13598,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13599,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13600,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13601,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13602,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13603,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13604,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13605,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13606,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13607,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, 0x39, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13608,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x35, 0x35, 0x31, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13609,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13610,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13611,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13612,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13613,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13614,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13615,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13616,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13617,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x39, 0x36, 0x35, 0x31, 0x39, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13618,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13619,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13620,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13621,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13622,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13623,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13624,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13625,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13626,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13627,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13628,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x38, 0x35, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13629,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13630,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13631,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13632,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13633,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13634,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13635,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13636,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13637,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x2d, 0x30, 0x30, 0x32, 0x35, 0x35, 0x31, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13638,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13639,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13640,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13641,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13642,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13643,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13644,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13645,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13646,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x30, 0x32, 0x35, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13647,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13648,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13649,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13650,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13651,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13652,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13653,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13654,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13655,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13656,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13657,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, 0x36, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13658,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13659,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13660,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13661,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13662,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x30, 0x32, 0x35, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13663,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13664,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13665,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x38, 0x35, 0x20, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13666,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13667,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13668,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13669,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13670,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13671,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13672,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13673,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13674,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13675,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x36, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13676,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x34, 0x54, 0x30, 0x30, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13677,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13678,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13679,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13680,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13681,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13682,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13683,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13684,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13685,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13686,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13687,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13688,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13689,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13690,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13691,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13692,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13693,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13694,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13695,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13696,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x35, 0x37, 0x2d, 0x39, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13697,64,"style","Trailing whitespace is superfluous."," 0x39, 0x38, 0x34, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13698,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13699,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13700,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13701,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13702,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13703,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13704,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13705,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13706,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13707,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13708,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13709,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13710,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13711,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13712,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13713,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13714,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13715,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13716,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13717,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13718,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13719,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13720,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13721,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13722,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13723,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13724,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13725,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13726,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13727,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13728,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13729,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13730,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13731,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13732,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x39, 0x35, 0x2d, 0x30, 0x30, 0x39, 0x38, 0x34, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13733,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13734,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13735,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13736,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13737,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13738,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13739,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13740,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13741,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13742,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x31, 0x32, 0x30, 0x32, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13743,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13744,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13745,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13746,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13747,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13748,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13749,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13750,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13751,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13752,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x33, 0x20, 0x4b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13753,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13754,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13755,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13756,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13757,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13758,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13759,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13760,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13761,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x35, 0x37, 0x2d, 0x39, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13762,64,"style","Trailing whitespace is superfluous."," 0x39, 0x38, 0x34, 0x33, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13763,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13764,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13765,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13766,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13767,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13768,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13769,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13770,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, 0x39, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13771,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x38, 0x34, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13772,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13773,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13774,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13775,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13776,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13777,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13778,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13779,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13780,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13781,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13782,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13783,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13784,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13785,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13786,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, 0x39, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13787,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x38, 0x34, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13788,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13789,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13790,64,"style","Trailing whitespace is superfluous."," 0x20, 0x38, 0x33, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13791,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13792,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13793,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13794,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13795,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13796,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13797,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13798,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13799,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13800,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x39, 0x39, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13801,64,"style","Trailing whitespace is superfluous."," 0x34, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13802,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13803,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13804,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13805,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13806,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13807,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13808,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13809,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13810,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13811,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13812,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x43, 0x49, 0x4b, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13813,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13814,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13815,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13816,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13817,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13818,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13819,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13820,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13821,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13822,64,"style","Trailing whitespace is superfluous."," 0x43, 0x49, 0x4b, 0x3d, 0x45, 0x41, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13823,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13824,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13825,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x31, 0x30, 0x2d, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13826,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x73, 0x74, 0x61, 0x72, 0x74, 0x3d, 0x30, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13827,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13828,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13829,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13830,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13831,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13832,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13833,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13834,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13835,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13836,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13837,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13838,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13839,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13840,64,"style","Trailing whitespace is superfluous."," 0x43, 0x49, 0x4b, 0x3d, 0x45, 0x41, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13841,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13842,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13843,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x31, 0x30, 0x2d, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13844,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x73, 0x74, 0x61, 0x72, 0x74, 0x3d, 0x30, 0x26, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13845,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13846,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13847,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x75, 0x74, 0x3d, 0x61, 0x74, 0x6f, 0x6d, 0x22, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13848,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x73, 0x65, 0x6c, 0x66, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13849,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x61, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13850,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6c, 0x69, 0x63, 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13851,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x6f, 0x6d, 0x2b, 0x78, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13852,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13853,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13854,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13855,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13856,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13857,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13858,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13859,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13860,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x43, 0x49, 0x4b, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13861,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13862,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x31, 0x30, 0x2d, 0x25, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13863,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13864,64,"style","Trailing whitespace is superfluous."," 0x65, 0x61, 0x3d, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13865,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x62, 0x3d, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13866,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13867,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13868,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13869,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x75, 0x74, 0x70, 0x75, 0x74, 0x3d, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13870,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x73, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13871,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13872,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x6e, 0x65, 0x78, 0x74, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13873,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x61, 0x70, 0x70, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13874,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x2f, 0x61, 0x74, 0x6f, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13875,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2b, 0x78, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13876,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13877,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x45, 0x4c, 0x45, 0x43, 0x54, 0x52, 0x4f, 0x4e, 0x49, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13878,64,"style","Trailing whitespace is superfluous."," 0x43, 0x20, 0x41, 0x52, 0x54, 0x53, 0x20, 0x49, 0x4e, 0x43, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13879,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x20, 0x20, 0x28, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13880,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x29, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13881,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13882,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13883,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x31, 0x2d, 0x32, 0x30, 0x54, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13884,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x35, 0x34, 0x3a, 0x32, 0x31, 0x2d, 0x30, 0x35, 0x3a, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13885,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13886,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x3c, 0x2f, 0x66, 0x65, 0x65, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13887,74,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a)), date = structure(1579542861, class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13888,77,"style","Trailing whitespace is superfluous."," ""POSIXt""), tzone = ""GMT""), times = c(redirect = 0, namelookup = 0.08977, ","trailing_whitespace_linter" +"vignettes/intro/0/browse-edgar-3c23fc.R",13889,73,"style","Trailing whitespace is superfluous."," connect = 0.198839, pretransfer = 0.31077, starttransfer = 0.622565, ","trailing_whitespace_linter" +"vignettes/parsing.Rmd",16,35,"style","Use TRUE instead of the symbol T.","knitr::opts_chunk$set(collapse = T, comment = ""#>"")","T_and_F_symbol_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1,121,"style","Lines should not be more than 120 characters.","structure(list(url = ""/browse-edgar?action=getcompany&CIK=STX&owner=exclude&type=10-Q&dateb=&start=0&count=40&output=atom"", ","line_length_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1,124,"style","Trailing whitespace is superfluous.","structure(list(url = ""/browse-edgar?action=getcompany&CIK=STX&owner=exclude&type=10-Q&dateb=&start=0&count=40&output=atom"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2,78,"style","Trailing whitespace is superfluous."," status_code = 200L, headers = structure(list(`content-encoding` = ""gzip"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3,68,"style","Trailing whitespace is superfluous."," `content-type` = ""application/atom+xml"", server = ""Apache"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4,80,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff"", `x-frame-options` = ""SAMEORIGIN"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5,73,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `content-length` = ""4033"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",6,78,"style","Trailing whitespace is superfluous."," `cache-control` = ""no-cache"", date = ""Mon, 20 Jan 2020 17:54:51 GMT"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",7,61,"style","Trailing whitespace is superfluous."," connection = ""keep-alive"", vary = ""Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",8,88,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000 ; includeSubDomains ; preload"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",10,69,"style","Trailing whitespace is superfluous."," )), all_headers = list(list(status = 200L, version = ""HTTP/1.1"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",11,62,"style","Trailing whitespace is superfluous."," headers = structure(list(`content-encoding` = ""gzip"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",12,72,"style","Trailing whitespace is superfluous."," `content-type` = ""application/atom+xml"", server = ""Apache"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",13,84,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff"", `x-frame-options` = ""SAMEORIGIN"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",14,77,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `content-length` = ""4033"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",15,82,"style","Trailing whitespace is superfluous."," `cache-control` = ""no-cache"", date = ""Mon, 20 Jan 2020 17:54:51 GMT"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",16,65,"style","Trailing whitespace is superfluous."," connection = ""keep-alive"", vary = ""Accept-Encoding"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",17,118,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000 ; includeSubDomains ; preload""), class = c(""insensitive"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",18,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",19,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",20,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",21,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",22,65,"style","Trailing whitespace is superfluous."," content = as.raw(c(0x3c, 0x3f, 0x78, 0x6d, 0x6c, 0x20, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",23,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x73, 0x69, 0x6f, 0x6e, 0x3d, 0x22, 0x31, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",24,64,"style","Trailing whitespace is superfluous."," 0x30, 0x22, 0x20, 0x65, 0x6e, 0x63, 0x6f, 0x64, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",25,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3d, 0x22, 0x49, 0x53, 0x4f, 0x2d, 0x38, 0x38, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",26,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x22, 0x20, 0x3f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",27,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x65, 0x65, 0x64, 0x20, 0x78, 0x6d, 0x6c, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",28,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",29,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x77, 0x33, 0x2e, 0x6f, 0x72, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",30,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x32, 0x30, 0x30, 0x35, 0x2f, 0x41, 0x74, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",31,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",32,64,"style","Trailing whitespace is superfluous."," 0x74, 0x68, 0x6f, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",33,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6d, 0x61, 0x69, 0x6c, 0x3e, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",34,64,"style","Trailing whitespace is superfluous."," 0x65, 0x62, 0x6d, 0x61, 0x73, 0x74, 0x65, 0x72, 0x40, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",35,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x3c, 0x2f, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",36,64,"style","Trailing whitespace is superfluous."," 0x61, 0x69, 0x6c, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",37,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x57, 0x65, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",38,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x73, 0x74, 0x65, 0x72, 0x3c, 0x2f, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",39,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",40,64,"style","Trailing whitespace is superfluous."," 0x61, 0x75, 0x74, 0x68, 0x6f, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",41,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",42,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x66, 0x6f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",43,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",44,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",45,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",46,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",47,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",48,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",49,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x79, 0x3e, 0x44, 0x55, 0x42, 0x4c, 0x49, 0x4e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",50,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x3c, 0x2f, 0x63, 0x69, 0x74, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",51,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",52,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x74, 0x61, 0x74, 0x65, 0x3e, 0x4c, 0x32, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",53,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x74, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",54,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",55,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x65, 0x65, 0x74, 0x31, 0x3e, 0x33, 0x38, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",56,64,"style","Trailing whitespace is superfluous."," 0x33, 0x39, 0x20, 0x46, 0x49, 0x54, 0x5a, 0x57, 0x49, 0x4c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",57,64,"style","Trailing whitespace is superfluous."," 0x4c, 0x49, 0x41, 0x4d, 0x20, 0x53, 0x51, 0x55, 0x41, 0x52, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",58,64,"style","Trailing whitespace is superfluous."," 0x45, 0x3c, 0x2f, 0x73, 0x74, 0x72, 0x65, 0x65, 0x74, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",59,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",60,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x7a, 0x69, 0x70, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",61,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x7a, 0x69, 0x70, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",62,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",63,64,"style","Trailing whitespace is superfluous."," 0x64, 0x64, 0x72, 0x65, 0x73, 0x73, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",64,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x64, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",65,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x73, 0x73, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",66,64,"style","Trailing whitespace is superfluous."," 0x22, 0x62, 0x75, 0x73, 0x69, 0x6e, 0x65, 0x73, 0x73, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",67,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",68,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x69, 0x74, 0x79, 0x3e, 0x44, 0x55, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",69,64,"style","Trailing whitespace is superfluous."," 0x42, 0x4c, 0x49, 0x4e, 0x20, 0x32, 0x3c, 0x2f, 0x63, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",70,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",71,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x70, 0x68, 0x6f, 0x6e, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",72,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x28, 0x33, 0x35, 0x33, 0x29, 0x20, 0x28, 0x31, 0x29, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",73,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x33, 0x34, 0x2d, 0x33, 0x31, 0x33, 0x36, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",74,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x70, 0x68, 0x6f, 0x6e, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",75,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",76,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x74, 0x65, 0x3e, 0x4c, 0x32, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",77,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",78,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",79,64,"style","Trailing whitespace is superfluous."," 0x65, 0x65, 0x74, 0x31, 0x3e, 0x33, 0x38, 0x2f, 0x33, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",80,64,"style","Trailing whitespace is superfluous."," 0x20, 0x46, 0x49, 0x54, 0x5a, 0x57, 0x49, 0x4c, 0x4c, 0x49, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",81,64,"style","Trailing whitespace is superfluous."," 0x41, 0x4d, 0x20, 0x53, 0x51, 0x55, 0x41, 0x52, 0x45, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",82,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x74, 0x72, 0x65, 0x65, 0x74, 0x31, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",83,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",84,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x7a, 0x69, 0x70, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",85,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x7a, 0x69, 0x70, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",86,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x61, 0x64, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",87,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x73, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",88,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",89,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",90,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x73, 0x73, 0x69, 0x67, 0x6e, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",91,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x73, 0x69, 0x63, 0x3e, 0x33, 0x35, 0x37, 0x32, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",92,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x73, 0x73, 0x69, 0x67, 0x6e, 0x65, 0x64, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",93,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x63, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",94,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x73, 0x73, 0x69, 0x67, 0x6e, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",95,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x73, 0x69, 0x63, 0x2d, 0x64, 0x65, 0x73, 0x63, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",96,64,"style","Trailing whitespace is superfluous."," 0x43, 0x4f, 0x4d, 0x50, 0x55, 0x54, 0x45, 0x52, 0x20, 0x53, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",97,64,"style","Trailing whitespace is superfluous."," 0x54, 0x4f, 0x52, 0x41, 0x47, 0x45, 0x20, 0x44, 0x45, 0x56, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",98,64,"style","Trailing whitespace is superfluous."," 0x49, 0x43, 0x45, 0x53, 0x3c, 0x2f, 0x61, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",99,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6e, 0x65, 0x64, 0x2d, 0x73, 0x69, 0x63, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",100,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x63, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",101,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x73, 0x73, 0x69, 0x67, 0x6e, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",102,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x73, 0x69, 0x63, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",103,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",104,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",105,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",106,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",107,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",108,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",109,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x53, 0x49, 0x43, 0x3d, 0x33, 0x35, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",110,64,"style","Trailing whitespace is superfluous."," 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",111,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",112,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",113,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x3c, 0x2f, 0x61, 0x73, 0x73, 0x69, 0x67, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",114,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x2d, 0x73, 0x69, 0x63, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",115,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",116,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",117,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x3c, 0x2f, 0x63, 0x69, 0x6b, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",118,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",119,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",120,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",121,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",122,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",123,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",124,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",125,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",126,64,"style","Trailing whitespace is superfluous."," 0x43, 0x49, 0x4b, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",127,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",128,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",129,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",130,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",131,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",132,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",133,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x64, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x53, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",134,64,"style","Trailing whitespace is superfluous."," 0x65, 0x61, 0x67, 0x61, 0x74, 0x65, 0x20, 0x54, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",135,64,"style","Trailing whitespace is superfluous."," 0x68, 0x6e, 0x6f, 0x6c, 0x6f, 0x67, 0x79, 0x20, 0x70, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",136,64,"style","Trailing whitespace is superfluous."," 0x63, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",137,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",138,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",139,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x2d, 0x79, 0x65, 0x61, 0x72, 0x2d, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",140,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x30, 0x37, 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",141,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x61, 0x6c, 0x2d, 0x79, 0x65, 0x61, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",142,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",143,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",144,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x73, 0x20, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",145,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x22, 0x33, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",146,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",147,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",148,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",149,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",150,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",151,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",152,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x53, 0x45, 0x41, 0x47, 0x41, 0x54, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",153,64,"style","Trailing whitespace is superfluous."," 0x45, 0x20, 0x54, 0x45, 0x43, 0x48, 0x4e, 0x4f, 0x4c, 0x4f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",154,64,"style","Trailing whitespace is superfluous."," 0x47, 0x59, 0x3c, 0x2f, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",155,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",156,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",157,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",158,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",159,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",160,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x36, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",161,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",162,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",163,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x53, 0x65, 0x61, 0x67, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",164,64,"style","Trailing whitespace is superfluous."," 0x20, 0x54, 0x65, 0x63, 0x68, 0x6e, 0x6f, 0x6c, 0x6f, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",165,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3c, 0x2f, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",166,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",167,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",168,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6e, 0x61, 0x6d, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",169,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",170,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",171,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x31, 0x32, 0x2d, 0x31, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",172,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",173,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",174,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x53, 0x45, 0x41, 0x47, 0x41, 0x54, 0x45, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",175,64,"style","Trailing whitespace is superfluous."," 0x54, 0x45, 0x43, 0x48, 0x4e, 0x4f, 0x4c, 0x4f, 0x47, 0x59, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",176,64,"style","Trailing whitespace is superfluous."," 0x20, 0x48, 0x4f, 0x4c, 0x44, 0x49, 0x4e, 0x47, 0x53, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",177,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",178,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",179,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",180,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",181,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",182,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6f, 0x66, 0x66, 0x69, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",183,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x4f, 0x66, 0x66, 0x69, 0x63, 0x65, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",184,64,"style","Trailing whitespace is superfluous."," 0x66, 0x20, 0x54, 0x65, 0x63, 0x68, 0x6e, 0x6f, 0x6c, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",185,64,"style","Trailing whitespace is superfluous."," 0x67, 0x79, 0x3c, 0x2f, 0x6f, 0x66, 0x66, 0x69, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",186,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",187,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x74, 0x65, 0x2d, 0x6c, 0x6f, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",188,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3e, 0x4c, 0x32, 0x3c, 0x2f, 0x73, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",189,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x2d, 0x6c, 0x6f, 0x63, 0x61, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",190,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",191,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x74, 0x61, 0x74, 0x65, 0x2d, 0x6c, 0x6f, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",192,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",193,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",194,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",195,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",196,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",197,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",198,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",199,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x53, 0x74, 0x61, 0x74, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",200,64,"style","Trailing whitespace is superfluous."," 0x4c, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",201,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",202,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",203,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x73, 0x74, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",204,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6c, 0x6f, 0x63, 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",205,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",206,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x74, 0x61, 0x74, 0x65, 0x2d, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",207,64,"style","Trailing whitespace is superfluous."," 0x66, 0x2d, 0x69, 0x6e, 0x63, 0x6f, 0x72, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",208,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x3e, 0x4c, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",209,64,"style","Trailing whitespace is superfluous."," 0x73, 0x74, 0x61, 0x74, 0x65, 0x2d, 0x6f, 0x66, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",210,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x63, 0x6f, 0x72, 0x70, 0x6f, 0x72, 0x61, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",211,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",212,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",213,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",214,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",215,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",216,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",217,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",218,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",219,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",220,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",221,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",222,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",223,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",224,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",225,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",226,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",227,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",228,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x36, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",229,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x30, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",230,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",231,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",232,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",233,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",234,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",235,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",236,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",237,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",238,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",239,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",240,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",241,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",242,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",243,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",244,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",245,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",246,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",247,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",248,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",249,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",250,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",251,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",252,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",253,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",254,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",255,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",256,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",257,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x31, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",258,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",259,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",260,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",261,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",262,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",263,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",264,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",265,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",266,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x36, 0x32, 0x38, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",267,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x31, 0x39, 0x30, 0x31, 0x33, 0x30, 0x39, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",268,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x36, 0x32, 0x38, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",269,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x31, 0x33, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",270,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",271,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",272,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",273,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",274,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",275,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",276,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",277,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",278,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",279,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x37, 0x36, 0x38, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",280,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",281,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",282,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",283,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",284,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",285,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",286,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",287,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",288,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",289,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x30, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",290,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",291,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",292,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",293,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",294,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",295,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",296,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",297,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",298,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",299,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",300,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",301,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x36, 0x32, 0x38, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",302,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x31, 0x33, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",303,64,"style","Trailing whitespace is superfluous."," 0x39, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",304,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",305,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",306,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",307,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",308,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",309,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",310,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",311,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",312,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",313,64,"style","Trailing whitespace is superfluous."," 0x36, 0x32, 0x38, 0x32, 0x38, 0x30, 0x2d, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",314,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x30, 0x39, 0x32, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",315,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",316,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",317,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",318,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",319,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",320,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",321,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",322,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x32, 0x38, 0x32, 0x38, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",323,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x30, 0x39, 0x32, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",324,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x32, 0x38, 0x32, 0x38, 0x30, 0x2d, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",325,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x33, 0x30, 0x39, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",326,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",327,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",328,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",329,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",330,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",331,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",332,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",333,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",334,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",335,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",336,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x31, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",337,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",338,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",339,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",340,64,"style","Trailing whitespace is superfluous."," 0x36, 0x32, 0x38, 0x32, 0x38, 0x30, 0x2d, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",341,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x30, 0x39, 0x32, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",342,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",343,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",344,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x30, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",345,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",346,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",347,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",348,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",349,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",350,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",351,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",352,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",353,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",354,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x31, 0x39, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",355,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x54, 0x31, 0x37, 0x3a, 0x32, 0x33, 0x3a, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",356,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",357,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",358,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",359,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",360,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",361,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",362,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",363,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",364,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",365,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",366,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",367,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",368,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",369,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",370,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",371,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",372,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",373,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",374,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",375,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x39, 0x2d, 0x31, 0x32, 0x39, 0x32, 0x38, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",376,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",377,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",378,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",379,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",380,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",381,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",382,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",383,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",384,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",385,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",386,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",387,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",388,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",389,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",390,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",391,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",392,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",393,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",394,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",395,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",396,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",397,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",398,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",399,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",400,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",401,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",402,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",403,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x2d, 0x33, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",404,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",405,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",406,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",407,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",408,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",409,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",410,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",411,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",412,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",413,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x32, 0x39, 0x32, 0x38, 0x34, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",414,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",415,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x32, 0x39, 0x32, 0x38, 0x34, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",416,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",417,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",418,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",419,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",420,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",421,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",422,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",423,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",424,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x31, 0x39, 0x37, 0x38, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",425,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",426,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",427,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",428,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",429,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",430,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",431,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",432,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",433,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",434,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",435,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x39, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",436,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",437,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",438,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",439,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",440,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",441,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",442,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",443,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",444,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",445,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",446,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",447,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",448,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x32, 0x39, 0x32, 0x38, 0x34, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",449,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",450,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",451,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",452,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",453,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",454,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",455,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",456,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",457,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",458,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",459,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x31, 0x32, 0x39, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",460,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",461,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",462,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",463,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",464,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",465,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",466,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",467,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",468,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x39, 0x31, 0x32, 0x39, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",469,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",470,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x31, 0x32, 0x39, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",471,64,"style","Trailing whitespace is superfluous."," 0x38, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",472,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",473,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",474,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",475,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",476,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",477,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",478,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",479,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",480,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",481,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",482,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x33, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",483,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",484,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",485,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",486,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x31, 0x32, 0x39, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",487,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",488,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",489,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x39, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",490,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",491,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",492,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",493,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",494,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",495,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",496,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",497,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",498,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",499,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",500,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",501,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x3a, 0x32, 0x38, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",502,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",503,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",504,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",505,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",506,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",507,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",508,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",509,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",510,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",511,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",512,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",513,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",514,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",515,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",516,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",517,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",518,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",519,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",520,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",521,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x30, 0x37, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",522,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",523,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",524,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",525,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",526,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",527,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",528,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",529,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",530,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",531,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",532,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",533,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",534,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",535,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",536,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",537,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",538,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",539,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",540,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",541,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",542,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",543,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",544,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",545,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",546,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",547,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",548,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",549,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",550,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",551,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",552,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",553,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",554,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",555,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",556,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",557,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",558,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x39, 0x30, 0x32, 0x37, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",559,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",560,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x32, 0x37, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",561,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",562,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",563,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",564,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",565,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",566,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",567,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",568,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",569,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",570,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x33, 0x37, 0x38, 0x33, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",571,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",572,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",573,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",574,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",575,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",576,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",577,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",578,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",579,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",580,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",581,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",582,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",583,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",584,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",585,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",586,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",587,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",588,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",589,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",590,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",591,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",592,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",593,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x32, 0x37, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",594,64,"style","Trailing whitespace is superfluous."," 0x37, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",595,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",596,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",597,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",598,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",599,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",600,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",601,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",602,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",603,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",604,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",605,64,"style","Trailing whitespace is superfluous."," 0x32, 0x37, 0x30, 0x30, 0x37, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",606,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",607,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",608,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",609,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",610,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",611,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",612,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",613,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x39, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",614,64,"style","Trailing whitespace is superfluous."," 0x32, 0x37, 0x30, 0x30, 0x37, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",615,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",616,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x37, 0x30, 0x30, 0x37, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",617,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",618,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",619,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",620,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",621,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",622,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",623,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",624,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",625,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",626,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",627,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x34, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",628,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",629,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",630,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",631,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",632,64,"style","Trailing whitespace is superfluous."," 0x32, 0x37, 0x30, 0x30, 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",633,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",634,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",635,64,"style","Trailing whitespace is superfluous."," 0x20, 0x38, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",636,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",637,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",638,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",639,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",640,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",641,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",642,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",643,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",644,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",645,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",646,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x36, 0x3a, 0x31, 0x30, 0x3a, 0x34, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",647,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",648,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",649,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",650,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",651,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",652,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",653,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",654,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",655,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",656,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",657,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",658,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",659,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",660,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",661,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",662,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",663,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",664,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",665,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",666,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x33, 0x31, 0x37, 0x31, 0x34, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",667,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",668,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",669,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",670,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",671,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",672,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",673,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",674,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",675,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",676,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",677,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",678,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",679,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",680,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",681,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",682,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",683,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",684,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",685,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",686,64,"style","Trailing whitespace is superfluous."," 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",687,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",688,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",689,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",690,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",691,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",692,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",693,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",694,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",695,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",696,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",697,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",698,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",699,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",700,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",701,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",702,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",703,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x38, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",704,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x31, 0x34, 0x33, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",705,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",706,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x37, 0x31, 0x34, 0x33, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",707,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",708,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",709,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",710,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",711,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",712,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",713,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",714,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",715,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x31, 0x38, 0x31, 0x31, 0x35, 0x37, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",716,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",717,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",718,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",719,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",720,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",721,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",722,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",723,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",724,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",725,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",726,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",727,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",728,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",729,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",730,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",731,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",732,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",733,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",734,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",735,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",736,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",737,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",738,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",739,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x37, 0x31, 0x34, 0x33, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",740,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",741,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",742,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",743,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",744,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",745,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",746,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",747,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",748,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",749,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",750,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x38, 0x2d, 0x33, 0x31, 0x37, 0x31, 0x34, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",751,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",752,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",753,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",754,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",755,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",756,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",757,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",758,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",759,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x38, 0x33, 0x31, 0x37, 0x31, 0x34, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",760,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",761,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x33, 0x31, 0x37, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",762,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",763,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",764,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",765,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",766,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",767,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",768,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",769,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",770,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",771,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",772,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",773,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",774,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",775,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",776,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",777,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x38, 0x2d, 0x33, 0x31, 0x37, 0x31, 0x34, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",778,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",779,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",780,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",781,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",782,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",783,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",784,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",785,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",786,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",787,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",788,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",789,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",790,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",791,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x32, 0x54, 0x31, 0x36, 0x3a, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",792,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3a, 0x32, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",793,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",794,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",795,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",796,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",797,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",798,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",799,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",800,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",801,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",802,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",803,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",804,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",805,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",806,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",807,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",808,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",809,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",810,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",811,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x31, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",812,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x38, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",813,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",814,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",815,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",816,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",817,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",818,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",819,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",820,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",821,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",822,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",823,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",824,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",825,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",826,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",827,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",828,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",829,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",830,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",831,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",832,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",833,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",834,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",835,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",836,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",837,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",838,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",839,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x31, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",840,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",841,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",842,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",843,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",844,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",845,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",846,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",847,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",848,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",849,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x38, 0x31, 0x34, 0x36, 0x35, 0x39, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",850,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",851,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x31, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",852,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",853,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",854,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",855,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",856,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",857,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",858,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",859,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",860,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x38, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",861,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x37, 0x30, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",862,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",863,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",864,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",865,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",866,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",867,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",868,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",869,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",870,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",871,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",872,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",873,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",874,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",875,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",876,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",877,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",878,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",879,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",880,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",881,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",882,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",883,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",884,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x38, 0x2d, 0x31, 0x34, 0x36, 0x35, 0x39, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",885,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",886,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",887,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",888,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",889,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",890,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",891,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",892,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",893,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",894,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",895,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",896,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",897,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",898,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",899,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",900,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",901,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",902,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",903,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",904,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x38, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",905,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",906,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",907,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",908,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",909,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",910,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",911,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",912,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",913,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",914,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",915,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",916,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",917,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",918,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x31, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",919,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",920,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",921,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",922,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",923,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",924,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",925,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",926,64,"style","Trailing whitespace is superfluous."," 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",927,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",928,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",929,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",930,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",931,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",932,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",933,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",934,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",935,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",936,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x31, 0x54, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",937,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x3a, 0x31, 0x36, 0x3a, 0x30, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",938,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",939,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",940,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",941,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",942,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",943,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",944,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",945,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",946,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",947,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",948,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",949,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",950,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",951,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",952,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",953,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",954,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",955,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",956,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",957,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x33, 0x35, 0x39, 0x32, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",958,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",959,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",960,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",961,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",962,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",963,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",964,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",965,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",966,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",967,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",968,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",969,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",970,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",971,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",972,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",973,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",974,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",975,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",976,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",977,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",978,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",979,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",980,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",981,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",982,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",983,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",984,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",985,64,"style","Trailing whitespace is superfluous."," 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",986,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",987,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",988,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",989,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",990,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",991,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",992,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",993,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",994,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x38, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",995,64,"style","Trailing whitespace is superfluous."," 0x33, 0x35, 0x39, 0x32, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",996,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",997,64,"style","Trailing whitespace is superfluous."," 0x32, 0x33, 0x35, 0x39, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",998,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",999,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1000,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1001,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1002,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1003,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1004,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1005,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1006,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x38, 0x35, 0x35, 0x35, 0x35, 0x38, 0x35, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1007,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1008,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1009,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1010,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1011,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1012,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1013,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1014,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1015,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1016,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1017,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1018,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1019,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1020,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1021,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1022,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1023,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1024,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1025,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1026,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1027,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1028,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1029,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1030,64,"style","Trailing whitespace is superfluous."," 0x33, 0x35, 0x39, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1031,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1032,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1033,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1034,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1035,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1036,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1037,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1038,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1039,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1040,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1041,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x32, 0x33, 0x35, 0x39, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1042,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1043,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1044,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1045,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1046,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1047,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1048,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1049,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1050,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x30, 0x32, 0x33, 0x35, 0x39, 0x32, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1051,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1052,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x32, 0x33, 0x35, 0x39, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1053,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1054,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1055,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1056,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1057,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1058,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1059,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1060,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1061,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1062,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1063,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x30, 0x31, 0x2d, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1064,64,"style","Trailing whitespace is superfluous."," 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1065,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1066,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1067,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1068,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x32, 0x33, 0x35, 0x39, 0x32, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1069,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1070,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1071,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1072,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1073,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1074,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1075,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1076,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1077,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1078,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1079,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1080,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1081,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1082,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x39, 0x54, 0x31, 0x36, 0x3a, 0x30, 0x37, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1083,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1084,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1085,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1086,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1087,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1088,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1089,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1090,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1091,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1092,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1093,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1094,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1095,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1096,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1097,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1098,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1099,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1100,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1101,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1102,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x33, 0x32, 0x33, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1103,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1104,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1105,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1106,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1107,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1108,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1109,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1110,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1111,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1112,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1113,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1114,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1115,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1116,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1117,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1118,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1119,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1120,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1121,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1122,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1123,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1124,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1125,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1126,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1127,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1128,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1129,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1130,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x37, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1131,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1132,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1133,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1134,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1135,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1136,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1137,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1138,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1139,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1140,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x33, 0x32, 0x33, 0x30, 0x34, 0x32, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1141,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1142,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x2d, 0x33, 0x32, 0x33, 0x30, 0x34, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1143,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1144,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1145,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1146,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1147,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1148,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1149,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1150,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1151,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x37, 0x31, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1152,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1153,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1154,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1155,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1156,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1157,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1158,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1159,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1160,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1161,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1162,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x36, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1163,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1164,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1165,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1166,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1167,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1168,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1169,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1170,64,"style","Trailing whitespace is superfluous."," 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1171,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1172,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1173,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1174,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1175,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x2d, 0x33, 0x32, 0x33, 0x30, 0x34, 0x32, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1176,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1177,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1178,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1179,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1180,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1181,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1182,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1183,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1184,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1185,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1186,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x33, 0x32, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1187,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x32, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1188,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1189,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1190,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1191,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1192,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1193,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1194,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1195,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x37, 0x33, 0x32, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1196,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x32, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1197,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x33, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1198,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x34, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1199,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1200,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1201,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1202,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1203,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1204,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1205,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1206,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1207,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1208,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1209,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x37, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1210,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1211,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1212,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1213,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x33, 0x32, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1214,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1215,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1216,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1217,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1218,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1219,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1220,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1221,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1222,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1223,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1224,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1225,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1226,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1227,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x37, 0x54, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1228,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x30, 0x37, 0x3a, 0x30, 0x38, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1229,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1230,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1231,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1232,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1233,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1234,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1235,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1236,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1237,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1238,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1239,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1240,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1241,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1242,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1243,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1244,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1245,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1246,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1247,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1248,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x38, 0x38, 0x35, 0x35, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1249,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1250,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1251,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1252,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1253,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1254,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1255,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1256,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1257,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1258,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1259,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1260,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1261,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1262,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1263,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1264,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1265,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1266,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1267,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1268,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1269,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1270,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1271,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1272,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1273,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1274,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1275,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x34, 0x2d, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1276,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1277,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1278,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1279,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1280,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1281,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1282,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1283,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1284,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1285,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x37, 0x31, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1286,64,"style","Trailing whitespace is superfluous."," 0x38, 0x35, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1287,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1288,64,"style","Trailing whitespace is superfluous."," 0x38, 0x38, 0x35, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1289,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1290,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1291,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1292,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1293,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1294,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1295,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1296,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1297,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x37, 0x39, 0x37, 0x31, 0x36, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1298,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1299,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1300,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1301,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1302,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1303,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1304,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1305,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1306,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1307,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1308,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1309,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1310,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1311,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1312,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1313,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1314,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1315,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1316,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1317,64,"style","Trailing whitespace is superfluous."," 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1318,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1319,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1320,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x31, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1321,64,"style","Trailing whitespace is superfluous."," 0x38, 0x35, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1322,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1323,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1324,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1325,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1326,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1327,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1328,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1329,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1330,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1331,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1332,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x38, 0x38, 0x35, 0x35, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1333,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1334,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1335,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1336,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1337,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1338,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1339,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1340,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1341,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x34, 0x38, 0x38, 0x35, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1342,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1343,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x31, 0x34, 0x38, 0x38, 0x35, 0x35, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1344,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1345,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1346,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1347,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1348,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1349,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1350,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1351,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1352,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1353,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1354,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x34, 0x2d, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1355,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1356,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1357,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1358,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1359,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x38, 0x38, 0x35, 0x35, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1360,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1361,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1362,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x38, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1363,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1364,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1365,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1366,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1367,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1368,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1369,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1370,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1371,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1372,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1373,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x54, 0x31, 0x37, 0x3a, 0x31, 0x39, 0x3a, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1374,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1375,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1376,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1377,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1378,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1379,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1380,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1381,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1382,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1383,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1384,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1385,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1386,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1387,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1388,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1389,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1390,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1391,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1392,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1393,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x31, 0x39, 0x37, 0x33, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1394,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1395,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1396,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1397,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1398,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1399,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1400,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1401,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1402,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1403,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1404,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1405,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1406,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1407,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1408,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1409,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1410,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1411,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1412,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1413,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1414,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1415,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1416,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1417,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1418,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1419,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1420,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1421,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x32, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1422,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1423,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1424,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1425,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1426,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1427,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1428,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1429,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1430,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1431,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x31, 0x39, 0x37, 0x33, 0x32, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1432,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1433,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x31, 0x39, 0x37, 0x33, 0x32, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1434,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1435,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1436,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1437,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1438,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1439,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1440,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1441,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1442,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x31, 0x37, 0x35, 0x34, 0x39, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1443,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1444,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1445,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1446,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1447,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1448,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1449,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1450,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1451,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1452,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1453,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1454,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1455,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1456,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1457,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1458,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1459,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1460,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1461,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1462,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1463,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1464,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1465,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1466,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x39, 0x37, 0x33, 0x32, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1467,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1468,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1469,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1470,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1471,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1472,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1473,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1474,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1475,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1476,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1477,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x31, 0x39, 0x37, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1478,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1479,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1480,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1481,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1482,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1483,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1484,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1485,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1486,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x37, 0x30, 0x31, 0x39, 0x37, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1487,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1488,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x31, 0x39, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1489,64,"style","Trailing whitespace is superfluous."," 0x33, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1490,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1491,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1492,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1493,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1494,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1495,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1496,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1497,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1498,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1499,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1500,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x32, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1501,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1502,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1503,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1504,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x31, 0x39, 0x37, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1505,64,"style","Trailing whitespace is superfluous."," 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1506,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1507,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1508,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1509,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1510,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1511,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1512,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1513,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1514,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1515,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1516,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1517,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1518,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x2d, 0x32, 0x36, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1519,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x3a, 0x31, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1520,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1521,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1522,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1523,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1524,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1525,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1526,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1527,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1528,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1529,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1530,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1531,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1532,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1533,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1534,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1535,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1536,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1537,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1538,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x37, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1539,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x39, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1540,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1541,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1542,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1543,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1544,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1545,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1546,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1547,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1548,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1549,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1550,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1551,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1552,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1553,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1554,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1555,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1556,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1557,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1558,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1559,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1560,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1561,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1562,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1563,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1564,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1565,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1566,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x38, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1567,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1568,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1569,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1570,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1571,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1572,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1573,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1574,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1575,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1576,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x36, 0x37, 0x35, 0x31, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1577,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1578,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x37, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1579,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1580,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1581,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1582,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1583,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1584,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1585,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1586,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1587,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1588,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x35, 0x38, 0x37, 0x31, 0x31, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1589,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1590,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1591,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1592,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1593,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1594,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1595,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1596,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1597,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1598,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1599,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1600,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1601,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1602,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1603,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1604,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1605,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1606,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1607,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1608,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1609,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1610,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1611,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x37, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1612,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1613,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1614,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1615,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1616,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1617,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1618,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1619,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1620,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1621,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1622,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1623,64,"style","Trailing whitespace is superfluous."," 0x37, 0x35, 0x31, 0x35, 0x39, 0x33, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1624,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1625,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1626,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1627,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1628,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1629,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1630,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1631,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1632,64,"style","Trailing whitespace is superfluous."," 0x37, 0x35, 0x31, 0x35, 0x39, 0x33, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1633,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1634,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x37, 0x35, 0x31, 0x35, 0x39, 0x33, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1635,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1636,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1637,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1638,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1639,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1640,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1641,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1642,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1643,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1644,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1645,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x38, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1646,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1647,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1648,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1649,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1650,64,"style","Trailing whitespace is superfluous."," 0x37, 0x35, 0x31, 0x35, 0x39, 0x33, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1651,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1652,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1653,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1654,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1655,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1656,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1657,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1658,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1659,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1660,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1661,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1662,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1663,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x31, 0x30, 0x2d, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1664,64,"style","Trailing whitespace is superfluous."," 0x38, 0x54, 0x31, 0x36, 0x3a, 0x31, 0x31, 0x3a, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1665,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1666,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1667,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1668,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1669,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1670,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1671,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1672,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1673,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1674,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1675,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1676,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1677,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1678,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1679,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1680,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1681,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1682,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1683,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1684,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x31, 0x31, 0x36, 0x32, 0x30, 0x31, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1685,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1686,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1687,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1688,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1689,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1690,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1691,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1692,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1693,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1694,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1695,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1696,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1697,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1698,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1699,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1700,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1701,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1702,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1703,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1704,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1705,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1706,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1707,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1708,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1709,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1710,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1711,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1712,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1713,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1714,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1715,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1716,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1717,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1718,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1719,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1720,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1721,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1722,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x36, 0x32, 0x30, 0x31, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1723,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1724,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x36, 0x32, 0x30, 0x31, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1725,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1726,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1727,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1728,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1729,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1730,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1731,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1732,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1733,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x36, 0x31, 0x36, 0x30, 0x36, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1734,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1735,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1736,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1737,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1738,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1739,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1740,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1741,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1742,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1743,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1744,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x38, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1745,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1746,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1747,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1748,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1749,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1750,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1751,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1752,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1753,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1754,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1755,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1756,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1757,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x36, 0x32, 0x30, 0x31, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1758,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1759,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1760,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1761,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1762,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1763,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1764,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1765,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1766,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1767,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1768,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x36, 0x2d, 0x31, 0x31, 0x36, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1769,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1770,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1771,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1772,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1773,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1774,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1775,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1776,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1777,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x36, 0x31, 0x31, 0x36, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1778,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1779,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x36, 0x2d, 0x31, 0x31, 0x36, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1780,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1781,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1782,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1783,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1784,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1785,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1786,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1787,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1788,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1789,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1790,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1791,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x32, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1792,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1793,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1794,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1795,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x36, 0x2d, 0x31, 0x31, 0x36, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1796,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1797,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1798,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x38, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1799,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1800,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1801,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1802,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1803,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1804,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1805,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1806,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1807,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1808,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1809,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x2d, 0x32, 0x39, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1810,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x3a, 0x35, 0x31, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1811,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1812,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1813,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1814,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1815,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1816,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1817,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1818,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1819,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1820,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1821,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1822,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1823,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1824,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1825,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1826,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1827,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1828,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1829,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1830,64,"style","Trailing whitespace is superfluous."," 0x32, 0x34, 0x36, 0x37, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1831,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1832,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1833,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1834,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1835,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1836,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1837,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1838,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1839,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1840,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1841,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1842,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1843,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1844,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1845,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1846,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1847,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1848,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1849,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1850,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1851,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1852,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1853,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1854,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1855,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1856,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1857,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x2d, 0x30, 0x31, 0x2d, 0x32, 0x39, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1858,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1859,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1860,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1861,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1862,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1863,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1864,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1865,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1866,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1867,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x36, 0x30, 0x39, 0x32, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1868,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1869,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x39, 0x32, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1870,64,"style","Trailing whitespace is superfluous."," 0x36, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1871,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1872,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1873,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1874,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1875,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1876,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1877,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1878,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1879,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x33, 0x34, 0x39, 0x32, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1880,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1881,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1882,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1883,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1884,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1885,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1886,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1887,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1888,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1889,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1890,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1891,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1892,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1893,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1894,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1895,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1896,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1897,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1898,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1899,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1900,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1901,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1902,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x39, 0x32, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1903,64,"style","Trailing whitespace is superfluous."," 0x36, 0x37, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1904,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1905,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1906,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1907,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1908,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1909,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1910,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1911,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1912,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1913,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1914,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x32, 0x34, 0x36, 0x37, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1915,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1916,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1917,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1918,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1919,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1920,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1921,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1922,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1923,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x32, 0x34, 0x36, 0x37, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1924,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1925,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x39, 0x32, 0x34, 0x36, 0x37, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1926,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1927,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1928,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1929,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1930,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1931,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1932,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1933,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1934,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1935,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1936,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x2d, 0x30, 0x31, 0x2d, 0x32, 0x39, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1937,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1938,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1939,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1940,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1941,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x32, 0x34, 0x36, 0x37, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1942,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1943,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1944,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x38, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1945,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1946,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1947,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1948,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1949,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1950,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1951,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1952,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1953,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1954,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x30, 0x31, 0x2d, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1955,64,"style","Trailing whitespace is superfluous."," 0x39, 0x54, 0x31, 0x36, 0x3a, 0x31, 0x30, 0x3a, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1956,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1957,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1958,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1959,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1960,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1961,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1962,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1963,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1964,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1965,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1966,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1967,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1968,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1969,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1970,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1971,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1972,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1973,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1974,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1975,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x30, 0x37, 0x34, 0x35, 0x33, 0x39, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1976,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1977,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1978,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1979,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1980,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1981,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1982,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1983,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1984,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1985,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1986,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1987,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1988,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1989,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1990,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1991,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1992,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1993,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1994,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1995,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1996,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1997,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1998,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",1999,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2000,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2001,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2002,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2003,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x33, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2004,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2005,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2006,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2007,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2008,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2009,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2010,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2011,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2012,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2013,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x34, 0x35, 0x33, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2014,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2015,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x34, 0x35, 0x33, 0x39, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2016,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2017,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2018,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2019,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2020,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2021,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2022,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2023,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2024,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x35, 0x31, 0x31, 0x38, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2025,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2026,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2027,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2028,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2029,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2030,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2031,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2032,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2033,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2034,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2035,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2036,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2037,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2038,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2039,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2040,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2041,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2042,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2043,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2044,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2045,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2046,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2047,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2048,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x34, 0x35, 0x33, 0x39, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2049,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2050,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2051,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2052,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2053,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2054,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2055,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2056,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2057,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2058,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2059,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x37, 0x34, 0x35, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2060,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2061,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2062,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2063,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2064,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2065,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2066,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2067,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2068,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x35, 0x30, 0x37, 0x34, 0x35, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2069,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2070,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x37, 0x34, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2071,64,"style","Trailing whitespace is superfluous."," 0x33, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2072,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2073,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2074,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2075,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2076,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2077,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2078,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2079,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2080,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2081,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2082,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x33, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2083,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2084,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2085,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2086,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x37, 0x34, 0x35, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2087,64,"style","Trailing whitespace is superfluous."," 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2088,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2089,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2090,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2091,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2092,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2093,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2094,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2095,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2096,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2097,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2098,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2099,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2100,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x33, 0x30, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2101,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x3a, 0x34, 0x34, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2102,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2103,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2104,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2105,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2106,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2107,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2108,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2109,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2110,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2111,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2112,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2113,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2114,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2115,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2116,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2117,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2118,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2119,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2120,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2121,64,"style","Trailing whitespace is superfluous."," 0x32, 0x36, 0x34, 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2122,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2123,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2124,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2125,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2126,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2127,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2128,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2129,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2130,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2131,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2132,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2133,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2134,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2135,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2136,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2137,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2138,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2139,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2140,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2141,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2142,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2143,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2144,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2145,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2146,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2147,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2148,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x35, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2149,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2150,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2151,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2152,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2153,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2154,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2155,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2156,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2157,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2158,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x35, 0x30, 0x33, 0x32, 0x36, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2159,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2160,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x33, 0x32, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2161,64,"style","Trailing whitespace is superfluous."," 0x34, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2162,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2163,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2164,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2165,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2166,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2167,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2168,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2169,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2170,64,"style","Trailing whitespace is superfluous."," 0x38, 0x31, 0x39, 0x38, 0x32, 0x31, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2171,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2172,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2173,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2174,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2175,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2176,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2177,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2178,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2179,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2180,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2181,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2182,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2183,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2184,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2185,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2186,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2187,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2188,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2189,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2190,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2191,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2192,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2193,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x33, 0x32, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2194,64,"style","Trailing whitespace is superfluous."," 0x34, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2195,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2196,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2197,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2198,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2199,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2200,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2201,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2202,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2203,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2204,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2205,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x32, 0x36, 0x34, 0x32, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2206,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2207,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2208,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2209,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2210,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2211,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2212,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2213,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2214,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x32, 0x36, 0x34, 0x32, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2215,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2216,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x33, 0x32, 0x36, 0x34, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2217,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2218,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2219,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2220,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2221,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2222,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2223,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2224,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2225,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2226,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2227,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x35, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2228,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2229,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2230,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2231,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2232,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x32, 0x36, 0x34, 0x32, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2233,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2234,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2235,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2236,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2237,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2238,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2239,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2240,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2241,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2242,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2243,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2244,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2245,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2246,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x54, 0x31, 0x36, 0x3a, 0x35, 0x37, 0x3a, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2247,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2248,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2249,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2250,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2251,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2252,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2253,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2254,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2255,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2256,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2257,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2258,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2259,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2260,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2261,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2262,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2263,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2264,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2265,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2266,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x35, 0x37, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2267,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2268,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2269,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2270,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2271,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2272,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2273,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2274,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2275,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2276,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2277,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2278,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2279,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2280,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2281,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2282,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2283,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2284,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2285,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2286,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2287,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2288,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2289,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2290,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2291,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2292,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2293,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2294,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x33, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2295,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2296,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2297,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2298,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2299,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2300,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2301,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2302,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2303,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2304,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x35, 0x37, 0x31, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2305,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2306,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x35, 0x37, 0x31, 0x39, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2307,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2308,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2309,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2310,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2311,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2312,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2313,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2314,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2315,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x31, 0x35, 0x35, 0x36, 0x33, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2316,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2317,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2318,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2319,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2320,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2321,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2322,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2323,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2324,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2325,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2326,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2327,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2328,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2329,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2330,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2331,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2332,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2333,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2334,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2335,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2336,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2337,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2338,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2339,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x35, 0x37, 0x31, 0x39, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2340,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2341,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2342,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2343,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2344,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2345,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2346,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2347,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2348,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2349,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2350,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2351,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2352,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2353,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2354,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2355,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2356,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2357,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2358,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2359,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x31, 0x35, 0x30, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2360,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2361,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2362,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2363,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2364,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2365,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2366,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2367,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2368,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2369,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2370,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2371,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2372,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2373,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x33, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2374,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2375,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2376,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2377,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2378,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2379,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2380,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2381,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2382,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2383,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2384,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2385,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2386,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2387,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2388,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2389,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2390,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2391,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x30, 0x31, 0x2d, 0x33, 0x30, 0x54, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2392,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x34, 0x30, 0x3a, 0x33, 0x39, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2393,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2394,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2395,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2396,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2397,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2398,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2399,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2400,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2401,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2402,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2403,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2404,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2405,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2406,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2407,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2409,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2410,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2411,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2412,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x35, 0x36, 0x36, 0x36, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2413,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2414,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2415,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2416,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2417,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2418,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2419,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2420,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2421,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2422,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2423,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2424,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2425,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2426,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2427,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2428,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2429,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2430,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2431,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2432,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2433,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2434,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2435,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2436,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2437,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2438,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2439,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2440,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2441,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2442,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2443,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2444,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2445,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2446,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2447,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2448,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2449,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x34, 0x30, 0x37, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2450,64,"style","Trailing whitespace is superfluous."," 0x36, 0x36, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2451,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2452,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x36, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2453,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2454,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2455,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2456,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2457,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2458,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2459,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2460,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2461,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x31, 0x31, 0x38, 0x37, 0x36, 0x33, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2462,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2463,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2464,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2465,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2466,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2467,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2468,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2469,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2470,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2471,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2472,64,"style","Trailing whitespace is superfluous."," 0x30, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2473,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2474,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2475,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2476,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2477,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2478,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2479,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2480,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2481,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2482,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2483,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2484,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2485,64,"style","Trailing whitespace is superfluous."," 0x37, 0x35, 0x36, 0x36, 0x36, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2486,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2487,64,"style","Trailing whitespace is superfluous."," 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2488,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2489,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2490,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2491,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2492,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2493,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2494,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2495,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2496,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x37, 0x35, 0x36, 0x36, 0x36, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2497,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2498,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2499,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2500,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2501,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2502,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2503,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2504,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2505,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x34, 0x30, 0x37, 0x35, 0x36, 0x36, 0x36, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2506,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2507,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x37, 0x35, 0x36, 0x36, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2508,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2509,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2510,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2511,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2512,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2513,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2514,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2515,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2516,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2517,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2518,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2519,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2520,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2521,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2522,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2523,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x37, 0x35, 0x36, 0x36, 0x36, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2524,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2525,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2526,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x30, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2527,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2528,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2529,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2530,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2531,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2532,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2533,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2534,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2535,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2536,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2537,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x33, 0x31, 0x54, 0x31, 0x39, 0x3a, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2538,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3a, 0x33, 0x39, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2539,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2540,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2541,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2542,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2543,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2544,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2545,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2546,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2547,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2548,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2549,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2550,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2551,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2552,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2553,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2554,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2555,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2556,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2557,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x33, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2558,64,"style","Trailing whitespace is superfluous."," 0x36, 0x37, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2559,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2560,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2561,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2562,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2563,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2564,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2565,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2566,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2567,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2568,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2569,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2570,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2571,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2572,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2573,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2574,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2575,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2576,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2577,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2578,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2579,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2580,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2581,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2582,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2583,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2584,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2585,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2586,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2587,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2588,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2589,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2590,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2591,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2592,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2593,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2594,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2595,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x31, 0x34, 0x30, 0x33, 0x32, 0x36, 0x37, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2596,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2597,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x33, 0x32, 0x36, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2598,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2599,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2600,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2601,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2602,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2603,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2604,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2605,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2606,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x34, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2607,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x31, 0x34, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2608,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2609,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2610,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2611,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2612,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2613,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2614,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2615,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2616,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2617,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2618,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2619,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2620,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2621,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2622,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2623,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2624,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2625,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2626,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2627,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2628,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2629,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2630,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x33, 0x32, 0x36, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2631,64,"style","Trailing whitespace is superfluous."," 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2632,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2633,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2634,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2635,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2636,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2637,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2638,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2639,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2640,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2641,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2642,64,"style","Trailing whitespace is superfluous."," 0x33, 0x32, 0x36, 0x37, 0x34, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2643,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2644,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2645,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2646,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2647,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2648,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2649,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2650,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2651,64,"style","Trailing whitespace is superfluous."," 0x33, 0x32, 0x36, 0x37, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2652,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2653,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x32, 0x36, 0x37, 0x34, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2654,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2655,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2656,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2657,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2658,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2659,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2660,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2661,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2662,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2663,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2664,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2665,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2666,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2667,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2668,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2669,64,"style","Trailing whitespace is superfluous."," 0x33, 0x32, 0x36, 0x37, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2670,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2671,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2672,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2673,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2674,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2675,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2676,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2677,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2678,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2679,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2680,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2681,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2682,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, 0x34, 0x2d, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2683,64,"style","Trailing whitespace is superfluous."," 0x30, 0x54, 0x31, 0x36, 0x3a, 0x32, 0x35, 0x3a, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2684,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2685,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2686,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2687,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2688,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2689,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2690,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2691,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2692,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2693,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2694,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2695,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2696,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2697,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2698,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2699,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2700,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2701,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2702,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2703,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x30, 0x34, 0x36, 0x31, 0x32, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2704,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2705,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2706,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2707,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2708,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2709,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2710,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2711,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2712,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2713,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2714,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2715,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2716,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2717,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2718,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2719,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2720,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2721,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2722,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2723,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2724,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2725,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2726,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2727,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2728,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2729,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2730,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2731,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x32, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2732,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2733,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2734,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2735,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2736,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2737,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2738,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2739,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2740,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2741,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x34, 0x36, 0x31, 0x32, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2742,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2743,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x34, 0x36, 0x31, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2744,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2745,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2746,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2747,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2748,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2749,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2750,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2751,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2752,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x34, 0x35, 0x35, 0x33, 0x38, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2753,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2754,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2755,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2756,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2757,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2758,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2759,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2760,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2761,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2762,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2763,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x32, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2764,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2765,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2766,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2767,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2768,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2769,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2770,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2771,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2772,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2773,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2774,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2775,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2776,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x34, 0x36, 0x31, 0x32, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2777,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2778,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2779,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2780,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2781,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2782,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2783,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2784,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2785,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2786,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2787,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x34, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2788,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2789,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2790,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2791,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2792,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2793,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2794,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2795,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2796,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x34, 0x30, 0x30, 0x34, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2797,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2798,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2799,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2800,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2801,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2802,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2803,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2804,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2805,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2806,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2807,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2808,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2809,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2810,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x32, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2811,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2812,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2813,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2814,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x34, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2815,64,"style","Trailing whitespace is superfluous."," 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2816,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2817,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x32, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2818,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2819,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2820,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2821,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2822,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2823,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2824,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2825,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2826,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2827,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2828,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x31, 0x2d, 0x32, 0x38, 0x54, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2829,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x31, 0x36, 0x3a, 0x32, 0x37, 0x2d, 0x30, 0x35, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2830,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2831,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2832,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2833,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2834,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2835,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2836,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2837,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2838,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2839,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2840,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2841,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2842,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2843,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2844,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2845,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2846,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2847,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2848,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2849,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x38, 0x32, 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2850,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2851,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2852,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2853,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2854,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2855,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2856,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2857,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2858,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2859,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2860,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2861,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2862,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2863,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2864,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2865,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2866,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2867,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2868,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2869,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2870,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2871,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2872,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2873,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2874,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2875,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2876,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x33, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2877,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2878,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2879,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2880,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2881,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2882,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2883,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2884,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2885,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2886,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x31, 0x33, 0x30, 0x37, 0x38, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2887,64,"style","Trailing whitespace is superfluous."," 0x32, 0x32, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2888,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x37, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2889,64,"style","Trailing whitespace is superfluous."," 0x38, 0x32, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2890,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2891,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2892,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2893,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2894,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2895,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2896,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2897,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2898,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x31, 0x37, 0x37, 0x32, 0x34, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2899,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2900,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2901,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2902,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2903,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2904,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2905,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2906,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2907,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2908,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2909,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2910,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2911,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2912,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2913,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2914,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2915,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2916,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2917,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2918,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2919,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2920,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2921,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2922,64,"style","Trailing whitespace is superfluous."," 0x38, 0x38, 0x32, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2923,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2924,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2925,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2926,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2927,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2928,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2929,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2930,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2931,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2932,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2933,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x37, 0x38, 0x38, 0x32, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2934,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2935,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2936,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2937,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2938,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2939,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2940,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2941,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2942,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x30, 0x37, 0x38, 0x38, 0x32, 0x32, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2943,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2944,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x37, 0x38, 0x38, 0x32, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2945,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2946,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2947,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2948,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2949,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2950,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2951,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2952,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2953,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2954,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2955,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x31, 0x30, 0x2d, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2956,64,"style","Trailing whitespace is superfluous."," 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2957,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2958,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2959,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2960,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x37, 0x38, 0x38, 0x32, 0x32, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2961,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2962,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2963,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2964,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2965,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2966,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2967,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2968,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2969,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2970,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2971,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2972,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2973,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2974,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x32, 0x39, 0x54, 0x31, 0x37, 0x3a, 0x32, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2975,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x35, 0x39, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2976,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2977,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2978,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2979,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2980,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2981,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2982,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2983,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2984,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2985,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2986,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2987,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2988,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2989,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2990,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2991,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2992,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2993,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2994,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x33, 0x36, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2995,64,"style","Trailing whitespace is superfluous."," 0x38, 0x36, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2996,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2997,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2998,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",2999,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3000,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3001,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3002,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3003,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3004,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3005,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3006,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3007,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3008,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3009,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3010,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3011,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3012,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3013,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3014,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3015,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3016,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3017,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3018,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3019,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3020,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3021,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3022,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x32, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3023,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3024,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3025,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3026,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3027,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3028,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3029,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3030,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3031,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3032,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x33, 0x30, 0x33, 0x36, 0x30, 0x38, 0x36, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3033,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3034,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x33, 0x36, 0x30, 0x38, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3035,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3036,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3037,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3038,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3039,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3040,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3041,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3042,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3043,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x33, 0x38, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3044,64,"style","Trailing whitespace is superfluous."," 0x34, 0x37, 0x36, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3045,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3046,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3047,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3048,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3049,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3050,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3051,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3052,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3053,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3054,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x32, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3055,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3056,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3057,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3058,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3059,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3060,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3061,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3062,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3063,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3064,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3065,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3066,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3067,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x33, 0x36, 0x30, 0x38, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3068,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3069,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3070,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3071,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3072,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3073,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3074,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3075,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3076,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3077,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3078,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3079,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x38, 0x36, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3080,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3081,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3082,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3083,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3084,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3085,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3086,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3087,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x33, 0x30, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3088,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x38, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3089,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3090,64,"style","Trailing whitespace is superfluous."," 0x33, 0x36, 0x30, 0x38, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3091,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3092,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3093,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3094,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3095,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3096,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3097,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3098,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3099,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3100,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3101,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x32, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3102,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3103,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3104,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3105,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3106,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x38, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3107,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3108,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3109,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3110,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3111,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3112,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3113,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3114,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3115,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3116,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3117,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3118,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3119,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3120,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x38, 0x3a, 0x31, 0x36, 0x3a, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3121,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3122,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3123,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3124,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3125,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3126,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3127,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3128,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3129,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3130,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3131,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3132,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x2f, 0x41, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3133,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3134,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3135,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3136,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3137,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3138,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3139,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3140,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x36, 0x35, 0x34, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3141,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3142,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3143,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3144,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3145,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3146,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x6d, 0x65, 0x6e, 0x64, 0x3e, 0x5b, 0x41, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3147,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x64, 0x5d, 0x3c, 0x2f, 0x61, 0x6d, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3148,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3149,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3150,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3151,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3152,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3153,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3154,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3155,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3156,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3157,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3158,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3159,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3160,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3161,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3162,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3163,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3164,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3165,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3166,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3167,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3168,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3169,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3170,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3171,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3172,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3173,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3174,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3175,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3176,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3177,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3178,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3179,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3180,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3181,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x30, 0x30, 0x36, 0x35, 0x34, 0x31, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3182,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3183,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x30, 0x36, 0x35, 0x34, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3184,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3185,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3186,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3187,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3188,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3189,64,"style","Trailing whitespace is superfluous."," 0x41, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3190,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3191,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3192,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x33, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3193,64,"style","Trailing whitespace is superfluous."," 0x36, 0x33, 0x36, 0x32, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3194,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3195,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3196,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3197,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3198,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3199,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3200,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3201,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3202,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3203,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x30, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3204,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3205,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3206,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3207,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3208,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3209,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3210,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3211,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3212,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3213,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3214,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3215,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3216,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x36, 0x35, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3217,64,"style","Trailing whitespace is superfluous."," 0x31, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3218,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3219,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3220,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3221,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3222,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3223,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3224,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3225,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3226,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3227,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3228,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x35, 0x34, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3229,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3230,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3231,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3232,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3233,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3234,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3235,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3236,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x33, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3237,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x35, 0x34, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3238,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3239,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x36, 0x35, 0x34, 0x31, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3240,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3241,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3242,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3243,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3244,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3245,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3246,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3247,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3248,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3249,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3250,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3251,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3252,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3253,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3254,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3255,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x35, 0x34, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3256,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3257,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3258,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x30, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3259,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3260,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3261,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x2f, 0x41, 0x20, 0x5b, 0x41, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3262,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x64, 0x5d, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3263,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3264,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3265,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3266,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3267,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3268,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3269,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3270,64,"style","Trailing whitespace is superfluous."," 0x31, 0x54, 0x31, 0x37, 0x3a, 0x31, 0x36, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3271,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3272,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3273,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3274,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3275,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3276,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3277,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3278,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3279,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3280,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3281,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3282,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3283,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3284,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3285,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3286,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3287,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3288,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3289,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3290,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x34, 0x39, 0x37, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3291,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3292,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3293,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3294,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3295,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3296,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3297,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3298,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3299,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3300,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3301,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3302,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3303,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3304,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3305,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3306,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3307,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3308,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3309,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3310,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3311,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3312,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3313,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3314,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3315,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3316,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3317,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3318,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3319,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3320,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3321,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3322,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3323,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3324,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3325,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3326,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3327,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3328,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x34, 0x39, 0x37, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3329,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3330,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x35, 0x34, 0x39, 0x37, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3331,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3332,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3333,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3334,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3335,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3336,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3337,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3338,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3339,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x33, 0x35, 0x35, 0x34, 0x38, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3340,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3341,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3342,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3343,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3344,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3345,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3346,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3347,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3348,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3349,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3350,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x32, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3351,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3352,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3353,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3354,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3355,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3356,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3357,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3358,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3359,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3360,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3361,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3362,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3363,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x35, 0x34, 0x39, 0x37, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3364,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3365,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3366,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3367,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3368,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3369,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3370,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3371,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3372,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3373,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3374,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x34, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3375,64,"style","Trailing whitespace is superfluous."," 0x37, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3376,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3377,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3378,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3379,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3380,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3381,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3382,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3383,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x33, 0x30, 0x30, 0x35, 0x34, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3384,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3385,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3386,64,"style","Trailing whitespace is superfluous."," 0x39, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3387,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3388,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3389,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3390,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3391,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3392,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3393,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3394,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3395,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3396,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3397,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x32, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3398,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3399,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3400,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3401,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x34, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3402,64,"style","Trailing whitespace is superfluous."," 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3403,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3404,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x32, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3405,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3406,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3407,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3409,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3410,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3411,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3412,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3413,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3414,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3415,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x31, 0x2d, 0x32, 0x39, 0x54, 0x31, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3416,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x34, 0x36, 0x3a, 0x30, 0x35, 0x2d, 0x30, 0x35, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3417,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3418,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3419,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3420,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3421,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3422,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3423,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3424,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3425,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3426,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3427,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3428,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3429,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3430,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3431,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3432,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3433,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3434,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3435,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3436,64,"style","Trailing whitespace is superfluous."," 0x37, 0x32, 0x37, 0x34, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3437,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3438,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3439,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3440,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3441,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3442,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3443,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3444,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3445,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3446,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3447,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3448,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3449,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3450,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3451,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3452,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3453,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3454,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3455,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3456,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3457,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3458,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3459,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3460,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3461,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3462,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3463,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x32, 0x2d, 0x31, 0x30, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3464,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3465,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3466,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3467,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3468,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3469,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3470,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3471,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3472,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3473,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x31, 0x32, 0x30, 0x37, 0x32, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3474,64,"style","Trailing whitespace is superfluous."," 0x34, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3475,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x37, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3476,64,"style","Trailing whitespace is superfluous."," 0x37, 0x34, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3477,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3478,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3479,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3480,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3481,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3482,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3483,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3484,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3485,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x31, 0x37, 0x31, 0x33, 0x39, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3486,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3487,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3488,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3489,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3490,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3491,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3492,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3493,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3494,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3495,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3496,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3497,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3498,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3499,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3500,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3501,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3502,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3503,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3504,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3505,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3506,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3507,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3508,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3509,64,"style","Trailing whitespace is superfluous."," 0x32, 0x37, 0x34, 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3510,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3511,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3512,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3513,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3514,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3515,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3516,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3517,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3518,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3519,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3520,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x37, 0x32, 0x37, 0x34, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3521,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3522,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3523,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3524,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3525,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3526,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3527,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3528,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3529,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x30, 0x37, 0x32, 0x37, 0x34, 0x34, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3530,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3531,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x2d, 0x30, 0x37, 0x32, 0x37, 0x34, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3532,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3533,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3534,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3535,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3536,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3537,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3538,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3539,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3540,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3541,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3542,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x32, 0x2d, 0x31, 0x30, 0x2d, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3543,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3544,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3545,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3546,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3547,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x37, 0x32, 0x37, 0x34, 0x34, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3548,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3549,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3550,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x31, 0x30, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3551,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3552,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3553,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3554,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3555,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3556,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3557,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3558,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3559,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3560,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x32, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3561,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x33, 0x31, 0x54, 0x31, 0x37, 0x3a, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3562,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x37, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3563,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3564,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3565,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3566,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3567,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3568,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3569,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3570,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3571,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3572,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3573,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3574,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3575,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3576,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3577,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3578,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3579,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3580,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3581,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x33, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3582,64,"style","Trailing whitespace is superfluous."," 0x34, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3583,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3584,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3585,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3586,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3587,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3588,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3589,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3590,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3591,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3592,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3593,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3594,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3595,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3596,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3597,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3598,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3599,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3600,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3601,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3602,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3603,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3604,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3605,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3606,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3607,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3608,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3609,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3610,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3611,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3612,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3613,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3614,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3615,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3616,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3617,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3618,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3619,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x32, 0x30, 0x33, 0x30, 0x37, 0x34, 0x34, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3620,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3621,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x33, 0x30, 0x37, 0x34, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3622,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3623,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3624,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3625,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3626,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3627,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3628,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3629,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3630,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x32, 0x37, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3631,64,"style","Trailing whitespace is superfluous."," 0x36, 0x37, 0x30, 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3632,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3633,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3634,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3635,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3636,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3637,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3638,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3639,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3640,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3641,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3642,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3643,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3644,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3645,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3646,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3647,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3648,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3649,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3650,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3651,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3652,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3653,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3654,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x33, 0x30, 0x37, 0x34, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3655,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3656,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3657,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3658,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3659,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3660,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3661,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3662,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3663,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3664,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3665,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3666,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x34, 0x34, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3667,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3668,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3669,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3670,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3671,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3672,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3673,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3674,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x32, 0x30, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3675,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x34, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3676,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3677,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x37, 0x34, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3678,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3679,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3680,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3681,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3682,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3683,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3684,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3685,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3686,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3687,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3688,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3689,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3690,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3691,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3692,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3693,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x34, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3694,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3695,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3696,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3697,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3698,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3699,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3700,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3701,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3702,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3703,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3704,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3705,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3706,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x32, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3707,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x37, 0x3a, 0x32, 0x38, 0x3a, 0x30, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3708,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3709,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3710,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3711,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3712,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3713,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3714,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3715,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3716,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3717,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3718,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3719,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3720,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3721,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3722,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3723,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3724,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3725,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3726,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3727,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x30, 0x35, 0x38, 0x36, 0x31, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3728,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3729,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3730,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3731,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3732,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3733,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3734,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3735,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3736,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3737,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3738,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3739,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3740,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3741,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3742,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3743,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3744,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3745,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3746,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3747,64,"style","Trailing whitespace is superfluous."," 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3748,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3749,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3750,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3751,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3752,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3753,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3754,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x32, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3755,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3756,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3757,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3758,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3759,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3760,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3761,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3762,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3763,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3764,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3765,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x38, 0x36, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3766,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3767,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x38, 0x36, 0x31, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3768,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3769,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3770,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3771,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3772,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3773,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3774,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3775,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3776,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x31, 0x32, 0x35, 0x36, 0x32, 0x37, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3777,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3778,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3779,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3780,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3781,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3782,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3783,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3784,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3785,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3786,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3787,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3788,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3789,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3790,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3791,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3792,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3793,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3794,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3795,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3796,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3797,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3798,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3799,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3800,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x38, 0x36, 0x31, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3801,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3802,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3803,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3804,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3805,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3806,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3807,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3808,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3809,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3810,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3811,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x35, 0x38, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3812,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3813,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3814,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3815,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3816,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3817,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3818,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3819,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3820,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x31, 0x32, 0x30, 0x30, 0x35, 0x38, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3821,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3822,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x35, 0x38, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3823,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3824,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3825,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3826,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3827,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3828,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3829,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3830,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3831,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3832,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3833,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x32, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3834,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3835,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3836,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3837,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3838,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x35, 0x38, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3839,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3840,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3841,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x34, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3842,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3843,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3844,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3845,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3846,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3847,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3848,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3849,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3850,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3851,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3852,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x31, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3853,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x3a, 0x34, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3854,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3855,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3856,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3857,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3858,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3859,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3860,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3861,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3862,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3863,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3864,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3865,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3866,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3867,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3868,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3869,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3870,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3871,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3872,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3873,64,"style","Trailing whitespace is superfluous."," 0x38, 0x34, 0x38, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3874,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3875,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3876,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3877,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3878,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3879,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3880,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3881,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3882,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3883,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3884,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3885,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3886,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3887,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3888,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3889,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3890,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3891,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3892,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3893,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3894,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3895,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3896,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3897,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3898,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3899,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3900,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x37, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3901,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3902,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3903,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3904,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3905,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3906,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3907,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3908,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3909,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3910,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x31, 0x30, 0x35, 0x38, 0x34, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3911,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3912,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x35, 0x38, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3913,64,"style","Trailing whitespace is superfluous."," 0x38, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3914,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3915,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3916,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3917,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3918,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3919,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3920,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3921,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3922,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x36, 0x32, 0x34, 0x32, 0x36, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3923,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3924,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3925,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3926,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3927,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3928,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3929,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3930,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3931,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3932,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3933,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3934,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3935,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3936,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3937,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3938,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3939,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3940,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3941,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3942,64,"style","Trailing whitespace is superfluous."," 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3943,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3944,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3945,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x35, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3946,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3947,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3948,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3949,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3950,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3951,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3952,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3953,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3954,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3955,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3956,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3957,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x38, 0x34, 0x38, 0x34, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3958,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3959,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3960,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3961,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3962,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3963,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3964,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3965,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3966,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x35, 0x38, 0x34, 0x38, 0x34, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3967,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3968,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x35, 0x38, 0x34, 0x38, 0x34, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3969,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3970,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3971,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3972,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3973,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3974,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3975,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3976,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3977,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3978,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3979,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x31, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3980,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3981,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3982,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3983,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3984,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x38, 0x34, 0x38, 0x34, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3985,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3986,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3987,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3988,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3989,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3990,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3991,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3992,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3993,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3994,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3995,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3996,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3997,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3998,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x37, 0x54, 0x31, 0x36, 0x3a, 0x34, 0x33, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",3999,64,"style","Trailing whitespace is superfluous."," 0x34, 0x32, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4000,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4001,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4002,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4003,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4004,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4005,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4006,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4007,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4008,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4009,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4010,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4011,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4012,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4013,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4014,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4015,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4016,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4017,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4018,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x35, 0x33, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4019,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4020,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4021,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4022,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4023,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4024,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4025,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4026,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4027,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4028,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4029,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4030,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4031,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4032,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4033,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4034,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4035,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4036,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4037,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4038,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4039,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4040,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4041,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4042,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4043,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4044,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4045,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4046,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4047,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4048,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4049,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4050,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4051,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4052,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4053,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4054,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4055,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4056,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x32, 0x35, 0x33, 0x33, 0x30, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4057,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4058,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x32, 0x35, 0x33, 0x33, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4059,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4060,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4061,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4062,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4063,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4064,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4065,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4066,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4067,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x31, 0x38, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4068,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4069,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4070,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4071,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4072,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4073,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4074,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4075,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4076,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4077,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4078,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4079,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4080,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4081,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4082,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4083,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4084,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4085,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4086,64,"style","Trailing whitespace is superfluous."," 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4087,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4088,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4089,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4090,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4091,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x32, 0x35, 0x33, 0x33, 0x30, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4092,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4093,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4094,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4095,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4096,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4097,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4098,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4099,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4100,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4101,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4102,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4103,64,"style","Trailing whitespace is superfluous."," 0x33, 0x33, 0x30, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4104,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4105,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4106,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4107,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4108,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4109,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4110,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4111,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x31, 0x30, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4112,64,"style","Trailing whitespace is superfluous."," 0x33, 0x33, 0x30, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4113,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4114,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x33, 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4115,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4116,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4117,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4118,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4119,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4120,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4121,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4122,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4123,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4124,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4125,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x33, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4126,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4127,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4128,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4129,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4130,64,"style","Trailing whitespace is superfluous."," 0x33, 0x33, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4131,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4132,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4133,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4134,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4135,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4136,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4137,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4138,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4139,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4140,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4141,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4142,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4143,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x33, 0x54, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4144,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x3a, 0x35, 0x35, 0x3a, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4145,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4146,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4147,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4148,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4149,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4150,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4151,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4152,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4153,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4154,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4155,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4156,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4157,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4158,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4159,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4160,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4161,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4162,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4163,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4164,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x34, 0x38, 0x34, 0x31, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4165,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4166,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4167,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4168,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4169,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4170,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4171,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4172,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4173,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4174,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4175,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4176,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4177,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4178,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4179,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4180,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4181,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4182,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4183,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4184,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4185,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4186,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4187,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4188,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4189,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4190,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4191,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4192,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4193,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4194,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4195,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4196,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4197,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4198,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4199,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4200,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4201,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x31, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4202,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x34, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4203,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4204,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x38, 0x34, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4205,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4206,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4207,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4208,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4209,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4210,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4211,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4212,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4213,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x31, 0x35, 0x37, 0x31, 0x35, 0x31, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4214,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4215,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4216,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4217,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4218,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4219,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4220,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4221,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4222,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4223,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4224,64,"style","Trailing whitespace is superfluous."," 0x35, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4225,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4226,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4227,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4228,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4229,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4230,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4231,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4232,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4233,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4234,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4235,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4236,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4237,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x38, 0x34, 0x31, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4238,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4239,64,"style","Trailing whitespace is superfluous."," 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4240,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4241,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4242,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4243,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4244,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4245,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4246,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4247,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4248,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x30, 0x34, 0x38, 0x34, 0x31, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4249,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4250,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4251,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4252,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4253,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4254,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4255,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4256,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4257,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x31, 0x30, 0x30, 0x34, 0x38, 0x34, 0x31, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4258,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4259,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x30, 0x34, 0x38, 0x34, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4260,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4261,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4262,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4263,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4264,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4265,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4266,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4267,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4268,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4269,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4270,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4271,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4272,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4273,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4274,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4275,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x30, 0x34, 0x38, 0x34, 0x31, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4276,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4277,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4278,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x35, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4279,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4280,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4281,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4282,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4283,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4284,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4285,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4286,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4287,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4288,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4289,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x33, 0x54, 0x31, 0x37, 0x3a, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4290,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3a, 0x33, 0x31, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4291,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4292,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4293,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4294,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4295,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4296,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4297,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4298,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4299,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4300,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4301,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4302,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4303,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4304,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4305,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4306,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4307,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4308,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4309,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x35, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4310,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4311,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4312,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4313,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4314,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4315,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4316,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4317,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4318,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4319,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4320,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4321,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4322,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4323,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4324,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4325,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4326,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4327,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4328,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4329,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4330,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4331,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4332,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4333,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4334,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4335,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4336,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4337,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4338,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4339,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4340,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4341,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4342,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4343,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4344,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4345,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4346,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4347,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x31, 0x30, 0x30, 0x35, 0x35, 0x36, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4348,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4349,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x35, 0x35, 0x36, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4350,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4351,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4352,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4353,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4354,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4355,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4356,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4357,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4358,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4359,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x37, 0x37, 0x39, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4360,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4361,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4362,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4363,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4364,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4365,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4366,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4367,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4368,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4369,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x32, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4370,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4371,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4372,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4373,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4374,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4375,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4376,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4377,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4378,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4379,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4380,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4381,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4382,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x35, 0x35, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4383,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4384,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4385,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4386,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4387,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4388,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4389,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4390,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4391,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4392,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4393,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4394,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x35, 0x36, 0x31, 0x32, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4395,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4396,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4397,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4398,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4399,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4400,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4401,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4402,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4403,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x35, 0x36, 0x31, 0x32, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4404,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4405,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x35, 0x36, 0x31, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4406,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4407,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4408,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4409,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4410,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4411,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4412,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4413,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4414,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4415,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4416,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4417,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4418,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4419,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4420,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4421,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x35, 0x36, 0x31, 0x32, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4422,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4423,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4424,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x32, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4425,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4426,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4427,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4428,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4429,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4430,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4431,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4432,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4433,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4434,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4435,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x54, 0x31, 0x36, 0x3a, 0x32, 0x38, 0x3a, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4436,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4437,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4438,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4439,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4440,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4441,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4442,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4443,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4444,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4445,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4446,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4447,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4448,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4449,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4450,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4451,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4452,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4453,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4454,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4455,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x32, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4456,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4457,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4458,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4459,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4460,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4461,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4462,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4463,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4464,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4465,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4466,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4467,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4468,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4469,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4470,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4471,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4472,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4473,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4474,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4475,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4476,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4477,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4478,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4479,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4480,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4481,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4482,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4483,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4484,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4485,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4486,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4487,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4488,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4489,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4490,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4491,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4492,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4493,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x35, 0x38, 0x32, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4494,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4495,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x32, 0x39, 0x2d, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4496,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4497,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4498,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4499,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4500,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4501,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4502,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4503,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4504,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x31, 0x30, 0x38, 0x30, 0x32, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4505,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4506,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4507,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4508,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4509,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4510,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4511,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4512,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4513,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4514,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4515,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4516,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4517,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4518,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4519,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4520,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4521,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4522,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4523,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4524,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x32, 0x39, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4525,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4526,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4527,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4528,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4529,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4530,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4531,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4532,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4533,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x30, 0x30, 0x32, 0x35, 0x38, 0x32, 0x39, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4534,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4535,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x32, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4536,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4537,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4538,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4539,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4540,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4541,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4542,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4543,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4544,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4545,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4546,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4547,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4548,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4549,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4550,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4551,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x32, 0x39, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4552,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4553,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4554,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x33, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4555,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4556,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4557,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4558,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4559,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4560,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4561,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4562,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4563,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4564,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4565,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x35, 0x54, 0x31, 0x37, 0x3a, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4566,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x32, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4567,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4568,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4569,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4570,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4571,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4572,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4573,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4574,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4575,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4576,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4577,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4578,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4579,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4580,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4581,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4582,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4583,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4584,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4585,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4586,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4587,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4588,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4589,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4590,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4591,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4592,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4593,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4594,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4595,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4596,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4597,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4598,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4599,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4600,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4601,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4602,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4603,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4604,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4605,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4606,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4607,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4608,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4609,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4610,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4611,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4612,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4613,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x31, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4614,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4615,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4616,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4617,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4618,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4619,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4620,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4621,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4622,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4623,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x30, 0x30, 0x30, 0x34, 0x32, 0x30, 0x35, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4624,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4625,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, 0x34, 0x32, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4626,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4627,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4628,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4629,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4630,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4631,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4632,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4633,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4634,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x30, 0x35, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4635,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x36, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4636,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4637,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4638,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4639,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4640,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4641,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4642,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4643,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4644,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4645,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4646,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4647,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4648,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4649,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4650,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4651,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4652,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4653,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4654,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, 0x34, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4655,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4656,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4657,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4658,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4659,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4660,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4661,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4662,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4663,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x30, 0x30, 0x30, 0x34, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4664,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4665,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4666,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4667,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4668,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4669,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4670,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4671,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4672,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4673,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4674,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4675,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4676,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4677,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4678,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4679,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4680,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4681,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, 0x34, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4682,64,"style","Trailing whitespace is superfluous."," 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4683,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4684,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x33, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4685,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4686,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4687,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4688,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4689,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4690,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4691,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4692,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4693,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4694,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4695,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x31, 0x54, 0x31, 0x37, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4696,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x3a, 0x33, 0x33, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4697,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4698,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4699,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4700,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4701,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4702,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4703,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4704,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4705,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4706,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4707,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4708,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4709,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4710,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4711,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4712,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4713,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4714,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4715,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x30, 0x39, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4716,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x30, 0x38, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4717,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4718,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4719,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4720,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4721,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4722,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4723,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4724,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4725,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4726,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4727,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4728,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4729,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4730,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4731,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4732,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4733,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4734,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4735,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4736,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4737,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4738,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4739,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4740,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4741,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4742,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4743,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4744,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4745,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4746,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4747,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4748,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4749,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4750,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4751,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4752,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4753,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x30, 0x39, 0x30, 0x36, 0x32, 0x35, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4754,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4755,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x30, 0x39, 0x2d, 0x30, 0x36, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4756,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4757,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4758,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4759,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4760,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4761,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4762,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4763,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4764,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4765,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x35, 0x37, 0x37, 0x38, 0x32, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4766,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4767,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4768,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4769,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4770,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4771,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4772,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4773,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4774,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4775,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x33, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4776,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4777,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4778,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4779,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4780,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4781,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4782,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4783,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4784,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x30, 0x39, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4785,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x30, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4786,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4787,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4788,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4789,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4790,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4791,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4792,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4793,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x30, 0x39, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4794,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x30, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4795,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x30, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4796,64,"style","Trailing whitespace is superfluous."," 0x36, 0x32, 0x35, 0x30, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4797,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4798,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4799,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4800,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4801,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4802,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4803,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4804,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4805,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4806,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4807,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x34, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4808,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4809,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4810,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4811,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x30, 0x39, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4812,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x30, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4813,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4814,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4815,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4816,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4817,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4818,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4819,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4820,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4821,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4822,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4823,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4824,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4825,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x34, 0x54, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4826,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x3a, 0x35, 0x39, 0x3a, 0x30, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4827,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4828,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4829,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4830,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4831,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4832,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4833,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4834,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4835,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4836,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4837,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4838,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4839,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4840,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4841,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4842,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4843,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4844,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4845,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4846,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x30, 0x33, 0x35, 0x33, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4847,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4848,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4849,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4850,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4851,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4852,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4853,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4854,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4855,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4856,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4857,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4858,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4859,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4860,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4861,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4862,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4863,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4864,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4865,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4866,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4867,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4868,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4869,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4870,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4871,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4872,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4873,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4874,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4875,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4876,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4877,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4878,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4879,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4880,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4881,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4882,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4883,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4884,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x35, 0x33, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4885,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4886,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x33, 0x35, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4887,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4888,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4889,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4890,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4891,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4892,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4893,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4894,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4895,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x39, 0x37, 0x39, 0x39, 0x33, 0x37, 0x31, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4896,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4897,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4898,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4899,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4900,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4901,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4902,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4903,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4904,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4905,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4906,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4907,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4908,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4909,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4910,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4911,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4912,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4913,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4914,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4915,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x33, 0x35, 0x33, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4916,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4917,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4918,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4919,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4920,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4921,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4922,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4923,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4924,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x33, 0x35, 0x33, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4925,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4926,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x30, 0x33, 0x35, 0x33, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4927,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4928,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4929,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4930,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4931,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4932,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4933,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4934,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4935,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4936,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4937,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x36, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4938,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4939,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4940,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4941,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4942,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x33, 0x35, 0x33, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4943,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4944,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4945,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4946,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4947,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4948,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4949,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4950,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4951,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4952,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4953,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4954,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4955,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4956,64,"style","Trailing whitespace is superfluous."," 0x35, 0x54, 0x32, 0x31, 0x3a, 0x34, 0x39, 0x3a, 0x33, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4957,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4958,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4959,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4960,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4961,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4962,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4963,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4964,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4965,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4966,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4967,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4968,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4969,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4970,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4971,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4972,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4973,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4974,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4975,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4976,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x2d, 0x30, 0x32, 0x34, 0x31, 0x35, 0x33, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4977,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4978,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4979,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4980,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4981,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4982,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4983,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4984,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4985,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4986,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4987,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4988,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4989,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4990,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4991,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4992,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4993,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4994,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4995,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4996,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4997,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4998,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",4999,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5000,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5001,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5002,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5003,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5004,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x31, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5005,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5006,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5007,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5008,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5009,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5010,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5011,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5012,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5013,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5014,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x34, 0x31, 0x35, 0x33, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5015,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5016,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x34, 0x31, 0x35, 0x33, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5017,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5018,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5019,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5020,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5021,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5022,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5023,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5024,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5025,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x39, 0x35, 0x38, 0x36, 0x34, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5026,64,"style","Trailing whitespace is superfluous."," 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5027,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5028,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5029,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5030,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5031,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5032,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5033,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5034,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5035,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5036,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5037,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5038,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5039,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5040,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5041,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5042,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5043,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5044,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5045,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x32, 0x34, 0x31, 0x35, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5046,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5047,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5048,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5049,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5050,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5051,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5052,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5053,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5054,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x30, 0x32, 0x34, 0x31, 0x35, 0x33, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5055,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5056,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x2d, 0x30, 0x32, 0x34, 0x31, 0x35, 0x33, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5057,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5058,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5059,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5060,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5061,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5062,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5063,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5064,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5065,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5066,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5067,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5068,64,"style","Trailing whitespace is superfluous."," 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5069,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5070,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5071,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5072,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x32, 0x34, 0x31, 0x35, 0x33, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5073,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5074,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5075,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5076,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5077,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5078,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5079,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5080,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5081,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5082,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5083,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5084,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5085,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5086,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x54, 0x31, 0x37, 0x3a, 0x30, 0x37, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5087,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5088,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5089,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5090,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5091,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5092,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5093,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5094,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5095,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5096,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5097,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5098,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5099,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5100,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5101,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5102,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5103,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5104,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5105,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5106,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x32, 0x32, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5107,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5108,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5109,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5110,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5111,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5112,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5113,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5114,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5115,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5116,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5117,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5118,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5119,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5120,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5121,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5122,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5123,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5124,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5125,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5126,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5127,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5128,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5129,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5130,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5131,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5132,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5133,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5134,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x33, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5135,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5136,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5137,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5138,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5139,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5140,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5141,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5142,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5143,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5144,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x32, 0x32, 0x30, 0x34, 0x32, 0x31, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5145,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5146,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x32, 0x32, 0x30, 0x34, 0x32, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5147,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5148,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5149,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5150,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5151,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5152,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5153,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5154,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5155,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x38, 0x31, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5156,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5157,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5158,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5159,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5160,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5161,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5162,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5163,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5164,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5165,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5166,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5167,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5168,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5169,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5170,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5171,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5172,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5173,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5174,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5175,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x32, 0x32, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5176,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5177,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5178,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5179,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5180,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5181,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5182,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5183,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5184,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x30, 0x38, 0x32, 0x32, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5185,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5186,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x32, 0x32, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5187,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5188,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5189,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5190,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5191,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5192,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5193,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5194,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5195,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5196,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5197,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5198,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x33, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5199,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5200,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5201,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5202,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x32, 0x32, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5203,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5204,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5205,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5206,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5207,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5208,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5209,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5210,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5211,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5212,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5213,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5214,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5215,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5216,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x33, 0x30, 0x54, 0x31, 0x37, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5217,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x3a, 0x33, 0x33, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5218,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5219,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5220,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5221,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5222,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5223,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5224,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5225,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5226,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5227,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5228,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5229,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5230,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5231,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5232,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5233,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5234,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5235,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5236,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5237,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x39, 0x37, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5238,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5239,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5240,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5241,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5242,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5243,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5244,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5245,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5246,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5247,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5248,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5249,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5250,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5251,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5252,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5253,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5254,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5255,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5256,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5257,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5258,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5259,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5260,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5261,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5262,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5263,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5264,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x2d, 0x30, 0x34, 0x2d, 0x32, 0x39, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5265,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5266,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5267,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5268,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5269,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5270,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5271,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5272,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5273,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5274,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x30, 0x38, 0x30, 0x39, 0x35, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5275,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5276,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, 0x35, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5277,64,"style","Trailing whitespace is superfluous."," 0x39, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5278,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5279,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5280,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5281,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5282,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5283,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5284,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5285,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5286,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x36, 0x30, 0x39, 0x37, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5287,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5288,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5289,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5290,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5291,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5292,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5293,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5294,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5295,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5296,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5297,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5298,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5299,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5300,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5301,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5302,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5303,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5304,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5305,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5306,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x37, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5307,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5308,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5309,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5310,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5311,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5312,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5313,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5314,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x38, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5315,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x37, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5316,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5317,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x39, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5318,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5319,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5320,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5321,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5322,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5323,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5324,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5325,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5326,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5327,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5328,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x2d, 0x32, 0x39, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5329,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5330,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5331,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5332,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5333,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5334,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5335,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5336,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5337,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5338,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5339,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5340,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5341,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5342,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5343,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5344,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5345,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5346,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x30, 0x34, 0x2d, 0x32, 0x39, 0x54, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5347,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x33, 0x39, 0x3a, 0x33, 0x37, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5348,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5349,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5350,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5351,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5352,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5353,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5354,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5355,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5356,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5357,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5358,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5359,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5360,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5361,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5362,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5363,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5364,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5365,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5366,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5367,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x35, 0x35, 0x34, 0x38, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5368,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5369,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5370,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5371,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5372,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5373,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5374,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5375,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5376,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5377,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5378,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5379,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5380,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5381,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5382,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5383,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5384,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5385,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5386,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5387,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5388,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5389,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5390,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5391,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5392,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5393,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5394,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x38, 0x2d, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5395,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5396,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5397,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5398,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5399,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5400,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5401,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5402,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5403,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5404,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x38, 0x30, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5405,64,"style","Trailing whitespace is superfluous."," 0x35, 0x34, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5406,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5407,64,"style","Trailing whitespace is superfluous."," 0x35, 0x35, 0x34, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5408,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5409,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5410,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5411,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5412,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5413,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5414,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5415,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5416,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x35, 0x36, 0x31, 0x37, 0x32, 0x35, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5417,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5418,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5419,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5420,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5421,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5422,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5423,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5424,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5425,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5426,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5427,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5428,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5429,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5430,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5431,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5432,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5433,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5434,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5435,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5436,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x35, 0x34, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5437,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5438,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5439,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5440,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5441,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5442,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5443,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5444,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x38, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5445,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x35, 0x34, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5446,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5447,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x35, 0x35, 0x34, 0x38, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5448,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5449,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5450,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5451,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5452,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5453,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5454,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5455,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5456,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5457,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5458,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x30, 0x31, 0x2d, 0x33, 0x30, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5459,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5460,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5461,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5462,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5463,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x35, 0x34, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5464,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5465,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5466,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5467,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5468,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5469,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5470,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5471,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5472,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5473,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5474,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5475,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5476,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x2d, 0x30, 0x31, 0x2d, 0x33, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5477,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x36, 0x3a, 0x35, 0x38, 0x3a, 0x35, 0x34, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5478,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5479,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5480,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5481,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5482,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5483,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5484,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5485,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5486,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5487,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5488,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5489,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5490,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5491,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5492,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5493,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5494,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5495,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5496,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5497,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x32, 0x32, 0x38, 0x30, 0x35, 0x36, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5498,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5499,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5500,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5501,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5502,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5503,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5504,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5505,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5506,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5507,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5508,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5509,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5510,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5511,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5512,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5513,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5514,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5515,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5516,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5517,64,"style","Trailing whitespace is superfluous."," 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5518,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5519,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5520,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5521,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5522,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5523,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5524,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5525,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5526,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5527,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5528,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5529,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5530,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5531,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5532,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5533,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5534,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x37, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5535,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x30, 0x35, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5536,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5537,64,"style","Trailing whitespace is superfluous."," 0x32, 0x32, 0x38, 0x30, 0x35, 0x36, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5538,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5539,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5540,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5541,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5542,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5543,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5544,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5545,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5546,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x37, 0x31, 0x31, 0x39, 0x36, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5547,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5548,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5549,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5550,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5551,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5552,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5553,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5554,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5555,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5556,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5557,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5558,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5559,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5560,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5561,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5562,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5563,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5564,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5565,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5566,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x32, 0x32, 0x38, 0x30, 0x35, 0x36, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5567,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5568,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5569,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5570,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5571,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5572,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5573,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5574,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5575,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x32, 0x32, 0x38, 0x30, 0x35, 0x36, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5576,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5577,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x32, 0x32, 0x38, 0x30, 0x35, 0x36, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5578,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5579,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5580,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5581,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5582,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5583,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5584,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5585,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5586,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5587,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5588,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x31, 0x30, 0x2d, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5589,64,"style","Trailing whitespace is superfluous."," 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5590,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5591,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5592,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5593,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x32, 0x32, 0x38, 0x30, 0x35, 0x36, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5594,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5595,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5596,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5597,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5598,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5599,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5600,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5601,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5602,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5603,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5604,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5605,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5606,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5607,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x39, 0x54, 0x31, 0x34, 0x3a, 0x32, 0x37, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5608,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5609,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5610,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5611,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5612,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5613,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5614,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5615,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5616,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5617,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5618,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5619,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5620,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5621,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5622,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5623,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5624,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5625,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5626,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5627,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x37, 0x2d, 0x31, 0x30, 0x31, 0x35, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5628,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5629,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5630,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5631,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5632,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5633,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5634,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5635,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5636,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5637,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5638,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5639,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5640,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5641,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5642,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5643,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5644,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5645,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5646,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5647,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5648,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5649,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5650,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5651,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5652,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5653,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5654,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5655,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5656,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5657,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5658,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5659,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5660,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5661,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5662,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5663,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5664,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5665,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x30, 0x31, 0x35, 0x34, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5666,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5667,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x31, 0x30, 0x31, 0x35, 0x34, 0x35, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5668,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5669,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5670,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5671,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5672,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5673,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5674,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5675,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5676,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x37, 0x38, 0x31, 0x36, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5677,64,"style","Trailing whitespace is superfluous."," 0x37, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5678,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5679,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5680,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5681,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5682,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5683,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5684,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5685,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5686,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5687,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5688,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5689,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5690,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5691,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5692,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5693,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5694,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5695,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5696,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x2d, 0x31, 0x30, 0x31, 0x35, 0x34, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5697,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5698,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5699,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5700,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5701,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5702,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5703,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5704,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5705,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x30, 0x37, 0x31, 0x30, 0x31, 0x35, 0x34, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5706,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5707,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x37, 0x2d, 0x31, 0x30, 0x31, 0x35, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5708,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5709,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5710,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5711,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5712,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5713,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5714,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5715,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5716,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5717,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5718,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5719,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5720,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5721,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5722,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5723,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x2d, 0x31, 0x30, 0x31, 0x35, 0x34, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5724,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5725,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5726,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5727,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5728,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5729,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5730,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5731,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5732,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5733,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5734,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5735,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5736,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5737,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x33, 0x54, 0x31, 0x37, 0x3a, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5738,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x33, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5739,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5740,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5741,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5742,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5743,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5744,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5745,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5746,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5747,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5748,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5749,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5750,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5751,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5752,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5753,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5754,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5755,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5756,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5757,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5758,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5759,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5760,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5761,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5762,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5763,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5764,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5765,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5766,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5767,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5768,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5769,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5770,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5771,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5772,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5773,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5774,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5775,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5776,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5777,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5778,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5779,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5780,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5781,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5782,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5783,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5784,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5785,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5786,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5787,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5788,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5789,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5790,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5791,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5792,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5793,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5794,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5795,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x30, 0x37, 0x30, 0x31, 0x39, 0x34, 0x30, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5796,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5797,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x39, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5798,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5799,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5800,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5801,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5802,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5803,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5804,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5805,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5806,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x37, 0x35, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5807,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x36, 0x36, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5808,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5809,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5810,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5811,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5812,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5813,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5814,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5815,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5816,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5817,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5818,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5819,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5820,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5821,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5822,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5823,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5824,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5825,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5826,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5827,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5828,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5829,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5830,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5831,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5832,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5833,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5834,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5835,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x30, 0x37, 0x30, 0x31, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5836,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5837,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5838,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5839,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5840,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5841,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5842,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5843,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5844,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5845,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5846,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5847,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5848,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x37, 0x2d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5849,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5850,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5851,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5852,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5853,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x39, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5854,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5855,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5856,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5857,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5858,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5859,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5860,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5861,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5862,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5863,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5864,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5865,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5866,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5867,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x32, 0x54, 0x31, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5868,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x33, 0x30, 0x3a, 0x30, 0x33, 0x2d, 0x30, 0x35, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5869,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5870,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5871,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5872,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5873,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5874,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5875,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5876,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5877,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5878,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x43, 0x49, 0x4b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5879,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5880,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5881,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5882,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5883,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5884,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5885,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5886,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5887,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5888,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x43, 0x49, 0x4b, 0x3d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5889,64,"style","Trailing whitespace is superfluous."," 0x53, 0x54, 0x58, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5890,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5891,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5892,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x2d, 0x51, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5893,64,"style","Trailing whitespace is superfluous."," 0x73, 0x74, 0x61, 0x72, 0x74, 0x3d, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5894,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5895,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5896,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5897,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5898,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5899,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5900,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5901,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5902,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5903,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5904,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5905,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5906,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x43, 0x49, 0x4b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5907,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x53, 0x54, 0x58, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5908,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5909,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5910,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x31, 0x30, 0x2d, 0x51, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5911,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x73, 0x74, 0x61, 0x72, 0x74, 0x3d, 0x30, 0x26, 0x61, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5912,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5913,64,"style","Trailing whitespace is superfluous."," 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x75, 0x74, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5914,64,"style","Trailing whitespace is superfluous."," 0x75, 0x74, 0x3d, 0x61, 0x74, 0x6f, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5915,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x73, 0x65, 0x6c, 0x66, 0x22, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5916,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x61, 0x70, 0x70, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5917,64,"style","Trailing whitespace is superfluous."," 0x69, 0x63, 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x2f, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5918,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x2b, 0x78, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5919,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5920,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5921,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5922,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5923,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5924,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5925,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5926,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5927,64,"style","Trailing whitespace is superfluous."," 0x43, 0x49, 0x4b, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5928,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5929,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x31, 0x30, 0x2d, 0x51, 0x25, 0x32, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5930,64,"style","Trailing whitespace is superfluous."," 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5931,64,"style","Trailing whitespace is superfluous."," 0x61, 0x3d, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5932,64,"style","Trailing whitespace is superfluous."," 0x65, 0x62, 0x3d, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5933,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5934,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5935,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x34, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5936,64,"style","Trailing whitespace is superfluous."," 0x75, 0x74, 0x70, 0x75, 0x74, 0x3d, 0x61, 0x74, 0x6f, 0x6d, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5937,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x73, 0x74, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5938,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x34, 0x30, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5939,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x78, 0x74, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5940,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x70, 0x70, 0x6c, 0x69, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5941,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2f, 0x61, 0x74, 0x6f, 0x6d, 0x2b, 0x78, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5942,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5943,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x53, 0x65, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5944,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x61, 0x74, 0x65, 0x20, 0x54, 0x65, 0x63, 0x68, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5945,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6f, 0x6c, 0x6f, 0x67, 0x79, 0x20, 0x70, 0x6c, 0x63, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5946,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x28, 0x30, 0x30, 0x30, 0x31, 0x31, 0x33, 0x37, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5947,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x29, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5948,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5949,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x32, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5950,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x2d, 0x32, 0x30, 0x54, 0x31, 0x32, 0x3a, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5951,64,"style","Trailing whitespace is superfluous."," 0x35, 0x34, 0x3a, 0x35, 0x31, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5952,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5953,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x3c, 0x2f, 0x66, 0x65, 0x65, 0x64, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5954,68,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a)), date = structure(1579542891, class = c(""POSIXct"", ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5955,77,"style","Trailing whitespace is superfluous."," ""POSIXt""), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.7e-05, ","trailing_whitespace_linter" +"vignettes/parsing/0/browse-edgar-073692.R",5956,72,"style","Trailing whitespace is superfluous."," connect = 2.8e-05, pretransfer = 8.2e-05, starttransfer = 0.473137, ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/edgarWebR/email-body b/.dev/revdep_emails/edgarWebR/email-body new file mode 100644 index 000000000..00f18f6b8 --- /dev/null +++ b/.dev/revdep_emails/edgarWebR/email-body @@ -0,0 +1,29 @@ +Hello Micah J Waldstein! Thank you for using {lintr} in your package {edgarWebR}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/mwaldstein/edgarWebR (hash: fb9a38e6a57186ffd1c93cc1aa00c4fdf1bc5514) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 28s on CRAN vs. 408s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/emayili/attachments/emayili.warnings b/.dev/revdep_emails/emayili/attachments/emayili.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/emayili/attachments/emayili.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/emayili/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/emayili/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..09eb67e65 --- /dev/null +++ b/.dev/revdep_emails/emayili/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,7 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/address.R",273,7,"warning","no visible binding for global variable β€˜.Generic’"," get(.Generic)(raw(e1), raw(e2))","object_usage_linter" +"R/attachment.R",31,56,"style","Use FALSE instead of the symbol F."," stop(""Must be precisely one attachment."", call. = F)","T_and_F_symbol_linter" +"R/encodable.R",52,7,"warning","no visible binding for global variable β€˜.Generic’"," get(.Generic)(as.character(e1), as.character(e2))","object_usage_linter" +"R/render.R",12,7,"warning","local variable β€˜plain’ assigned but may not be used"," if (plain <- attr(markdown, ""plain"")) {","object_usage_linter" +"R/utils.R",88,48,"style","Put spaces around all infix operators.","hexkey <- function(object = runif(1), algorithm=""crc32"") {","infix_spaces_linter" +"R/utils.R",239,41,"warning","Conditional expressions require scalar logical operators (&& and ||)"," inherits(content, ""shiny.tag.list"") |","vector_logic_linter" diff --git a/.dev/revdep_emails/emayili/email-body b/.dev/revdep_emails/emayili/email-body new file mode 100644 index 000000000..ed3325e2d --- /dev/null +++ b/.dev/revdep_emails/emayili/email-body @@ -0,0 +1,29 @@ +Hello Andrew B. Collier! Thank you for using {lintr} in your package {emayili}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/datawookie/emayili (hash: d8271d8ef20905cf0689f4dfd94c3c24cc389ed1) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 46s on CRAN vs. 30s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/epigraphdb/attachments/epigraphdb.warnings b/.dev/revdep_emails/epigraphdb/attachments/epigraphdb.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/epigraphdb/attachments/epigraphdb.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/epigraphdb/email-body b/.dev/revdep_emails/epigraphdb/email-body new file mode 100644 index 000000000..737343bee --- /dev/null +++ b/.dev/revdep_emails/epigraphdb/email-body @@ -0,0 +1,29 @@ +Hello Yi Liu! Thank you for using {lintr} in your package {epigraphdb}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/MRCIEU/epigraphdb-r (hash: 3820f10e07fbb4ce170a644d2fc9d7d20dfe84e0) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 16s on CRAN vs. 9s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/fakemake/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/fakemake/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..9da57e81d --- /dev/null +++ b/.dev/revdep_emails/fakemake/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,2 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/makelists.R",16,28,"style","Commas should never have a space before."," testing = ,","commas_linter" diff --git a/.dev/revdep_emails/fakemake/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/fakemake/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..8c8fe2df2 --- /dev/null +++ b/.dev/revdep_emails/fakemake/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,2 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/makelists.R",78,31,"style","Any function spanning multiple lines should use curly braces."," index <- which(sapply(ml, function(x) target %in% x[[""prerequisites""]] ||","brace_linter" diff --git a/.dev/revdep_emails/fakemake/email-body b/.dev/revdep_emails/fakemake/email-body new file mode 100644 index 000000000..a03eb8ee7 --- /dev/null +++ b/.dev/revdep_emails/fakemake/email-body @@ -0,0 +1,29 @@ +Hello Andreas Dominik Cullmann! Thank you for using {lintr} in your package {fakemake}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://gitlab.com/fvafrcu/fakemake (hash: 8e326ab1b3ce987d6905e1b497442654bf1cb6ec) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 14s on CRAN vs. 7s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/fixtuRes/attachments/fixtuRes.warnings b/.dev/revdep_emails/fixtuRes/attachments/fixtuRes.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/fixtuRes/attachments/fixtuRes.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/fixtuRes/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/fixtuRes/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..c7f5c21af --- /dev/null +++ b/.dev/revdep_emails/fixtuRes/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,3 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/vectors.R",202,3,"warning","local variable β€˜differences_conversion_function’ assigned but may not be used"," differences_conversion_function <- switch(","object_usage_linter" +"vignettes/configuration.R",1,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" diff --git a/.dev/revdep_emails/fixtuRes/email-body b/.dev/revdep_emails/fixtuRes/email-body new file mode 100644 index 000000000..08e62b1a6 --- /dev/null +++ b/.dev/revdep_emails/fixtuRes/email-body @@ -0,0 +1,29 @@ +Hello Jakub Nowicki! Thank you for using {lintr} in your package {fixtuRes}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/jakubnowicki/fixtuRes (hash: 3abac4c038c5c4c85048d74bc17a9d28ecaeaba7) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 8s on CRAN vs. 5s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/fst/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/fst/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..d86cf0fd7 --- /dev/null +++ b/.dev/revdep_emails/fst/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,12 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/fst_table.R",345,13,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!drop | ncol(x) > 1) return(x)","vector_logic_linter" +"R/fst.R",170,1,"style","Variable and function name style should be snake_case or symbols.","write.fst <- function(x, path, compress = 50, uniform_encoding = TRUE) {","object_name_linter" +"R/fst.R",251,21,"style","Variable and function name style should be snake_case or symbols."," attr(res_table, ""row.names"") <- base::.set_row_names(nr_of_rows)","object_name_linter" +"R/hash.R",36,65,"style","Trailing semicolons are not needed."," stop(""Please specify an integer value for the hash seed."");","semicolon_linter" +"R/hash.R",42,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.logical(block_hash) | length(block_hash) != 1) {","vector_logic_linter" +"R/hash.R",43,69,"style","Trailing semicolons are not needed."," stop(""Please specify a logical value for parameter block_hash."");","semicolon_linter" +"R/hash.R",47,62,"style","Trailing semicolons are not needed."," stop(""Please specify a raw vector as input parameter x."");","semicolon_linter" +"tests/testthat/test_factor.R",21,5,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," ) }","brace_linter" +"tests/testthat/test_fst.R",23,5,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," ) }","brace_linter" +"tests/testthat/test_fst.R",30,7,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," ) }","brace_linter" +"tests/testthat/test_meta.R",223,17,"style","Use FALSE instead of the symbol F."," setkey(x, L, F, N)","T_and_F_symbol_linter" diff --git a/.dev/revdep_emails/fst/email-body b/.dev/revdep_emails/fst/email-body new file mode 100644 index 000000000..dced7868c --- /dev/null +++ b/.dev/revdep_emails/fst/email-body @@ -0,0 +1,29 @@ +Hello Mark Klik! Thank you for using {lintr} in your package {fst}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/fstpackage/fst (hash: 7952dea1582353f4e18bfc98681a65cb99cbcbfa) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 23s on CRAN vs. 12s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/fstcore/email-body b/.dev/revdep_emails/fstcore/email-body new file mode 100644 index 000000000..5beafb5d8 --- /dev/null +++ b/.dev/revdep_emails/fstcore/email-body @@ -0,0 +1,29 @@ +Hello Mark Klik! Thank you for using {lintr} in your package {fstcore}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/fstpackage/fst (hash: 7952dea1582353f4e18bfc98681a65cb99cbcbfa) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 23s on CRAN vs. 12s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/geofacet/email-body b/.dev/revdep_emails/geofacet/email-body new file mode 100644 index 000000000..149868aef --- /dev/null +++ b/.dev/revdep_emails/geofacet/email-body @@ -0,0 +1,29 @@ +Hello Ryan Hafen! Thank you for using {lintr} in your package {geofacet}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/hafen/geofacet (hash: 37be2b8f2bc6477dfaea3cb68898982423cdb2c9) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 0s on CRAN vs. 0s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/geogrid/email-body b/.dev/revdep_emails/geogrid/email-body new file mode 100644 index 000000000..96684633c --- /dev/null +++ b/.dev/revdep_emails/geogrid/email-body @@ -0,0 +1,29 @@ +Hello Joseph Bailey! Thank you for using {lintr} in your package {geogrid}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/jbaileyh/geogrid (hash: 2625053a117d164da7eaa8bc736a6e92c4851b44) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 0s on CRAN vs. 0s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/ggRandomForests/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/ggRandomForests/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..1cfa3f9b3 --- /dev/null +++ b/.dev/revdep_emails/ggRandomForests/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,12 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/gg_error.R",233,1,"style","Variable and function name style should be snake_case.","gg_error.randomForest.formula <- gg_error.randomForest","object_name_linter" +"R/kaplan.R",113,31,"style","Place a space before left parenthesis, except in a function call."," lag_s <- c(1, gg_dta$surv)[-(dim(gg_dta)[1] + 1)]","spaces_left_parentheses_linter" +"R/kaplan.R",114,31,"style","Place a space before left parenthesis, except in a function call."," lag_t <- c(0, gg_dta$time)[-(dim(gg_dta)[1] + 1)]","spaces_left_parentheses_linter" +"R/nelson.R",134,36,"style","Place a space before left parenthesis, except in a function call."," lag_surv <- c(1, gg_dta$surv)[-(dim(gg_dta)[1] + 1)]","spaces_left_parentheses_linter" +"R/nelson.R",135,36,"style","Place a space before left parenthesis, except in a function call."," lag_time <- c(0, gg_dta$time)[-(dim(gg_dta)[1] + 1)]","spaces_left_parentheses_linter" +"R/plot.gg_interaction.R",121,56,"style","Trailing whitespace is superfluous."," stop(""gg_interaction expects a rfsrc object, or a ","trailing_whitespace_linter" +"R/plot.gg_variable.R",283,58,"style","Trailing whitespace is superfluous."," ""Mismatched variable types for panel plots... ","trailing_whitespace_linter" +"R/plot.gg_variable.R",360,48,"style","Trailing whitespace is superfluous."," warning(""Mismatched variable types... ","trailing_whitespace_linter" +"tests/testthat/test_gg_error.R",42,14,"style","Variable and function name style should be snake_case."," rfsrc_iris$err.rate <- NULL","object_name_linter" +"tests/testthat/test_gg_error.R",101,11,"style","Variable and function name style should be snake_case."," rf_iris$err.rate <- NULL","object_name_linter" +"tests/testthat/test_gg_partial.R",73,18,"style","Variable and function name style should be snake_case."," partial_boston$xvar.names <- ""lstat""","object_name_linter" diff --git a/.dev/revdep_emails/ggRandomForests/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/ggRandomForests/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..a406c67bc --- /dev/null +++ b/.dev/revdep_emails/ggRandomForests/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,357 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/cache_rfsrc_datasets.R",89,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/cache_rfsrc_datasets.R",92,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/cache_rfsrc_datasets.R",179,5,"style","Either both or neither branch in `if`/`else` should use curly braces."," else{","brace_linter" +"R/cache_rfsrc_datasets.R",179,9,"style","There should be a space before an opening curly brace."," else{","brace_linter" +"R/cache_rfsrc_datasets.R",305,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" +"R/calc_roc.R",63,12,"style","Variable and function name style should be snake_case or symbols."," which.outcome = ""all"",","object_name_linter" +"R/calc_roc.R",72,32,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(arg_list$oob) & is.logical(arg_list$oob))","vector_logic_linter" +"R/calc_roc.R",89,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/calc_roc.R",91,7,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- 1","object_name_linter" +"R/calc_roc.R",125,22,"style","Variable and function name style should be snake_case or symbols."," which.outcome = ""all"",","object_name_linter" +"R/calc_roc.R",136,12,"style","Variable and function name style should be snake_case or symbols."," which.outcome = 1,","object_name_linter" +"R/calc_roc.R",143,7,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- 1","object_name_linter" +"R/combine.gg_partial.R",95,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((!inherits(x, ""gg_partial_list"") &","vector_logic_linter" +"R/combine.gg_partial.R",96,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !inherits(x, ""gg_partial"")) &","vector_logic_linter" +"R/combine.gg_partial.R",97,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," (!inherits(y, ""gg_partial_list"") &","vector_logic_linter" +"R/gg_error.R",225,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_minimal_depth.R",135,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_minimal_vimp.R",128,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_minimal_vimp.R",134,34,"warning","1:dim(...)[1] is likely to be wrong in the empty edge case. Use seq_len() instead."," rnk_md$depth <- rnk_vm$vimp <- 1:dim(rnk_md)[1]","seq_linter" +"R/gg_minimal_vimp.R",143,18,"warning","1:dim(...)[1] is likely to be wrong in the empty edge case. Use seq_len() instead."," rnk_vm$vimp <- 1:dim(rnk_vm)[1]","seq_linter" +"R/gg_partial_coplot.R",115,5,"style","Either both or neither branch in `if`/`else` should use curly braces."," else{","brace_linter" +"R/gg_partial_coplot.R",115,9,"style","There should be a space before an opening curly brace."," else{","brace_linter" +"R/gg_partial.R",222,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_partial.R",232,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_partial.R",257,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",152,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",157,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.vector(grp) | is.factor(grp)) {","vector_logic_linter" +"R/gg_rfsrc.R",163,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",184,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",187,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",190,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",203,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",230,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",248,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",255,36,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(arg_list$conf.int) & missing(by)) {","vector_logic_linter" +"R/gg_rfsrc.R",266,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",279,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",285,7,"style","Either both or neither branch in `if`/`else` should use curly braces."," else{","brace_linter" +"R/gg_rfsrc.R",285,11,"style","There should be a space before an opening curly brace."," else{","brace_linter" +"R/gg_rfsrc.R",308,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",317,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",327,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",352,47,"style","Use TRUE instead of the symbol T."," replace = T)","T_and_F_symbol_linter" +"R/gg_rfsrc.R",375,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",413,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",418,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.vector(grp) | is.factor(grp)) {","vector_logic_linter" +"R/gg_rfsrc.R",424,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",451,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",463,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_rfsrc.R",481,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_roc.R",69,34,"style","Variable and function name style should be snake_case or symbols.","gg_roc.rfsrc <- function(object, which.outcome, oob, ...) {","object_name_linter" +"R/gg_roc.R",70,71,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (sum(inherits(object, c(""rfsrc"", ""grow""), TRUE) == c(1, 2)) != 2 &","vector_logic_linter" +"R/gg_roc.R",71,74,"warning","Conditional expressions require scalar logical operators (&& and ||)"," sum(inherits(object, c(""rfsrc"", ""predict""), TRUE) == c(1, 2)) != 2 &","vector_logic_linter" +"R/gg_roc.R",85,5,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- ""all""","object_name_linter" +"R/gg_roc.R",101,28,"style","Variable and function name style should be snake_case or symbols.","gg_roc <- function(object, which.outcome, oob, ...) {","object_name_linter" +"R/gg_roc.R",106,41,"style","Variable and function name style should be snake_case or symbols.","gg_roc.randomForest <- function(object, which.outcome, oob, ...) {","object_name_linter" +"R/gg_roc.R",116,5,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- ""all""","object_name_linter" +"R/gg_variable.R",163,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_variable.R",195,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_variable.R",236,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_variable.R",257,3,"warning","local variable β€˜oob’ assigned but may not be used"," oob <- if (!is.null(arg_list$oob)) {","object_usage_linter" +"R/gg_variable.R",259,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_vimp.R",107,71,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (sum(inherits(object, c(""rfsrc"", ""grow""), TRUE) == c(1, 2)) != 2 &","vector_logic_linter" +"R/gg_vimp.R",119,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_vimp.R",148,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_vimp.R",158,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_vimp.R",165,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_vimp.R",177,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_vimp.R",187,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_vimp.R",223,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_vimp.R",232,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_vimp.R",257,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_vimp.R",267,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_vimp.R",274,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_vimp.R",286,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/gg_vimp.R",295,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/kaplan.R",59,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/kaplan.R",71,3,"warning","local variable β€˜delta_time’ assigned but may not be used"," delta_time <- sapply(2:length(times), function(ind) {","object_usage_linter" +"R/kaplan.R",124,15,"warning","1:dim(...)[1] is likely to be wrong in the empty edge case. Use seq_len() instead."," for (ind in 1:dim(gg_dta)[1]) {","seq_linter" +"R/nelson.R",74,5,"warning","local variable β€˜srv’ assigned but may not be used"," srv <-","object_usage_linter" +"R/nelson.R",78,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/nelson.R",94,5,"warning","local variable β€˜delta_time’ assigned but may not be used"," delta_time <- sapply(2:length(times), function(ind) {","object_usage_linter" +"R/nelson.R",145,17,"warning","1:dim(...)[1] is likely to be wrong in the empty edge case. Use seq_len() instead."," for (ind in 1:dim(gg_dta)[1]) {","seq_linter" +"R/plot.gg_error.R",131,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_interaction.R",145,20,"warning","1:dim(...)[1] is likely to be wrong in the empty edge case. Use seq_len() instead."," gg_dta$rank <- 1:dim(gg_dta)[1]","seq_linter" +"R/plot.gg_interaction.R",184,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/plot.gg_interaction.R",185,39,"warning","1:dim(...)[1] is likely to be wrong in the empty edge case. Use seq_len() instead."," gg_dta <- data.frame(cbind(rank = 1:dim(object)[1],","seq_linter" +"R/plot.gg_minimal_depth.R",128,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.numeric(arg_set$nvar) & arg_set$nvar > 1) {","vector_logic_linter" +"R/plot.gg_minimal_depth.R",179,18,"warning","1:dim(...)[1] is likely to be wrong in the empty edge case. Use seq_len() instead."," vsel$rank <- 1:dim(vsel)[1]","seq_linter" +"R/plot.gg_minimal_depth.R",219,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_minimal_vimp.R",132,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_partial_list.R",194,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_partial_list.R",208,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_partial_list.R",212,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_partial_list.R",220,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_partial.R",182,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_partial.R",202,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_partial.R",205,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_partial.R",255,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_partial.R",259,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_rfsrc.R",116,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (inherits(gg_dta, ""class"") |","vector_logic_linter" +"R/plot.gg_rfsrc.R",135,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_rfsrc.R",152,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_rfsrc.R",174,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_rfsrc.R",184,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_rfsrc.R",200,39,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (inherits(gg_dta, ""regr"") |","vector_logic_linter" +"R/plot.gg_rfsrc.R",204,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_rfsrc.R",216,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_roc.R",67,28,"style","Variable and function name style should be snake_case or symbols.","plot.gg_roc <- function(x, which.outcome = NULL, ...) {","object_name_linter" +"R/plot.gg_roc.R",76,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (crv > 2 & is.null(which.outcome)) {","vector_logic_linter" +"R/plot.gg_roc.R",81,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_roc.R",83,11,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- 2","object_name_linter" +"R/plot.gg_roc.R",86,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_roc.R",93,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (crv > 2 & is.null(which.outcome)) {","vector_logic_linter" +"R/plot.gg_roc.R",98,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_roc.R",100,11,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- 2","object_name_linter" +"R/plot.gg_roc.R",133,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_survival.R",83,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_survival.R",121,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",177,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",217,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",260,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",271,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",279,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",309,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",316,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",330,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",353,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",357,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",372,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",381,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",396,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",423,17,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",431,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",450,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",470,19,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",483,17,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",500,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",511,17,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",531,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",539,17,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_variable.R",546,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_vimp.R",96,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.numeric(arg_set$nvar) & arg_set$nvar > 1) {","vector_logic_linter" +"R/plot.gg_vimp.R",119,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/plot.gg_vimp.R",143,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(gg_dta$set) | length(unique(gg_dta$set)) < 2) {","vector_logic_linter" +"R/plot.gg_vimp.R",146,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"R/quantile_pts.R",64,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"tests/testthat/test_gg_error.R",113,3,"style","Variable and function name style should be snake_case or symbols."," Boston$chas <- as.logical(Boston$chas)","object_name_linter" +"tests/testthat/test_gg_error.R",159,3,"style","Variable and function name style should be snake_case or symbols."," Boston$chas <- as.logical(Boston$chas)","object_name_linter" +"tests/testthat/test_gg_interaction.R",51,3,"style","Variable and function name style should be snake_case or symbols."," Boston$chas <- as.logical(Boston$chas)","object_name_linter" +"tests/testthat/test_gg_roc.R",15,3,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- 1","object_name_linter" +"tests/testthat/test_gg_roc.R",69,3,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- 1","object_name_linter" +"tests/testthat/test_gg_vimp.R",125,15,"warning","1:dim(...)[2] is likely to be wrong in the empty edge case. Use seq_len() instead."," for (ind in 1:dim(pbc)[2]) {","seq_linter" +"tests/testthat/test_gg_vimp.R",132,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"tests/testthat/test_gg_vimp.R",225,3,"style","Variable and function name style should be snake_case or symbols."," Boston$chas <- as.logical(Boston$chas)","object_name_linter" +"tests/testthat/test_surface_matrix.R",17,3,"style","Variable and function name style should be snake_case or symbols."," rm.tmp <- do.call(c, lapply(rm_pts,","object_name_linter" +"tests/testthat/test_survival_datasets.R",21,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"vignettes/ggrfRegression.Rmd",37,81,"style","Lines should not be more than 80 characters.","# set global chunk options for knitr. These can be changed in the header for each individual R code chunk","line_length_linter" +"vignettes/ggrfRegression.Rmd",39,28,"style","Only use double-quotes."," fig.align = 'center',","single_quotes_linter" +"vignettes/ggrfRegression.Rmd",41,27,"style","Only use double-quotes."," fig.show = 'hold',","single_quotes_linter" +"vignettes/ggrfRegression.Rmd",44,23,"style","Only use double-quotes."," size = 'footnotesize',","single_quotes_linter" +"vignettes/ggrfRegression.Rmd",48,81,"style","Lines should not be more than 80 characters."," echo = FALSE, # Change this to TRUE if you want to see all the code examples","line_length_linter" +"vignettes/ggrfRegression.Rmd",55,63,"style","Trailing whitespace is superfluous.","options(object.size = Inf, expressions = 100000, memory = Inf, ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",73,46,"style","Trailing whitespace is superfluous.","library(""plot3D"") # for 3d surfaces. ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",79,73,"style","Trailing whitespace is superfluous.","library(""randomForestSRC"") # random forests for survival, regression and ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",86,50,"style","Trailing whitespace is superfluous.","## Set open circle for censored, and x for events ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",87,1,"style","Variable and function name style should be snake_case or symbols.","event.marks <- c(1, 4)","object_name_linter" +"vignettes/ggrfRegression.Rmd",88,1,"style","Variable and function name style should be snake_case or symbols.","event.labels <- c(FALSE, TRUE)","object_name_linter" +"vignettes/ggrfRegression.Rmd",91,1,"style","Variable and function name style should be snake_case or symbols.","strCol <- brewer.pal(3, ""Set1"")[c(2,1,3)]","object_name_linter" +"vignettes/ggrfRegression.Rmd",91,37,"style","Commas should always have a space after.","strCol <- brewer.pal(3, ""Set1"")[c(2,1,3)]","commas_linter" +"vignettes/ggrfRegression.Rmd",91,39,"style","Commas should always have a space after.","strCol <- brewer.pal(3, ""Set1"")[c(2,1,3)]","commas_linter" +"vignettes/ggrfRegression.Rmd",128,21,"style","Put spaces around all infix operators.","data(Boston, package=""MASS"")","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",131,1,"style","Variable and function name style should be snake_case or symbols.","Boston$chas <- as.logical(Boston$chas)","object_name_linter" +"vignettes/ggrfRegression.Rmd",135,29,"style","Trailing whitespace is superfluous.","cls <- sapply(Boston, class) ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",136,2,"style","Trailing whitespace is superfluous.","# ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",137,8,"style","Trailing whitespace is superfluous.","lbls <- ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",168,1,"style","Variable and function name style should be snake_case or symbols.","dta.labs <- data.frame(cbind(Variable=names(cls), Description=lbls, type=cls))","object_name_linter" +"vignettes/ggrfRegression.Rmd",168,38,"style","Put spaces around all infix operators.","dta.labs <- data.frame(cbind(Variable=names(cls), Description=lbls, type=cls))","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",168,62,"style","Put spaces around all infix operators.","dta.labs <- data.frame(cbind(Variable=names(cls), Description=lbls, type=cls))","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",168,73,"style","Put spaces around all infix operators.","dta.labs <- data.frame(cbind(Variable=names(cls), Description=lbls, type=cls))","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",171,1,"style","Variable and function name style should be snake_case or symbols.","st.labs <- as.character(dta.labs$Description)","object_name_linter" +"vignettes/ggrfRegression.Rmd",172,7,"style","Variable and function name style should be snake_case or symbols.","names(st.labs) <- names(cls)","object_name_linter" +"vignettes/ggrfRegression.Rmd",175,16,"style","Trailing whitespace is superfluous.","kable(dta.labs, ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",176,25,"style","Trailing whitespace is superfluous."," row.names = FALSE, ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",177,14,"style","Put spaces around all infix operators."," caption=""`Boston` housing data dictionary."",","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",194,12,"style","Put spaces around all infix operators.","ggplot(dta)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",195,19,"style","Put spaces around all infix operators."," geom_point(alpha=0.4, aes(x=medv, y=value, color=chas))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",195,30,"style","Put spaces around all infix operators."," geom_point(alpha=0.4, aes(x=medv, y=value, color=chas))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",195,38,"style","Put spaces around all infix operators."," geom_point(alpha=0.4, aes(x=medv, y=value, color=chas))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",195,51,"style","Put spaces around all infix operators."," geom_point(alpha=0.4, aes(x=medv, y=value, color=chas))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",195,58,"style","Put spaces around all infix operators."," geom_point(alpha=0.4, aes(x=medv, y=value, color=chas))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",196,20,"style","Put spaces around all infix operators."," geom_smooth(aes(x=medv, y=value), se=FALSE)+ ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",196,28,"style","Put spaces around all infix operators."," geom_smooth(aes(x=medv, y=value), se=FALSE)+ ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",196,39,"style","Put spaces around all infix operators."," geom_smooth(aes(x=medv, y=value), se=FALSE)+ ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",196,46,"style","Put spaces around all infix operators."," geom_smooth(aes(x=medv, y=value), se=FALSE)+ ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",196,47,"style","Trailing whitespace is superfluous."," geom_smooth(aes(x=medv, y=value), se=FALSE)+ ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",197,9,"style","Put spaces around all infix operators."," labs(y="""", x=st.labs[""medv""]) +","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",197,15,"style","Put spaces around all infix operators."," labs(y="""", x=st.labs[""medv""]) +","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",198,29,"style","Put spaces around all infix operators."," scale_color_brewer(palette=""Set2"")+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",198,37,"style","Put spaces around all infix operators."," scale_color_brewer(palette=""Set2"")+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",199,31,"style","Put spaces around all infix operators."," facet_wrap(~variable, scales=""free_y"", ncol=3)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",199,46,"style","Put spaces around all infix operators."," facet_wrap(~variable, scales=""free_y"", ncol=3)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",216,1,"style","Variable and function name style should be snake_case or symbols.","rfsrc_Boston <- rfsrc(medv~., data=Boston, ","object_name_linter" +"vignettes/ggrfRegression.Rmd",216,27,"style","Put spaces around all infix operators.","rfsrc_Boston <- rfsrc(medv~., data=Boston, ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",216,35,"style","Put spaces around all infix operators.","rfsrc_Boston <- rfsrc(medv~., data=Boston, ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",216,43,"style","Trailing whitespace is superfluous.","rfsrc_Boston <- rfsrc(medv~., data=Boston, ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",235,29,"style","Commas should always have a space after.","class(gg_e) <- c(""gg_error"",class(gg_e))","commas_linter" +"vignettes/ggrfRegression.Rmd",247,35,"style","Put spaces around all infix operators.","plot(gg_rfsrc(rfsrc_Boston), alpha=.5)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",247,39,"style","Put spaces around all infix operators.","plot(gg_rfsrc(rfsrc_Boston), alpha=.5)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",248,23,"style","Put spaces around all infix operators."," coord_cartesian(ylim=c(5,49))","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",248,28,"style","Commas should always have a space after."," coord_cartesian(ylim=c(5,49))","commas_linter" +"vignettes/ggrfRegression.Rmd",267,33,"style","Put spaces around all infix operators.","plot(gg_vimp(rfsrc_Boston), lbls=st.labs)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",288,1,"style","Variable and function name style should be snake_case or symbols.","varsel_Boston <- var.select(rfsrc_Boston)","object_name_linter" +"vignettes/ggrfRegression.Rmd",294,17,"style","Put spaces around all infix operators.","plot(gg_md, lbls=st.labs)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",330,39,"style","Trailing whitespace is superfluous.","# plotted in minimal depth rank order. ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",334,16,"style","Put spaces around all infix operators.","plot(gg_v, xvar=xvar, panel=TRUE, alpha=.5)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",334,28,"style","Put spaces around all infix operators.","plot(gg_v, xvar=xvar, panel=TRUE, alpha=.5)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",334,40,"style","Put spaces around all infix operators.","plot(gg_v, xvar=xvar, panel=TRUE, alpha=.5)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",334,44,"style","Put spaces around all infix operators.","plot(gg_v, xvar=xvar, panel=TRUE, alpha=.5)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",335,9,"style","Put spaces around all infix operators."," labs(y=st.labs[""medv""], x="""")","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",335,28,"style","Put spaces around all infix operators."," labs(y=st.labs[""medv""], x="""")","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",343,16,"style","Put spaces around all infix operators.","plot(gg_v, xvar=""chas"", alpha=.4)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",343,30,"style","Put spaces around all infix operators.","plot(gg_v, xvar=""chas"", alpha=.4)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",343,34,"style","Put spaces around all infix operators.","plot(gg_v, xvar=""chas"", alpha=.4)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",344,9,"style","Put spaces around all infix operators."," labs(y=st.labs[""medv""])","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",362,1,"style","Variable and function name style should be snake_case or symbols.","partial_Boston <- plot.variable(rfsrc_Boston,","object_name_linter" +"vignettes/ggrfRegression.Rmd",363,37,"style","Put spaces around all infix operators."," xvar=gg_md$topvars,","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",364,40,"style","Put spaces around all infix operators."," partial=TRUE, sorted=FALSE,","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",364,53,"style","Put spaces around all infix operators."," partial=TRUE, sorted=FALSE,","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",365,51,"style","Do not place spaces before parentheses."," show.plots = FALSE )","spaces_inside_linter" +"vignettes/ggrfRegression.Rmd",371,17,"style","Put spaces around all infix operators.","plot(gg_p, panel=TRUE) +","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",372,9,"style","Put spaces around all infix operators."," labs(y=st.labs[""medv""], x="""") +","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",372,28,"style","Put spaces around all infix operators."," labs(y=st.labs[""medv""], x="""") +","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",373,24,"style","Only use double-quotes."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)","single_quotes_linter" +"vignettes/ggrfRegression.Rmd",373,40,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",373,41,"style","Only use double-quotes."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)","single_quotes_linter" +"vignettes/ggrfRegression.Rmd",373,52,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",390,1,"style","Variable and function name style should be snake_case or symbols.","interaction_Boston <- find.interaction(rfsrc_Boston)","object_name_linter" +"vignettes/ggrfRegression.Rmd",393,41,"style","Trailing whitespace is superfluous.","plot(gg_interaction(interaction_Boston), ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",394,10,"style","Put spaces around all infix operators."," xvar=gg_md$topvars, panel=TRUE)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",394,31,"style","Put spaces around all infix operators."," xvar=gg_md$topvars, panel=TRUE)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",408,63,"style","Trailing whitespace is superfluous.","# Find the rm variable points to create 6 intervals of roughly ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",410,52,"style","Put spaces around all infix operators.","rm_pts <- quantile_pts(rfsrc_Boston$xvar$rm, groups=6, ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",410,55,"style","Trailing whitespace is superfluous.","rm_pts <- quantile_pts(rfsrc_Boston$xvar$rm, groups=6, ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",411,33,"style","Put spaces around all infix operators."," intervals=TRUE)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",414,43,"style","Put spaces around all infix operators.","rm_grp <- cut(rfsrc_Boston$xvar$rm, breaks=rm_pts)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",419,49,"style","Trailing whitespace is superfluous.","# Modify the labels for descriptive panel titles ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",420,39,"style","Trailing whitespace is superfluous.","levels(gg_v$rm_grp) <- paste(""rm in "", ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",421,54,"style","Put spaces around all infix operators."," levels(gg_v$rm_grp), sep="""")","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",423,41,"style","Trailing whitespace is superfluous.","# Create a variable dependence (co)plot, ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",425,27,"style","Put spaces around all infix operators.","plot(gg_v, xvar = ""lstat"")+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",426,48,"style","Trailing whitespace is superfluous."," # method = ""loess"", span=1.5, se = FALSE) + ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",427,30,"style","Put spaces around all infix operators."," labs(y = st.labs[""medv""], x=st.labs[""lstat""]) + ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",427,50,"style","Trailing whitespace is superfluous."," labs(y = st.labs[""medv""], x=st.labs[""lstat""]) + ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",428,36,"style","Trailing whitespace is superfluous."," theme(legend.position = ""none"") + ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",429,41,"style","Trailing whitespace is superfluous."," scale_color_brewer(palette = ""Set3"") + ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",439,66,"style","Trailing whitespace is superfluous.","# Find the lstat variable points to create 6 intervals of roughly ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",441,58,"style","Put spaces around all infix operators.","lstat_pts <- quantile_pts(rfsrc_Boston$xvar$lstat, groups=6, intervals=TRUE)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",441,71,"style","Put spaces around all infix operators.","lstat_pts <- quantile_pts(rfsrc_Boston$xvar$lstat, groups=6, intervals=TRUE)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",444,49,"style","Put spaces around all infix operators.","lstat_grp <- cut(rfsrc_Boston$xvar$lstat, breaks=lstat_pts)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",449,49,"style","Trailing whitespace is superfluous.","# Modify the labels for descriptive panel titles ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",450,77,"style","Commas should always have a space after.","levels(gg_v$lstat_grp) <- paste(""lstat in "", levels(gg_v$lstat_grp), "" (%)"",sep="""")","commas_linter" +"vignettes/ggrfRegression.Rmd",450,80,"style","Put spaces around all infix operators.","levels(gg_v$lstat_grp) <- paste(""lstat in "", levels(gg_v$lstat_grp), "" (%)"",sep="""")","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",450,81,"style","Lines should not be more than 80 characters.","levels(gg_v$lstat_grp) <- paste(""lstat in "", levels(gg_v$lstat_grp), "" (%)"",sep="""")","line_length_linter" +"vignettes/ggrfRegression.Rmd",453,36,"style","Put spaces around all infix operators.","plot(gg_v, xvar = ""rm"", alpha = .5)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",454,47,"style","Trailing whitespace is superfluous."," #method = ""loess"", span=1.5, , se = FALSE) + ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",455,30,"style","Put spaces around all infix operators."," labs(y = st.labs[""medv""], x=st.labs[""rm""]) + ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",455,47,"style","Trailing whitespace is superfluous."," labs(y = st.labs[""medv""], x=st.labs[""rm""]) + ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",456,36,"style","Trailing whitespace is superfluous."," theme(legend.position = ""none"") + ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",457,41,"style","Trailing whitespace is superfluous."," scale_color_brewer(palette = ""Set3"") + ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",459,68,"style","Trailing whitespace is superfluous."," #scale_shape_manual(values = event.marks, labels = event.labels)+ ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",482,1,"style","Variable and function name style should be snake_case or symbols.","partial_coplot_Boston <- gg_partial_coplot(rfsrc_Boston, xvar=""lstat"", ","object_name_linter" +"vignettes/ggrfRegression.Rmd",482,62,"style","Put spaces around all infix operators.","partial_coplot_Boston <- gg_partial_coplot(rfsrc_Boston, xvar=""lstat"", ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",482,71,"style","Trailing whitespace is superfluous.","partial_coplot_Boston <- gg_partial_coplot(rfsrc_Boston, xvar=""lstat"", ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",483,50,"style","Put spaces around all infix operators."," groups=rm_grp,","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",484,54,"style","Put spaces around all infix operators."," show.plots=FALSE)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",493,36,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston, aes(x=lstat, y=yhat, col=group))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",493,45,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston, aes(x=lstat, y=yhat, col=group))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",493,55,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston, aes(x=lstat, y=yhat, col=group))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",493,63,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston, aes(x=lstat, y=yhat, col=group))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",494,15,"style","Put spaces around all infix operators."," geom_point()+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",495,24,"style","Only use double-quotes."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE, alpha=.25)+","single_quotes_linter" +"vignettes/ggrfRegression.Rmd",495,40,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE, alpha=.25)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",495,41,"style","Only use double-quotes."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE, alpha=.25)+","single_quotes_linter" +"vignettes/ggrfRegression.Rmd",495,52,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE, alpha=.25)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",495,65,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE, alpha=.25)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",495,70,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE, alpha=.25)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",496,9,"style","Put spaces around all infix operators."," labs(x=st.labs[""lstat""], y=st.labs[""medv""],","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",496,29,"style","Put spaces around all infix operators."," labs(x=st.labs[""lstat""], y=st.labs[""medv""],","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",497,13,"style","Put spaces around all infix operators."," color=""Room"", shape=""Room"")+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",497,27,"style","Put spaces around all infix operators."," color=""Room"", shape=""Room"")+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",497,35,"style","Put spaces around all infix operators."," color=""Room"", shape=""Room"")+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",498,29,"style","Put spaces around all infix operators."," scale_color_brewer(palette=""Set1"")","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",508,1,"style","Variable and function name style should be snake_case or symbols.","partial_coplot_Boston2 <- gg_partial_coplot(rfsrc_Boston, xvar=""rm"", ","object_name_linter" +"vignettes/ggrfRegression.Rmd",508,63,"style","Put spaces around all infix operators.","partial_coplot_Boston2 <- gg_partial_coplot(rfsrc_Boston, xvar=""rm"", ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",508,69,"style","Trailing whitespace is superfluous.","partial_coplot_Boston2 <- gg_partial_coplot(rfsrc_Boston, xvar=""rm"", ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",509,51,"style","Put spaces around all infix operators."," groups=lstat_grp,","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",510,55,"style","Put spaces around all infix operators."," show.plots=FALSE)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",516,37,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston2, aes(x=rm, y=yhat, col=group))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",516,43,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston2, aes(x=rm, y=yhat, col=group))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",516,53,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston2, aes(x=rm, y=yhat, col=group))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",516,61,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston2, aes(x=rm, y=yhat, col=group))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",517,15,"style","Put spaces around all infix operators."," geom_point()+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",518,24,"style","Only use double-quotes."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)+","single_quotes_linter" +"vignettes/ggrfRegression.Rmd",518,40,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",518,41,"style","Only use double-quotes."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)+","single_quotes_linter" +"vignettes/ggrfRegression.Rmd",518,52,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",518,59,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",519,9,"style","Put spaces around all infix operators."," labs(x=st.labs[""rm""], y=st.labs[""medv""], ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",519,26,"style","Put spaces around all infix operators."," labs(x=st.labs[""rm""], y=st.labs[""medv""], ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",519,43,"style","Trailing whitespace is superfluous."," labs(x=st.labs[""rm""], y=st.labs[""medv""], ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",520,13,"style","Put spaces around all infix operators."," color=""Lower Status"", shape=""Lower Status"")+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",520,35,"style","Put spaces around all infix operators."," color=""Lower Status"", shape=""Lower Status"")+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",520,51,"style","Put spaces around all infix operators."," color=""Lower Status"", shape=""Lower Status"")+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",521,29,"style","Put spaces around all infix operators."," scale_color_brewer(palette=""Set1"")","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",533,52,"style","Put spaces around all infix operators.","rm_pts <- quantile_pts(rfsrc_Boston$xvar$rm, groups=49, intervals = TRUE)","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",542,13,"style","Variable and function name style should be snake_case or symbols.","system.time(partial_Boston_surf <- lapply(rm_pts, function(ct){","object_name_linter" +"vignettes/ggrfRegression.Rmd",542,63,"style","There should be a space before an opening curly brace.","system.time(partial_Boston_surf <- lapply(rm_pts, function(ct){","brace_linter" +"vignettes/ggrfRegression.Rmd",542,63,"style","There should be a space between a right parenthesis and a body expression.","system.time(partial_Boston_surf <- lapply(rm_pts, function(ct){","paren_body_linter" +"vignettes/ggrfRegression.Rmd",543,3,"style","Variable and function name style should be snake_case or symbols."," rfsrc_Boston$xvar$rm <- ct","object_name_linter" +"vignettes/ggrfRegression.Rmd",545,47,"style","Trailing whitespace is superfluous."," npts = 50, show.plots = FALSE, ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",548,29,"style","Trailing whitespace is superfluous.","# user system elapsed ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",549,29,"style","Trailing whitespace is superfluous.","# 1109.641 76.516 1199.732 ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",557,1,"style","Variable and function name style should be snake_case or symbols.","rm.tmp <- do.call(c,lapply(rm_pts, ","object_name_linter" +"vignettes/ggrfRegression.Rmd",557,21,"style","Commas should always have a space after.","rm.tmp <- do.call(c,lapply(rm_pts, ","commas_linter" +"vignettes/ggrfRegression.Rmd",557,35,"style","Trailing whitespace is superfluous.","rm.tmp <- do.call(c,lapply(rm_pts, ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",558,41,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," function(grp){rep(grp, 50)}))","brace_linter" +"vignettes/ggrfRegression.Rmd",558,41,"style","There should be a space before an opening curly brace."," function(grp){rep(grp, 50)}))","brace_linter" +"vignettes/ggrfRegression.Rmd",558,41,"style","There should be a space between a right parenthesis and a body expression."," function(grp){rep(grp, 50)}))","paren_body_linter" +"vignettes/ggrfRegression.Rmd",560,46,"style","Trailing whitespace is superfluous.","# Convert the list of plot.variable output to ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",561,31,"style","Commas should always have a space after.","partial_surf <- do.call(rbind,lapply(partial_Boston_surf, gg_partial))","commas_linter" +"vignettes/ggrfRegression.Rmd",567,27,"style","Put spaces around all infix operators.","ggplot(partial_surf, aes(x=lstat, y=rm, z=yhat))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",567,36,"style","Put spaces around all infix operators.","ggplot(partial_surf, aes(x=lstat, y=rm, z=yhat))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",567,42,"style","Put spaces around all infix operators.","ggplot(partial_surf, aes(x=lstat, y=rm, z=yhat))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",567,49,"style","Put spaces around all infix operators.","ggplot(partial_surf, aes(x=lstat, y=rm, z=yhat))+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",568,55,"style","Put spaces around all infix operators."," stat_contour(aes(colour = ..level..), binwidth = .5)+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",569,9,"style","Put spaces around all infix operators."," labs(x=st.labs[""lstat""], y=st.labs[""rm""], ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",569,29,"style","Put spaces around all infix operators."," labs(x=st.labs[""lstat""], y=st.labs[""rm""], ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",569,44,"style","Trailing whitespace is superfluous."," labs(x=st.labs[""lstat""], y=st.labs[""rm""], ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",570,13,"style","Put spaces around all infix operators."," color=""Median Home Values"")+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",570,35,"style","Put spaces around all infix operators."," color=""Median Home Values"")+","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",571,33,"style","Put spaces around all infix operators."," scale_colour_gradientn(colours=topo.colors(10))","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",580,15,"style","Commas should always have a space after.","par(mai = c(0,0,0,0))","commas_linter" +"vignettes/ggrfRegression.Rmd",580,17,"style","Commas should always have a space after.","par(mai = c(0,0,0,0))","commas_linter" +"vignettes/ggrfRegression.Rmd",580,19,"style","Commas should always have a space after.","par(mai = c(0,0,0,0))","commas_linter" +"vignettes/ggrfRegression.Rmd",589,9,"style","Put spaces around all infix operators.","surf3D(x=srf$x, y=srf$y, z=srf$z, col=topo.colors(10),","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",589,18,"style","Put spaces around all infix operators.","surf3D(x=srf$x, y=srf$y, z=srf$z, col=topo.colors(10),","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",589,27,"style","Put spaces around all infix operators.","surf3D(x=srf$x, y=srf$y, z=srf$z, col=topo.colors(10),","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",589,38,"style","Put spaces around all infix operators.","surf3D(x=srf$x, y=srf$y, z=srf$z, col=topo.colors(10),","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",590,14,"style","Put spaces around all infix operators."," colkey=FALSE, border = ""black"", bty=""b2"", ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",590,43,"style","Put spaces around all infix operators."," colkey=FALSE, border = ""black"", bty=""b2"", ","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",590,49,"style","Trailing whitespace is superfluous."," colkey=FALSE, border = ""black"", bty=""b2"", ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",591,34,"style","Trailing whitespace is superfluous."," shade = 0.5, expand = 0.5, ","trailing_whitespace_linter" +"vignettes/ggrfRegression.Rmd",593,12,"style","Put spaces around all infix operators."," xlab=""Lower Status"", ylab=""Average Rooms"", zlab=""Median Value""","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",593,33,"style","Put spaces around all infix operators."," xlab=""Lower Status"", ylab=""Average Rooms"", zlab=""Median Value""","infix_spaces_linter" +"vignettes/ggrfRegression.Rmd",593,55,"style","Put spaces around all infix operators."," xlab=""Lower Status"", ylab=""Average Rooms"", zlab=""Median Value""","infix_spaces_linter" diff --git a/.dev/revdep_emails/ggRandomForests/email-body b/.dev/revdep_emails/ggRandomForests/email-body new file mode 100644 index 000000000..1720de086 --- /dev/null +++ b/.dev/revdep_emails/ggRandomForests/email-body @@ -0,0 +1,29 @@ +Hello John Ehrlinger! Thank you for using {lintr} in your package {ggRandomForests}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/ehrlinger/ggRandomForests (hash: d24c83cba61d024f16bc6cf42b3a25da6fb2d9b9) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 93s on CRAN vs. 60s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/ggcharts/attachments/ggcharts.warnings b/.dev/revdep_emails/ggcharts/attachments/ggcharts.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/ggcharts/attachments/ggcharts.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/ggcharts/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/ggcharts/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..652215dab --- /dev/null +++ b/.dev/revdep_emails/ggcharts/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,3 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/zzz.R",1,1,"style","Variable and function name style should be snake_case.",".onLoad <- function(libname, pkgname) {","object_name_linter" +"R/zzz.R",43,1,"style","Variable and function name style should be snake_case.",".onUnload <- function(libpath) {","object_name_linter" diff --git a/.dev/revdep_emails/ggcharts/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/ggcharts/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..d22aa5cde --- /dev/null +++ b/.dev/revdep_emails/ggcharts/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,5 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/bar_chart.R",81,14,"warning","possible error in post_process_plot(plot = p, is_sorted = sort, horizontal = horizontal, facet = !!facet, fill = has_fill, highlight = highlight, color = bar_color, other = other, threshold = threshold): unused arguments (other = other, threshold = threshold)","bar_chart <- function(data, x, y, facet = NULL, ..., bar_color = ""auto"",","object_usage_linter" +"R/lollipop_chart.R",83,19,"warning","possible error in post_process_plot(plot = p, is_sorted = TRUE, horizontal = horizontal, facet = !!facet, fill = FALSE, highlight = highlight, color = line_color, other = other, threshold = threshold): unused arguments (other = other, threshold = threshold)","lollipop_chart <- function(data, x, y, facet = NULL, ..., line_size = 0.75,","object_usage_linter" +"R/post_process_plot.R",47,13,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (other & !is.null(threshold)) {","vector_logic_linter" +"vignettes/customize.Rmd",52,101,"style","Lines should not be more than 100 characters."," y = ""Developers Who are Developing with the Language but\nHave not Expressed Interest in Continuing to Do so"",","line_length_linter" diff --git a/.dev/revdep_emails/ggcharts/email-body b/.dev/revdep_emails/ggcharts/email-body new file mode 100644 index 000000000..53fc2f7e6 --- /dev/null +++ b/.dev/revdep_emails/ggcharts/email-body @@ -0,0 +1,29 @@ +Hello Thomas Neitmann! Thank you for using {lintr} in your package {ggcharts}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/thomas-neitmann/ggcharts (hash: fa263d12878ece10d5eadfed26b27e2d233d28b1) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 20s on CRAN vs. 13s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/ggfortify/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/ggfortify/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..172b5ab90 --- /dev/null +++ b/.dev/revdep_emails/ggfortify/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,118 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/base_fortify_list.R",7,1,"style","Variable and function name style should be snake_case.","fortify.list <- function(model, data = NULL, ...) {","object_name_linter" +"R/base_fortify_list.R",31,1,"style","Variable and function name style should be snake_case.","autoplot.list <- function(object, data = NULL,","object_name_linter" +"R/base_fortify_ts.R",88,1,"style","Variable and function name style should be snake_case.","fortify.timeSeries <- fortify.ts","object_name_linter" +"R/base_fortify_ts.R",91,1,"style","Variable and function name style should be snake_case.","fortify.irts <- fortify.ts","object_name_linter" +"R/base_fortify_ts.R",269,1,"style","Variable and function name style should be snake_case.","autoplot.zooreg <- autoplot.ts","object_name_linter" +"R/base_fortify_ts.R",272,1,"style","Variable and function name style should be snake_case.","autoplot.xts <- autoplot.ts","object_name_linter" +"R/base_fortify_ts.R",275,1,"style","Variable and function name style should be snake_case.","autoplot.timeSeries <- autoplot.ts","object_name_linter" +"R/base_fortify_ts.R",278,1,"style","Variable and function name style should be snake_case.","autoplot.irts <- autoplot.ts","object_name_linter" +"R/base_fortify_ts.R",391,1,"style","Variable and function name style should be snake_case.","fortify.ar <- fortify.tsmodel","object_name_linter" +"R/base_fortify_ts.R",394,1,"style","Variable and function name style should be snake_case.","fortify.Arima <- fortify.tsmodel","object_name_linter" +"R/base_fortify_ts.R",397,1,"style","Variable and function name style should be snake_case.","fortify.tsmodel <- fortify.tsmodel","object_name_linter" +"R/base_fortify_ts.R",400,1,"style","Variable and function name style should be snake_case.","fortify.HoltWinters <- fortify.tsmodel","object_name_linter" +"R/base_fortify_ts.R",403,1,"style","Variable and function name style should be snake_case.","fortify.fracdiff <- fortify.tsmodel","object_name_linter" +"R/base_fortify_ts.R",406,1,"style","Variable and function name style should be snake_case.","fortify.nnetar <- fortify.tsmodel","object_name_linter" +"R/base_fortify_ts.R",409,1,"style","Variable and function name style should be snake_case.","fortify.fGARCH <- fortify.tsmodel","object_name_linter" +"R/base_fortify_ts.R",412,1,"style","Variable and function name style should be snake_case.","fortify.dlmFiltered <- fortify.tsmodel","object_name_linter" +"R/base_fortify_ts.R",415,1,"style","Variable and function name style should be snake_case.","fortify.KFS <- fortify.tsmodel","object_name_linter" +"R/base_fortify_ts.R",457,1,"style","Variable and function name style should be snake_case.","autoplot.tsmodel <- function(object, data = NULL,","object_name_linter" +"R/base_fortify_ts.R",499,1,"style","Variable and function name style should be snake_case.","autoplot.ar <- autoplot.tsmodel","object_name_linter" +"R/base_fortify_ts.R",502,1,"style","Variable and function name style should be snake_case.","autoplot.Arima <- autoplot.tsmodel","object_name_linter" +"R/base_fortify_ts.R",505,1,"style","Variable and function name style should be snake_case.","autoplot.HoltWinters <- autoplot.tsmodel","object_name_linter" +"R/base_fortify_ts.R",508,1,"style","Variable and function name style should be snake_case.","autoplot.fracdiff <- autoplot.tsmodel","object_name_linter" +"R/base_fortify_ts.R",511,1,"style","Variable and function name style should be snake_case.","autoplot.nnetar <- autoplot.tsmodel","object_name_linter" +"R/base_fortify_ts.R",514,1,"style","Variable and function name style should be snake_case.","autoplot.fGARCH <- autoplot.tsmodel","object_name_linter" +"R/base_fortify_ts.R",517,1,"style","Variable and function name style should be snake_case.","autoplot.dlmFiltered <- autoplot.tsmodel","object_name_linter" +"R/base_fortify_ts.R",520,1,"style","Variable and function name style should be snake_case.","autoplot.KFS <- autoplot.tsmodel","object_name_linter" +"R/fortify_base.R",20,1,"style","Variable and function name style should be snake_case.","fortify.table <- function(model, data, ...) {","object_name_linter" +"R/fortify_base.R",38,1,"style","Variable and function name style should be snake_case.","fortify.matrix <- function(model, data = NULL, compat = FALSE, ...) {","object_name_linter" +"R/fortify_base.R",91,15,"style","Variable and function name style should be snake_case."," fortified$Index <- rownames(fortified)","object_name_linter" +"R/fortify_basis.R",24,1,"style","Variable and function name style should be snake_case.","as_tibble.basis <- function(x, ...) {","object_name_linter" +"R/fortify_changepoint.R",21,1,"style","Variable and function name style should be snake_case.","fortify.cpt <- function(model, data = NULL,","object_name_linter" +"R/fortify_changepoint.R",56,1,"style","Variable and function name style should be snake_case.","fortify.breakpoints <- fortify.cpt","object_name_linter" +"R/fortify_changepoint.R",59,1,"style","Variable and function name style should be snake_case.","fortify.breakpointsfull <- fortify.cpt","object_name_linter" +"R/fortify_changepoint.R",111,1,"style","Variable and function name style should be snake_case.","autoplot.breakpoints <- function(object, data = NULL,","object_name_linter" +"R/fortify_changepoint.R",129,1,"style","Variable and function name style should be snake_case.","fortify.breakpointsfull <- fortify.breakpoints","object_name_linter" +"R/fortify_cluster.R",13,1,"style","Variable and function name style should be snake_case.","fortify.kmeans <- function(model, data = NULL, ...) {","object_name_linter" +"R/fortify_cluster.R",43,1,"style","Variable and function name style should be snake_case.","autoplot.kmeans <- function(object, data = NULL,","object_name_linter" +"R/fortify_cluster.R",67,1,"style","Variable and function name style should be snake_case.","fortify.partition <- fortify.kmeans","object_name_linter" +"R/fortify_cluster.R",70,1,"style","Variable and function name style should be snake_case.","fortify.clara <- fortify.partition","object_name_linter" +"R/fortify_cluster.R",73,1,"style","Variable and function name style should be snake_case.","fortify.fanny <- fortify.partition","object_name_linter" +"R/fortify_cluster.R",76,1,"style","Variable and function name style should be snake_case.","fortify.pam <- fortify.partition","object_name_linter" +"R/fortify_cluster.R",79,1,"style","Variable and function name style should be snake_case.","autoplot.partition <- autoplot.kmeans","object_name_linter" +"R/fortify_cluster.R",82,1,"style","Variable and function name style should be snake_case.","autoplot.clara <- autoplot.partition","object_name_linter" +"R/fortify_cluster.R",85,1,"style","Variable and function name style should be snake_case.","autoplot.fanny <- autoplot.partition","object_name_linter" +"R/fortify_cluster.R",88,1,"style","Variable and function name style should be snake_case.","autoplot.pam <- autoplot.partition","object_name_linter" +"R/fortify_cluster.R",103,1,"style","Variable and function name style should be snake_case.","fortify.silhouette <- function(model, data = NULL, ...) {","object_name_linter" +"R/fortify_cluster.R",138,1,"style","Variable and function name style should be snake_case.","autoplot.silhouette <- function(object, colour = ""red"",","object_name_linter" +"R/fortify_forecast.R",18,14,"style","Variable and function name style should be snake_case."," forecasted$Index <- get.dtindex(model$mean, is.date = is.date)","object_name_linter" +"R/fortify_forecast.R",96,1,"style","Variable and function name style should be snake_case.","fortify.ets <- function(model, data = NULL, ...) {","object_name_linter" +"R/fortify_forecast.R",144,1,"style","Variable and function name style should be snake_case.","fortify.bats <- fortify.ets","object_name_linter" +"R/fortify_forecast.R",147,1,"style","Variable and function name style should be snake_case.","autoplot.ets <- autoplot.ts","object_name_linter" +"R/fortify_forecast.R",150,1,"style","Variable and function name style should be snake_case.","autoplot.bats <- autoplot.ts","object_name_linter" +"R/fortify_glmnet.R",9,1,"style","Variable and function name style should be snake_case.","fortify.glmnet <- function(model, data = NULL, ...) {","object_name_linter" +"R/fortify_glmnet.R",95,1,"style","Variable and function name style should be snake_case.","fortify.cv.glmnet <- function(model, data = NULL, ...) {","object_name_linter" +"R/fortify_MSwM.R",15,1,"style","Variable and function name style should be snake_case.","fortify.MSM.lm <- function(model, data = NULL, melt = FALSE, ...) {","object_name_linter" +"R/fortify_MSwM.R",28,10,"style","Variable and function name style should be snake_case."," md$Index <- factor(md$Index, levels = idx)","object_name_linter" +"R/fortify_MSwM.R",29,10,"style","Variable and function name style should be snake_case."," md$Model <- rep(k, nrow(md))","object_name_linter" +"R/fortify_MSwM.R",30,10,"style","Variable and function name style should be snake_case."," md$ProbableModel <- probable","object_name_linter" +"R/fortify_MSwM.R",34,7,"style","Variable and function name style should be snake_case."," d$Model <- as.factor(d$Model)","object_name_linter" +"R/fortify_performance.R",7,1,"style","Variable and function name style should be snake_case.","fortify.performance <- function(model, data = NULL, ...) {","object_name_linter" +"R/fortify_performance.R",60,1,"style","Variable and function name style should be snake_case.","autoplot.performance <- function(object, p = NULL,","object_name_linter" +"R/fortify_raster.R",9,1,"style","Variable and function name style should be snake_case.","fortify.RasterCommon <- function(model, data = NULL, maxpixels = 100000,","object_name_linter" +"R/fortify_raster.R",49,1,"style","Variable and function name style should be snake_case.","fortify.RasterLayer <- fortify.RasterCommon","object_name_linter" +"R/fortify_raster.R",52,1,"style","Variable and function name style should be snake_case.","fortify.RasterBrick <- fortify.RasterCommon","object_name_linter" +"R/fortify_raster.R",55,1,"style","Variable and function name style should be snake_case.","fortify.RasterStack <- fortify.RasterCommon","object_name_linter" +"R/fortify_raster.R",95,1,"style","Variable and function name style should be snake_case.","autoplot.RasterLayer <- autoplot.RasterCommon","object_name_linter" +"R/fortify_raster.R",98,1,"style","Variable and function name style should be snake_case.","autoplot.RasterBrick <- autoplot.RasterCommon","object_name_linter" +"R/fortify_raster.R",101,1,"style","Variable and function name style should be snake_case.","autoplot.RasterStack <- autoplot.RasterCommon","object_name_linter" +"R/fortify_spatial.R",8,1,"style","Variable and function name style should be snake_case.","fortify.SpatialCommon <- function(model, data = NULL,","object_name_linter" +"R/fortify_spatial.R",39,1,"style","Variable and function name style should be snake_case.","fortify.SpatialPoints <- fortify.SpatialCommon","object_name_linter" +"R/fortify_spatial.R",42,1,"style","Variable and function name style should be snake_case.","fortify.SpatialPointsDataFrame <- fortify.SpatialCommon","object_name_linter" +"R/fortify_spatial.R",45,1,"style","Variable and function name style should be snake_case.","fortify.SpatialLines <- fortify.SpatialCommon","object_name_linter" +"R/fortify_spatial.R",135,1,"style","Variable and function names should not be longer than 30 characters.","autoplot.SpatialPointsDataFrame <- autoplot.SpatialCommon","object_length_linter" +"R/fortify_spatial.R",135,1,"style","Variable and function name style should be snake_case.","autoplot.SpatialPointsDataFrame <- autoplot.SpatialCommon","object_name_linter" +"R/fortify_spatial.R",138,1,"style","Variable and function name style should be snake_case.","autoplot.SpatialPoints <- autoplot.SpatialCommon","object_name_linter" +"R/fortify_spatial.R",141,1,"style","Variable and function name style should be snake_case.","autoplot.Line <- autoplot.SpatialCommon","object_name_linter" +"R/fortify_spatial.R",144,1,"style","Variable and function name style should be snake_case.","autoplot.Lines <- autoplot.SpatialCommon","object_name_linter" +"R/fortify_spatial.R",147,1,"style","Variable and function name style should be snake_case.","autoplot.SpatialLines <- autoplot.SpatialCommon","object_name_linter" +"R/fortify_spatial.R",150,1,"style","Variable and function name style should be snake_case.","autoplot.SpatialLinesDataFrame <- autoplot.SpatialCommon","object_name_linter" +"R/fortify_spatial.R",153,1,"style","Variable and function name style should be snake_case.","autoplot.Polygon <- autoplot.SpatialCommon","object_name_linter" +"R/fortify_spatial.R",156,1,"style","Variable and function name style should be snake_case.","autoplot.Polygons <- autoplot.SpatialCommon","object_name_linter" +"R/fortify_spatial.R",159,1,"style","Variable and function name style should be snake_case.","autoplot.SpatialPolygons <- autoplot.SpatialCommon","object_name_linter" +"R/fortify_spatial.R",162,1,"style","Variable and function names should not be longer than 30 characters.","autoplot.SpatialPolygonsDataFrame <- autoplot.SpatialCommon","object_length_linter" +"R/fortify_spatial.R",162,1,"style","Variable and function name style should be snake_case.","autoplot.SpatialPolygonsDataFrame <- autoplot.SpatialCommon","object_name_linter" +"R/fortify_stats_density.R",9,1,"style","Variable and function name style should be snake_case.","fortify.density <- function(model, data = NULL, ...) {","object_name_linter" +"R/fortify_stats_lm.R",335,1,"style","Variable and function name style should be snake_case.","autoplot.glm <- autoplot.lm","object_name_linter" +"R/fortify_stats.R",2,1,"style","Variable and function name style should be snake_case.","fortify.stl <- fortify.ts","object_name_linter" +"R/fortify_stats.R",5,1,"style","Variable and function name style should be snake_case.","fortify.decomposed.ts <- fortify.ts","object_name_linter" +"R/fortify_stats.R",8,1,"style","Variable and function name style should be snake_case.","autoplot.stl <- autoplot.ts","object_name_linter" +"R/fortify_stats.R",11,1,"style","Variable and function name style should be snake_case.","autoplot.decomposed.ts <- autoplot.ts","object_name_linter" +"R/fortify_stats.R",28,1,"style","Variable and function name style should be snake_case.","fortify.acf <- function(model, data = NULL,","object_name_linter" +"R/fortify_stats.R",57,1,"style","Variable and function name style should be snake_case.","autoplot.acf <- function(object,","object_name_linter" +"R/fortify_stats.R",98,1,"style","Variable and function name style should be snake_case.","fortify.spec <- function(model, data = NULL, ...) {","object_name_linter" +"R/fortify_stats.R",114,1,"style","Variable and function name style should be snake_case.","autoplot.spec <- function(object,","object_name_linter" +"R/fortify_stats.R",140,1,"style","Variable and function name style should be snake_case.","fortify.prcomp <- function(model, data = NULL, ...) {","object_name_linter" +"R/fortify_stats.R",160,1,"style","Variable and function name style should be snake_case.","fortify.princomp <- fortify.prcomp","object_name_linter" +"R/fortify_stats.R",172,1,"style","Variable and function name style should be snake_case.","fortify.factanal <- function(model, data = NULL, ...) {","object_name_linter" +"R/fortify_stats.R",194,1,"style","Variable and function name style should be snake_case.","fortify.lfda <- function(model, data = NULL, ...) {","object_name_linter" +"R/fortify_stats.R",252,1,"style","Variable and function name style should be snake_case.","autoplot.pca_common <- function(object, data = NULL,","object_name_linter" +"R/fortify_stats.R",345,1,"style","Variable and function name style should be snake_case.","autoplot.prcomp <- autoplot.pca_common","object_name_linter" +"R/fortify_stats.R",348,1,"style","Variable and function name style should be snake_case.","autoplot.princomp <- autoplot.pca_common","object_name_linter" +"R/fortify_stats.R",351,1,"style","Variable and function name style should be snake_case.","autoplot.factanal <- autoplot.pca_common","object_name_linter" +"R/fortify_stats.R",354,1,"style","Variable and function name style should be snake_case.","autoplot.lfda <- autoplot.pca_common","object_name_linter" +"R/fortify_stats.R",365,1,"style","Variable and function name style should be snake_case.","fortify.dist <- function(model, data = NULL, ...) {","object_name_linter" +"R/fortify_stats.R",371,1,"style","Variable and function name style should be snake_case.","autoplot.dist <- autoplot.matrix","object_name_linter" +"R/fortify_stats.R",385,1,"style","Variable and function name style should be snake_case.","fortify.stepfun <- function(model, data, ...) {","object_name_linter" +"R/fortify_stats.R",418,1,"style","Variable and function name style should be snake_case.","autoplot.stepfun <- function(object,","object_name_linter" +"R/fortify_surv.R",282,1,"style","Variable and function name style should be snake_case.","fortify.aareg <- function(model, data = NULL,","object_name_linter" +"R/fortify_vars.R",26,21,"style","There should be a space between right parenthesis and an opening curly brace."," for (col in cols){","paren_brace_linter" +"R/fortify_vars.R",28,12,"style","Variable and function name style should be snake_case."," pred$Index <- dtindex.cont","object_name_linter" +"R/fortify_vars.R",37,21,"style","There should be a space between right parenthesis and an opening curly brace."," for (col in cols){","paren_brace_linter" +"R/fortify_vars.R",41,10,"style","Variable and function name style should be snake_case."," pred$Index <- dtindex.cont","object_name_linter" +"R/plotlib.R",457,1,"style","Variable and function name style should be snake_case.","autoplot.ggplot <- function(object, ...) {","object_name_linter" +"R/plotlib.R",468,1,"style","Variable and function name style should be snake_case.","autoplot.ggmultiplot <- function(object, ...) {","object_name_linter" +"R/tslib.R",130,3,"style","Variable and function name style should be snake_case."," with.ci.ma <- with.ci && ci.type == ""ma"" && x$type == ""correlation""","object_name_linter" +"R/tslib.R",134,5,"style","Variable and function name style should be snake_case."," with.ci.ma <- FALSE","object_name_linter" +"tests/testthat/test-raster.R",35,7,"style","Variable and function name style should be snake_case."," exp$layer.2 <- exp$layer","object_name_linter" diff --git a/.dev/revdep_emails/ggfortify/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/ggfortify/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..89239abb7 --- /dev/null +++ b/.dev/revdep_emails/ggfortify/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,190 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/base_fortify_list.R",54,25,"style","Any function spanning multiple lines should use curly braces."," p <- lapply(object, function(x) autoplot(x, data = data, nrow = nrow,","brace_linter" +"R/fortify_basis.R",25,13,"style","Variable and function name style should be snake_case or symbols."," attr(x, ""basis.class"") <- attr(x, ""class"")","object_name_linter" +"R/fortify_basis.R",87,5,"style","Variable and function name style should be snake_case or symbols."," all.knots <- c(attr(object, ""Boundary.knots""),","object_name_linter" +"R/fortify_glmnet.R",69,3,"style","Variable and function name style should be snake_case or symbols."," label.data$label_y <- rep(max(plot.data$value), nrow(label.data))","object_name_linter" +"R/fortify_glmnet.R",115,33,"style","Variable and function name style should be snake_case or symbols."," sign.lambda = 1,","object_name_linter" +"R/fortify_stats_lm.R",150,15,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (label & label.n > 0) {","vector_logic_linter" +"R/fortify_stats.R",283,5,"style","Either both or neither branch in `if`/`else` should use curly braces."," if (is.null(attr(object, ""covariance""))) {","brace_linter" +"R/fortify_stats.R",319,5,"style","Variable and function name style should be snake_case or symbols."," loadings.data$rownames <- rownames(loadings.data)","object_name_linter" +"R/fortify_stats.R",328,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(ve) | !variance_percentage) {","vector_logic_linter" +"R/fortify_stats.R",433,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nrow(plot.data) >= 3 & !is.null(shape)) {","vector_logic_linter" +"R/fortify_surv.R",99,5,"style","`else` should come on the same line as the previous `}`."," else if (!is.function(fun)) {","brace_linter" +"R/fortify_surv.R",233,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (missing(conf.int.fill) & !is.null(surv.colour)) {","vector_logic_linter" +"R/plotlib.R",350,1,"style","Variable and function name style should be snake_case or symbols.","get.layout <- function(nplots, ncol, nrow) {","object_name_linter" +"R/plotlib.R",592,5,"style","Variable and function name style should be snake_case or symbols."," loadings.data[, 1L:2L] <- loadings.data[, 1L:2L] * scaler * 0.8","object_name_linter" +"R/tslib.R",224,3,"style","Either both or neither branch in `if`/`else` should use curly braces."," if (length(x) %% 2 == 0) {","brace_linter" +"R/tslib.R",229,3,"style","`else` should come on the same line as the previous `}`."," else y <- y[seq_along(x)]","brace_linter" +"tests/testthat/test-stats-lm.R",563,31,"style","Put spaces around all infix operators."," p <- autoplot(lm(Petal.Width~Petal.Length, data = iris), size = 5)","infix_spaces_linter" +"tests/testthat/test-surv.R",166,45,"style","Use TRUE instead of the symbol T."," fortified <- fortify(fit, surv.connect = T)","T_and_F_symbol_linter" +"vignettes/basics.Rmd",8,25,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/basics-', warning=FALSE)","infix_spaces_linter" +"vignettes/basics.Rmd",8,39,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/basics-', warning=FALSE)","infix_spaces_linter" +"vignettes/basics.Rmd",8,51,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/basics-', warning=FALSE)","infix_spaces_linter" +"vignettes/basics.Rmd",8,52,"style","Only use double-quotes.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/basics-', warning=FALSE)","single_quotes_linter" +"vignettes/basics.Rmd",8,78,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/basics-', warning=FALSE)","infix_spaces_linter" +"vignettes/basics.Rmd",8,81,"style","Lines should not be more than 80 characters.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/basics-', warning=FALSE)","line_length_linter" +"vignettes/basics.Rmd",32,37,"style","Only use double-quotes.","autoplot(AirPassengers, ts.colour = 'blue')","single_quotes_linter" +"vignettes/basics.Rmd",46,13,"style","Only use double-quotes.","p + ggtitle('AirPassengers') + xlab('Year') + ylab('Passengers')","single_quotes_linter" +"vignettes/basics.Rmd",46,37,"style","Only use double-quotes.","p + ggtitle('AirPassengers') + xlab('Year') + ylab('Passengers')","single_quotes_linter" +"vignettes/basics.Rmd",46,52,"style","Only use double-quotes.","p + ggtitle('AirPassengers') + xlab('Year') + ylab('Passengers')","single_quotes_linter" +"vignettes/basics.Rmd",50,49,"style","Trailing whitespace is superfluous.","# these common options are supported as keywords ","trailing_whitespace_linter" +"vignettes/basics.Rmd",51,33,"style","Only use double-quotes.","autoplot(AirPassengers, title = 'AirPassengers', xlab = 'Year', ylab = 'Passengers')","single_quotes_linter" +"vignettes/basics.Rmd",51,57,"style","Only use double-quotes.","autoplot(AirPassengers, title = 'AirPassengers', xlab = 'Year', ylab = 'Passengers')","single_quotes_linter" +"vignettes/basics.Rmd",51,72,"style","Only use double-quotes.","autoplot(AirPassengers, title = 'AirPassengers', xlab = 'Year', ylab = 'Passengers')","single_quotes_linter" +"vignettes/basics.Rmd",51,81,"style","Lines should not be more than 80 characters.","autoplot(AirPassengers, title = 'AirPassengers', xlab = 'Year', ylab = 'Passengers')","line_length_linter" +"vignettes/basics.Rmd",74,17,"style","Put spaces around all infix operators.","ggplot(df, aes(x= cluster, fill = cluster)) + geom_bar()","infix_spaces_linter" +"vignettes/basics.Rmd",82,40,"style","Trailing whitespace is superfluous.","res <- lm(Volume ~ Girth, data = trees) ","trailing_whitespace_linter" +"vignettes/basics.Rmd",155,5,"style","Only use double-quotes.","new('ggmultiplot', plots = list(p1, p2))","single_quotes_linter" +"vignettes/basics.Rmd",161,5,"style","Only use double-quotes.","new('ggmultiplot', plots = list(p1, p2), ncol = 1)","single_quotes_linter" +"vignettes/plot_dist.Rmd",8,25,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/dist-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_dist.Rmd",8,39,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/dist-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_dist.Rmd",8,51,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/dist-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_dist.Rmd",8,52,"style","Only use double-quotes.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/dist-', warning=FALSE)","single_quotes_linter" +"vignettes/plot_dist.Rmd",8,76,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/dist-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_dist.Rmd",8,81,"style","Lines should not be more than 80 characters.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/dist-', warning=FALSE)","line_length_linter" +"vignettes/plot_dist.Rmd",27,67,"style","Only use double-quotes.","ggdistribution(pnorm, seq(-3, 3, 0.1), mean = 0, sd = 1, colour = 'red')","single_quotes_linter" +"vignettes/plot_dist.Rmd",28,54,"style","Only use double-quotes.","ggdistribution(dpois, seq(0, 20), lambda = 9, fill = 'blue')","single_quotes_linter" +"vignettes/plot_dist.Rmd",34,63,"style","Only use double-quotes.","p <- ggdistribution(dchisq, seq(0, 20, 0.1), df = 7, colour = 'blue')","single_quotes_linter" +"vignettes/plot_dist.Rmd",35,63,"style","Only use double-quotes.","p <- ggdistribution(dchisq, seq(0, 20, 0.1), df = 9, colour = 'green', p = p)","single_quotes_linter" +"vignettes/plot_dist.Rmd",36,59,"style","Only use double-quotes.","ggdistribution(dchisq, seq(0, 20, 0.1), df = 11, colour = 'red', p = p)","single_quotes_linter" +"vignettes/plot_dist.Rmd",44,39,"style","Only use double-quotes.","autoplot(density(rnorm(1:50)), fill = 'green')","single_quotes_linter" +"vignettes/plot_lm.Rmd",8,25,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=8, fig.height=6, fig.path='figures/lm-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_lm.Rmd",8,39,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=8, fig.height=6, fig.path='figures/lm-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_lm.Rmd",8,51,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=8, fig.height=6, fig.path='figures/lm-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_lm.Rmd",8,52,"style","Only use double-quotes.","opts_chunk$set(fig.width=8, fig.height=6, fig.path='figures/lm-', warning=FALSE)","single_quotes_linter" +"vignettes/plot_lm.Rmd",8,74,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=8, fig.height=6, fig.path='figures/lm-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_lm.Rmd",57,35,"style","Only use double-quotes.","autoplot(m, which = 1:6, colour = 'dodgerblue3',","single_quotes_linter" +"vignettes/plot_lm.Rmd",58,26,"style","Only use double-quotes."," smooth.colour = 'black', smooth.linetype = 'dashed',","single_quotes_linter" +"vignettes/plot_lm.Rmd",58,53,"style","Only use double-quotes."," smooth.colour = 'black', smooth.linetype = 'dashed',","single_quotes_linter" +"vignettes/plot_lm.Rmd",59,22,"style","Only use double-quotes."," ad.colour = 'blue',","single_quotes_linter" +"vignettes/plot_lm.Rmd",60,54,"style","Only use double-quotes."," label.size = 3, label.n = 5, label.colour = 'blue',","single_quotes_linter" +"vignettes/plot_lm.Rmd",68,19,"style","Only use double-quotes."," colour = 'Species', label.size = 3)","single_quotes_linter" +"vignettes/plot_lm.Rmd",83,24,"style","Only use double-quotes.","autoplot(fit, colour = 'blue')","single_quotes_linter" +"vignettes/plot_map.Rmd",8,25,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=3, fig.height=3, fig.path='figures/map-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_map.Rmd",8,39,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=3, fig.height=3, fig.path='figures/map-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_map.Rmd",8,51,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=3, fig.height=3, fig.path='figures/map-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_map.Rmd",8,52,"style","Only use double-quotes.","opts_chunk$set(fig.width=3, fig.height=3, fig.path='figures/map-', warning=FALSE)","single_quotes_linter" +"vignettes/plot_map.Rmd",8,75,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=3, fig.height=3, fig.path='figures/map-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_map.Rmd",8,81,"style","Lines should not be more than 80 characters.","opts_chunk$set(fig.width=3, fig.height=3, fig.path='figures/map-', warning=FALSE)","line_length_linter" +"vignettes/plot_map.Rmd",21,25,"style","Only use double-quotes.","jp <- ggplot2::map_data('world2', 'japan')","single_quotes_linter" +"vignettes/plot_map.Rmd",21,35,"style","Only use double-quotes.","jp <- ggplot2::map_data('world2', 'japan')","single_quotes_linter" +"vignettes/plot_map.Rmd",32,12,"style","Only use double-quotes.","jp <- map('world2', 'japan', plot = FALSE, fill = TRUE)","single_quotes_linter" +"vignettes/plot_map.Rmd",32,22,"style","Only use double-quotes.","jp <- map('world2', 'japan', plot = FALSE, fill = TRUE)","single_quotes_linter" +"vignettes/plot_map.Rmd",36,26,"style","Only use double-quotes.","p <- autoplot(jp, geom = 'polygon', fill = 'subregion') + ","single_quotes_linter" +"vignettes/plot_map.Rmd",36,44,"style","Only use double-quotes.","p <- autoplot(jp, geom = 'polygon', fill = 'subregion') + ","single_quotes_linter" +"vignettes/plot_map.Rmd",36,58,"style","Trailing whitespace is superfluous.","p <- autoplot(jp, geom = 'polygon', fill = 'subregion') + ","trailing_whitespace_linter" +"vignettes/plot_map.Rmd",37,24,"style","Put spaces around all infix operators."," theme(legend.position=""none"")","infix_spaces_linter" +"vignettes/plot_map.Rmd",44,15,"style","Only use double-quotes.","cities <- get('world.cities')","single_quotes_linter" +"vignettes/plot_map.Rmd",45,40,"style","Only use double-quotes.","cities <- cities[cities$country.etc == 'Japan', ]","single_quotes_linter" +"vignettes/plot_map.Rmd",49,25,"style","Only use double-quotes."," colour = 'blue', size = 0.1)","single_quotes_linter" +"vignettes/plot_map.Rmd",55,40,"style","Only use double-quotes.","p + geom_point(data = cities, colour = 'blue', size = 0.1)","single_quotes_linter" +"vignettes/plot_map.Rmd",81,28,"style","Only use double-quotes."," label = c('Tokyo', 'Osaka'),","single_quotes_linter" +"vignettes/plot_map.Rmd",81,37,"style","Only use double-quotes."," label = c('Tokyo', 'Osaka'),","single_quotes_linter" +"vignettes/plot_map.Rmd",85,30,"style","Only use double-quotes.","autoplot(df, p = p, colour = 'red', size = 10)","single_quotes_linter" +"vignettes/plot_map.Rmd",91,30,"style","Only use double-quotes.","autoplot(df, p = p, colour = 'red', size = 'population') +","single_quotes_linter" +"vignettes/plot_map.Rmd",91,44,"style","Only use double-quotes.","autoplot(df, p = p, colour = 'red', size = 'population') +","single_quotes_linter" +"vignettes/plot_map.Rmd",104,30,"style","Only use double-quotes.","autoplot(df, p = p, colour = 'red', size = 'population') + ","single_quotes_linter" +"vignettes/plot_map.Rmd",104,44,"style","Only use double-quotes.","autoplot(df, p = p, colour = 'red', size = 'population') + ","single_quotes_linter" +"vignettes/plot_map.Rmd",104,59,"style","Trailing whitespace is superfluous.","autoplot(df, p = p, colour = 'red', size = 'population') + ","trailing_whitespace_linter" +"vignettes/plot_pca.Rmd",8,25,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/pca-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_pca.Rmd",8,39,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/pca-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_pca.Rmd",8,51,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/pca-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_pca.Rmd",8,52,"style","Only use double-quotes.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/pca-', warning=FALSE)","single_quotes_linter" +"vignettes/plot_pca.Rmd",8,75,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/pca-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_pca.Rmd",8,81,"style","Lines should not be more than 80 characters.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/pca-', warning=FALSE)","line_length_linter" +"vignettes/plot_pca.Rmd",28,41,"style","Only use double-quotes.","autoplot(pca_res, data = iris, colour = 'Species')","single_quotes_linter" +"vignettes/plot_pca.Rmd",34,41,"style","Only use double-quotes.","autoplot(pca_res, data = iris, colour = 'Species', label = TRUE, label.size = 3)","single_quotes_linter" +"vignettes/plot_pca.Rmd",40,41,"style","Only use double-quotes.","autoplot(pca_res, data = iris, colour = 'Species', shape = FALSE, label.size = 3)","single_quotes_linter" +"vignettes/plot_pca.Rmd",40,81,"style","Lines should not be more than 80 characters.","autoplot(pca_res, data = iris, colour = 'Species', shape = FALSE, label.size = 3)","line_length_linter" +"vignettes/plot_pca.Rmd",46,41,"style","Only use double-quotes.","autoplot(pca_res, data = iris, colour = 'Species', loadings = TRUE)","single_quotes_linter" +"vignettes/plot_pca.Rmd",52,41,"style","Only use double-quotes.","autoplot(pca_res, data = iris, colour = 'Species',","single_quotes_linter" +"vignettes/plot_pca.Rmd",53,45,"style","Only use double-quotes."," loadings = TRUE, loadings.colour = 'blue',","single_quotes_linter" +"vignettes/plot_pca.Rmd",70,1,"style","Variable and function name style should be snake_case or symbols.","d.factanal <- factanal(state.x77, factors = 3, scores = 'regression')","object_name_linter" +"vignettes/plot_pca.Rmd",70,57,"style","Only use double-quotes.","d.factanal <- factanal(state.x77, factors = 3, scores = 'regression')","single_quotes_linter" +"vignettes/plot_pca.Rmd",71,49,"style","Only use double-quotes.","autoplot(d.factanal, data = state.x77, colour = 'Income')","single_quotes_linter" +"vignettes/plot_pca.Rmd",106,55,"style","Only use double-quotes.","autoplot(pam(iris[-5], 3), frame = TRUE, frame.type = 'norm')","single_quotes_linter" +"vignettes/plot_pca.Rmd",128,49,"style","Put spaces around all infix operators.","model <- lfda(iris[-5], iris[, 5], r = 3, metric=""plain"")","infix_spaces_linter" +"vignettes/plot_pca.Rmd",129,59,"style","Only use double-quotes.","autoplot(model, data = iris, frame = TRUE, frame.colour = 'Species')","single_quotes_linter" +"vignettes/plot_pca.Rmd",134,61,"style","Put spaces around all infix operators.","model <- self(iris[-5], iris[, 5], beta = 0.1, r = 3, metric=""plain"")","infix_spaces_linter" +"vignettes/plot_pca.Rmd",135,59,"style","Only use double-quotes.","autoplot(model, data = iris, frame = TRUE, frame.colour = 'Species')","single_quotes_linter" +"vignettes/plot_pca.Rmd",175,37,"style","Only use double-quotes.","autoplot(isoMDS(eurodist), colour = 'orange', size = 4, shape = 3)","single_quotes_linter" +"vignettes/plot_pca.Rmd",181,58,"style","Only use double-quotes.","autoplot(sammon(eurodist), shape = FALSE, label.colour = 'blue', label.size = 3)","single_quotes_linter" +"vignettes/plot_surv.Rmd",8,25,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/surv-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_surv.Rmd",8,39,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/surv-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_surv.Rmd",8,51,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/surv-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_surv.Rmd",8,52,"style","Only use double-quotes.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/surv-', warning=FALSE)","single_quotes_linter" +"vignettes/plot_surv.Rmd",8,76,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/surv-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_surv.Rmd",8,81,"style","Lines should not be more than 80 characters.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/surv-', warning=FALSE)","line_length_linter" +"vignettes/plot_surv.Rmd",27,31,"style","Only use double-quotes.","autoplot(fit, surv.linetype = 'dashed', conf.int = FALSE,","single_quotes_linter" +"vignettes/plot_surv.Rmd",28,25,"style","Only use double-quotes."," censor.shape = '*', censor.size = 5, facets = TRUE, ncol = 2)","single_quotes_linter" +"vignettes/plot_surv.Rmd",30,70,"style","Only use double-quotes.","autoplot(survfit(Surv(time, status) ~ 1, data = lung), surv.colour = 'orange', censor.colour = 'red')","single_quotes_linter" +"vignettes/plot_surv.Rmd",30,81,"style","Lines should not be more than 80 characters.","autoplot(survfit(Surv(time, status) ~ 1, data = lung), surv.colour = 'orange', censor.colour = 'red')","line_length_linter" +"vignettes/plot_surv.Rmd",30,96,"style","Only use double-quotes.","autoplot(survfit(Surv(time, status) ~ 1, data = lung), surv.colour = 'orange', censor.colour = 'red')","single_quotes_linter" +"vignettes/plot_surv.Rmd",32,64,"style","Only use double-quotes.","autoplot(survfit(Surv(time, status) ~ sex, data = lung), fun = 'event')","single_quotes_linter" +"vignettes/plot_surv.Rmd",34,1,"style","Variable and function name style should be snake_case or symbols.","d.coxph <- survfit(coxph(Surv(time, status) ~ sex, data = lung))","object_name_linter" +"vignettes/plot_surv.Rmd",35,35,"style","Only use double-quotes.","autoplot(d.coxph, surv.linetype = 'dashed', surv.colour = 'blue',","single_quotes_linter" +"vignettes/plot_surv.Rmd",35,59,"style","Only use double-quotes.","autoplot(d.coxph, surv.linetype = 'dashed', surv.colour = 'blue',","single_quotes_linter" +"vignettes/plot_surv.Rmd",36,26,"style","Only use double-quotes."," conf.int.fill = 'dodgerblue3', conf.int.alpha = 0.5, censor = FALSE)","single_quotes_linter" +"vignettes/plot_ts.Rmd",8,25,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/ts-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_ts.Rmd",8,39,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/ts-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_ts.Rmd",8,51,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/ts-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_ts.Rmd",8,52,"style","Only use double-quotes.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/ts-', warning=FALSE)","single_quotes_linter" +"vignettes/plot_ts.Rmd",8,74,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/ts-', warning=FALSE)","infix_spaces_linter" +"vignettes/plot_ts.Rmd",25,37,"style","Only use double-quotes.","autoplot(AirPassengers, ts.colour = 'red', ts.linetype = 'dashed')","single_quotes_linter" +"vignettes/plot_ts.Rmd",25,58,"style","Only use double-quotes.","autoplot(AirPassengers, ts.colour = 'red', ts.linetype = 'dashed')","single_quotes_linter" +"vignettes/plot_ts.Rmd",51,45,"style","Only use double-quotes.","autoplot(as.xts(AirPassengers), ts.colour = 'green')","single_quotes_linter" +"vignettes/plot_ts.Rmd",54,53,"style","Only use double-quotes.","autoplot(as.timeSeries(AirPassengers), ts.colour = ('dodgerblue3'))","single_quotes_linter" +"vignettes/plot_ts.Rmd",62,35,"style","Only use double-quotes.","autoplot(AirPassengers, ts.geom = 'bar', fill = 'blue')","single_quotes_linter" +"vignettes/plot_ts.Rmd",62,49,"style","Only use double-quotes.","autoplot(AirPassengers, ts.geom = 'bar', fill = 'blue')","single_quotes_linter" +"vignettes/plot_ts.Rmd",66,35,"style","Only use double-quotes.","autoplot(AirPassengers, ts.geom = 'ribbon', fill = 'green')","single_quotes_linter" +"vignettes/plot_ts.Rmd",66,52,"style","Only use double-quotes.","autoplot(AirPassengers, ts.geom = 'ribbon', fill = 'green')","single_quotes_linter" +"vignettes/plot_ts.Rmd",70,35,"style","Only use double-quotes.","autoplot(AirPassengers, ts.geom = 'point', shape = 3)","single_quotes_linter" +"vignettes/plot_ts.Rmd",76,81,"style","Lines should not be more than 80 characters.","mts <- ts(data.frame(a = c(1, 2, 3, 4, 4, 3), b = c(3, 2, 3, 2, 2, 1)), start = 2010)","line_length_linter" +"vignettes/plot_ts.Rmd",77,25,"style","Only use double-quotes.","autoplot(mts, ts.geom = 'bar', facets = FALSE)","single_quotes_linter" +"vignettes/plot_ts.Rmd",81,25,"style","Only use double-quotes.","autoplot(mts, ts.geom = 'bar', facets = FALSE, stacked = TRUE)","single_quotes_linter" +"vignettes/plot_ts.Rmd",85,25,"style","Only use double-quotes.","autoplot(mts, ts.geom = 'ribbon', facets = FALSE)","single_quotes_linter" +"vignettes/plot_ts.Rmd",89,25,"style","Only use double-quotes.","autoplot(mts, ts.geom = 'ribbon', facets = FALSE, stacked = TRUE)","single_quotes_linter" +"vignettes/plot_ts.Rmd",98,1,"style","Variable and function name style should be snake_case or symbols.","d.arima <- auto.arima(AirPassengers)","object_name_linter" +"vignettes/plot_ts.Rmd",99,1,"style","Variable and function name style should be snake_case or symbols.","d.forecast <- forecast(d.arima, level = c(95), h = 50)","object_name_linter" +"vignettes/plot_ts.Rmd",106,34,"style","Only use double-quotes.","autoplot(d.forecast, ts.colour = 'firebrick1', predict.colour = 'red',","single_quotes_linter" +"vignettes/plot_ts.Rmd",106,65,"style","Only use double-quotes.","autoplot(d.forecast, ts.colour = 'firebrick1', predict.colour = 'red',","single_quotes_linter" +"vignettes/plot_ts.Rmd",107,29,"style","Only use double-quotes."," predict.linetype = 'dashed', conf.int = FALSE)","single_quotes_linter" +"vignettes/plot_ts.Rmd",116,1,"style","Variable and function name style should be snake_case or symbols.","d.vselect <- VARselect(Canada, lag.max = 5, type = 'const')$selection[1]","object_name_linter" +"vignettes/plot_ts.Rmd",116,52,"style","Only use double-quotes.","d.vselect <- VARselect(Canada, lag.max = 5, type = 'const')$selection[1]","single_quotes_linter" +"vignettes/plot_ts.Rmd",117,1,"style","Variable and function name style should be snake_case or symbols.","d.var <- VAR(Canada, p = d.vselect, type = 'const')","object_name_linter" +"vignettes/plot_ts.Rmd",117,44,"style","Only use double-quotes.","d.var <- VAR(Canada, p = d.vselect, type = 'const')","single_quotes_linter" +"vignettes/plot_ts.Rmd",123,52,"style","Only use double-quotes.","autoplot(predict(d.var, n.ahead = 50), ts.colour = 'dodgerblue4',","single_quotes_linter" +"vignettes/plot_ts.Rmd",124,27,"style","Only use double-quotes."," predict.colour = 'blue', predict.linetype = 'dashed')","single_quotes_linter" +"vignettes/plot_ts.Rmd",124,54,"style","Only use double-quotes."," predict.colour = 'blue', predict.linetype = 'dashed')","single_quotes_linter" +"vignettes/plot_ts.Rmd",139,51,"style","Only use double-quotes.","autoplot(cpt.meanvar(AirPassengers), cpt.colour = 'blue', cpt.linetype = 'solid')","single_quotes_linter" +"vignettes/plot_ts.Rmd",139,74,"style","Only use double-quotes.","autoplot(cpt.meanvar(AirPassengers), cpt.colour = 'blue', cpt.linetype = 'solid')","single_quotes_linter" +"vignettes/plot_ts.Rmd",139,81,"style","Lines should not be more than 80 characters.","autoplot(cpt.meanvar(AirPassengers), cpt.colour = 'blue', cpt.linetype = 'solid')","line_length_linter" +"vignettes/plot_ts.Rmd",149,45,"style","Only use double-quotes.","autoplot(breakpoints(Nile ~ 1), ts.colour = 'blue', ts.linetype = 'dashed',","single_quotes_linter" +"vignettes/plot_ts.Rmd",149,67,"style","Only use double-quotes.","autoplot(breakpoints(Nile ~ 1), ts.colour = 'blue', ts.linetype = 'dashed',","single_quotes_linter" +"vignettes/plot_ts.Rmd",150,23,"style","Only use double-quotes."," cpt.colour = 'dodgerblue3', cpt.linetype = 'solid')","single_quotes_linter" +"vignettes/plot_ts.Rmd",150,53,"style","Only use double-quotes."," cpt.colour = 'dodgerblue3', cpt.linetype = 'solid')","single_quotes_linter" +"vignettes/plot_ts.Rmd",159,24,"style","There should be a space before an opening curly brace.","form <- function(theta){","brace_linter" +"vignettes/plot_ts.Rmd",159,24,"style","There should be a space between a right parenthesis and a body expression.","form <- function(theta){","paren_body_linter" +"vignettes/plot_ts.Rmd",160,3,"warning","no visible global function definition for β€˜dlmModPoly’"," dlmModPoly(order = 1, dV = exp(theta[1]), dW = exp(theta[2]))","object_usage_linter" +"vignettes/plot_ts.Rmd",172,34,"style","Only use double-quotes.","autoplot(filtered, ts.linetype = 'dashed', fitted.colour = 'blue')","single_quotes_linter" +"vignettes/plot_ts.Rmd",172,60,"style","Only use double-quotes.","autoplot(filtered, ts.linetype = 'dashed', fitted.colour = 'blue')","single_quotes_linter" +"vignettes/plot_ts.Rmd",187,32,"style","Only use double-quotes.","autoplot(smoothed, ts.colour = 'blue', p = p)","single_quotes_linter" +"vignettes/plot_ts.Rmd",197,25,"style","Put spaces around all infix operators."," Nile ~ SSMtrend(degree=1, Q=matrix(NA)), H=matrix(NA)","infix_spaces_linter" +"vignettes/plot_ts.Rmd",197,30,"style","Put spaces around all infix operators."," Nile ~ SSMtrend(degree=1, Q=matrix(NA)), H=matrix(NA)","infix_spaces_linter" +"vignettes/plot_ts.Rmd",197,45,"style","Put spaces around all infix operators."," Nile ~ SSMtrend(degree=1, Q=matrix(NA)), H=matrix(NA)","infix_spaces_linter" +"vignettes/plot_ts.Rmd",199,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/plot_ts.Rmd",200,20,"style","Put spaces around all infix operators.","fit <- fitSSM(model=model, inits=c(log(var(Nile)),log(var(Nile))), method=""BFGS"")","infix_spaces_linter" +"vignettes/plot_ts.Rmd",200,33,"style","Put spaces around all infix operators.","fit <- fitSSM(model=model, inits=c(log(var(Nile)),log(var(Nile))), method=""BFGS"")","infix_spaces_linter" +"vignettes/plot_ts.Rmd",200,51,"style","Commas should always have a space after.","fit <- fitSSM(model=model, inits=c(log(var(Nile)),log(var(Nile))), method=""BFGS"")","commas_linter" +"vignettes/plot_ts.Rmd",200,74,"style","Put spaces around all infix operators.","fit <- fitSSM(model=model, inits=c(log(var(Nile)),log(var(Nile))), method=""BFGS"")","infix_spaces_linter" +"vignettes/plot_ts.Rmd",200,81,"style","Lines should not be more than 80 characters.","fit <- fitSSM(model=model, inits=c(log(var(Nile)),log(var(Nile))), method=""BFGS"")","line_length_linter" +"vignettes/plot_ts.Rmd",208,37,"style","Put spaces around all infix operators.","filtered <- KFS(fit$model, filtering=""mean"", smoothing='none')","infix_spaces_linter" +"vignettes/plot_ts.Rmd",208,55,"style","Put spaces around all infix operators.","filtered <- KFS(fit$model, filtering=""mean"", smoothing='none')","infix_spaces_linter" +"vignettes/plot_ts.Rmd",208,56,"style","Only use double-quotes.","filtered <- KFS(fit$model, filtering=""mean"", smoothing='none')","single_quotes_linter" +"vignettes/plot_ts.Rmd",215,33,"style","Put spaces around all infix operators.","trend <- signal(smoothed, states=""trend"")","infix_spaces_linter" +"vignettes/plot_ts.Rmd",223,29,"style","Only use double-quotes.","autoplot(trend, ts.colour = 'blue', p = p)","single_quotes_linter" +"vignettes/plot_ts.Rmd",237,40,"style","Only use double-quotes.","autoplot(stl(AirPassengers, s.window = 'periodic'), ts.colour = 'blue')","single_quotes_linter" +"vignettes/plot_ts.Rmd",237,65,"style","Only use double-quotes.","autoplot(stl(AirPassengers, s.window = 'periodic'), ts.colour = 'blue')","single_quotes_linter" +"vignettes/plot_ts.Rmd",249,60,"style","Only use double-quotes.","autoplot(acf(AirPassengers, plot = FALSE), conf.int.fill = '#0000FF', conf.int.value = 0.8, conf.int.type = 'ma')","single_quotes_linter" +"vignettes/plot_ts.Rmd",249,81,"style","Lines should not be more than 80 characters.","autoplot(acf(AirPassengers, plot = FALSE), conf.int.fill = '#0000FF', conf.int.value = 0.8, conf.int.type = 'ma')","line_length_linter" +"vignettes/plot_ts.Rmd",249,109,"style","Only use double-quotes.","autoplot(acf(AirPassengers, plot = FALSE), conf.int.fill = '#0000FF', conf.int.value = 0.8, conf.int.type = 'ma')","single_quotes_linter" diff --git a/.dev/revdep_emails/ggfortify/email-body b/.dev/revdep_emails/ggfortify/email-body new file mode 100644 index 000000000..e1dd0cc79 --- /dev/null +++ b/.dev/revdep_emails/ggfortify/email-body @@ -0,0 +1,29 @@ +Hello Yuan Tang! Thank you for using {lintr} in your package {ggfortify}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/sinhrks/ggfortify (hash: 8e3e7df69554757025825a0844f8e467eaff6748) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 72s on CRAN vs. 38s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/ggthemes/attachments/ggthemes.warnings b/.dev/revdep_emails/ggthemes/attachments/ggthemes.warnings new file mode 100644 index 000000000..82e46410d --- /dev/null +++ b/.dev/revdep_emails/ggthemes/attachments/ggthemes.warnings @@ -0,0 +1,2 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Trying to remove β€˜snake_case_linter’, β€˜camel_case_linter’ and β€˜multiple_dots_linter’, which are not in `defaults`. diff --git a/.dev/revdep_emails/ggthemes/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/ggthemes/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..63b0ec688 --- /dev/null +++ b/.dev/revdep_emails/ggthemes/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,2 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/utils.R",10,1,"style","Variable and function name style should be snake_case.","""%||%"" <- function(a, b) {","object_name_linter" diff --git a/.dev/revdep_emails/ggthemes/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/ggthemes/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..29295fec8 --- /dev/null +++ b/.dev/revdep_emails/ggthemes/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,48 @@ +"filename","line_number","column_number","type","message","line","linter" +"data-raw/build.R",9,1,"style","Variable and function name style should be snake_case or symbols.","utf8ToPch <- function(x) {","object_name_linter" +"data-raw/build.R",15,20,"warning","no visible global function definition for β€˜map_int’"," as.integer(-1L * map_int(x, ~ utf8ToInt(.x)[[1]]))","object_usage_linter" +"data-raw/build.R",26,7,"warning","no visible global function definition for β€˜tibble’"," tibble(name = out$colors$schemes[[i]]) %>%","object_usage_linter" +"data-raw/build.R",27,7,"warning","no visible global function definition for β€˜left_join’"," left_join(out$colors$names, by = ""name"")","object_usage_linter" +"data-raw/build.R",29,17,"warning","no visible global function definition for β€˜select’"," out$shapes <- select(map_dfr(out$shapes, as_tibble), -comment) %>%","object_usage_linter" +"data-raw/build.R",30,5,"warning","no visible global function definition for β€˜mutate’"," mutate(pch = utf8ToPch(character))","object_usage_linter" +"data-raw/build.R",53,23,"warning","no visible global function definition for β€˜map_chr’"," out$bg <- set_names(map_chr(out$bg, ""value""), map_chr(out$bg, ""name""))","object_usage_linter" +"data-raw/build.R",53,23,"warning","no visible global function definition for β€˜map_chr’"," out$bg <- set_names(map_chr(out$bg, ""value""), map_chr(out$bg, ""name""))","object_usage_linter" +"data-raw/build.R",85,17,"warning","no visible global function definition for β€˜tibble’"," out$colors <- tibble(value = rev(map_chr(xml_children(x), xml_text)))","object_usage_linter" +"data-raw/build.R",85,36,"warning","no visible global function definition for β€˜map_chr’"," out$colors <- tibble(value = rev(map_chr(xml_children(x), xml_text)))","object_usage_linter" +"data-raw/build.R",90,3,"warning","local variable β€˜classic’ assigned but may not be used"," classic <- read_xml(here(""data-raw"", ""theme-data"", ""tableau-classic.xml"")) %>%","object_usage_linter" +"data-raw/build.R",104,7,"warning","no visible global function definition for β€˜mutate’"," mutate(pch = utf8ToPch(character))","object_usage_linter" +"data-raw/build.R",153,5,"warning","no visible global function definition for β€˜mutate’"," mutate(pch = utf8ToPch(character))","object_usage_linter" +"data-raw/build.R",163,17,"warning","no visible global function definition for β€˜mutate’"," out$shapes <- mutate(out$shapes, pch = utf8ToPch(character))","object_usage_linter" +"data-raw/build.R",171,17,"warning","no visible global function definition for β€˜mutate’"," out$shapes <- mutate(out$shapes, pch = utf8ToPch(character))","object_usage_linter" +"data-raw/build.R",178,28,"warning","no visible global function definition for β€˜mutate’"," out$cleveland$default <- mutate(map_dfr(out$cleveland$default, as_tibble),","object_usage_linter" +"data-raw/build.R",182,21,"warning","no visible global function definition for β€˜map_df’"," out$circlefill <- map_df(out$circlefill, as_tibble) %>%","object_usage_linter" +"data-raw/build.R",183,5,"warning","no visible global function definition for β€˜mutate’"," mutate(pch = utf8ToPch(character))","object_usage_linter" +"data-raw/canva_palette.R",3,81,"style","Lines should not be more than 80 characters.","#' #' The color list is from http://makeadifferencewithdata.com/2017/01/150-paletas-colores-tableau/,","line_length_linter" +"data-raw/canva_palette.R",4,81,"style","Lines should not be more than 80 characters.","#' #' and referenced here: https://policyviz.com/2017/01/12/150-color-palettes-for-excel/.","line_length_linter" +"data-raw/canva_palette.R",10,81,"style","Lines should not be more than 80 characters.","#' color_palettes_url <- ""http://makeadifferencewithdata.com/wp-content/uploads/2016/12/color-palettes.txt""","line_length_linter" +"data-raw/canva_palette.R",34,81,"style","Lines should not be more than 80 characters.","#' duplicated(names(canva_palettes))] <- ""Vintage charm 2""","line_length_linter" +"data-raw/clean-colors.R",4,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" +"data-raw/excel_themes.R",8,81,"style","Lines should not be more than 80 characters.","# - https://support.office.com/en-us/article/change-a-theme-and-make-it-the-default-in-word-or-excel-c846f997-968e-4daa-b2d4-42bd2afef904?ui=en-US&rs=en-US&ad=US","line_length_linter" +"data-raw/excel_themes.R",10,81,"style","Lines should not be more than 80 characters.","# - https://support.office.com/en-us/article/open-xml-formats-and-file-name-extensions-5200d93c-3449-4380-8e11-31ef14555b18","line_length_linter" +"data-raw/excel_themes.R",16,81,"style","Lines should not be more than 80 characters.","theme_dir <- ""/Applications/Microsoft Excel.app/Contents/Resources/Office Themes""","line_length_linter" +"data-raw/excel_themes.R",30,3,"warning","no visible global function definition for β€˜set_names’"," set_names(list(val), name)","object_usage_linter" +"data-raw/excel_themes.R",33,1,"style","Variable and function name style should be snake_case or symbols.","process_clrScheme <- function(x) {","object_name_linter" +"data-raw/excel_themes.R",35,13,"warning","no visible global function definition for β€˜flatten_chr’"," colors <- flatten_chr(map(xml_children(x), process_color))","object_usage_linter" +"data-raw/excel_themes.R",39,37,"warning","no visible global function definition for β€˜str_subset’"," unname(colors[str_subset(names(colors), ""^accent"")])),","object_usage_linter" +"data-raw/libreoffice_palettes.R",7,81,"style","Lines should not be more than 80 characters.","# https://design.blog.documentfoundation.org/2016/11/11/additions-to-libreoffice/","line_length_linter" +"data-raw/libreoffice_palettes.R",18,3,"warning","no visible global function definition for β€˜tibble’"," tibble(name = xml_attr(x, ""name""),","object_usage_linter" +"data-raw/libreoffice_palettes.R",23,3,"warning","local variable β€˜name’ assigned but may not be used"," name <- tools::file_path_sans_ext(basename(path))","object_usage_linter" +"data-raw/libreoffice_palettes.R",43,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" +"R/economist.R",11,31,"style","Put spaces around all infix operators.","economist_pal <- function(fill=TRUE) {","infix_spaces_linter" +"R/few.R",87,50,"style","Put spaces around all infix operators.","theme_few <- function(base_size = 12, base_family="""") {","infix_spaces_linter" +"R/gdocs.R",9,52,"style","Put spaces around all infix operators.","theme_gdocs <- function(base_size = 12, base_family=""sans"") {","infix_spaces_linter" +"R/scales.R",31,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/shapes.R",168,40,"style","Put spaces around all infix operators.","scale_shape_tremmel <- function(overlap=FALSE, alt=TRUE, ...) {","infix_spaces_linter" +"R/shapes.R",168,51,"style","Put spaces around all infix operators.","scale_shape_tremmel <- function(overlap=FALSE, alt=TRUE, ...) {","infix_spaces_linter" +"R/stata.R",14,29,"style","Put spaces around all infix operators.","stata_pal <- function(scheme=""s2color"") {","infix_spaces_linter" +"R/stata.R",32,38,"style","Put spaces around all infix operators.","scale_colour_stata <- function(scheme=""s2color"", ...) {","infix_spaces_linter" +"R/stata.R",38,36,"style","Put spaces around all infix operators.","scale_fill_stata <- function(scheme=""s2color"", ...) {","infix_spaces_linter" +"R/stata.R",125,38,"style","Put spaces around all infix operators.","theme_stata_colors <- function(scheme=""s2color"") {","infix_spaces_linter" +"R/stata.R",232,31,"style","Put spaces around all infix operators."," scheme=""s2color"") {","infix_spaces_linter" +"R/theme-foundation.R",21,39,"style","Put spaces around all infix operators.","theme_foundation <- function(base_size=12, base_family="""") {","infix_spaces_linter" +"R/theme-foundation.R",21,55,"style","Put spaces around all infix operators.","theme_foundation <- function(base_size=12, base_family="""") {","infix_spaces_linter" diff --git a/.dev/revdep_emails/ggthemes/email-body b/.dev/revdep_emails/ggthemes/email-body new file mode 100644 index 000000000..2a2bacb9e --- /dev/null +++ b/.dev/revdep_emails/ggthemes/email-body @@ -0,0 +1,29 @@ +Hello Jeffrey B. Arnold! Thank you for using {lintr} in your package {ggthemes}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/jrnold/ggthemes (hash: 4b5e80e25e88b821ab30736a9c3b2ac32e294fc1) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 57s on CRAN vs. 37s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/healthcareai/attachments/healthcareai.warnings b/.dev/revdep_emails/healthcareai/attachments/healthcareai.warnings new file mode 100644 index 000000000..182961f94 --- /dev/null +++ b/.dev/revdep_emails/healthcareai/attachments/healthcareai.warnings @@ -0,0 +1,2 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Trying to remove β€˜camel_case_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/healthcareai/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/healthcareai/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..d1f7b6cc8 --- /dev/null +++ b/.dev/revdep_emails/healthcareai/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,149 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/db_connections.R",33,44,"style","Put spaces around all infix operators."," trusted=TRUE,","infix_spaces_linter" +"R/db_connections.R",44,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!missing(user_id) & !missing(password))","vector_logic_linter" +"R/db_connections.R",59,32,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (!missing(user_id) & !missing(password)) {","vector_logic_linter" +"R/find_unique_columns.R",39,22,"style","Any function spanning multiple lines should use curly braces."," dplyr::select_if(function(col)","brace_linter" +"R/missingness.R",32,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.matrix(d) | (is.vector(d) && !is.list(d)))","vector_logic_linter" +"R/pip.R",221,43,"style","Any function spanning multiple lines should use curly braces."," d <- purrr::map_df(names(split_vars), function(v)","brace_linter" +"R/plot_predictions.R",246,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.numeric(text_size) & !is.logical(text_size))","vector_logic_linter" +"R/plot_predictions.R",264,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.numeric(text_angle) & !is.logical(text_angle))","vector_logic_linter" +"R/predict.R",413,12,"style","Either both or neither branch in `if`/`else` should use curly braces."," } else if (mi$m_class == ""Multiclass"") {","brace_linter" +"R/prep_data.R",354,41,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (remove_near_zero_variance < 0 | remove_near_zero_variance > 1)","vector_logic_linter" +"R/save_load.R",55,44,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(attr(x, ""recipe"")$template) | !is.null(attr(x, ""recipe"")$orig_data))","vector_logic_linter" +"R/setup_hyperparameters.R",78,43,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (model_class == ""classification"" | model_class == ""multiclass"") {","vector_logic_linter" +"R/training_setup.R",272,21,"style","Any function spanning multiple lines should use curly braces.","character_in_quo <- function(x)","brace_linter" +"R/utilities.R",31,22,"style","Any function spanning multiple lines should use curly braces."," lapply(names(ref), function(v)","brace_linter" +"R/utilities.R",53,49,"style","Either both or neither branch in `if`/`else` should use curly braces."," if (!length(new_levels[[.x]])) return(NULL) else {","brace_linter" +"tests/testthat/test-hcai-impute.R",9,58,"style","Use TRUE instead of the symbol T."," vendorID = sample(1:9, size = n, replace = T),","T_and_F_symbol_linter" +"tests/testthat/test-hcai-impute.R",12,67,"style","Use TRUE instead of the symbol T."," heat = sample(c(""Cold"", ""Hot""), size = n, replace = T),","T_and_F_symbol_linter" +"tests/testthat/test-hcai-impute.R",14,54,"style","Use TRUE instead of the symbol T."," size = n, replace = T)","T_and_F_symbol_linter" +"tests/testthat/test-impute.r",11,68,"style","Use TRUE instead of the symbol T."," fur = sample(c(""Long"", ""Short""), size = n, replace = T),","T_and_F_symbol_linter" +"tests/testthat/test-impute.r",13,50,"style","Use TRUE instead of the symbol T."," size = n, replace = T)","T_and_F_symbol_linter" +"tests/testthat/test-PCA.R",9,69,"style","Use TRUE instead of the symbol T."," genre = sample(c(""Rock"", ""Jazz"", ""Country""), size = n, replace = T),","T_and_F_symbol_linter" +"tests/testthat/test-PCA.R",11,42,"style","Use TRUE instead of the symbol T."," size = n, replace = T),","T_and_F_symbol_linter" +"tests/testthat/test-PCA.R",12,54,"style","Use TRUE instead of the symbol T."," guitar_flag = sample(c(0, 1), size = n, replace = T),","T_and_F_symbol_linter" +"tests/testthat/test-PCA.R",13,56,"style","Use TRUE instead of the symbol T."," drum_flag = sample(c(0, 1, NA), size = n, replace = T,","T_and_F_symbol_linter" +"tests/testthat/test-PCA.R",21,78,"style","Use TRUE instead of the symbol T."," state = sample(c(""NY"", ""MA"", ""CT"", ""CA"", ""VT"", ""NH""), size = n, replace = T,","T_and_F_symbol_linter" +"tests/testthat/test-pip.R",59,16,"style","Any function spanning multiple lines should use curly braces."," max_count <- function(d)","brace_linter" +"tests/testthat/test-prep_data_utils.R",10,57,"style","Use TRUE instead of the symbol T."," tuba_flag = sample(c(0, 1), size = n, replace = T),","T_and_F_symbol_linter" +"tests/testthat/test-prep_data_utils.R",11,61,"style","Use TRUE instead of the symbol T."," drum_flag = sample(c(0, 1, NA), size = n, replace = T),","T_and_F_symbol_linter" +"tests/testthat/test-prep_data_utils.R",13,47,"style","Use TRUE instead of the symbol T."," size = n, replace = T),","T_and_F_symbol_linter" +"tests/testthat/test-prep_data.R",14,69,"style","Use TRUE instead of the symbol T."," genre = sample(c(""Rock"", ""Jazz"", ""Country""), size = n, replace = T),","T_and_F_symbol_linter" +"tests/testthat/test-prep_data.R",16,42,"style","Use TRUE instead of the symbol T."," size = n, replace = T, prob = c(4, 4, 4, 6)),","T_and_F_symbol_linter" +"tests/testthat/test-prep_data.R",17,54,"style","Use TRUE instead of the symbol T."," guitar_flag = sample(c(0, 1), size = n, replace = T),","T_and_F_symbol_linter" +"tests/testthat/test-prep_data.R",18,56,"style","Use TRUE instead of the symbol T."," drum_flag = sample(c(0, 1, NA), size = n, replace = T,","T_and_F_symbol_linter" +"tests/testthat/test-prep_data.R",26,78,"style","Use TRUE instead of the symbol T."," state = sample(c(""NY"", ""MA"", ""CT"", ""CA"", ""VT"", ""NH""), size = n, replace = T,","T_and_F_symbol_linter" +"tests/testthat/test-tune_models.R",295,18,"style","Any function spanning multiple lines should use curly braces."," phi_present <- function(messages)","brace_linter" +"vignettes/site_only/best_levels.Rmd",41,17,"style","Trailing whitespace is superfluous.","meds <- tribble( ","trailing_whitespace_linter" +"vignettes/site_only/best_levels.Rmd",50,13,"style","Trailing whitespace is superfluous.","pima_meds <- ","trailing_whitespace_linter" +"vignettes/site_only/best_levels.Rmd",54,79,"style","Trailing whitespace is superfluous."," medication = sample(x = meds$name, size = sample(0:4, 1), replace = FALSE, ","trailing_whitespace_linter" +"vignettes/site_only/best_levels.Rmd",72,22,"style","Trailing whitespace is superfluous.","pima_diabetes_meds <- ","trailing_whitespace_linter" +"vignettes/site_only/best_levels.Rmd",76,81,"style","Trailing whitespace is superfluous."," # Data frame with id, the high-cardinality factor, and (optionally) a column ","trailing_whitespace_linter" +"vignettes/site_only/best_levels.Rmd",103,30,"style","Trailing whitespace is superfluous.","pima_diabetes_med_duration <- ","trailing_whitespace_linter" +"vignettes/site_only/best_levels.Rmd",166,28,"style","Trailing whitespace is superfluous.","new_patient_med_duration <- ","trailing_whitespace_linter" +"vignettes/site_only/best_levels.Rmd",167,35,"style","Trailing whitespace is superfluous."," add_best_levels(d = new_patient, ","trailing_whitespace_linter" +"vignettes/site_only/best_levels.Rmd",168,40,"style","Trailing whitespace is superfluous."," longsheet = new_meds, ","trailing_whitespace_linter" +"vignettes/site_only/best_levels.Rmd",186,84,"style","Trailing whitespace is superfluous.","models <- machine_learn(pima_diabetes_med_duration, patient_id, outcome = diabetes, ","trailing_whitespace_linter" +"vignettes/site_only/best_levels.Rmd",188,33,"style","Trailing whitespace is superfluous.","add_best_levels(d = new_patient, ","trailing_whitespace_linter" +"vignettes/site_only/best_levels.Rmd",189,38,"style","Trailing whitespace is superfluous."," longsheet = new_meds, ","trailing_whitespace_linter" +"vignettes/site_only/best_levels.Rmd",196,38,"style","Trailing whitespace is superfluous."," missing_fill = 0) %>% ","trailing_whitespace_linter" +"vignettes/site_only/best_levels.Rmd",241,17,"style","Trailing whitespace is superfluous.","meds <- tribble( ","trailing_whitespace_linter" +"vignettes/site_only/best_levels.Rmd",255,13,"style","Trailing whitespace is superfluous.","pima_meds <- ","trailing_whitespace_linter" +"vignettes/site_only/best_levels.Rmd",259,79,"style","Trailing whitespace is superfluous."," medication = sample(x = meds$name, size = sample(0:4, 1), replace = FALSE, ","trailing_whitespace_linter" +"vignettes/site_only/db_connections.Rmd",12,70,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set(echo = TRUE, results = ""hold"", collapse = TRUE, ","trailing_whitespace_linter" +"vignettes/site_only/db_connections.Rmd",131,44,"style","Commas should always have a space after.","predictions <- data.frame(patient_id = c(1,2,3),","commas_linter" +"vignettes/site_only/db_connections.Rmd",131,46,"style","Commas should always have a space after.","predictions <- data.frame(patient_id = c(1,2,3),","commas_linter" +"vignettes/site_only/db_connections.Rmd",134,34,"style","Trailing whitespace is superfluous.","table_id <- Id(schema = ""Sepsis"", ","trailing_whitespace_linter" +"vignettes/site_only/db_connections.Rmd",155,44,"style","Commas should always have a space after.","predictions <- data.frame(patient_id = c(1,2,3),","commas_linter" +"vignettes/site_only/db_connections.Rmd",155,46,"style","Commas should always have a space after.","predictions <- data.frame(patient_id = c(1,2,3),","commas_linter" +"vignettes/site_only/db_connections.Rmd",159,13,"style","Trailing whitespace is superfluous.","sqlSave(con, ","trailing_whitespace_linter" +"vignettes/site_only/db_connections.Rmd",160,21,"style","Trailing whitespace is superfluous."," predictions, ","trailing_whitespace_linter" +"vignettes/site_only/db_connections.Rmd",161,30,"style","Trailing whitespace is superfluous."," ""Sepsis.Predictions"", ","trailing_whitespace_linter" +"vignettes/site_only/db_connections.Rmd",162,23,"style","Trailing whitespace is superfluous."," append = TRUE, ","trailing_whitespace_linter" +"vignettes/site_only/db_connections.Rmd",192,44,"style","Commas should always have a space after.","predictions <- data.frame(patient_id = c(1,2,3),","commas_linter" +"vignettes/site_only/db_connections.Rmd",192,46,"style","Commas should always have a space after.","predictions <- data.frame(patient_id = c(1,2,3),","commas_linter" +"vignettes/site_only/db_connections.Rmd",197,24,"style","Trailing whitespace is superfluous.","RODBC::sqlSave(con_out, ","trailing_whitespace_linter" +"vignettes/site_only/db_connections.Rmd",198,28,"style","Trailing whitespace is superfluous."," predictions, ","trailing_whitespace_linter" +"vignettes/site_only/db_connections.Rmd",199,37,"style","Trailing whitespace is superfluous."," ""Sepsis.Predictions"", ","trailing_whitespace_linter" +"vignettes/site_only/db_connections.Rmd",200,30,"style","Trailing whitespace is superfluous."," append = TRUE, ","trailing_whitespace_linter" +"vignettes/site_only/deploy_model.Rmd",52,31,"style","Trailing whitespace is superfluous.","models <- machine_learn(d = d, ","trailing_whitespace_linter" +"vignettes/site_only/deploy_model.Rmd",100,31,"style","Trailing whitespace is superfluous.","predictions <- predictions %>% ","trailing_whitespace_linter" +"vignettes/site_only/deploy_model.Rmd",124,12,"style","Trailing whitespace is superfluous."," SELECT ","trailing_whitespace_linter" +"vignettes/site_only/deploy_model.Rmd",125,7,"style","Only use double-quotes."," '' AS FacilityAccountID","single_quotes_linter" +"vignettes/site_only/deploy_model.Rmd",125,10,"error","unexpected symbol"," '' AS FacilityAccountID",NA +"vignettes/site_only/deploy_model.Rmd",141,13,"style","Trailing whitespace is superfluous.","sqlSave(con, ","trailing_whitespace_linter" +"vignettes/site_only/deploy_model.Rmd",142,21,"style","Trailing whitespace is superfluous."," predictions, ","trailing_whitespace_linter" +"vignettes/site_only/deploy_model.Rmd",143,39,"style","Trailing whitespace is superfluous."," ""Schema.ReadmitMLOutputTable"", ","trailing_whitespace_linter" +"vignettes/site_only/deploy_model.Rmd",144,23,"style","Trailing whitespace is superfluous."," append = TRUE, ","trailing_whitespace_linter" +"vignettes/site_only/deploy_model.Rmd",175,22,"style","Trailing whitespace is superfluous.","prod_query <- ""SELECT ","trailing_whitespace_linter" +"vignettes/site_only/deploy_model.Rmd",193,13,"style","Trailing whitespace is superfluous.","sqlSave(con, ","trailing_whitespace_linter" +"vignettes/site_only/deploy_model.Rmd",194,21,"style","Trailing whitespace is superfluous."," predictions, ","trailing_whitespace_linter" +"vignettes/site_only/deploy_model.Rmd",195,43,"style","Trailing whitespace is superfluous."," ""Schema.ReadmitMLOutputTableBASE"", ","trailing_whitespace_linter" +"vignettes/site_only/deploy_model.Rmd",196,23,"style","Trailing whitespace is superfluous."," append = TRUE, ","trailing_whitespace_linter" +"vignettes/site_only/healthcareai.Rmd",12,70,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set(echo = TRUE, results = ""hold"", collapse = TRUE, ","trailing_whitespace_linter" +"vignettes/site_only/healthcareai.Rmd",65,17,"style","Trailing whitespace is superfluous.","quick_models %>% ","trailing_whitespace_linter" +"vignettes/site_only/healthcareai.Rmd",66,34,"style","Trailing whitespace is superfluous."," predict(outcome_groups = 2) %>% ","trailing_whitespace_linter" +"vignettes/site_only/healthcareai.Rmd",76,31,"style","Trailing whitespace is superfluous.","missingness(pima_diabetes) %>% ","trailing_whitespace_linter" +"vignettes/site_only/healthcareai.Rmd",132,28,"style","Trailing whitespace is superfluous.","models[""Random Forest""] %>% ","trailing_whitespace_linter" +"vignettes/site_only/healthcareai.Rmd",158,22,"style","Trailing whitespace is superfluous.","interpret(models) %>% ","trailing_whitespace_linter" +"vignettes/site_only/healthcareai.Rmd",176,20,"style","Trailing whitespace is superfluous.","explore(models) %>% ","trailing_whitespace_linter" +"vignettes/site_only/healthcareai.Rmd",194,20,"style","Trailing whitespace is superfluous.","test_predictions <- ","trailing_whitespace_linter" +"vignettes/site_only/healthcareai.Rmd",195,18,"style","Trailing whitespace is superfluous."," predict(models, ","trailing_whitespace_linter" +"vignettes/site_only/healthcareai.Rmd",196,27,"style","Trailing whitespace is superfluous."," split_data$test, ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",12,70,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set(echo = TRUE, results = ""hold"", collapse = TRUE, ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",83,44,"style","Put spaces around all infix operators.","print(paste(""Data is"", round(as.numeric(os)/1000000, 1), ""mb.""))","infix_spaces_linter" +"vignettes/site_only/performance.Rmd",113,22,"warning","1:nrow(...) is likely to be wrong in the empty edge case. Use seq_len() instead."," flight_id = 1:nrow(d)) %>%","seq_linter" +"vignettes/site_only/performance.Rmd",115,17,"style","Trailing whitespace is superfluous.","d_clean <- d %>% ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",118,43,"style","Trailing whitespace is superfluous."," collapse_rare_factors = FALSE, ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",122,52,"style","Put spaces around all infix operators.","print(paste(""Prepped data is"", round(as.numeric(os)/1000000, 1), ""mb.""))","infix_spaces_linter" +"vignettes/site_only/performance.Rmd",158,50,"style","Commas should never have a space before."," summarize_if(~ is.character(.x) | is.factor(.x) , n_distinct)","commas_linter" +"vignettes/site_only/performance.Rmd",166,83,"style","Trailing whitespace is superfluous."," ggplot(aes(x = reorder(dest, arr_delay, function(x) -sum(x == ""Y"") / length(x)), ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",219,33,"style","Trailing whitespace is superfluous."," prep_data(outcome = arr_delay, ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",231,33,"style","Trailing whitespace is superfluous."," prep_data(outcome = arr_delay, ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",286,6,"style","Trailing whitespace is superfluous.","d %>% ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",290,24,"style","Trailing whitespace is superfluous.","stratified_sample_d %>% ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",300,18,"style","Trailing whitespace is superfluous.","d_recent <- d %>% ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",314,18,"style","Trailing whitespace is superfluous.","downsampled_d %>% ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",361,33,"style","Trailing whitespace is superfluous."," prep_data(outcome = arr_delay, ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",365,32,"style","Trailing whitespace is superfluous.","m_rf_1 <- flash_models(d_clean, ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",366,44,"style","Trailing whitespace is superfluous."," outcome = arr_delay, ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",378,22,"style","Trailing whitespace is superfluous.","m <- machine_learn(d, ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",398,33,"style","Trailing whitespace is superfluous."," prep_data(outcome = arr_delay, ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",402,33,"style","Trailing whitespace is superfluous.","m_glm_1 <- flash_models(d_clean, ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",403,45,"style","Trailing whitespace is superfluous."," outcome = arr_delay, ","trailing_whitespace_linter" +"vignettes/site_only/performance.Rmd",419,33,"style","Trailing whitespace is superfluous."," prep_data(outcome = arr_delay, ","trailing_whitespace_linter" +"vignettes/site_only/transitioning.Rmd",12,70,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set(echo = TRUE, results = ""hold"", collapse = TRUE, ","trailing_whitespace_linter" +"vignettes/site_only/transitioning.Rmd",34,36,"style","Trailing whitespace is superfluous.","# csvfile <- system.file(""extdata"", ","trailing_whitespace_linter" +"vignettes/site_only/transitioning.Rmd",35,52,"style","Trailing whitespace is superfluous.","# ""HCRDiabetesClinical.csv"", ","trailing_whitespace_linter" +"vignettes/site_only/transitioning.Rmd",37,33,"style","Trailing whitespace is superfluous.","# df <- read.csv(file = csvfile, ","trailing_whitespace_linter" +"vignettes/site_only/transitioning.Rmd",38,32,"style","Trailing whitespace is superfluous.","# header = TRUE, ","trailing_whitespace_linter" +"vignettes/site_only/transitioning.Rmd",40,2,"style","Trailing whitespace is superfluous.","# ","trailing_whitespace_linter" +"vignettes/site_only/transitioning.Rmd",41,3,"style","Commented code should be removed.","# df$PatientID <- NULL # Only one ID column (ie, PatientEncounterID) is needed remove this column","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",62,3,"style","Commented code should be removed.","# dfDeploy <- df[951:1000,]","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",71,3,"style","Commented code should be removed.","# p <- SupervisedModelDevelopmentParams$new()","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",72,3,"style","Commented code should be removed.","# p$df <- df","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",73,3,"style","Commented code should be removed.","# p$type <- ""classification""","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",74,3,"style","Commented code should be removed.","# p$impute <- TRUE","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",75,3,"style","Commented code should be removed.","# p$grainCol <- ""PatientEncounterID""","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",76,3,"style","Commented code should be removed.","# p$predictedCol <- ""ThirtyDayReadmitFLG""","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",77,3,"style","Commented code should be removed.","# p$debug <- FALSE","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",78,3,"style","Commented code should be removed.","# p$cores <- 1","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",79,2,"style","Trailing whitespace is superfluous.","# ","trailing_whitespace_linter" +"vignettes/site_only/transitioning.Rmd",81,3,"style","Commented code should be removed.","# RandomForest <- RandomForestDevelopment$new(p)","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",82,3,"style","Commented code should be removed.","# RandomForest$run()","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",84,33,"style","Trailing whitespace is superfluous.","models <- machine_learn(d$train, ","trailing_whitespace_linter" +"vignettes/site_only/transitioning.Rmd",86,55,"style","Trailing whitespace is superfluous."," outcome = ThirtyDayReadmitFLG, ","trailing_whitespace_linter" +"vignettes/site_only/transitioning.Rmd",113,3,"style","Commented code should be removed.","# p2 <- SupervisedModelDeploymentParams$new()","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",114,3,"style","Commented code should be removed.","# p2$type <- ""classification""","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",115,3,"style","Commented code should be removed.","# p2$df <- dfDeploy","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",116,3,"style","Commented code should be removed.","# p2$grainCol <- ""PatientEncounterID""","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",117,3,"style","Commented code should be removed.","# p2$predictedCol <- ""ThirtyDayReadmitFLG""","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",118,3,"style","Commented code should be removed.","# p2$impute <- TRUE","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",119,3,"style","Commented code should be removed.","# p2$debug <- FALSE","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",120,3,"style","Commented code should be removed.","# p2$cores <- 1","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",121,2,"style","Trailing whitespace is superfluous.","# ","trailing_whitespace_linter" +"vignettes/site_only/transitioning.Rmd",122,3,"style","Commented code should be removed.","# dL <- RandomForestDeployment$new(p2)","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",123,3,"style","Commented code should be removed.","# dL$deploy()","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",124,2,"style","Trailing whitespace is superfluous.","# ","trailing_whitespace_linter" +"vignettes/site_only/transitioning.Rmd",125,3,"style","Commented code should be removed.","# dfOut <- dL$getOutDf()","commented_code_linter" +"vignettes/site_only/transitioning.Rmd",126,3,"style","Commented code should be removed.","# head(dfOut)","commented_code_linter" diff --git a/.dev/revdep_emails/healthcareai/email-body b/.dev/revdep_emails/healthcareai/email-body new file mode 100644 index 000000000..cd4df8083 --- /dev/null +++ b/.dev/revdep_emails/healthcareai/email-body @@ -0,0 +1,29 @@ +Hello Mike Mastanduno! Thank you for using {lintr} in your package {healthcareai}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/HealthCatalyst/healthcareai-r (hash: 3125ca1e78bd52b9718ef80e0e931c3707f172f6) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 83s on CRAN vs. 31s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/i18n/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/i18n/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..72fed09e9 --- /dev/null +++ b/.dev/revdep_emails/i18n/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,345 @@ +"filename","line_number","column_number","type","message","line","linter" +"data-raw/01-locales.R",7,15,"style","Trailing whitespace is superfluous.","all_locales <- ","trailing_whitespace_linter" +"data-raw/01-locales.R",10,40,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-core"", ","trailing_whitespace_linter" +"data-raw/02-default_locales.R",7,19,"style","Trailing whitespace is superfluous.","default_content <- ","trailing_whitespace_linter" +"data-raw/02-default_locales.R",10,40,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-core"", ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",15,15,"style","Trailing whitespace is superfluous."," languages <- ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",30,13,"style","Trailing whitespace is superfluous."," scripts <- ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",37,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",44,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",45,17,"style","Trailing whitespace is superfluous."," territories <- ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",52,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",59,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",60,14,"style","Trailing whitespace is superfluous."," variants <- ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",67,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",74,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",77,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",80,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",82,81,"style","Lines should not be more than 80 characters."," territories_values <- territories_data$main[[1]]$localeDisplayNames$territories","line_length_linter" +"data-raw/03-locale_names.R",83,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",86,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",95,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/03-locale_names.R",98,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",15,3,"style","Variable and function names should not be longer than 30 characters."," dates_gregorian_json_url_locale <- ","object_length_linter" +"data-raw/04-dates.R",15,37,"style","Trailing whitespace is superfluous."," dates_gregorian_json_url_locale <- ","trailing_whitespace_linter" +"data-raw/04-dates.R",18,53,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-dates-full/main"", ","trailing_whitespace_linter" +"data-raw/04-dates.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" +"data-raw/04-dates.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",33,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",36,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$months$format$abbreviated","line_length_linter" +"data-raw/04-dates.R",37,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",40,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$months$format$narrow","line_length_linter" +"data-raw/04-dates.R",41,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",45,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",48,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$months$`stand-alone`$abbreviated","line_length_linter" +"data-raw/04-dates.R",49,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",52,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$months$`stand-alone`$narrow","line_length_linter" +"data-raw/04-dates.R",53,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",56,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$months$`stand-alone`$wide","line_length_linter" +"data-raw/04-dates.R",57,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",61,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",64,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$days$format$abbreviated","line_length_linter" +"data-raw/04-dates.R",65,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",69,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",73,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",77,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",80,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$days$`stand-alone`$abbreviated","line_length_linter" +"data-raw/04-dates.R",81,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",84,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$days$`stand-alone`$narrow","line_length_linter" +"data-raw/04-dates.R",85,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",88,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$days$`stand-alone`$short","line_length_linter" +"data-raw/04-dates.R",89,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",92,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$days$`stand-alone`$wide","line_length_linter" +"data-raw/04-dates.R",93,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",97,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",100,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$quarters$format$abbreviated","line_length_linter" +"data-raw/04-dates.R",101,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",104,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$quarters$format$narrow","line_length_linter" +"data-raw/04-dates.R",105,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",108,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$quarters$format$wide","line_length_linter" +"data-raw/04-dates.R",109,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",112,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$quarters$`stand-alone`$abbreviated","line_length_linter" +"data-raw/04-dates.R",113,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",116,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$quarters$`stand-alone`$narrow","line_length_linter" +"data-raw/04-dates.R",117,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",120,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$quarters$`stand-alone`$wide","line_length_linter" +"data-raw/04-dates.R",121,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",125,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",128,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dayPeriods$format$abbreviated","line_length_linter" +"data-raw/04-dates.R",129,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",132,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dayPeriods$format$narrow","line_length_linter" +"data-raw/04-dates.R",133,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",136,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dayPeriods$format$wide","line_length_linter" +"data-raw/04-dates.R",137,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",140,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dayPeriods$`stand-alone`$abbreviated","line_length_linter" +"data-raw/04-dates.R",141,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",144,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dayPeriods$`stand-alone`$narrow","line_length_linter" +"data-raw/04-dates.R",145,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",148,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dayPeriods$`stand-alone`$wide","line_length_linter" +"data-raw/04-dates.R",149,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",153,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",157,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",161,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",165,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",169,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",173,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",177,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",181,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",183,20,"style","Trailing whitespace is superfluous."," time_skeletons <- ","trailing_whitespace_linter" +"data-raw/04-dates.R",185,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",188,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dateTimeFormats[1:4]","line_length_linter" +"data-raw/04-dates.R",189,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",192,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dateTimeFormats[[5]]","line_length_linter" +"data-raw/04-dates.R",193,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",196,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dateTimeFormats$appendItems","line_length_linter" +"data-raw/04-dates.R",197,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",200,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dateTimeFormats$intervalFormats","line_length_linter" +"data-raw/04-dates.R",201,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",244,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",247,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/04-dates.R",259,66,"style","Trailing whitespace is superfluous."," months_format_abbrev, months_format_narrow, months_format_wide, ","trailing_whitespace_linter" +"data-raw/04-dates.R",264,72,"style","Trailing whitespace is superfluous."," quarters_format_abbrev, quarters_format_narrow, quarters_format_wide, ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",15,35,"style","Trailing whitespace is superfluous."," dates_generic_json_url_locale <- ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",18,53,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-dates-full/main"", ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",33,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",36,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$months$format$abbreviated","line_length_linter" +"data-raw/05-dates_generic.R",37,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",41,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",45,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",48,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$months$`stand-alone`$abbreviated","line_length_linter" +"data-raw/05-dates_generic.R",49,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",52,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$months$`stand-alone`$narrow","line_length_linter" +"data-raw/05-dates_generic.R",53,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",56,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$months$`stand-alone`$wide","line_length_linter" +"data-raw/05-dates_generic.R",57,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",61,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",65,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",69,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",73,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",77,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",80,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$days$`stand-alone`$abbreviated","line_length_linter" +"data-raw/05-dates_generic.R",81,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",84,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$days$`stand-alone`$narrow","line_length_linter" +"data-raw/05-dates_generic.R",85,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",88,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$days$`stand-alone`$short","line_length_linter" +"data-raw/05-dates_generic.R",89,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",93,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",97,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",100,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$quarters$format$abbreviated","line_length_linter" +"data-raw/05-dates_generic.R",101,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",105,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",109,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",112,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$quarters$`stand-alone`$abbreviated","line_length_linter" +"data-raw/05-dates_generic.R",113,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",116,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$quarters$`stand-alone`$narrow","line_length_linter" +"data-raw/05-dates_generic.R",117,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",120,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$quarters$`stand-alone`$wide","line_length_linter" +"data-raw/05-dates_generic.R",121,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",125,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",128,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$dayPeriods$format$abbreviated","line_length_linter" +"data-raw/05-dates_generic.R",129,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",132,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$dayPeriods$format$narrow","line_length_linter" +"data-raw/05-dates_generic.R",133,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",137,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",140,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$dayPeriods$`stand-alone`$abbreviated","line_length_linter" +"data-raw/05-dates_generic.R",141,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",144,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$dayPeriods$`stand-alone`$narrow","line_length_linter" +"data-raw/05-dates_generic.R",145,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",148,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$dayPeriods$`stand-alone`$wide","line_length_linter" +"data-raw/05-dates_generic.R",149,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",153,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",157,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",161,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",165,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",169,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",173,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",177,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",181,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",183,20,"style","Trailing whitespace is superfluous."," time_skeletons <- ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",185,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",189,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",193,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",196,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$dateTimeFormats$appendItems","line_length_linter" +"data-raw/05-dates_generic.R",197,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",200,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$dateTimeFormats$intervalFormats","line_length_linter" +"data-raw/05-dates_generic.R",201,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",244,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/05-dates_generic.R",247,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",15,29,"style","Trailing whitespace is superfluous."," numbers_json_url_locale <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",18,55,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-numbers-full/main"", ","trailing_whitespace_linter" +"data-raw/06-numbers.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" +"data-raw/06-numbers.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",33,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",37,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",41,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",43,13,"style","Trailing whitespace is superfluous."," decimal <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",45,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",47,11,"style","Trailing whitespace is superfluous."," group <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",49,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",51,10,"style","Trailing whitespace is superfluous."," list <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",53,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",55,18,"style","Trailing whitespace is superfluous."," percent_sign <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",57,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",59,15,"style","Trailing whitespace is superfluous."," plus_sign <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",61,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",63,16,"style","Trailing whitespace is superfluous."," minus_sign <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",65,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",67,17,"style","Trailing whitespace is superfluous."," approx_sign <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",69,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",71,14,"style","Trailing whitespace is superfluous."," exp_sign <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",73,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",75,13,"style","Trailing whitespace is superfluous."," sup_exp <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",76,81,"style","Lines should not be more than 80 characters."," numbers_data$main[[1]]$numbers$`symbols-numberSystem-latn`$superscriptingExponent","line_length_linter" +"data-raw/06-numbers.R",77,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",79,15,"style","Trailing whitespace is superfluous."," per_mille <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",81,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",83,14,"style","Trailing whitespace is superfluous."," infinity <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",85,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",87,9,"style","Trailing whitespace is superfluous."," nan <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",89,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",91,14,"style","Trailing whitespace is superfluous."," time_sep <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",93,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",95,20,"style","Trailing whitespace is superfluous."," approx_pattern <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",96,81,"style","Lines should not be more than 80 characters."," numbers_data$main[[1]]$numbers$`miscPatterns-numberSystem-latn`$approximately","line_length_linter" +"data-raw/06-numbers.R",97,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",99,22,"style","Trailing whitespace is superfluous."," at_least_pattern <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",101,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",103,21,"style","Trailing whitespace is superfluous."," at_most_pattern <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",105,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",107,19,"style","Trailing whitespace is superfluous."," range_pattern <- ","trailing_whitespace_linter" +"data-raw/06-numbers.R",109,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",113,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",116,81,"style","Lines should not be more than 80 characters."," numbers_data$main[[1]]$numbers$`scientificFormats-numberSystem-latn`$standard","line_length_linter" +"data-raw/06-numbers.R",117,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",121,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",125,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",128,81,"style","Lines should not be more than 80 characters."," numbers_data$main[[1]]$numbers$`currencyFormats-numberSystem-latn`$accounting","line_length_linter" +"data-raw/06-numbers.R",129,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",141,17,"style","Put spaces around all infix operators."," plus_sign =plus_sign,","infix_spaces_linter" +"data-raw/06-numbers.R",160,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/06-numbers.R",163,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/07-currencies.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/07-currencies.R",15,32,"style","Trailing whitespace is superfluous."," currencies_json_url_locale <- ","trailing_whitespace_linter" +"data-raw/07-currencies.R",18,55,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-numbers-full/main"", ","trailing_whitespace_linter" +"data-raw/07-currencies.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" +"data-raw/07-currencies.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/07-currencies.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/07-currencies.R",31,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/07-currencies.R",41,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/07-currencies.R",49,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/07-currencies.R",63,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/07-currencies.R",77,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/07-currencies.R",78,3,"style","Variable and function names should not be longer than 30 characters."," currency_display_name_count_other <-","object_length_linter" +"data-raw/07-currencies.R",91,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/07-currencies.R",103,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/07-currencies.R",106,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/08-characters.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/08-characters.R",15,16,"style","Trailing whitespace is superfluous."," characters <- ","trailing_whitespace_linter" +"data-raw/08-characters.R",18,52,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-misc-full/main"", ","trailing_whitespace_linter" +"data-raw/08-characters.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" +"data-raw/08-characters.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/08-characters.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/08-characters.R",36,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/08-characters.R",38,81,"style","Lines should not be more than 80 characters."," leninent_scope_general <- characters_data$main[[1]]$characters$`lenient-scope-general`","line_length_linter" +"data-raw/08-characters.R",39,81,"style","Lines should not be more than 80 characters."," leninent_scope_date <- characters_data$main[[1]]$characters$`lenient-scope-date`","line_length_linter" +"data-raw/08-characters.R",40,81,"style","Lines should not be more than 80 characters."," leninent_scope_number <- characters_data$main[[1]]$characters$`lenient-scope-number`","line_length_linter" +"data-raw/08-characters.R",41,81,"style","Lines should not be more than 80 characters."," stricter_scope_number <- characters_data$main[[1]]$characters$`stricter-scope-number`","line_length_linter" +"data-raw/08-characters.R",42,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/08-characters.R",59,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/08-characters.R",62,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/09-character_labels.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/09-character_labels.R",15,17,"style","Trailing whitespace is superfluous."," char_labels <- ","trailing_whitespace_linter" +"data-raw/09-character_labels.R",18,52,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-misc-full/main"", ","trailing_whitespace_linter" +"data-raw/09-character_labels.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" +"data-raw/09-character_labels.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/09-character_labels.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/09-character_labels.R",31,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/09-character_labels.R",33,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/09-character_labels.R",41,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/09-character_labels.R",44,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/10-delimiters.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/10-delimiters.R",15,16,"style","Trailing whitespace is superfluous."," delimiters <- ","trailing_whitespace_linter" +"data-raw/10-delimiters.R",18,52,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-misc-full/main"", ","trailing_whitespace_linter" +"data-raw/10-delimiters.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" +"data-raw/10-delimiters.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/10-delimiters.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/10-delimiters.R",32,81,"style","Lines should not be more than 80 characters."," alt_quotation_start <- delimiters_data$main[[1]]$delimiters$alternateQuotationStart","line_length_linter" +"data-raw/10-delimiters.R",33,81,"style","Lines should not be more than 80 characters."," alt_quotation_end <- delimiters_data$main[[1]]$delimiters$alternateQuotationEnd","line_length_linter" +"data-raw/10-delimiters.R",44,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/10-delimiters.R",47,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/10-delimiters.R",59,74,"style","Trailing whitespace is superfluous."," quotation_start, quotation_end, alt_quotation_start, alt_quotation_end, ","trailing_whitespace_linter" +"data-raw/11-layout.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/11-layout.R",15,12,"style","Trailing whitespace is superfluous."," layout <- ","trailing_whitespace_linter" +"data-raw/11-layout.R",18,52,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-misc-full/main"", ","trailing_whitespace_linter" +"data-raw/11-layout.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" +"data-raw/11-layout.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/11-layout.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/11-layout.R",40,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/11-layout.R",43,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/12-script_metadata.R",8,15,"style","Trailing whitespace is superfluous.","script_meta <- ","trailing_whitespace_linter" +"data-raw/12-script_metadata.R",10,81,"style","Lines should not be more than 80 characters."," ""https://raw.githubusercontent.com/unicode-org/cldr-json/main/cldr-json/cldr-core"", ","line_length_linter" +"data-raw/12-script_metadata.R",10,88,"style","Trailing whitespace is superfluous."," ""https://raw.githubusercontent.com/unicode-org/cldr-json/main/cldr-json/cldr-core"", ","trailing_whitespace_linter" +"data-raw/12-script_metadata.R",30,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/12-script_metadata.R",41,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/12-script_metadata.R",49,31,"style","Trailing whitespace is superfluous."," lb_letters = lb_letters, ","trailing_whitespace_linter" +"data-raw/12-script_metadata.R",57,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/12-script_metadata.R",59,81,"style","Lines should not be more than 80 characters."," script_metadata_tbl <- dplyr::bind_rows(script_metadata_tbl, script_metadata_row_i)","line_length_linter" +"data-raw/12-script_metadata.R",60,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/12-script_metadata.R",63,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/13-units.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/13-units.R",15,11,"style","Trailing whitespace is superfluous."," units <- ","trailing_whitespace_linter" +"data-raw/13-units.R",18,53,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-units-full/main"", ","trailing_whitespace_linter" +"data-raw/13-units.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" +"data-raw/13-units.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/13-units.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/13-units.R",33,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/13-units.R",41,42,"style","Trailing whitespace is superfluous."," dplyr::mutate(unit = names(long)) %>% ","trailing_whitespace_linter" +"data-raw/13-units.R",45,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/13-units.R",53,43,"style","Trailing whitespace is superfluous."," dplyr::mutate(unit = names(short)) %>% ","trailing_whitespace_linter" +"data-raw/13-units.R",57,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/13-units.R",65,44,"style","Trailing whitespace is superfluous."," dplyr::mutate(unit = names(narrow)) %>% ","trailing_whitespace_linter" +"data-raw/13-units.R",81,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/13-units.R",84,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/13-units.R",91,19,"style","Trailing whitespace is superfluous.","colnames_sorted <- ","trailing_whitespace_linter" +"data-raw/13-units.R",118,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/14-tz_exemplar.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/14-tz_exemplar.R",15,17,"style","Trailing whitespace is superfluous."," tz_exemplar <- ","trailing_whitespace_linter" +"data-raw/14-tz_exemplar.R",18,53,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-dates-full/main"", ","trailing_whitespace_linter" +"data-raw/14-tz_exemplar.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" +"data-raw/14-tz_exemplar.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/14-tz_exemplar.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/14-tz_exemplar.R",31,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/14-tz_exemplar.R",33,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/14-tz_exemplar.R",35,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/14-tz_exemplar.R",39,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/14-tz_exemplar.R",40,28,"style","Trailing whitespace is superfluous."," names(exemplar_cities) <- ","trailing_whitespace_linter" +"data-raw/14-tz_exemplar.R",42,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/14-tz_exemplar.R",43,27,"style","Trailing whitespace is superfluous."," tz_exemplar_tbl_row_i <- ","trailing_whitespace_linter" +"data-raw/14-tz_exemplar.R",48,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/14-tz_exemplar.R",51,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/15-tz_map.R",8,10,"style","Trailing whitespace is superfluous.","tz_map <- ","trailing_whitespace_linter" +"data-raw/15-tz_map.R",11,54,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-core/supplemental/"", ","trailing_whitespace_linter" +"data-raw/15-tz_map.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/15-tz_map.R",21,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/15-tz_map.R",24,26,"style","Trailing whitespace is superfluous.","colnames(map_data_all) <- ","trailing_whitespace_linter" +"data-raw/16-tz_formats.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/16-tz_formats.R",15,16,"style","Trailing whitespace is superfluous."," tz_formats <- ","trailing_whitespace_linter" +"data-raw/16-tz_formats.R",18,53,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-dates-full/main"", ","trailing_whitespace_linter" +"data-raw/16-tz_formats.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" +"data-raw/16-tz_formats.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/16-tz_formats.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/16-tz_formats.R",31,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/16-tz_formats.R",39,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/16-tz_formats.R",51,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"data-raw/16-tz_formats.R",54,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/i18n/email-body b/.dev/revdep_emails/i18n/email-body new file mode 100644 index 000000000..0c4af3e5e --- /dev/null +++ b/.dev/revdep_emails/i18n/email-body @@ -0,0 +1,29 @@ +Hello Richard Iannone! Thank you for using {lintr} in your package {i18n}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/rich-iannone/i18n (hash: 071bc900ca7e59e6ac3181be9e9b923deb6280a2) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 1s on CRAN vs. 5s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/jpmesh/attachments/jpmesh.warnings b/.dev/revdep_emails/jpmesh/attachments/jpmesh.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/jpmesh/attachments/jpmesh.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/jpmesh/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/jpmesh/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..25badc69e --- /dev/null +++ b/.dev/revdep_emails/jpmesh/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,3 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/administration_mesh.R",54,44,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (to_mesh_size <= mesh_units[5] & to_mesh_size >= mesh_units[7]) {","vector_logic_linter" +"R/coords_to_mesh.R",48,39,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!rlang::is_missing(longitude) | !rlang::is_missing(latitude))","vector_logic_linter" diff --git a/.dev/revdep_emails/jpmesh/email-body b/.dev/revdep_emails/jpmesh/email-body new file mode 100644 index 000000000..8222a02ad --- /dev/null +++ b/.dev/revdep_emails/jpmesh/email-body @@ -0,0 +1,29 @@ +Hello Shinya Uryu! Thank you for using {lintr} in your package {jpmesh}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/uribo/jpmesh (hash: 15cb73e710d23ca5dc7a671377b08b98bebb9a10) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 15s on CRAN vs. 9s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/languageserver/attachments/languageserver.warnings b/.dev/revdep_emails/languageserver/attachments/languageserver.warnings new file mode 100644 index 000000000..182961f94 --- /dev/null +++ b/.dev/revdep_emails/languageserver/attachments/languageserver.warnings @@ -0,0 +1,2 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Trying to remove β€˜camel_case_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/languageserver/email-body b/.dev/revdep_emails/languageserver/email-body new file mode 100644 index 000000000..55be8b259 --- /dev/null +++ b/.dev/revdep_emails/languageserver/email-body @@ -0,0 +1,29 @@ +Hello Randy Lai! Thank you for using {lintr} in your package {languageserver}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/REditorSupport/languageserver (hash: 7398fea984792864433a901ee18d3d6f719468e2) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 35s on CRAN vs. 11s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/latrend/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/latrend/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..6cf6f9344 --- /dev/null +++ b/.dev/revdep_emails/latrend/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,35 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/test-cases/data-na.R",50,13,"style","Variable and function name style should be snake_case.","testData2[, Value := replace(Value, .GRP %% M + 1L, NA), by = Id]","object_name_linter" +"R/data.R",168,13,"style","Variable and function name style should be snake_case."," alldata[, Mu.class := rowSums(Xc * t(clusterCoefs)[Class, ])]","object_name_linter" +"R/data.R",191,15,"style","Variable and function name style should be snake_case."," alldata[, Mu.random := rowSums(Xr * idCoefs[Id, ])]","object_name_linter" +"R/data.R",193,15,"style","Variable and function name style should be snake_case."," alldata[, Mu := Mu.fixed + Mu.class + Mu.random]","object_name_linter" +"R/data.R",195,15,"style","Variable and function name style should be snake_case."," alldata[, Mu := Mu.fixed + Mu.class]","object_name_linter" +"R/data.R",205,13,"style","Variable and function name style should be snake_case."," alldata[, Value := Mu + rnoise(.N, 0, noiseScales[Class])]","object_name_linter" +"R/data.R",215,13,"style","Variable and function name style should be snake_case."," alldata[, Class := factor(clusterNames[Class], levels = clusterNames)]","object_name_linter" +"R/matrix.R",161,10,"style","Variable and function name style should be snake_case."," dt[, .Fill := FALSE]","object_name_linter" +"R/matrix.R",166,10,"style","Variable and function name style should be snake_case."," dt[, .Fill := NULL]","object_name_linter" +"R/methodStratify.R",216,11,"style","Variable and function name style should be snake_case."," out[, Cluster := as.integer(Cluster) + 1L]","object_name_linter" +"R/model.R",948,15,"style","Variable and function name style should be snake_case."," newdata[, Cluster := factor(Cluster, levels = clusterNames(object))]","object_name_linter" +"R/model.R",961,38,"style","Variable and function name style should be snake_case."," lapply(function(cdata) cdata[, Cluster := NULL])","object_name_linter" +"R/model.R",1289,15,"style","Variable and function name style should be snake_case."," rawdata[, Cluster := trajAssignments[make.idRowIndices(object)]]","object_name_linter" +"R/modelCustom.R",197,19,"style","Place a space before left parenthesis, except in a function call."," object@predict(object, newdata, what, ...)","spaces_left_parentheses_linter" +"R/modelCustom.R",228,11,"style","Variable and function name style should be snake_case."," .[, Cluster := factor(Cluster,","object_name_linter" +"R/modelLcmmGMM.R",22,37,"style","Variable and function name style should be snake_case."," dataIndex[object@model$na.action, Include := FALSE]","object_name_linter" +"R/modelMixtoolsRM.R",57,11,"style","Variable and function name style should be snake_case."," .[, Time := times[.Block]] %>%","object_name_linter" +"R/modelMixtoolsRM.R",59,11,"style","Variable and function name style should be snake_case."," .[, .Component := NULL] %>%","object_name_linter" +"R/modelMixtoolsRM.R",60,11,"style","Variable and function name style should be snake_case."," .[, .Block := NULL] %>%","object_name_linter" +"R/models.R",515,9,"style","Variable and function name style should be snake_case."," .[, .ROW_INDEX := .I] %>%","object_name_linter" +"R/test.R",74,10,"style","Variable and function name style should be snake_case."," data[, Id := as.character(Id)]","object_name_linter" +"R/test.R",75,10,"style","Variable and function name style should be snake_case."," data[, Cluster := as.character(Cluster)]","object_name_linter" +"tests/testthat/setup-data.R",22,7,"style","Variable and function name style should be snake_case."," .[, Constant := 1] %>%","object_name_linter" +"tests/testthat/setup-data.R",23,7,"style","Variable and function name style should be snake_case."," .[, Cluster := Class]","object_name_linter" +"tests/testthat/test-akmedoids.R",24,12,"style","Variable and function name style should be snake_case.","trajData[, Cluster := LETTERS[as.integer(Id) %% 3 + 1]]","object_name_linter" +"tests/testthat/test-assert.R",197,32,"style","Variable and function name style should be snake_case."," .[Traj == unique(Traj)[2], Value := NA]","object_name_linter" +"tests/testthat/test-cluslong.R",111,23,"style","Variable and function name style should be snake_case."," .[sample(.N, 10), Traj := NA]","object_name_linter" +"tests/testthat/test-cluslong.R",118,9,"style","Variable and function name style should be snake_case."," .[, Traj := factor(Traj)]","object_name_linter" +"tests/testthat/test-cluslong.R",128,9,"style","Variable and function name style should be snake_case."," .[, Traj := factor(Traj, levels = rev(unique(Traj)))]","object_name_linter" +"tests/testthat/test-cluslong.R",138,9,"style","Variable and function name style should be snake_case."," .[, Traj := factor(Traj, levels = seq(0, uniqueN(Traj) + 1))]","object_name_linter" +"tests/testthat/test-cluslong.R",147,18,"style","Variable and function name style should be snake_case."," .[Traj == 1, Traj := NA]","object_name_linter" +"tests/testthat/test-cluslong.R",165,23,"style","Variable and function name style should be snake_case."," .[sample(.N, 10), Value := NA]","object_name_linter" +"tests/testthat/test-cluslong.R",175,23,"style","Variable and function name style should be snake_case."," .[sample(.N, 10), Value := Inf]","object_name_linter" +"tests/testthat/test-crimcv.R",32,7,"style","Variable and function name style should be snake_case."," .[, Cluster := rep(LETTERS[1:3], each = 33 * ncol(subTO1adj))]","object_name_linter" diff --git a/.dev/revdep_emails/latrend/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/latrend/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..c3fd426a9 --- /dev/null +++ b/.dev/revdep_emails/latrend/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,331 @@ +"filename","line_number","column_number","type","message","line","linter" +"data-raw/latrendData.R",6,1,"style","Variable and function name style should be snake_case or symbols.","latrendData = generateLongData(","object_name_linter" +"data-raw/latrendData.R",6,13,"style","Use <-, not =, for assignment.","latrendData = generateLongData(","assignment_linter" +"data-raw/latrendData.R",11,8,"style","Only use double-quotes."," id = 'Id',","single_quotes_linter" +"data-raw/latrendData.R",17,24,"style","Only use double-quotes."," clusterNames = paste('Class', 1:3),","single_quotes_linter" +"data-raw/latrendData.R",22,42,"style","Only use double-quotes.","plotTrajectories(latrendData, response = 'Y')","single_quotes_linter" +"data-raw/latrendData.R",23,42,"style","Only use double-quotes.","plotTrajectories(latrendData, response = 'Y', cluster = 'Class', facet = FALSE)","single_quotes_linter" +"data-raw/latrendData.R",23,57,"style","Only use double-quotes.","plotTrajectories(latrendData, response = 'Y', cluster = 'Class', facet = FALSE)","single_quotes_linter" +"data-raw/latrendData.R",24,42,"style","Only use double-quotes.","plotTrajectories(latrendData, response = 'Y', cluster = 'Class', facet = TRUE)","single_quotes_linter" +"data-raw/latrendData.R",24,57,"style","Only use double-quotes.","plotTrajectories(latrendData, response = 'Y', cluster = 'Class', facet = TRUE)","single_quotes_linter" +"data-raw/osa-adherence-data.R",6,81,"style","Lines should not be more than 80 characters.","#' @description Generates data from the group definitions provided by M. Aloia et al. (2008).","line_length_linter" +"data-raw/osa-adherence-data.R",16,81,"style","Lines should not be more than 80 characters.","#' @param missing Whether to simulate measurements being missing (including drop-out)","line_length_linter" +"data-raw/osa-adherence-data.R",19,81,"style","Lines should not be more than 80 characters.","#' Mark S. Aloia, Matthew S. Goodwin, Wayne F. Velicer, J. Todd Arnedt, Molly Zimmerman, Jaime Skrekas, Sarah Harris, Richard P. Millman,","line_length_linter" +"data-raw/osa-adherence-data.R",20,81,"style","Lines should not be more than 80 characters.","#' Time Series Analysis of Treatment Adherence Patterns in Individuals with Obstructive Sleep Apnea, Annals of Behavioral Medicine,","line_length_linter" +"data-raw/osa-adherence-data.R",21,81,"style","Lines should not be more than 80 characters.","#' Volume 36, Issue 1, August 2008, Pages 44–53, https://doi.org/10.1007/s12160-008-9052-9","line_length_linter" +"data-raw/osa-adherence-data.R",22,19,"style","Use <-, not =, for assignment.","generate_osa_data = function(","assignment_linter" +"data-raw/osa-adherence-data.R",25,3,"style","Variable and function name style should be snake_case or symbols."," nAggr = 14,","object_name_linter" +"data-raw/osa-adherence-data.R",37,3,"style","Variable and function name style should be snake_case or symbols."," dropoutTimes = c(Inf, Inf, Inf, Inf, Inf, 90, 30),","object_name_linter" +"data-raw/osa-adherence-data.R",38,3,"style","Variable and function name style should be snake_case or symbols."," sd.dropoutTimes = c(0, 0, 0, 0, 0, 30, 10),","object_name_linter" +"data-raw/osa-adherence-data.R",39,3,"style","Variable and function name style should be snake_case or symbols."," attemptProbs = c(354, 344, 280, 299, 106, 55, 14) / pmin(dropoutTimes, 365),","object_name_linter" +"data-raw/osa-adherence-data.R",50,3,"style","Variable and function name style should be snake_case or symbols."," sd.intercepts = c(","object_name_linter" +"data-raw/osa-adherence-data.R",68,3,"style","Variable and function name style should be snake_case or symbols."," sd.slopes = c(","object_name_linter" +"data-raw/osa-adherence-data.R",86,3,"style","Variable and function name style should be snake_case or symbols."," sd.quads = c(","object_name_linter" +"data-raw/osa-adherence-data.R",104,3,"style","Variable and function name style should be snake_case or symbols."," sd.vars = c(","object_name_linter" +"data-raw/osa-adherence-data.R",122,3,"style","Variable and function name style should be snake_case or symbols."," groupNames = c(","object_name_linter" +"data-raw/osa-adherence-data.R",123,5,"style","Only use double-quotes."," 'Good users',","single_quotes_linter" +"data-raw/osa-adherence-data.R",124,5,"style","Only use double-quotes."," 'Slow improvers',","single_quotes_linter" +"data-raw/osa-adherence-data.R",125,5,"style","Only use double-quotes."," 'Slow decliners',","single_quotes_linter" +"data-raw/osa-adherence-data.R",126,5,"style","Only use double-quotes."," 'Variable users',","single_quotes_linter" +"data-raw/osa-adherence-data.R",127,5,"style","Only use double-quotes."," 'Occasional attempters',","single_quotes_linter" +"data-raw/osa-adherence-data.R",128,5,"style","Only use double-quotes."," 'Early drop-outs',","single_quotes_linter" +"data-raw/osa-adherence-data.R",129,5,"style","Only use double-quotes."," 'Non-users'","single_quotes_linter" +"data-raw/osa-adherence-data.R",134,3,"style","Variable and function name style should be snake_case or symbols."," groupCounts = floor(patients * props)","object_name_linter" +"data-raw/osa-adherence-data.R",134,15,"style","Use <-, not =, for assignment."," groupCounts = floor(patients * props)","assignment_linter" +"data-raw/osa-adherence-data.R",135,3,"style","Variable and function name style should be snake_case or symbols."," incrIdx = order((patients * props) %% 1) %>%","object_name_linter" +"data-raw/osa-adherence-data.R",135,11,"style","Use <-, not =, for assignment."," incrIdx = order((patients * props) %% 1) %>%","assignment_linter" +"data-raw/osa-adherence-data.R",137,3,"style","Variable and function name style should be snake_case or symbols."," groupCounts[incrIdx] = groupCounts[incrIdx] + 1 # increment the groups that were closest to receiving another patient","object_name_linter" +"data-raw/osa-adherence-data.R",137,24,"style","Use <-, not =, for assignment."," groupCounts[incrIdx] = groupCounts[incrIdx] + 1 # increment the groups that were closest to receiving another patient","assignment_linter" +"data-raw/osa-adherence-data.R",137,81,"style","Lines should not be more than 80 characters."," groupCounts[incrIdx] = groupCounts[incrIdx] + 1 # increment the groups that were closest to receiving another patient","line_length_linter" +"data-raw/osa-adherence-data.R",139,3,"style","Variable and function name style should be snake_case or symbols."," groupNames = factor(groupNames, levels = groupNames)","object_name_linter" +"data-raw/osa-adherence-data.R",139,14,"style","Use <-, not =, for assignment."," groupNames = factor(groupNames, levels = groupNames)","assignment_linter" +"data-raw/osa-adherence-data.R",142,3,"style","Variable and function name style should be snake_case or symbols."," groupCoefs = data.table(","object_name_linter" +"data-raw/osa-adherence-data.R",142,14,"style","Use <-, not =, for assignment."," groupCoefs = data.table(","assignment_linter" +"data-raw/osa-adherence-data.R",159,3,"style","Variable and function name style should be snake_case or symbols."," patCoefs = groupCoefs[, .(","object_name_linter" +"data-raw/osa-adherence-data.R",159,12,"style","Use <-, not =, for assignment."," patCoefs = groupCoefs[, .(","assignment_linter" +"data-raw/osa-adherence-data.R",160,19,"warning","no visible binding for global variable β€˜Patients’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" +"data-raw/osa-adherence-data.R",160,19,"warning","no visible binding for global variable β€˜Patients’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" +"data-raw/osa-adherence-data.R",160,19,"warning","no visible binding for global variable β€˜Patients’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" +"data-raw/osa-adherence-data.R",160,19,"warning","no visible binding for global variable β€˜Patients’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" +"data-raw/osa-adherence-data.R",160,19,"warning","no visible binding for global variable β€˜Patients’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" +"data-raw/osa-adherence-data.R",160,19,"warning","no visible binding for global variable β€˜Patients’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" +"data-raw/osa-adherence-data.R",160,29,"warning","no visible binding for global variable β€˜TDrop’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" +"data-raw/osa-adherence-data.R",160,36,"warning","no visible binding for global variable β€˜Sd.TDrop’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" +"data-raw/osa-adherence-data.R",161,13,"warning","no visible binding for global variable β€˜AProb’"," AProb = AProb,","object_usage_linter" +"data-raw/osa-adherence-data.R",162,33,"warning","no visible binding for global variable β€˜Int’"," Intercept = rnorm(Patients, Int, Sd.Int) %>% pmax(0),","object_usage_linter" +"data-raw/osa-adherence-data.R",162,38,"warning","no visible binding for global variable β€˜Sd.Int’"," Intercept = rnorm(Patients, Int, Sd.Int) %>% pmax(0),","object_usage_linter" +"data-raw/osa-adherence-data.R",163,29,"warning","no visible binding for global variable β€˜Slope’"," Slope = rnorm(Patients, Slope, Sd.Slope),","object_usage_linter" +"data-raw/osa-adherence-data.R",163,36,"warning","no visible binding for global variable β€˜Sd.Slope’"," Slope = rnorm(Patients, Slope, Sd.Slope),","object_usage_linter" +"data-raw/osa-adherence-data.R",164,28,"warning","no visible binding for global variable β€˜Quad’"," Quad = rnorm(Patients, Quad, Sd.Quad),","object_usage_linter" +"data-raw/osa-adherence-data.R",164,34,"warning","no visible binding for global variable β€˜Sd.Quad’"," Quad = rnorm(Patients, Quad, Sd.Quad),","object_usage_linter" +"data-raw/osa-adherence-data.R",165,32,"warning","no visible binding for global variable β€˜Var’"," Variance = rnorm(Patients, Var, Sd.Var) %>% pmax(.75),","object_usage_linter" +"data-raw/osa-adherence-data.R",165,37,"warning","no visible binding for global variable β€˜Sd.Var’"," Variance = rnorm(Patients, Var, Sd.Var) %>% pmax(.75),","object_usage_linter" +"data-raw/osa-adherence-data.R",166,13,"warning","no visible binding for global variable β€˜R’"," R = rep(R, Patients)","object_usage_linter" +"data-raw/osa-adherence-data.R",167,11,"warning","no visible binding for global variable β€˜Group’"," ), by = Group]","object_usage_linter" +"data-raw/osa-adherence-data.R",170,3,"style","Variable and function name style should be snake_case or symbols."," genTs = function(N,","object_name_linter" +"data-raw/osa-adherence-data.R",170,9,"style","Use <-, not =, for assignment."," genTs = function(N,","assignment_linter" +"data-raw/osa-adherence-data.R",170,20,"style","Variable and function name style should be snake_case or symbols."," genTs = function(N,","object_name_linter" +"data-raw/osa-adherence-data.R",171,5,"style","Variable and function name style should be snake_case or symbols."," Intercept,","object_name_linter" +"data-raw/osa-adherence-data.R",172,5,"style","Variable and function name style should be snake_case or symbols."," Slope,","object_name_linter" +"data-raw/osa-adherence-data.R",173,5,"style","Variable and function name style should be snake_case or symbols."," Quad,","object_name_linter" +"data-raw/osa-adherence-data.R",174,5,"style","Variable and function name style should be snake_case or symbols."," Variance,","object_name_linter" +"data-raw/osa-adherence-data.R",175,5,"style","Variable and function name style should be snake_case or symbols."," R,","object_name_linter" +"data-raw/osa-adherence-data.R",176,5,"style","Variable and function name style should be snake_case or symbols."," AProb,","object_name_linter" +"data-raw/osa-adherence-data.R",177,5,"style","Variable and function name style should be snake_case or symbols."," TDrop,","object_name_linter" +"data-raw/osa-adherence-data.R",179,7,"style","Use <-, not =, for assignment."," y = as.numeric(Intercept + times * Slope + times ^ 2 * Quad + arima.sim(list(ar = R),","assignment_linter" +"data-raw/osa-adherence-data.R",179,81,"style","Lines should not be more than 80 characters."," y = as.numeric(Intercept + times * Slope + times ^ 2 * Quad + arima.sim(list(ar = R),","line_length_linter" +"data-raw/osa-adherence-data.R",183,5,"style","Variable and function name style should be snake_case or symbols."," skipMask = !rbinom(length(times), size = 1, prob = AProb)","object_name_linter" +"data-raw/osa-adherence-data.R",183,14,"style","Use <-, not =, for assignment."," skipMask = !rbinom(length(times), size = 1, prob = AProb)","assignment_linter" +"data-raw/osa-adherence-data.R",184,17,"style","Use <-, not =, for assignment."," y[skipMask] = 0","assignment_linter" +"data-raw/osa-adherence-data.R",187,7,"style","Variable and function name style should be snake_case or symbols."," obsMask = times <= TDrop","object_name_linter" +"data-raw/osa-adherence-data.R",187,15,"style","Use <-, not =, for assignment."," obsMask = times <= TDrop","assignment_linter" +"data-raw/osa-adherence-data.R",190,24,"style","Use <-, not =, for assignment."," y[times > TDrop] = 0","assignment_linter" +"data-raw/osa-adherence-data.R",195,3,"style","Variable and function name style should be snake_case or symbols."," patNames = paste0('P', 1:patients)","object_name_linter" +"data-raw/osa-adherence-data.R",195,12,"style","Use <-, not =, for assignment."," patNames = paste0('P', 1:patients)","assignment_linter" +"data-raw/osa-adherence-data.R",195,21,"style","Only use double-quotes."," patNames = paste0('P', 1:patients)","single_quotes_linter" +"data-raw/osa-adherence-data.R",196,11,"style","Use <-, not =, for assignment."," alldata = patCoefs[, do.call(genTs, .SD), by = .(Group, Id = factor(patNames, levels = patNames))] %>%","assignment_linter" +"data-raw/osa-adherence-data.R",196,52,"warning","no visible binding for global variable β€˜Group’"," alldata = patCoefs[, do.call(genTs, .SD), by = .(Group, Id = factor(patNames, levels = patNames))] %>%","object_usage_linter" +"data-raw/osa-adherence-data.R",196,81,"style","Lines should not be more than 80 characters."," alldata = patCoefs[, do.call(genTs, .SD), by = .(Group, Id = factor(patNames, levels = patNames))] %>%","line_length_linter" +"data-raw/osa-adherence-data.R",200,3,"style","Variable and function name style should be snake_case or symbols."," groupTrajs = groupCoefs[, .(","object_name_linter" +"data-raw/osa-adherence-data.R",200,14,"style","Use <-, not =, for assignment."," groupTrajs = groupCoefs[, .(","assignment_linter" +"data-raw/osa-adherence-data.R",202,19,"warning","no visible binding for global variable β€˜Int’"," Usage = (pmax(Int + times * Slope + times ^ 2 * Quad, 0) * AProb) %>% ifelse(times > TDrop, 0, .)","object_usage_linter" +"data-raw/osa-adherence-data.R",202,33,"warning","no visible binding for global variable β€˜Slope’"," Usage = (pmax(Int + times * Slope + times ^ 2 * Quad, 0) * AProb) %>% ifelse(times > TDrop, 0, .)","object_usage_linter" +"data-raw/osa-adherence-data.R",202,53,"warning","no visible binding for global variable β€˜Quad’"," Usage = (pmax(Int + times * Slope + times ^ 2 * Quad, 0) * AProb) %>% ifelse(times > TDrop, 0, .)","object_usage_linter" +"data-raw/osa-adherence-data.R",202,64,"warning","no visible binding for global variable β€˜AProb’"," Usage = (pmax(Int + times * Slope + times ^ 2 * Quad, 0) * AProb) %>% ifelse(times > TDrop, 0, .)","object_usage_linter" +"data-raw/osa-adherence-data.R",202,81,"style","Lines should not be more than 80 characters."," Usage = (pmax(Int + times * Slope + times ^ 2 * Quad, 0) * AProb) %>% ifelse(times > TDrop, 0, .)","line_length_linter" +"data-raw/osa-adherence-data.R",202,90,"warning","no visible binding for global variable β€˜TDrop’"," Usage = (pmax(Int + times * Slope + times ^ 2 * Quad, 0) * AProb) %>% ifelse(times > TDrop, 0, .)","object_usage_linter" +"data-raw/osa-adherence-data.R",203,13,"warning","no visible binding for global variable β€˜Group’"," ), by = Group]","object_usage_linter" +"data-raw/osa-adherence-data.R",205,20,"style","Only use double-quotes."," setattr(alldata, 'patCoefs', patCoefs)","single_quotes_linter" +"data-raw/osa-adherence-data.R",206,20,"style","Only use double-quotes."," setattr(alldata, 'groupCoefs', groupCoefs)","single_quotes_linter" +"data-raw/osa-adherence-data.R",207,20,"style","Only use double-quotes."," setattr(alldata, 'groupTrajs', groupTrajs)","single_quotes_linter" +"data-raw/osa-adherence-data.R",211,13,"style","Use <-, not =, for assignment."," alldata = transformToAverage(alldata, binSize = nAggr)","assignment_linter" +"data-raw/osa-adherence-data.R",211,15,"warning","no visible global function definition for β€˜transformToAverage’"," alldata = transformToAverage(alldata, binSize = nAggr)","object_usage_linter" +"data-raw/osa-adherence-data.R",217,1,"style","Variable and function name style should be snake_case or symbols.","transformToAverage = function(data, binSize = 14) {","object_name_linter" +"data-raw/osa-adherence-data.R",217,20,"style","Use <-, not =, for assignment.","transformToAverage = function(data, binSize = 14) {","assignment_linter" +"data-raw/osa-adherence-data.R",217,37,"style","Variable and function name style should be snake_case or symbols.","transformToAverage = function(data, binSize = 14) {","object_name_linter" +"data-raw/osa-adherence-data.R",218,8,"style","Use <-, not =, for assignment."," bins = seq(min(data$Time), max(data$Time), by = binSize)","assignment_linter" +"data-raw/osa-adherence-data.R",219,11,"style","Use <-, not =, for assignment."," bindata = data[, .(Usage = mean(Usage), Time = max(Time)),","assignment_linter" +"data-raw/osa-adherence-data.R",219,35,"warning","no visible binding for global variable β€˜Usage’"," bindata = data[, .(Usage = mean(Usage), Time = max(Time)),","object_usage_linter" +"data-raw/osa-adherence-data.R",221,7,"warning","no visible binding for global variable β€˜Group’"," Group,","object_usage_linter" +"data-raw/osa-adherence-data.R",226,3,"style","Variable and function name style should be snake_case or symbols."," groupTrajs = attr(data, 'groupTrajs')","object_name_linter" +"data-raw/osa-adherence-data.R",226,14,"style","Use <-, not =, for assignment."," groupTrajs = attr(data, 'groupTrajs')","assignment_linter" +"data-raw/osa-adherence-data.R",226,27,"style","Only use double-quotes."," groupTrajs = attr(data, 'groupTrajs')","single_quotes_linter" +"data-raw/osa-adherence-data.R",227,3,"style","Variable and function name style should be snake_case or symbols."," bingroupTrajs = groupTrajs[, .(Usage = mean(Usage)),","object_name_linter" +"data-raw/osa-adherence-data.R",227,17,"style","Use <-, not =, for assignment."," bingroupTrajs = groupTrajs[, .(Usage = mean(Usage)),","assignment_linter" +"data-raw/osa-adherence-data.R",227,47,"warning","no visible binding for global variable β€˜Usage’"," bingroupTrajs = groupTrajs[, .(Usage = mean(Usage)),","object_usage_linter" +"data-raw/osa-adherence-data.R",229,7,"warning","no visible binding for global variable β€˜Group’"," Group,","object_usage_linter" +"data-raw/osa-adherence-data.R",232,22,"warning","no visible binding for global variable β€˜Bin’"," .[, Time := bins[Bin]]","object_usage_linter" +"data-raw/osa-adherence-data.R",234,20,"style","Only use double-quotes."," setattr(bindata, 'groupTrajs', bingroupTrajs)","single_quotes_linter" +"data-raw/osa-adherence-data.R",239,9,"style","Use <-, not =, for assignment.","dataset = generate_osa_data(patients = 500, seed = 1)","assignment_linter" +"data-raw/osa-adherence-data.R",240,21,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" +"data-raw/osa-adherence-data.R",240,27,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" +"data-raw/osa-adherence-data.R",240,35,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" +"data-raw/osa-adherence-data.R",240,42,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" +"data-raw/osa-adherence-data.R",240,54,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" +"data-raw/osa-adherence-data.R",240,65,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" +"data-raw/osa-adherence-data.R",240,75,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" +"data-raw/osa-adherence-data.R",240,81,"style","Lines should not be more than 80 characters.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","line_length_linter" +"data-raw/osa-adherence-data.R",240,85,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" +"data-raw/osa-adherence-data.R",241,24,"style","Only use double-quotes.","setcolorder(dataset, c('Patient', 'Biweek', 'MaxDay', 'UsageHours', 'Group'))","single_quotes_linter" +"data-raw/osa-adherence-data.R",241,35,"style","Only use double-quotes.","setcolorder(dataset, c('Patient', 'Biweek', 'MaxDay', 'UsageHours', 'Group'))","single_quotes_linter" +"data-raw/osa-adherence-data.R",241,45,"style","Only use double-quotes.","setcolorder(dataset, c('Patient', 'Biweek', 'MaxDay', 'UsageHours', 'Group'))","single_quotes_linter" +"data-raw/osa-adherence-data.R",241,55,"style","Only use double-quotes.","setcolorder(dataset, c('Patient', 'Biweek', 'MaxDay', 'UsageHours', 'Group'))","single_quotes_linter" +"data-raw/osa-adherence-data.R",241,69,"style","Only use double-quotes.","setcolorder(dataset, c('Patient', 'Biweek', 'MaxDay', 'UsageHours', 'Group'))","single_quotes_linter" +"data-raw/osa-adherence-data.R",244,32,"style","Only use double-quotes.","plotTrajectories(dataset, id = 'Patient', time = 'Biweek', response = 'UsageHours', cluster = 'Group', facet = TRUE)","single_quotes_linter" +"data-raw/osa-adherence-data.R",244,50,"style","Only use double-quotes.","plotTrajectories(dataset, id = 'Patient', time = 'Biweek', response = 'UsageHours', cluster = 'Group', facet = TRUE)","single_quotes_linter" +"data-raw/osa-adherence-data.R",244,71,"style","Only use double-quotes.","plotTrajectories(dataset, id = 'Patient', time = 'Biweek', response = 'UsageHours', cluster = 'Group', facet = TRUE)","single_quotes_linter" +"data-raw/osa-adherence-data.R",244,81,"style","Lines should not be more than 80 characters.","plotTrajectories(dataset, id = 'Patient', time = 'Biweek', response = 'UsageHours', cluster = 'Group', facet = TRUE)","line_length_linter" +"data-raw/osa-adherence-data.R",244,95,"style","Only use double-quotes.","plotTrajectories(dataset, id = 'Patient', time = 'Biweek', response = 'UsageHours', cluster = 'Group', facet = TRUE)","single_quotes_linter" +"data-raw/osa-adherence-data.R",248,1,"style","Variable and function name style should be snake_case or symbols.","OSA.adherence = as.data.frame(dataset)","object_name_linter" +"data-raw/osa-adherence-data.R",248,15,"style","Use <-, not =, for assignment.","OSA.adherence = as.data.frame(dataset)","assignment_linter" +"R/assert.R",109,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/assert.R",341,7,"warning","no visible binding for global variable β€˜Dupe’"," .[Dupe == TRUE]","object_usage_linter" +"R/assert.R",371,7,"warning","no visible binding for global variable β€˜Moments’"," .[Moments < min]","object_usage_linter" +"R/assert.R",402,7,"warning","no visible binding for global variable β€˜HasMult’"," .[HasMult == TRUE]","object_usage_linter" +"R/assert.R",407,7,"warning","no visible global function definition for β€˜nroW’"," nroW(dtMult),","object_usage_linter" +"R/assert.R",413,9,"warning","no visible binding for global variable β€˜IsEqualLen’"," .[IsEqualLen == FALSE]","object_usage_linter" +"R/assert.R",438,7,"warning","no visible binding for global variable β€˜NaCount’"," .[NaCount > 0]","object_usage_linter" +"R/formula.R",31,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/generics.R",467,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/matrix.R",85,3,"style","`else` should come on the same line as the previous `}`."," else if (is.factor(times)) {","brace_linter" +"R/matrix.R",90,3,"style","`else` should come on the same line as the previous `}`."," else if (is.character(times)) {","brace_linter" +"R/method.R",364,3,"style","`else` should come on the same line as the previous `}`."," else if (is.list(args)) {","brace_linter" +"R/method.R",671,12,"warning","no visible binding for global variable β€˜label’"," object$label","object_usage_linter" +"R/method.R",1088,12,"warning","no visible binding for global variable β€˜response’"," object$response","object_usage_linter" +"R/method.R",1154,3,"style","`else` should come on the same line as the previous `}`."," else if (inherits(object, what = classes)) {","brace_linter" +"R/methods.R",123,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/model-transform.R",367,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/model-transform.R",388,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/model-transform.R",405,7,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/model.R",438,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/model.R",938,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/model.R",963,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/model.R",991,3,"style","`else` should come on the same line as the previous `}`."," else if (is.numeric(predList[[1]])) {","brace_linter" +"R/model.R",1004,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/model.R",1106,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/model.R",1381,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/modelKML.R",48,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/modelLMKM.R",59,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/models.R",53,3,"style","`else` should come on the same line as the previous `}`."," else if (is.lcModels(x)) {","brace_linter" +"R/models.R",56,3,"style","`else` should come on the same line as the previous `}`."," else if (is.lcModel(x)) {","brace_linter" +"R/models.R",59,3,"style","`else` should come on the same line as the previous `}`."," else if (is.list(x)) {","brace_linter" +"R/models.R",63,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/models.R",156,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/models.R",247,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/modelWeightedPartition.R",42,3,"style","`else` should come on the same line as the previous `}`."," else if (is.function(clusterNames)) {","brace_linter" +"R/random.R",12,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/test.R",410,3,"style","`else` should come on the same line as the previous `}`."," else if (!isFALSE(error)) {","brace_linter" +"tests/testthat/setup-init.R",160,17,"warning","no visible global function definition for β€˜is.ggplot’"," expect_true(is.ggplot(plot(object)))","object_usage_linter" +"tests/testthat/test-formula.R",9,28,"style","Put spaces around all infix operators."," expect_true(hasResponse(A~0))","infix_spaces_linter" +"tests/testthat/test-formula.R",10,36,"style","Put spaces around all infix operators."," expect_true(hasResponse(I(log(A))~B))","infix_spaces_linter" +"tests/testthat/test-formula.R",17,29,"style","Put spaces around all infix operators."," expect_true(hasIntercept(A~1))","infix_spaces_linter" +"tests/testthat/test-formula.R",18,30,"style","Put spaces around all infix operators."," expect_false(hasIntercept(A~-1))","infix_spaces_linter" +"tests/testthat/test-formula.R",25,34,"style","Put spaces around all infix operators."," expect_true(hasSingleResponse(A~0))","infix_spaces_linter" +"tests/testthat/test-formula.R",26,34,"style","Put spaces around all infix operators."," expect_true(hasSingleResponse(A~B))","infix_spaces_linter" +"tests/testthat/test-formula.R",43,27,"style","Put spaces around all infix operators."," expect_null(getREterms(A~B))","infix_spaces_linter" +"tests/testthat/test-formula.R",44,29,"style","Put spaces around all infix operators."," expect_length(getREterms(A~B + (1 | C)), 1)","infix_spaces_linter" +"tests/testthat/test-formula.R",45,29,"style","Put spaces around all infix operators."," expect_length(getREterms(A~B + (1 | C) + (1 | D)), 2)","infix_spaces_linter" +"tests/testthat/test-formula.R",62,28,"style","Put spaces around all infix operators."," expect_equal(getREterms(A~B + (1 | C))[[1]] %>% REtermAsFormula, ~1)","infix_spaces_linter" +"tests/testthat/test-formula.R",63,28,"style","Put spaces around all infix operators."," expect_equal(getREterms(A~B + (D | C))[[1]] %>% REtermAsFormula, ~D)","infix_spaces_linter" +"tests/testthat/test-formula.R",64,28,"style","Put spaces around all infix operators."," expect_equal(getREterms(A~B + (-1 + D | C))[[1]] %>% REtermAsFormula, ~-1 + D)","infix_spaces_linter" +"tests/testthat/test-formula.R",74,30,"style","Put spaces around all infix operators."," expect_true(hasCovariates(A~B))","infix_spaces_linter" +"tests/testthat/test-formula.R",76,30,"style","Put spaces around all infix operators."," expect_true(hasCovariates(A~poly(A, 2)))","infix_spaces_linter" +"tests/testthat/test-formula.R",77,31,"style","Put spaces around all infix operators."," expect_false(hasCovariates(A~0))","infix_spaces_linter" +"tests/testthat/test-formula.R",78,31,"style","Put spaces around all infix operators."," expect_false(hasCovariates(A~1))","infix_spaces_linter" +"tests/testthat/test-formula.R",84,32,"style","Put spaces around all infix operators."," expect_length(getCovariates(A~0), 0)","infix_spaces_linter" +"tests/testthat/test-formula.R",85,32,"style","Put spaces around all infix operators."," expect_length(getCovariates(A~1), 0)","infix_spaces_linter" +"tests/testthat/test-formula.R",101,31,"style","Put spaces around all infix operators."," expect_equal(merge.formula(Z~A, ~B), Z~A + B)","infix_spaces_linter" +"tests/testthat/test-formula.R",101,41,"style","Put spaces around all infix operators."," expect_equal(merge.formula(Z~A, ~B), Z~A + B)","infix_spaces_linter" +"tests/testthat/test-formula.R",102,31,"style","Put spaces around all infix operators."," expect_equal(merge.formula(Z~A + B, ~B), Z~A + B)","infix_spaces_linter" +"tests/testthat/test-formula.R",102,45,"style","Put spaces around all infix operators."," expect_equal(merge.formula(Z~A + B, ~B), Z~A + B)","infix_spaces_linter" +"tests/testthat/test-formula.R",103,31,"style","Put spaces around all infix operators."," expect_equal(merge.formula(Z~A + C, ~B), Z~A + C + B)","infix_spaces_linter" +"tests/testthat/test-formula.R",103,45,"style","Put spaces around all infix operators."," expect_equal(merge.formula(Z~A + C, ~B), Z~A + C + B)","infix_spaces_linter" +"tests/testthat/test-formula.R",104,35,"style","Put spaces around all infix operators."," expect_error(merge.formula(~A, Z~B))","infix_spaces_linter" +"tests/testthat/test-formula.R",111,42,"style","Put spaces around all infix operators."," expect_false(hasResponse(dropResponse(A~0)))","infix_spaces_linter" +"tests/testthat/test-formula.R",112,43,"style","Put spaces around all infix operators."," expect_false(hasIntercept(dropResponse(A~0)))","infix_spaces_linter" +"tests/testthat/test-formula.R",113,30,"style","Put spaces around all infix operators."," expect_equal(dropResponse(A~1), ~1)","infix_spaces_linter" +"tests/testthat/test-formula.R",114,30,"style","Put spaces around all infix operators."," expect_equal(dropResponse(A~B), ~B)","infix_spaces_linter" +"tests/testthat/test-formula.R",115,35,"style","Put spaces around all infix operators."," expect_equal(dropResponse(A + B ~C), ~C)","infix_spaces_linter" +"tests/testthat/test-formula.R",120,44,"style","Put spaces around all infix operators."," expect_false(hasIntercept(dropIntercept(A~0)))","infix_spaces_linter" +"tests/testthat/test-formula.R",121,44,"style","Put spaces around all infix operators."," expect_false(hasIntercept(dropIntercept(A~B)))","infix_spaces_linter" +"tests/testthat/test-method.R",15,11,"style","Put spaces around all infix operators."," form = A~B,","infix_spaces_linter" +"vignettes/demo.Rmd",28,23,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" +"vignettes/demo.Rmd",28,34,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" +"vignettes/demo.Rmd",28,41,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" +"vignettes/demo.Rmd",28,49,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" +"vignettes/demo.Rmd",28,81,"style","Lines should not be more than 80 characters."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","line_length_linter" +"vignettes/demo.Rmd",64,1,"style","Variable and function name style should be snake_case or symbols.","kmlMethod <- lcMethodKML(response = ""Y"", nClusters = 2, nbRedrawing = 1)","object_name_linter" +"vignettes/demo.Rmd",74,1,"style","Variable and function name style should be snake_case or symbols.","kmlModel <- latrend(kmlMethod, data = latrendData)","object_name_linter" +"vignettes/demo.Rmd",86,1,"style","Variable and function name style should be snake_case or symbols.","kmlMethods <- lcMethods(kmlMethod, nClusters = 1:8)","object_name_linter" +"vignettes/demo.Rmd",94,1,"style","Variable and function name style should be snake_case or symbols.","kmlModels <- latrendBatch(kmlMethods, data = latrendData, verbose = FALSE)","object_name_linter" +"vignettes/demo.Rmd",107,1,"style","Variable and function name style should be snake_case or symbols.","kmlModel4 <- subset(kmlModels, nClusters == 4, drop = TRUE)","object_name_linter" +"vignettes/demo.Rmd",144,1,"style","Variable and function name style should be snake_case or symbols.","gbtmMethod <- lcMethodLcmmGBTM(fixed = Y ~ bs(Time), mixture = fixed)","object_name_linter" +"vignettes/demo.Rmd",151,1,"style","Variable and function name style should be snake_case or symbols.","gbtmMethods <- lcMethods(gbtmMethod, nClusters = 1:5)","object_name_linter" +"vignettes/demo.Rmd",153,1,"style","Variable and function name style should be snake_case or symbols.","gbtmModels <- latrendBatch(gbtmMethods, data = latrendData, verbose = FALSE)","object_name_linter" +"vignettes/demo.Rmd",162,1,"style","Variable and function name style should be snake_case or symbols.","bestGbtmModel <- subset(gbtmModels, nClusters == 3, drop=TRUE)","object_name_linter" +"vignettes/demo.Rmd",162,57,"style","Put spaces around all infix operators.","bestGbtmModel <- subset(gbtmModels, nClusters == 3, drop=TRUE)","infix_spaces_linter" +"vignettes/demo.Rmd",170,1,"style","Variable and function name style should be snake_case or symbols.","gmmMethod <- lcMethodLcmmGMM(fixed = Y ~ poly(Time, 2, raw = TRUE), mixture = fixed, idiag = TRUE)","object_name_linter" +"vignettes/demo.Rmd",170,81,"style","Lines should not be more than 80 characters.","gmmMethod <- lcMethodLcmmGMM(fixed = Y ~ poly(Time, 2, raw = TRUE), mixture = fixed, idiag = TRUE)","line_length_linter" +"vignettes/demo.Rmd",176,1,"style","Variable and function name style should be snake_case or symbols.","gmmMethods <- lcMethods(gmmMethod, nClusters = 1:5)","object_name_linter" +"vignettes/demo.Rmd",178,1,"style","Variable and function name style should be snake_case or symbols.","gmmModels <- latrendBatch(gmmMethods, latrendData, verbose = FALSE)","object_name_linter" +"vignettes/demo.Rmd",186,1,"style","Variable and function name style should be snake_case or symbols.","bestGmmModel <- subset(gmmModels, nClusters == 3, drop=TRUE)","object_name_linter" +"vignettes/demo.Rmd",186,55,"style","Put spaces around all infix operators.","bestGmmModel <- subset(gmmModels, nClusters == 3, drop=TRUE)","infix_spaces_linter" +"vignettes/demo.Rmd",207,43,"style","Only use double-quotes.","metric(list(bestGbtmModel, bestGmmModel), 'WMAE')","single_quotes_linter" +"vignettes/demo.Rmd",211,45,"style","Only use double-quotes.","externalMetric(bestGbtmModel, bestGmmModel, 'WMMAE')","single_quotes_linter" +"vignettes/demo.Rmd",216,45,"style","Only use double-quotes.","externalMetric(bestGbtmModel, bestGmmModel, 'adjustedRand')","single_quotes_linter" +"vignettes/demo.Rmd",230,1,"style","Variable and function name style should be snake_case or symbols.","refTrajAssigns <- aggregate(Class ~ Id, data = latrendData, FUN = data.table::first)","object_name_linter" +"vignettes/demo.Rmd",230,81,"style","Lines should not be more than 80 characters.","refTrajAssigns <- aggregate(Class ~ Id, data = latrendData, FUN = data.table::first)","line_length_linter" +"vignettes/demo.Rmd",231,1,"style","Variable and function name style should be snake_case or symbols.","refModel <- lcModelPartition(data = latrendData, response = ""Y"", trajectoryAssignments = refTrajAssigns$Class)","object_name_linter" +"vignettes/demo.Rmd",231,81,"style","Lines should not be more than 80 characters.","refModel <- lcModelPartition(data = latrendData, response = ""Y"", trajectoryAssignments = refTrajAssigns$Class)","line_length_linter" +"vignettes/implement.Rmd",22,23,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" +"vignettes/implement.Rmd",22,34,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" +"vignettes/implement.Rmd",22,41,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" +"vignettes/implement.Rmd",22,81,"style","Lines should not be more than 80 characters."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","line_length_linter" +"vignettes/implement.Rmd",47,23,"style","Trailing whitespace is superfluous."," latrend.id = ""Traj"", ","trailing_whitespace_linter" +"vignettes/implement.Rmd",57,21,"style","Trailing whitespace is superfluous."," sizes = c(40, 60), ","trailing_whitespace_linter" +"vignettes/implement.Rmd",61,20,"style","Trailing whitespace is superfluous."," cluster = ~ Time, ","trailing_whitespace_linter" +"vignettes/implement.Rmd",66,6,"style","Trailing whitespace is superfluous.",") %>% ","trailing_whitespace_linter" +"vignettes/implement.Rmd",107,20,"style","Trailing whitespace is superfluous."," factor(int > 1.7, ","trailing_whitespace_linter" +"vignettes/implement.Rmd",108,34,"style","Trailing whitespace is superfluous."," levels = c(FALSE, TRUE), ","trailing_whitespace_linter" +"vignettes/implement.Rmd",122,18,"style","Trailing whitespace is superfluous."," response = ""Y"", ","trailing_whitespace_linter" +"vignettes/implement.Rmd",123,33,"style","Trailing whitespace is superfluous."," stratify = Intercept[1] > 1.7, ","trailing_whitespace_linter" +"vignettes/implement.Rmd",135,1,"style","Variable and function name style should be snake_case or symbols.","repStep <- function(method, data, verbose) {","object_name_linter" +"vignettes/implement.Rmd",137,72,"warning","no visible binding for global variable β€˜Traj’"," coefdata <- dt[, lm(Y ~ Time, .SD) %>% coef() %>% as.list(), keyby = Traj]","object_usage_linter" +"vignettes/implement.Rmd",148,1,"style","Variable and function name style should be snake_case or symbols.","clusStep <- function(method, data, repMat, envir, verbose) {","object_name_linter" +"vignettes/implement.Rmd",148,36,"style","Variable and function name style should be snake_case or symbols.","clusStep <- function(method, data, repMat, envir, verbose) {","object_name_linter" +"vignettes/implement.Rmd",152,32,"style","Trailing whitespace is superfluous."," response = method$response, ","trailing_whitespace_linter" +"vignettes/implement.Rmd",154,17,"style","Trailing whitespace is superfluous."," data = data, ","trailing_whitespace_linter" +"vignettes/implement.Rmd",164,1,"style","Variable and function name style should be snake_case or symbols.","m.twostep <- lcMethodFeature(","object_name_linter" +"vignettes/implement.Rmd",165,18,"style","Trailing whitespace is superfluous."," response = ""Y"", ","trailing_whitespace_linter" +"vignettes/implement.Rmd",166,32,"style","Trailing whitespace is superfluous."," representationStep = repStep, ","trailing_whitespace_linter" +"vignettes/implement.Rmd",172,1,"style","Variable and function name style should be snake_case or symbols.","model.twostep <- latrend(m.twostep, data = casedata)","object_name_linter" +"vignettes/implement.Rmd",183,1,"style","Variable and function name style should be snake_case or symbols.","repStep.gen <- function(method, data, verbose) {","object_name_linter" +"vignettes/implement.Rmd",185,81,"style","Lines should not be more than 80 characters."," coefdata <- dt[, lm(method$formula, .SD) %>% coef() %>% as.list(), keyby = c(method$id)]","line_length_linter" +"vignettes/implement.Rmd",192,1,"style","Variable and function name style should be snake_case or symbols.","clusStep.gen <- function(method, data, repMat, envir, verbose) {","object_name_linter" +"vignettes/implement.Rmd",192,40,"style","Variable and function name style should be snake_case or symbols.","clusStep.gen <- function(method, data, repMat, envir, verbose) {","object_name_linter" +"vignettes/implement.Rmd",198,17,"style","Trailing whitespace is superfluous."," data = data, ","trailing_whitespace_linter" +"vignettes/implement.Rmd",208,1,"style","Variable and function name style should be snake_case or symbols.","m.twostepgen <- lcMethodFeature(","object_name_linter" +"vignettes/implement.Rmd",210,36,"style","Trailing whitespace is superfluous."," representationStep = repStep.gen, ","trailing_whitespace_linter" +"vignettes/implement.Rmd",217,1,"style","Variable and function name style should be snake_case or symbols.","model.twostepgen <- latrend(m.twostepgen, formula = Y ~ Time, nClusters = 2, casedata)","object_name_linter" +"vignettes/implement.Rmd",217,81,"style","Lines should not be more than 80 characters.","model.twostepgen <- latrend(m.twostepgen, formula = Y ~ Time, nClusters = 2, casedata)","line_length_linter" +"vignettes/implement.Rmd",235,1,"style","Variable and function name style should be snake_case or symbols.","lcMethodSimpleGBTM <- function(...) {","object_name_linter" +"vignettes/implement.Rmd",236,6,"style","Use <-, not =, for assignment."," mc = match.call()","assignment_linter" +"vignettes/implement.Rmd",237,12,"style","Use <-, not =, for assignment."," mc$Class = 'lcMethodSimpleGBTM'","assignment_linter" +"vignettes/implement.Rmd",237,14,"style","Only use double-quotes."," mc$Class = 'lcMethodSimpleGBTM'","single_quotes_linter" +"vignettes/implement.Rmd",254,43,"style","Trailing whitespace is superfluous.","setMethod(""getName"", ""lcMethodSimpleGBTM"", ","trailing_whitespace_linter" +"vignettes/implement.Rmd",264,81,"style","Lines should not be more than 80 characters.","setMethod(""prepareData"", ""lcMethodSimpleGBTM"", function(method, data, verbose, ...) {","line_length_linter" +"vignettes/implement.Rmd",274,81,"style","Lines should not be more than 80 characters.","setMethod(""fit"", ""lcMethodSimpleGBTM"", function(method, data, envir, verbose, ...) {","line_length_linter" +"vignettes/implement.Rmd",286,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/implement.Rmd",288,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/implement.Rmd",290,25,"style","Trailing whitespace is superfluous."," ""lcModelSimpleGBTM"", ","trailing_whitespace_linter" +"vignettes/implement.Rmd",315,81,"style","Lines should not be more than 80 characters.","fitted.lcModelSimpleGBTM <- function(object, clusters = trajectoryAssignments(object)) {","line_length_linter" +"vignettes/implement.Rmd",316,3,"style","Variable and function name style should be snake_case or symbols."," predNames <- paste0(""pred_m"", 1:nClusters(object))","object_name_linter" +"vignettes/implement.Rmd",317,3,"style","Variable and function name style should be snake_case or symbols."," predMat <- as.matrix(object@model$pred[predNames])","object_name_linter" +"vignettes/implement.Rmd",318,12,"style","Variable and function name style should be snake_case or symbols."," colnames(predMat) <- clusterNames(object)","object_name_linter" +"vignettes/implement.Rmd",326,38,"style","Only use double-quotes."," object, newdata, cluster, what = 'mu', ...)","single_quotes_linter" +"vignettes/implement.Rmd",327,1,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","{","brace_linter" +"vignettes/implement.Rmd",328,3,"style","Variable and function name style should be snake_case or symbols."," predMat = lcmm::predictY(object@model, newdata = newdata)$pred %>%","object_name_linter" +"vignettes/implement.Rmd",328,11,"style","Use <-, not =, for assignment."," predMat = lcmm::predictY(object@model, newdata = newdata)$pred %>%","assignment_linter" +"vignettes/implement.Rmd",331,3,"style","Variable and function name style should be snake_case or symbols."," clusIdx = match(cluster, clusterNames(object))","object_name_linter" +"vignettes/implement.Rmd",331,11,"style","Use <-, not =, for assignment."," clusIdx = match(cluster, clusterNames(object))","assignment_linter" +"vignettes/simulation.Rmd",23,23,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'simTool', 'dplyr', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" +"vignettes/simulation.Rmd",23,34,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'simTool', 'dplyr', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" +"vignettes/simulation.Rmd",23,45,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'simTool', 'dplyr', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" +"vignettes/simulation.Rmd",23,54,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'simTool', 'dplyr', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" +"vignettes/simulation.Rmd",23,81,"style","Lines should not be more than 80 characters."," eval = all(vapply(c('ggplot2', 'simTool', 'dplyr', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","line_length_linter" +"vignettes/simulation.Rmd",66,1,"style","Variable and function name style should be snake_case or symbols.","dataGen <- function(numTraj, ..., data.seed) {","object_name_linter" +"vignettes/simulation.Rmd",66,21,"style","Variable and function name style should be snake_case or symbols.","dataGen <- function(numTraj, ..., data.seed) {","object_name_linter" +"vignettes/simulation.Rmd",66,35,"style","Variable and function name style should be snake_case or symbols.","dataGen <- function(numTraj, ..., data.seed) {","object_name_linter" +"vignettes/simulation.Rmd",91,1,"style","Variable and function name style should be snake_case or symbols.","exampleData <- dataGen(numTraj = 200, randomScale = .1, data.seed = 1)","object_name_linter" +"vignettes/simulation.Rmd",101,1,"style","Variable and function name style should be snake_case or symbols.","dataGrid <- simTool::expand_tibble(","object_name_linter" +"vignettes/simulation.Rmd",118,1,"style","Variable and function name style should be snake_case or symbols.","kmlMethodGrid <- simTool::expand_tibble(","object_name_linter" +"vignettes/simulation.Rmd",134,1,"style","Variable and function name style should be snake_case or symbols.","fitGCKM <- function(type, ...) {","object_name_linter" +"vignettes/simulation.Rmd",139,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/simulation.Rmd",146,1,"style","Variable and function name style should be snake_case or symbols.","gckmMethodGrid <- simTool::expand_tibble(","object_name_linter" +"vignettes/simulation.Rmd",157,1,"style","Variable and function name style should be snake_case or symbols.","methodGrid <- dplyr::bind_rows(kmlMethodGrid, gckmMethodGrid)","object_name_linter" +"vignettes/simulation.Rmd",166,1,"style","Variable and function name style should be snake_case or symbols.","analyzeModel <- function(model) {","object_name_linter" +"vignettes/simulation.Rmd",168,3,"style","Variable and function name style should be snake_case or symbols."," refModel <- lcModelPartition(data, response = ""Y"", trajectoryAssignments = ""Class"")","object_name_linter" +"vignettes/simulation.Rmd",168,81,"style","Lines should not be more than 80 characters."," refModel <- lcModelPartition(data, response = ""Y"", trajectoryAssignments = ""Class"")","line_length_linter" +"vignettes/simulation.Rmd",169,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/simulation.Rmd",182,24,"style","Trailing whitespace is superfluous."," data_grid = dataGrid, ","trailing_whitespace_linter" +"vignettes/simulation.Rmd",196,1,"style","Variable and function name style should be snake_case or symbols.","resultsTable <- as.data.table(result$simulation)","object_name_linter" +"vignettes/simulation.Rmd",204,81,"style","Lines should not be more than 80 characters.","resultsTable[, .(K = nClusters[which.min(BIC)]), keyby = .(numTraj, randomScales, data.seed, method)]","line_length_linter" +"vignettes/simulation.Rmd",213,81,"style","Lines should not be more than 80 characters.","resultsTable[nClusters > 1, .(ARI = mean(ARI)), keyby = .(nClusters, numTraj, randomScales, method)]","line_length_linter" +"vignettes/simulation.Rmd",217,81,"style","Lines should not be more than 80 characters.","resultsTable[nClusters > 1, .(ARI = mean(ARI)), keyby = .(randomScales, nClusters, method)]","line_length_linter" +"vignettes/simulation.Rmd",225,81,"style","Lines should not be more than 80 characters.","resultsTable[randomScales == .1, .(WMAE = mean(WMAE)), keyby = .(nClusters, method)]","line_length_linter" +"vignettes/validation.Rmd",29,23,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'mclustcomp', 'caret'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" +"vignettes/validation.Rmd",29,34,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'mclustcomp', 'caret'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" +"vignettes/validation.Rmd",29,41,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'mclustcomp', 'caret'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" +"vignettes/validation.Rmd",29,55,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'mclustcomp', 'caret'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" +"vignettes/validation.Rmd",29,81,"style","Lines should not be more than 80 characters."," eval = all(vapply(c('ggplot2', 'kml', 'mclustcomp', 'caret'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","line_length_linter" +"vignettes/validation.Rmd",64,1,"style","Variable and function name style should be snake_case or symbols.","repModels <- latrendRep(kml, data = latrendData, .rep=10)","object_name_linter" +"vignettes/validation.Rmd",64,54,"style","Put spaces around all infix operators.","repModels <- latrendRep(kml, data = latrendData, .rep=10)","infix_spaces_linter" +"vignettes/validation.Rmd",69,1,"style","Variable and function name style should be snake_case or symbols.","repSelfMetrics <- metric(repModels, name = c(""BIC"", ""WMAE"", ""APPA""))","object_name_linter" +"vignettes/validation.Rmd",81,1,"style","Variable and function name style should be snake_case or symbols.","bestRepModel <- min(repModels, ""BIC"")","object_name_linter" +"vignettes/validation.Rmd",88,1,"style","Variable and function name style should be snake_case or symbols.","simMat <- externalMetric(repModels, name = ""adjustedRand"")","object_name_linter" +"vignettes/validation.Rmd",98,1,"style","Variable and function name style should be snake_case or symbols.","bootModels <- latrendBoot(kml, data = latrendData, samples = 10)","object_name_linter" +"vignettes/validation.Rmd",103,1,"style","Variable and function name style should be snake_case or symbols.","bootMetrics <- metric(bootModels, name = c(""BIC"", ""WMAE"", ""APPA""))","object_name_linter" +"vignettes/validation.Rmd",119,1,"style","Variable and function name style should be snake_case or symbols.","trainModels <- latrendCV(kml, data = latrendData, folds = 10, seed = 1)","object_name_linter" +"vignettes/validation.Rmd",127,1,"style","Variable and function name style should be snake_case or symbols.","dataFolds <- createTrainDataFolds(latrendData, folds = 10)","object_name_linter" +"vignettes/validation.Rmd",128,1,"style","Variable and function name style should be snake_case or symbols.","foldModels <- latrendBatch(kml, data = dataFolds)","object_name_linter" +"vignettes/validation.Rmd",133,1,"style","Variable and function name style should be snake_case or symbols.","testDataFolds <- createTestDataFolds(latrendData, dataFolds)","object_name_linter" diff --git a/.dev/revdep_emails/latrend/email-body b/.dev/revdep_emails/latrend/email-body new file mode 100644 index 000000000..0e5b7a363 --- /dev/null +++ b/.dev/revdep_emails/latrend/email-body @@ -0,0 +1,29 @@ +Hello Niek Den Teuling! Thank you for using {lintr} in your package {latrend}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/philips-software/latrend (hash: 30f1fd7ce93bbc63a321dbf7d92347555ad522c2) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 149s on CRAN vs. 93s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/lifecycle/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/lifecycle/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..7733b67eb --- /dev/null +++ b/.dev/revdep_emails/lifecycle/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,5 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/aaa.R",6,6,"style","Variable and function name style should be snake_case."," ns$.__rlang_hook__. <- c(ns$.__rlang_hook__., list(callback))","object_name_linter" +"R/aaa.R",21,6,"style","Variable and function name style should be snake_case."," ns$.__rlang_hook__. <- NULL","object_name_linter" +"R/lifecycle-package.R",11,1,"style","Variable and function name style should be snake_case.",".onLoad <- function(lib, pkg) {","object_name_linter" +"R/warning.R",48,1,"style","Variable and function names should not be longer than 30 characters.","conditionMessage.lifecycle_warning_deprecated <- function(c) {","object_length_linter" diff --git a/.dev/revdep_emails/lifecycle/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/lifecycle/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..080c856e1 --- /dev/null +++ b/.dev/revdep_emails/lifecycle/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,24 @@ +"filename","line_number","column_number","type","message","line","linter" +"vignettes/communicate.Rmd",70,3,"style","Trailing whitespace is superfluous.","#' ","trailing_whitespace_linter" +"vignettes/communicate.Rmd",73,3,"style","Trailing whitespace is superfluous.","#' ","trailing_whitespace_linter" +"vignettes/communicate.Rmd",81,13,"style","Trailing whitespace is superfluous.","#' @examples ","trailing_whitespace_linter" +"vignettes/communicate.Rmd",118,13,"style","Trailing whitespace is superfluous."," ""1.0.0"", ","trailing_whitespace_linter" +"vignettes/communicate.Rmd",119,17,"style","Trailing whitespace is superfluous."," ""add_two()"", ","trailing_whitespace_linter" +"vignettes/communicate.Rmd",186,3,"style","Trailing whitespace is superfluous.","#' ","trailing_whitespace_linter" +"vignettes/communicate.Rmd",187,16,"style","Trailing whitespace is superfluous.","#' @description ","trailing_whitespace_linter" +"vignettes/communicate.Rmd",189,3,"style","Trailing whitespace is superfluous.","#' ","trailing_whitespace_linter" +"vignettes/communicate.Rmd",227,3,"style","Trailing whitespace is superfluous.","#' ","trailing_whitespace_linter" +"vignettes/communicate.Rmd",274,27,"style","Variable and function name style should be snake_case or symbols.","add_two <- function(x, y, na.rm = TRUE) {","object_name_linter" +"vignettes/communicate.Rmd",290,27,"style","Variable and function name style should be snake_case or symbols.","add_two <- function(x, y, na.rm = TRUE) {","object_name_linter" +"vignettes/communicate.Rmd",293,22,"style","Trailing whitespace is superfluous."," when = ""1.0.0"", ","trailing_whitespace_linter" +"vignettes/communicate.Rmd",295,81,"style","Lines should not be more than 80 characters."," details = ""Ability to retain missing values will be dropped in next release.""","line_length_linter" +"vignettes/communicate.Rmd",298,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/communicate.Rmd",313,27,"style","Variable and function name style should be snake_case or symbols.","add_two <- function(x, y, na.rm = deprecated()) {","object_name_linter" +"vignettes/communicate.Rmd",316,22,"style","Trailing whitespace is superfluous."," when = ""1.0.0"", ","trailing_whitespace_linter" +"vignettes/communicate.Rmd",318,81,"style","Lines should not be more than 80 characters."," details = ""Ability to retain missing values will be dropped in next release.""","line_length_linter" +"vignettes/communicate.Rmd",321,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/communicate.Rmd",340,41,"style","Variable and function name style should be snake_case or symbols.","add_two <- function(x, y, na_rm = TRUE, na.rm = deprecated()) {","object_name_linter" +"vignettes/communicate.Rmd",345,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/manage.Rmd",36,81,"style","Lines should not be more than 80 characters.","#> Call `lifecycle::last_lifecycle_warnings()` to see where this warning was generated.","line_length_linter" +"vignettes/stages.Rmd",57,81,"style","Lines should not be more than 80 characters.","#> Call `lifecycle::last_lifecycle_warnings()` to see where this warning was generated. ","line_length_linter" +"vignettes/stages.Rmd",57,88,"style","Trailing whitespace is superfluous.","#> Call `lifecycle::last_lifecycle_warnings()` to see where this warning was generated. ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/lifecycle/email-body b/.dev/revdep_emails/lifecycle/email-body new file mode 100644 index 000000000..0ca6fceca --- /dev/null +++ b/.dev/revdep_emails/lifecycle/email-body @@ -0,0 +1,29 @@ +Hello Lionel Henry! Thank you for using {lintr} in your package {lifecycle}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/r-lib/lifecycle (hash: 5e11675148a58af68fda4588cf933c655daff62c) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 12s on CRAN vs. 8s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/lightgbm/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/lightgbm/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..9ad81cde0 --- /dev/null +++ b/.dev/revdep_emails/lightgbm/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,14 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/callback.R",27,1,"style","Variable and function name style should be snake_case.","format.eval.string <- function(eval_res, eval_err) {","object_name_linter" +"R/callback.R",43,1,"style","Variable and function name style should be snake_case.","merge.eval.string <- function(env) {","object_name_linter" +"R/lgb.Booster.R",805,1,"style","Variable and function name style should be snake_case.","predict.lgb.Booster <- function(object,","object_name_linter" +"R/lgb.Booster.R",853,1,"style","Variable and function name style should be snake_case.","print.lgb.Booster <- function(x, ...) {","object_name_linter" +"R/lgb.Booster.R",902,1,"style","Variable and function name style should be snake_case.","summary.lgb.Booster <- function(object, ...) {","object_name_linter" +"R/lgb.Dataset.R",956,1,"style","Variable and function name style should be snake_case.","dim.lgb.Dataset <- function(x) {","object_name_linter" +"R/lgb.Dataset.R",991,1,"style","Variable and function name style should be snake_case.","dimnames.lgb.Dataset <- function(x) {","object_name_linter" +"R/lgb.Dataset.R",1004,1,"style","Variable and function name style should be snake_case.","`dimnames<-.lgb.Dataset` <- function(x, value) {","object_name_linter" +"R/lgb.Dataset.R",1064,1,"style","Variable and function name style should be snake_case.","slice.lgb.Dataset <- function(dataset, idxset) {","object_name_linter" +"R/lgb.Dataset.R",1111,1,"style","Variable and function name style should be snake_case.","get_field.lgb.Dataset <- function(dataset, field_name) {","object_name_linter" +"R/lgb.Dataset.R",1160,1,"style","Variable and function name style should be snake_case.","set_field.lgb.Dataset <- function(dataset, field_name, data) {","object_name_linter" +"tests/testthat/test_lgb.interprete.R",71,10,"style","Variable and function name style should be snake_case."," iris$Species <- as.numeric(as.factor(iris$Species)) - 1L","object_name_linter" +"tests/testthat/test_lgb.plot.interpretation.R",69,10,"style","Variable and function name style should be snake_case."," iris$Species <- as.numeric(as.factor(iris$Species)) - 1L","object_name_linter" diff --git a/.dev/revdep_emails/lightgbm/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/lightgbm/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..1111460de --- /dev/null +++ b/.dev/revdep_emails/lightgbm/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,67 @@ +"filename","line_number","column_number","type","message","line","linter" +"demo/basic_walkthrough.R",11,81,"style","Lines should not be more than 80 characters.","# The loaded data is stored in sparseMatrix, and label is a numeric vector in {0,1}","line_length_linter" +"demo/basic_walkthrough.R",25,81,"style","Lines should not be more than 80 characters.","# Note: we are putting in sparse matrix here, lightgbm naturally handles sparse input","line_length_linter" +"demo/basic_walkthrough.R",26,81,"style","Lines should not be more than 80 characters.","# Use sparse matrix when your feature is sparse (e.g. when you are using one-hot encoding vector)","line_length_linter" +"demo/basic_walkthrough.R",44,81,"style","Lines should not be more than 80 characters.","# You can also put in lgb.Dataset object, which stores label, data and other meta datas needed for advanced features","line_length_linter" +"demo/basic_walkthrough.R",82,81,"style","Lines should not be more than 80 characters.","# Since we do not have this file with us, the following line is just for illustration","line_length_linter" +"demo/basic_walkthrough.R",84,7,"style","Commented code should be removed.","# data = ""agaricus.train.svm""","commented_code_linter" +"demo/basic_walkthrough.R",111,81,"style","Lines should not be more than 80 characters.","dtrain <- lgb.Dataset(data = train$data, label = train$label, free_raw_data = FALSE)","line_length_linter" +"demo/boost_from_prediction.R",8,81,"style","Lines should not be more than 80 characters.","dtest <- lgb.Dataset.create.valid(dtrain, data = agaricus.test$data, label = agaricus.test$label)","line_length_linter" +"demo/boost_from_prediction.R",24,81,"style","Lines should not be more than 80 characters.","# Note: we need the margin value instead of transformed prediction in set_init_score","line_length_linter" +"demo/categorical_features_rules.R",58,81,"style","Lines should not be more than 80 characters.","bank_test <- lgb.convert_with_rules(data = bank_test, rules = bank_rules$rules)$data","line_length_linter" +"demo/categorical_features_rules.R",70,81,"style","Lines should not be more than 80 characters.","# The categorical features can be passed to lgb.train to not copy and paste a lot","line_length_linter" +"demo/cross_validation.R",7,81,"style","Lines should not be more than 80 characters.","dtest <- lgb.Dataset.create.valid(dtrain, data = agaricus.test$data, label = agaricus.test$label)","line_length_linter" +"demo/cross_validation.R",52,81,"style","Lines should not be more than 80 characters.","# User-defined evaluation function returns a pair (metric_name, result, higher_better)","line_length_linter" +"demo/cross_validation.R",53,81,"style","Lines should not be more than 80 characters.","# NOTE: when you do customized loss function, the default prediction value is margin","line_length_linter" +"demo/cross_validation.R",55,81,"style","Lines should not be more than 80 characters.","# For example, we are doing logistic loss, the prediction is score before logistic transformation","line_length_linter" +"demo/cross_validation.R",56,81,"style","Lines should not be more than 80 characters.","# Keep this in mind when you use the customization, and maybe you need write customized evaluation function","line_length_linter" +"demo/early_stopping.R",9,81,"style","Lines should not be more than 80 characters.","dtest <- lgb.Dataset.create.valid(dtrain, data = agaricus.test$data, label = agaricus.test$label)","line_length_linter" +"demo/early_stopping.R",21,81,"style","Lines should not be more than 80 characters.","# User define objective function, given prediction, return gradient and second order gradient","line_length_linter" +"demo/early_stopping.R",31,81,"style","Lines should not be more than 80 characters.","# User-defined evaluation function returns a pair (metric_name, result, higher_better)","line_length_linter" +"demo/early_stopping.R",32,81,"style","Lines should not be more than 80 characters.","# NOTE: when you do customized loss function, the default prediction value is margin","line_length_linter" +"demo/early_stopping.R",34,81,"style","Lines should not be more than 80 characters.","# For example, we are doing logistic loss, the prediction is score before logistic transformation","line_length_linter" +"demo/early_stopping.R",36,81,"style","Lines should not be more than 80 characters.","# Keep this in mind when you use the customization, and maybe you need write customized evaluation function","line_length_linter" +"demo/efficient_many_training.R",2,81,"style","Lines should not be more than 80 characters.","# In the case of many trainings (like 100+ models), RAM will be eaten very quickly","line_length_linter" +"demo/efficient_many_training.R",5,81,"style","Lines should not be more than 80 characters.","# More results can be found here: https://github.com/microsoft/LightGBM/issues/879#issuecomment-326656580","line_length_linter" +"demo/efficient_many_training.R",7,81,"style","Lines should not be more than 80 characters.","# With reset=FALSE you get after 500 iterations (not 1000): OS reports 27GB usage, while R gc() reports 1.5GB.","line_length_linter" +"demo/efficient_many_training.R",9,81,"style","Lines should not be more than 80 characters.","# Doing reset=TRUE and calling gc() in the loop will have OS 1.3GB. Thanks for the latest tip.""","line_length_linter" +"demo/efficient_many_training.R",16,81,"style","Lines should not be more than 80 characters.","x_data <- matrix(rnorm(n = 100000000L, mean = 0.0, sd = 100.0), nrow = 1000000L, ncol = 100L)","line_length_linter" +"demo/efficient_many_training.R",23,81,"style","Lines should not be more than 80 characters.","# Loop through a training of 1000 models, please check your RAM on your task manager","line_length_linter" +"demo/leaf_stability.R",1,81,"style","Lines should not be more than 80 characters.","# We are going to look at how iterating too much might generate observation instability.","line_length_linter" +"demo/leaf_stability.R",9,81,"style","Lines should not be more than 80 characters.","# output of `RColorBrewer::brewer.pal(10, ""RdYlGn"")`, hardcooded here to avoid a dependency","line_length_linter" +"demo/leaf_stability.R",108,3,"style","Commented code should be removed.","# Z = logloss","commented_code_linter" +"demo/leaf_stability.R",124,81,"style","Lines should not be more than 80 characters.","new_data$Z <- -1.0 * (agaricus.test$label * log(new_data$Y) + (1L - agaricus.test$label) * log(1L - new_data$Y))","line_length_linter" +"demo/leaf_stability.R",140,81,"style","Lines should not be more than 80 characters.","# On the second plot, we clearly notice the lower the bin (the lower the leaf value), the higher the loss","line_length_linter" +"demo/leaf_stability.R",178,81,"style","Lines should not be more than 80 characters.","new_data2$Z <- -1.0 * (agaricus.test$label * log(new_data2$Y) + (1L - agaricus.test$label) * log(1L - new_data2$Y))","line_length_linter" +"demo/leaf_stability.R",194,81,"style","Lines should not be more than 80 characters.","# On the second plot, we clearly notice the lower the bin (the lower the leaf value), the higher the loss","line_length_linter" +"demo/leaf_stability.R",195,81,"style","Lines should not be more than 80 characters.","# On the third plot, it is clearly not smooth! We are severely overfitting the data, but the rules are","line_length_linter" +"demo/leaf_stability.R",234,81,"style","Lines should not be more than 80 characters.","new_data3$Z <- -1.0 * (agaricus.test$label * log(new_data3$Y) + (1L - agaricus.test$label) * log(1L - new_data3$Y))","line_length_linter" +"demo/leaf_stability.R",250,81,"style","Lines should not be more than 80 characters.","# On the third plot, it is clearly not smooth! We are severely overfitting the data, but the rules","line_length_linter" +"demo/leaf_stability.R",252,81,"style","Lines should not be more than 80 characters.","# However, if the rules were not true, the loss would explode. See the sudden spikes?","line_length_linter" +"demo/multiclass_custom_objective.R",17,81,"style","Lines should not be more than 80 characters.","dtest <- lgb.Dataset.create.valid(dtrain, data = test[, 1L:4L], label = test[, 5L])","line_length_linter" +"demo/multiclass_custom_objective.R",44,81,"style","Lines should not be more than 80 characters.","# User defined objective function, given prediction, return gradient and second order gradient","line_length_linter" +"demo/multiclass_custom_objective.R",48,81,"style","Lines should not be more than 80 characters."," # preds is a matrix with rows corresponding to samples and columns corresponding to choices","line_length_linter" +"demo/multiclass.R",17,81,"style","Lines should not be more than 80 characters.","dtest <- lgb.Dataset.create.valid(dtrain, data = test[, 1L:4L], label = test[, 5L])","line_length_linter" +"demo/multiclass.R",37,81,"style","Lines should not be more than 80 characters.","# Order: obs1 class1, obs1 class2, obs1 class3, obs2 class1, obs2 class2, obs2 class3...","line_length_linter" +"demo/weight_param.R",9,81,"style","Lines should not be more than 80 characters.","# - Run 1: sum of weights equal to 6513 (x 1e-5) without adjusted regularization (not learning)","line_length_linter" +"demo/weight_param.R",10,81,"style","Lines should not be more than 80 characters.","# - Run 2: sum of weights equal to 6513 (x 1e-5) adjusted regularization (learning)","line_length_linter" +"demo/weight_param.R",23,81,"style","Lines should not be more than 80 characters.","dtest <- lgb.Dataset.create.valid(dtrain, test$data, label = test$label, weight = weights2)","line_length_linter" +"demo/weight_param.R",26,81,"style","Lines should not be more than 80 characters.","# Run 1: sum of weights equal to 6513 (x 1e-5) without adjusted regularization (not learning)","line_length_linter" +"demo/weight_param.R",28,81,"style","Lines should not be more than 80 characters.","# min_sum_hessian alone is bigger than the sum of weights, thus you will never learn anything","line_length_linter" +"demo/weight_param.R",50,81,"style","Lines should not be more than 80 characters.","# Run 2: sum of weights equal to 6513 (x 1e-5) with adjusted regularization (learning)","line_length_linter" +"demo/weight_param.R",51,81,"style","Lines should not be more than 80 characters.","# Adjusted regularization just consisting in multiplicating results by 1e4 (x10000)","line_length_linter" +"demo/weight_param.R",52,81,"style","Lines should not be more than 80 characters.","# Notice how it learns, there is no issue as we adjusted regularization ourselves","line_length_linter" +"inst/make-r-def.R",49,22,"warning","no visible global function definition for β€˜shoQuote’"," , args = shoQuote(args)","object_usage_linter" +"R/aliases.R",50,13,"warning","no visible binding for global variable β€˜LGBM_DumpParamAliases_R’"," LGBM_DumpParamAliases_R","object_usage_linter" +"R/lgb.cv.R",288,14,"warning","no visible global function definition for β€˜cb_early_stop’"," , cb = cb_early_stop(","object_usage_linter" +"R/lgb.cv.R",583,7,"style","Variable and function name style should be snake_case or symbols."," foldVector[y == dimnames(numInClass)$y[i]] <- sample(seqVector)","object_name_linter" +"R/lgb.train.R",253,14,"warning","no visible global function definition for β€˜cb_early_stop’"," , cb = cb_early_stop(","object_usage_linter" +"tests/testthat/test_basic.R",1758,10,"style","Variable and function name style should be snake_case or symbols."," mode(X) <- data_mode","object_name_linter" +"tests/testthat/test_basic.R",2591,5,"style","Variable and function name style should be snake_case or symbols."," X[, 1L] <- rnorm(100L)","object_name_linter" +"tests/testthat/test_basic.R",2592,5,"style","Variable and function name style should be snake_case or symbols."," X[, 2L] <- sample(seq_len(4L), size = 100L, replace = TRUE)","object_name_linter" +"tests/testthat/test_Predictor.R",51,18,"style","Variable and function name style should be snake_case or symbols."," storage.mode(X_double) <- ""double""","object_name_linter" +"tests/testthat/test_Predictor.R",310,15,"style","Variable and function name style should be snake_case or symbols."," row.names(Xcopy) <- NULL","object_name_linter" +"tests/testthat/test_Predictor.R",327,15,"style","Variable and function name style should be snake_case or symbols."," row.names(Xcopy) <- NULL","object_name_linter" +"tests/testthat/test_Predictor.R",358,15,"style","Variable and function name style should be snake_case or symbols."," row.names(X) <- paste(""rname"", seq(1L, nrow(X)), sep = """")","object_name_linter" +"tests/testthat/test_Predictor.R",373,15,"style","Variable and function name style should be snake_case or symbols."," row.names(X) <- paste(""rname"", seq(1L, nrow(X)), sep = """")","object_name_linter" +"vignettes/basic_walkthrough.Rmd",59,1,"style","Variable and function name style should be snake_case or symbols.","X <- data.matrix(bank[, c(""age"", ""balance"")])","object_name_linter" diff --git a/.dev/revdep_emails/lightgbm/email-body b/.dev/revdep_emails/lightgbm/email-body new file mode 100644 index 000000000..0421723fa --- /dev/null +++ b/.dev/revdep_emails/lightgbm/email-body @@ -0,0 +1,29 @@ +Hello Yu Shi! Thank you for using {lintr} in your package {lightgbm}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/microsoft/LightGBM (hash: 27d9ad2e8e7ea2d00dbab7b17b0a34b5d9184fe0) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 78s on CRAN vs. 40s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/mlflow/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/mlflow/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..9386eedd9 --- /dev/null +++ b/.dev/revdep_emails/mlflow/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,3 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/tracking-rest.R",34,13,"style","Variable and function name style should be snake_case."," headers$Authorization <- auth_header","object_name_linter" +"R/tracking-rest.R",36,11,"style","Variable and function name style should be snake_case."," headers$`User-Agent` <- paste(""mlflow-r-client"", utils::packageVersion(""mlflow""), sep = ""/"")","object_name_linter" diff --git a/.dev/revdep_emails/mlflow/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/mlflow/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..6262bcd68 --- /dev/null +++ b/.dev/revdep_emails/mlflow/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,12 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/model.R",39,12,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," tryCatch({ mlflow_record_logged_model(model_spec) }, error = function(e) {","brace_linter" +"R/model.R",198,47,"style","Put spaces around all infix operators.","parse_json <- function(input_path, json_format=""split"") {","infix_spaces_linter" +"R/project-param.R",54,13,"style","Any function spanning multiple lines should use curly braces."," error = function(e) stop(""`default` value for `"", name, ""` cannot be casted to type "",","brace_linter" +"R/project-param.R",60,13,"style","Any function spanning multiple lines should use curly braces."," error = function(e) stop(""Provided value for `"", name,","brace_linter" +"R/project-param.R",76,9,"style","Compound semicolons are discouraged. Replace them by a newline."," i <- 0; n <- length(arguments)","semicolon_linter" +"R/tracking-observer.R",41,31,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," error = function(e) { }","brace_linter" +"R/tracking-observer.R",41,33,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," error = function(e) { }","brace_linter" +"R/tracking-rest.R",50,49,"style","Put spaces around all infix operators."," max_rate_limit_interval=60) {","infix_spaces_linter" +"tests/testthat/test-databricks-utils.R",35,66,"style","Any function spanning multiple lines should use curly braces."," with_mock(.env = ""mlflow"", get_databricks_config_for_profile = function(profile) list(","brace_linter" +"tests/testthat/test-databricks-utils.R",187,42,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," assign("".get_job_info"", function() { job_info }, envir = databricks_internal_env)","brace_linter" +"tests/testthat/test-ui.R",12,3,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","brace_linter" diff --git a/.dev/revdep_emails/mlflow/attachments/mlflow.warnings b/.dev/revdep_emails/mlflow/attachments/mlflow.warnings new file mode 100644 index 000000000..e85af501f --- /dev/null +++ b/.dev/revdep_emails/mlflow/attachments/mlflow.warnings @@ -0,0 +1,2 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Trying to remove β€˜closed_curly_linter’, β€˜open_curly_linter’ and β€˜absolute_paths_linter’, which are not in `defaults`. diff --git a/.dev/revdep_emails/mlflow/email-body b/.dev/revdep_emails/mlflow/email-body new file mode 100644 index 000000000..2bd9dbe8c --- /dev/null +++ b/.dev/revdep_emails/mlflow/email-body @@ -0,0 +1,29 @@ +Hello Matei Zaharia! Thank you for using {lintr} in your package {mlflow}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/mlflow/mlflow (hash: f5d38bd934cf63c16cf10d8ff5bcebcd3b72aec3) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 31s on CRAN vs. 19s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/mlr/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/mlr/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..52bb8b49d --- /dev/null +++ b/.dev/revdep_emails/mlr/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,152 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/analyzeFeatSelResult.R",49,6,"style","Variable and function name style should be snake_case or CamelCase."," df$n.feats = rowSums(df[, features, drop = FALSE])","object_name_linter" +"R/BaggingWrapper.R",50,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$bw.iters = bw.iters","object_name_linter" +"R/BaggingWrapper.R",54,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$bw.replace = bw.replace","object_name_linter" +"R/BaggingWrapper.R",58,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$bw.size = bw.size","object_name_linter" +"R/BaggingWrapper.R",62,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$bw.feats = bw.feats","object_name_linter" +"R/BaseEnsemble_operators.R",69,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$base.learners = lapply(lrn$base.learners, setPredictType, predict.type = predict.type)","object_name_linter" +"R/BaseEnsemble.R",66,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$base.learners = setNames(base.learners, ids)","object_name_linter" +"R/BaseEnsemble.R",67,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$par.set.bls = par.set.bls","object_name_linter" +"R/BaseEnsemble.R",68,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$par.set.ens = par.set","object_name_linter" +"R/BaseWrapper_operators.R",2,1,"style","Variable and function name style should be snake_case or CamelCase.","getParamSet.BaseWrapper = function(x) {","object_name_linter" +"R/BaseWrapper.R",41,11,"style","Variable and function name style should be snake_case or CamelCase."," learner$fix.factors.prediction = FALSE","object_name_linter" +"R/BaseWrapper.R",43,11,"style","Variable and function name style should be snake_case or CamelCase."," learner$model.subclass = model.subclass","object_name_linter" +"R/BenchmarkResultOrderLevels.R",11,8,"style","Variable and function name style should be snake_case or CamelCase."," df$task.id = factor(df$task.id, order.tsks)","object_name_linter" +"R/BenchmarkResultOrderLevels.R",26,8,"style","Variable and function name style should be snake_case or CamelCase."," df$learner.id = factor(df$learner.id, order.lrns)","object_name_linter" +"R/calculateConfusionMatrix.R",118,12,"style","Variable and function name style should be snake_case or CamelCase."," result$relative.row = result.rel.row","object_name_linter" +"R/calculateConfusionMatrix.R",119,12,"style","Variable and function name style should be snake_case or CamelCase."," result$relative.col = result.rel.col","object_name_linter" +"R/calculateConfusionMatrix.R",120,12,"style","Variable and function name style should be snake_case or CamelCase."," result$relative.error = result$result[k + 1, k + 1] / n.pred","object_name_linter" +"R/ClassifTask.R",36,8,"style","Variable and function name style should be snake_case or CamelCase."," task$task.desc = makeClassifTaskDesc(id, data, target, weights, blocking, positive, coordinates)","object_name_linter" +"R/ClusterTask.R",16,8,"style","Variable and function name style should be snake_case or CamelCase."," task$task.desc = makeClusterTaskDesc(id, data, weights, blocking, coordinates)","object_name_linter" +"R/CostSensTask.R",45,8,"style","Variable and function name style should be snake_case or CamelCase."," task$task.desc = makeCostSensTaskDesc(id, data, target, blocking, costs, coordinates)","object_name_linter" +"R/CostSensWeightedPairsWrapper.R",61,15,"style","Variable and function name style should be snake_case or CamelCase."," feats$..y.. = y","object_name_linter" +"R/createSpatialResamplingPlots.R",153,5,"style","Variable and function name style should be snake_case or CamelCase."," length.n.resamp = length(resample)","object_name_linter" +"R/createSpatialResamplingPlots.R",160,3,"style","Variable and function name style should be snake_case or CamelCase."," plot.list.out.all = lapply(resample, function(r) {","object_name_linter" +"R/createSpatialResamplingPlots.R",171,5,"style","Variable and function name style should be snake_case or CamelCase."," plot.list.out = imap(plot.list, function(.x, .y) {","object_name_linter" +"R/downsample.R",37,7,"style","Variable and function name style should be snake_case or CamelCase."," obj$train.inds = lapply(obj$train.inds, function(x) sample(x, size = length(x) * perc))","object_name_linter" +"R/DownsampleWrapper.R",26,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$dw.perc = dw.perc","object_name_linter" +"R/DownsampleWrapper.R",30,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$dw.stratify = dw.stratify","object_name_linter" +"R/DownsampleWrapper.R",55,5,"style","Variable and function name style should be snake_case or CamelCase."," m$train.task = .task","object_name_linter" +"R/extractFDAFeatures.R",89,8,"style","Variable and function name style should be snake_case or CamelCase."," desc$extractFDAFeat = Map(function(x) {","object_name_linter" +"R/extractFDAFeatures.R",102,8,"style","Variable and function name style should be snake_case or CamelCase."," desc$fd.cols = names(desc$extractFDAFeat)","object_name_linter" +"R/extractFDAFeatures.R",115,8,"style","Variable and function name style should be snake_case or CamelCase."," desc$extractFDAFeat = extracts","object_name_linter" +"R/FeatSelWrapper.R",71,5,"style","Variable and function name style should be snake_case or CamelCase."," x$opt.result = or","object_name_linter" +"R/FilterWrapper.R",168,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$more.args = ddd","object_name_linter" +"R/getHyperPars.R",43,26,"style","Variable and function name style should be snake_case or CamelCase."," learner$par.set$pars$fw.base.methods = NULL","object_name_linter" +"R/getHyperPars.R",44,26,"style","Variable and function name style should be snake_case or CamelCase."," learner$par.set$pars$fw.method = NULL","object_name_linter" +"R/getHyperPars.R",45,22,"style","Variable and function name style should be snake_case or CamelCase."," learner$par.vals$fw.method = NULL","object_name_linter" +"R/getHyperPars.R",46,22,"style","Variable and function name style should be snake_case or CamelCase."," learner$par.vals$fw.base.methods = NULL","object_name_linter" +"R/getHyperPars.R",49,39,"style","Variable and function name style should be snake_case or CamelCase."," learner$next.learner$par.set$pars$fw.base.methods = NULL","object_name_linter" +"R/getHyperPars.R",50,39,"style","Variable and function name style should be snake_case or CamelCase."," learner$next.learner$par.set$pars$fw.method = NULL","object_name_linter" +"R/getHyperPars.R",51,35,"style","Variable and function name style should be snake_case or CamelCase."," learner$next.learner$par.vals$fw.method = NULL","object_name_linter" +"R/getHyperPars.R",52,35,"style","Variable and function name style should be snake_case or CamelCase."," learner$next.learner$par.vals$fw.base.methods = NULL","object_name_linter" +"R/getMultilabelBinaryPerformances.R",39,20,"style","Variable and function name style should be snake_case or CamelCase."," predi$data$prob.TRUE = probs[, label]","object_name_linter" +"R/getParamSet.R",13,1,"style","Variable and function name style should be snake_case or CamelCase.","getParamSet.Learner = function(x) {","object_name_linter" +"R/getParamSet.R",18,1,"style","Variable and function name style should be snake_case or CamelCase.","getParamSet.character = function(x) {","object_name_linter" +"R/Impute.R",179,8,"style","Variable and function name style should be snake_case or CamelCase."," desc$recode.factor.levels = recode.factor.levels","object_name_linter" +"R/Impute.R",180,8,"style","Variable and function name style should be snake_case or CamelCase."," desc$impute.new.levels = impute.new.levels","object_name_linter" +"R/logFunOpt.R",9,5,"style","Variable and function name style should be snake_case or CamelCase."," start.time = Sys.time()","object_name_linter" +"R/logFunOpt.R",13,5,"style","Variable and function name style should be snake_case or CamelCase."," end.time = Sys.time()","object_name_linter" +"R/logFunOpt.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," start.time = Sys.time()","object_name_linter" +"R/logFunOpt.R",35,5,"style","Variable and function name style should be snake_case or CamelCase."," end.time = Sys.time()","object_name_linter" +"R/makeLearner.R",173,6,"style","Variable and function name style should be snake_case or CamelCase."," wl$fix.factors.prediction = fix.factors.prediction","object_name_linter" +"R/Measure_operators.R",22,11,"style","Variable and function name style should be snake_case or CamelCase."," measure$extra.args = insert(measure$extra.args, insert(par.vals, args))","object_name_linter" +"R/ModelMultiplexer.R",93,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$par.set = c(lrn$par.set, ps)","object_name_linter" +"R/ModelMultiplexer.R",94,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$par.set.ens = ps","object_name_linter" +"R/ModelMultiplexer.R",95,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$fix.factors.prediction = TRUE","object_name_linter" +"R/MultilabelNestedStackingWrapper.R",37,5,"style","Variable and function name style should be snake_case or CamelCase."," x$cv.folds = cv.folds","object_name_linter" +"R/MultilabelStackingWrapper.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," x$cv.folds = cv.folds","object_name_linter" +"R/MultilabelTask.R",34,8,"style","Variable and function name style should be snake_case or CamelCase."," task$task.desc = makeMultilabelTaskDesc(id, data, target, weights, blocking, coordinates)","object_name_linter" +"R/OptWrapper.R",8,5,"style","Variable and function name style should be snake_case or CamelCase."," x$opt.pars = par.set","object_name_linter" +"R/OptWrapper.R",9,5,"style","Variable and function name style should be snake_case or CamelCase."," x$bit.names = bit.names","object_name_linter" +"R/OptWrapper.R",10,5,"style","Variable and function name style should be snake_case or CamelCase."," x$bits.to.features = bits.to.features","object_name_linter" +"R/OptWrapper.R",11,5,"style","Variable and function name style should be snake_case or CamelCase."," x$opt.pars = par.set","object_name_linter" +"R/OptWrapper.R",13,5,"style","Variable and function name style should be snake_case or CamelCase."," x$show.info = show.info","object_name_linter" +"R/OverBaggingWrapper.R",48,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$obw.iters = obw.iters","object_name_linter" +"R/OverBaggingWrapper.R",52,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$obw.rate = obw.rate","object_name_linter" +"R/OverBaggingWrapper.R",56,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$obw.maxcl = obw.maxcl","object_name_linter" +"R/OverBaggingWrapper.R",60,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$obw.cl = obw.cl","object_name_linter" +"R/OverUndersampleWrapper.R",36,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$usw.rate = usw.rate","object_name_linter" +"R/OverUndersampleWrapper.R",40,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$usw.cl = usw.cl","object_name_linter" +"R/OverUndersampleWrapper.R",58,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$osw.rate = osw.rate","object_name_linter" +"R/OverUndersampleWrapper.R",62,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$osw.cl = osw.cl","object_name_linter" +"R/OverUndersampleWrapper.R",86,5,"style","Variable and function name style should be snake_case or CamelCase."," m$train.task = .task","object_name_linter" +"R/OverUndersampleWrapper.R",103,5,"style","Variable and function name style should be snake_case or CamelCase."," m$train.task = .task","object_name_linter" +"R/plotBMRRanksAsBarChart.R",39,6,"style","Variable and function name style should be snake_case or CamelCase."," df$learner.id = factor(rownames(df))","object_name_linter" +"R/plotCritDifferences.R",83,6,"style","Variable and function name style should be snake_case or CamelCase."," df$short.name = getBMRLearnerShortNames(bmr)","object_name_linter" +"R/plotLearnerPrediction.R",182,14,"style","Variable and function name style should be snake_case or CamelCase."," grid$.prob.pred.class = prob","object_name_linter" +"R/predict.R",101,5,"style","Variable and function name style should be snake_case or CamelCase."," time.predict = NA_real_","object_name_linter" +"R/predict.R",131,5,"style","Variable and function name style should be snake_case or CamelCase."," time.predict = measureTime(fun1({","object_name_linter" +"R/predict.R",142,7,"style","Variable and function name style should be snake_case or CamelCase."," time.predict = NA_real_","object_name_linter" +"R/Prediction.R",142,8,"style","Variable and function name style should be snake_case or CamelCase."," data$truth.time = truth[, 1L]","object_name_linter" +"R/Prediction.R",143,8,"style","Variable and function name style should be snake_case or CamelCase."," data$truth.event = truth[, 2L]","object_name_linter" +"R/RegrTask.R",27,8,"style","Variable and function name style should be snake_case or CamelCase."," task$task.desc = makeRegrTaskDesc(id, data, target, weights, blocking, coordinates)","object_name_linter" +"R/RemoveConstantFeaturesWrapper.R",18,10,"style","Variable and function name style should be snake_case or CamelCase."," args$dont.rm = union(args$dont.rm, target)","object_name_linter" +"R/ResampleDesc.R",123,5,"style","Variable and function name style should be snake_case or CamelCase."," d$stratify.cols = stratify.cols","object_name_linter" +"R/ResampleDesc.R",125,5,"style","Variable and function name style should be snake_case or CamelCase."," d$blocking.cv = blocking.cv","object_name_linter" +"R/ResampleInstance.R",92,10,"style","Variable and function name style should be snake_case or CamelCase."," inst$train.inds = lapply(inst$train.inds, function(i) sample(which(blocking %in% levs[i])))","object_name_linter" +"R/ResampleInstance.R",94,10,"style","Variable and function name style should be snake_case or CamelCase."," inst$test.inds = lapply(inst$train.inds, function(x) setdiff(ti, x))","object_name_linter" +"R/ResampleInstance.R",136,10,"style","Variable and function name style should be snake_case or CamelCase."," inst$train.inds = Reduce(function(i1, i2) Map(c, i1, i2), train.inds)","object_name_linter" +"R/ResampleInstance.R",137,10,"style","Variable and function name style should be snake_case or CamelCase."," inst$test.inds = Reduce(function(i1, i2) Map(c, i1, i2), test.inds)","object_name_linter" +"R/ResampleInstances.R",50,5,"style","Variable and function name style should be snake_case or CamelCase."," length.test.inds = unlist(lapply(test.inds, function(x) length(x)))","object_name_linter" +"R/ResampleResult_operators.R",149,11,"style","Variable and function name style should be snake_case or CamelCase."," res$measures.train = cbind(res$measures.train, perf$train[, missing.measures, drop = FALSE])","object_name_linter" +"R/ResampleResult_operators.R",154,11,"style","Variable and function name style should be snake_case or CamelCase."," res$measures.test = cbind(res$measures.test, perf$test[, missing.measures, drop = FALSE])","object_name_linter" +"R/RLearner_classif_h2odeeplearning.R",252,7,"style","Variable and function name style should be snake_case or CamelCase."," d$.mlr.weights = .weights","object_name_linter" +"R/RLearner_classif_h2oglm.R",47,7,"style","Variable and function name style should be snake_case or CamelCase."," d$.mlr.weights = .weights","object_name_linter" +"R/RLearner_regr_h2odeeplearning.R",253,7,"style","Variable and function name style should be snake_case or CamelCase."," d$.mlr.weights = .weights","object_name_linter" +"R/RLearner_regr_h2oglm.R",45,7,"style","Variable and function name style should be snake_case or CamelCase."," d$.mlr.weights = .weights","object_name_linter" +"R/RLearner_regr_km.R",54,10,"style","Variable and function name style should be snake_case or CamelCase."," args$nugget.stability = NULL","object_name_linter" +"R/RLearner.R",92,11,"style","Variable and function name style should be snake_case or CamelCase."," learner$short.name = short.name","object_name_linter" +"R/RLearner.R",95,11,"style","Variable and function name style should be snake_case or CamelCase."," learner$help.list = makeParamHelpList(callees, package, par.set)","object_name_linter" +"R/RLearner.R",113,11,"style","Variable and function name style should be snake_case or CamelCase."," lrn$class.weights.param = class.weights.param","object_name_linter" +"R/SMOTEWrapper.R",42,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$sw.rate = sw.rate","object_name_linter" +"R/SMOTEWrapper.R",46,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$sw.nn = sw.nn","object_name_linter" +"R/SMOTEWrapper.R",49,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$sw.standardize = sw.standardize","object_name_linter" +"R/SMOTEWrapper.R",52,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$sw.alt.logic = sw.alt.logic","object_name_linter" +"R/StackedLearner.R",153,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$fix.factors.prediction = TRUE","object_name_linter" +"R/StackedLearner.R",154,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$use.feat = use.feat","object_name_linter" +"R/StackedLearner.R",157,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$super.learner = super.learner","object_name_linter" +"R/SurvTask.R",48,8,"style","Variable and function name style should be snake_case or CamelCase."," task$task.desc = makeSurvTaskDesc(id, data, target, weights, blocking, coordinates)","object_name_linter" +"R/Task_operators.R",460,8,"style","Variable and function name style should be snake_case or CamelCase."," task$task.desc = switch(td$type,","object_name_linter" +"R/train.R",81,5,"style","Variable and function name style should be snake_case or CamelCase."," time.train = 0","object_name_linter" +"R/train.R",105,5,"style","Variable and function name style should be snake_case or CamelCase."," time.train = measureTime(fun1({","object_name_linter" +"R/TuneControlIrace.R",45,18,"style","Variable and function name style should be snake_case or CamelCase."," x$extra.args$maxExperiments = asCount(x$extra.args$maxExperiments)","object_name_linter" +"R/TuneControlIrace.R",55,18,"style","Variable and function name style should be snake_case or CamelCase."," x$extra.args$maxExperiments = x$budget","object_name_linter" +"R/TuneControlMBO.R",58,5,"style","Variable and function name style should be snake_case or CamelCase."," x$mbo.control = mbo.control","object_name_linter" +"R/TuneControlMBO.R",60,5,"style","Variable and function name style should be snake_case or CamelCase."," x$mbo.design = mbo.design","object_name_linter" +"R/tuneIrace.R",26,22,"style","Variable and function name style should be snake_case or CamelCase."," control$extra.args$n.instances = NULL","object_name_linter" +"R/tuneIrace.R",28,22,"style","Variable and function name style should be snake_case or CamelCase."," control$extra.args$show.irace.output = NULL","object_name_linter" +"R/TuneMultiCritControlMBO.R",37,5,"style","Variable and function name style should be snake_case or CamelCase."," x$mbo.control = mbo.control","object_name_linter" +"R/TuneMultiCritControlMBO.R",39,5,"style","Variable and function name style should be snake_case or CamelCase."," x$mbo.design = mbo.design","object_name_linter" +"R/TuneWrapper.R",72,5,"style","Variable and function name style should be snake_case or CamelCase."," x$opt.result = or","object_name_linter" +"R/utils_opt.R",11,13,"style","Variable and function name style should be snake_case or CamelCase."," control$impute.val = vnapply(measures, getDefVal)","object_name_linter" +"R/utils.R",35,1,"style","Variable and function name style should be snake_case or CamelCase.","print.mlr.dump = function(x, ...) {","object_name_linter" +"R/WeightedClassesWrapper.R",92,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$wcw.weight = wcw.weight","object_name_linter" +"R/WeightedClassesWrapper.R",100,5,"style","Variable and function name style should be snake_case or CamelCase."," x$wcw.param = wcw.param","object_name_linter" +"R/zzz.R",15,1,"style","Variable and function name style should be snake_case or CamelCase.",".onLoad = function(libname, pkgname) {","object_name_linter" +"R/zzz.R",20,1,"style","Variable and function name style should be snake_case or CamelCase.",".onAttach = function(libname, pkgname) {","object_name_linter" +"R/zzz.R",34,5,"style","Variable and function name style should be snake_case or CamelCase.","mlr$learner.properties = list(","object_name_linter" +"tests/testthat/helper_lint.R",279,13,"style","Variable and function name style should be snake_case or CamelCase."," linters$T.and.F.symbol = lintr::T_and_F_symbol_linter","object_name_linter" +"tests/testthat/helper_lint.R",282,13,"style","Variable and function name style should be snake_case or CamelCase."," linters$semicolon.terminator = lintr::semicolon_terminator_linter","object_name_linter" +"tests/testthat/helper_lint.R",288,13,"style","Variable and function name style should be snake_case or CamelCase."," linters$unneeded.concatenation = lintr::unneeded_concatenation_linter","object_name_linter" +"tests/testthat/test_base_BaseWrapper.R",34,41,"style","Place a space before left parenthesis, except in a function call."," makeDiscreteParam(""C"", values = 2^(-2:2)),","spaces_left_parentheses_linter" +"tests/testthat/test_base_BaseWrapper.R",35,45,"style","Place a space before left parenthesis, except in a function call."," makeDiscreteParam(""sigma"", values = 2^(-2:2))","spaces_left_parentheses_linter" +"tests/testthat/test_base_BaseWrapper.R",63,43,"style","Place a space before left parenthesis, except in a function call."," makeDiscreteParam(""C"", values = 2^(-2:2)),","spaces_left_parentheses_linter" +"tests/testthat/test_base_BaseWrapper.R",64,47,"style","Place a space before left parenthesis, except in a function call."," makeDiscreteParam(""sigma"", values = 2^(-2:2))","spaces_left_parentheses_linter" +"tests/testthat/test_base_generateHyperParsEffect.R",35,55,"style","Place a space before left parenthesis, except in a function call."," ps = makeParamSet(makeDiscreteParam(""C"", values = 2^(-2:2)))","spaces_left_parentheses_linter" +"tests/testthat/test_base_measures.R",202,3,"style","Variable and function name style should be snake_case or CamelCase."," time.surv = c(5, 10, 5, 10)","object_name_linter" +"tests/testthat/test_base_MulticlassWrapper.R",46,6,"style","Variable and function name style should be snake_case or CamelCase."," df$Sepal.Length = factor(df$Sepal.Length)","object_name_linter" +"tests/testthat/test_base_plotCritDifferences.R",33,5,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" +"tests/testthat/test_base_selectFeatures.R",17,8,"style","Variable and function name style should be snake_case or CamelCase."," ctrl$impute.val = 10","object_name_linter" +"tests/testthat/test_base_tuning.R",34,8,"style","Variable and function name style should be snake_case or CamelCase."," ctrl$impute.val = 10","object_name_linter" +"tests/testthat/test_base_tuning.R",192,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$par.set = c(lrn$par.set, long.learner.params)","object_name_linter" +"tests/testthat/test_classif_ksvm.R",26,10,"style","Variable and function name style should be snake_case or CamelCase."," pars$prob.model = TRUE","object_name_linter" +"tests/testthat/test_classif_pamr.R",20,14,"style","Variable and function name style should be snake_case or CamelCase."," parset$threshold.predict = NULL","object_name_linter" +"tests/testthat/test_regr_frbs.R",20,10,"style","Variable and function name style should be snake_case or CamelCase."," pars$data.train = regr.num.train","object_name_linter" +"tests/testthat/test_regr_mob.R",33,12,"style","Variable and function name style should be snake_case or CamelCase."," parset$term.feats = parset$part.feats = NULL","object_name_linter" +"tests/testthat/test_regr_mob.R",33,32,"style","Variable and function name style should be snake_case or CamelCase."," parset$term.feats = parset$part.feats = NULL","object_name_linter" +"tests/testthat/test_tune_tuneDesign.R",6,3,"style","Variable and function name style should be snake_case or CamelCase."," sigma.seq = 2^seq(-2, 2, length.out = reso)","object_name_linter" +"tests/testthat/test_tune_tuneGrid.R",6,3,"style","Variable and function name style should be snake_case or CamelCase."," sigma.seq = 2^seq(-2, 2, length.out = reso)","object_name_linter" +"tests/testthat/test_tune_tuneGrid.R",7,3,"style","Variable and function name style should be snake_case or CamelCase."," sigma.seq.2 = 2^seq(-2, 2, length.out = reso * 2)","object_name_linter" +"tests/testthat/test_tune_tuneGrid.R",41,7,"style","Variable and function name style should be snake_case or CamelCase."," op1$exec.time = op2$exec.time = NULL","object_name_linter" +"tests/testthat/test_tune_tuneGrid.R",41,23,"style","Variable and function name style should be snake_case or CamelCase."," op1$exec.time = op2$exec.time = NULL","object_name_linter" diff --git a/.dev/revdep_emails/mlr/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/mlr/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..819f871a1 --- /dev/null +++ b/.dev/revdep_emails/mlr/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,791 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/makeData.R",96,1,"style","Variable and function name style should be snake_case or CamelCase.","fuelSubset$UVVIS = scale(fuelSubset$UVVIS, scale = FALSE)","object_name_linter" +"inst/makeData.R",97,1,"style","Variable and function name style should be snake_case or CamelCase.","fuelSubset$NIR = scale(fuelSubset$NIR, scale = FALSE)","object_name_linter" +"R/analyzeFeatSelResult.R",95,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.na(ctrl$max.features) & (length(x) == ctrl$max.features)) {","vector_logic_linter" +"R/batchmark.R",59,5,"style","Variable and function name style should be snake_case or CamelCase."," apply.fun = getAlgoFun(learner, measures, models, keep.extract)","object_name_linter" +"R/benchmark.R",67,11,"style","Variable and function name style should be snake_case or CamelCase."," names(results.by.task[[taskname]]) = grid$learner[grid$task == taskname]","object_name_linter" +"R/BenchmarkResult_operators.R",125,7,"style","Variable and function name style should be snake_case or CamelCase."," drop.tasks = length(task.ids) == 1L","object_name_linter" +"R/BenchmarkResult_operators.R",126,7,"style","Variable and function name style should be snake_case or CamelCase."," drop.learners = length(learner.ids) == 1L","object_name_linter" +"R/BenchmarkResult_operators.R",127,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (drop.tasks | drop.learners) {","vector_logic_linter" +"R/BenchmarkResult_operators.R",129,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (drop.tasks & drop.learners) {","vector_logic_linter" +"R/BenchmarkResult_operators.R",132,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (drop.tasks & !drop.learners) {","vector_logic_linter" +"R/BenchmarkResult_operators.R",135,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!drop.tasks & drop.learners) {","vector_logic_linter" +"R/calculateConfusionMatrix.R",83,3,"style","Variable and function name style should be snake_case or CamelCase."," row.err = rowSums(mt)","object_name_linter" +"R/calculateConfusionMatrix.R",84,3,"style","Variable and function name style should be snake_case or CamelCase."," col.err = colSums(mt)","object_name_linter" +"R/calculateConfusionMatrix.R",158,5,"style","Variable and function name style should be snake_case or CamelCase."," col.err = x$relative.col[k + 1, ]","object_name_linter" +"R/calculateConfusionMatrix.R",159,5,"style","Variable and function name style should be snake_case or CamelCase."," row.err = x$relative.row[, k + 1]","object_name_linter" +"R/calculateConfusionMatrix.R",183,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/checkLearner.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," missing.props = setdiff(props, learner.props)","object_name_linter" +"R/configureMlr.R",74,3,"style","Variable and function name style should be snake_case or CamelCase."," any.change = FALSE","object_name_linter" +"R/configureMlr.R",78,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" +"R/configureMlr.R",83,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" +"R/configureMlr.R",88,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" +"R/configureMlr.R",93,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" +"R/configureMlr.R",98,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" +"R/configureMlr.R",103,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" +"R/configureMlr.R",108,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" +"R/configureMlr.R",113,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" +"R/evalOptimizationState.R",15,3,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = control$log.fun","object_name_linter" +"R/evalOptimizationState.R",50,7,"style","Variable and function name style should be snake_case or CamelCase."," th.args$pred = r$pred","object_name_linter" +"R/evalOptimizationState.R",51,7,"style","Variable and function name style should be snake_case or CamelCase."," th.args$measure = measures[[1L]]","object_name_linter" +"R/extractFDAFeatures.R",68,3,"style","Variable and function name style should be snake_case or CamelCase."," all.fds = which(names(feat.methods) == ""all"")","object_name_linter" +"R/extractFDAFeatures.R",71,5,"style","Variable and function name style should be snake_case or CamelCase."," feat.methods[all.fds] = NULL","object_name_linter" +"R/extractFDAFeaturesMethods.R",389,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(refs) | is.integer(refs)) {","vector_logic_linter" +"R/extractFDAFeaturesMethods.R",526,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(dim(df)) | vals$res.level == 1L) {","vector_logic_linter" +"R/FeatSelControl.R",106,3,"style","Variable and function name style should be snake_case or CamelCase."," max.features = asCount(max.features, na.ok = TRUE, positive = TRUE)","object_name_linter" +"R/FeatSelControl.R",108,5,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = logFunFeatSel","object_name_linter" +"R/FeatSelControl.R",110,5,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = logFunTuneMemory","object_name_linter" +"R/FeatSelControlExhaustive.R",5,3,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = ""default"") {","object_name_linter" +"R/FeatSelControlGA.R",4,24,"style","Variable and function name style should be snake_case or CamelCase."," maxit = NA_integer_, max.features = NA_integer_, comma = FALSE, mu = 10L, lambda,","object_name_linter" +"R/FeatSelControlGA.R",6,3,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = ""default"") {","object_name_linter" +"R/FeatSelControlSequential.R",4,53,"style","Variable and function name style should be snake_case or CamelCase."," alpha = 0.01, beta = -0.001, maxit = NA_integer_, max.features = NA_integer_,","object_name_linter" +"R/FilterEnsemble.R",56,3,"warning","local variable β€˜tag2df’ assigned but may not be used"," tag2df = function(tags, prefix = """") {","object_usage_linter" +"R/FilterEnsemble.R",113,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(fval.ens) = c(""name"", ""value"")","object_name_linter" +"R/FilterEnsemble.R",117,5,"style","Variable and function name style should be snake_case or CamelCase."," fval.ens$filter = ""E-min""","object_name_linter" +"R/FilterEnsemble.R",146,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(fval.ens) = c(""name"", ""value"")","object_name_linter" +"R/FilterEnsemble.R",150,5,"style","Variable and function name style should be snake_case or CamelCase."," fval.ens$filter = ""E-mean""","object_name_linter" +"R/FilterEnsemble.R",180,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(fval.ens) = c(""name"", ""value"")","object_name_linter" +"R/FilterEnsemble.R",184,5,"style","Variable and function name style should be snake_case or CamelCase."," fval.ens$filter = ""E-max""","object_name_linter" +"R/FilterEnsemble.R",213,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(fval.ens) = c(""name"", ""value"")","object_name_linter" +"R/FilterEnsemble.R",217,5,"style","Variable and function name style should be snake_case or CamelCase."," fval.ens$filter = ""E-median""","object_name_linter" +"R/FilterEnsemble.R",250,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(fval.ens) = c(""name"", ""value"")","object_name_linter" +"R/FilterEnsemble.R",254,5,"style","Variable and function name style should be snake_case or CamelCase."," fval.ens$filter = ""E-Borda""","object_name_linter" +"R/FilterEnsemble.R",290,3,"style","Variable and function name style should be snake_case or CamelCase."," all.filters = rbind(simple_filters, ensemble_filters)","object_name_linter" +"R/filterFeatures.R",170,22,"warning","no visible binding for global variable β€˜value’"," order(filter, -value)), ][[""value""]]), fun.args))","object_usage_linter" +"R/filterFeatures.R",191,47,"warning","no visible binding for global variable β€˜value’"," features = fval[with(fval, order(filter, -value)), ]","object_usage_linter" +"R/filterFeatures.R",206,3,"style","Variable and function name style should be snake_case or CamelCase."," sum.null = sum(!is.null(perc), !is.null(abs), !is.null(threshold), !is.null(fun))","object_name_linter" +"R/friedmanPostHocTestBMR.R",74,3,"style","Variable and function name style should be snake_case or CamelCase."," q.nemenyi = qtukey(1 - p.value, n.learners, 1e+06) / sqrt(2L)","object_name_linter" +"R/friedmanPostHocTestBMR.R",76,3,"style","Variable and function name style should be snake_case or CamelCase."," q.bd = qtukey(1L - (p.value / (n.learners - 1L)), 2L, 1e+06) / sqrt(2L)","object_name_linter" +"R/generateCalibration.R",101,7,"style","Variable and function name style should be snake_case or CamelCase."," break.points = hist(df$Probability, breaks = breaks, plot = FALSE)$breaks","object_name_linter" +"R/generateCalibration.R",121,3,"style","Variable and function name style should be snake_case or CamelCase."," max.bin = sapply(stri_split(levels(proportion$bin), regex = "",|]|\\)""),","object_name_linter" +"R/generateCalibration.R",201,5,"style","Variable and function name style should be snake_case or CamelCase."," top.data$x = jitter(as.numeric(top.data$bin))","object_name_linter" +"R/generateCalibration.R",204,5,"style","Variable and function name style should be snake_case or CamelCase."," bottom.data$x = jitter(as.numeric(bottom.data$bin))","object_name_linter" +"R/generateFilterValues.R",141,7,"style","Variable and function name style should be snake_case or CamelCase."," missing.score = setdiff(fn, names(x))","object_name_linter" +"R/generateFilterValues.R",165,44,"warning","no visible binding for global variable β€˜value’"," print(x$data[with(x$data, order(filter, -value)), ])","object_usage_linter" +"R/generateHyperParsEffect.R",304,7,"style","Variable and function name style should be snake_case or CamelCase."," col.name = stri_split_fixed(col, "".test.mean"", omit_empty = TRUE)[[1]]","object_name_linter" +"R/generateHyperParsEffect.R",353,9,"style","Variable and function name style should be snake_case or CamelCase."," col.name = stri_split_fixed(col, "".test.mean"", omit_empty = TRUE)[[1]]","object_name_linter" +"R/generateLearningCurve.R",135,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((color == ""learner"" & nlearn == 1L) | (color == ""measure"" & nmeas == 1L)) {","vector_logic_linter" +"R/generateLearningCurve.R",135,43,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((color == ""learner"" & nlearn == 1L) | (color == ""measure"" & nmeas == 1L)) {","vector_logic_linter" +"R/generateLearningCurve.R",135,65,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((color == ""learner"" & nlearn == 1L) | (color == ""measure"" & nmeas == 1L)) {","vector_logic_linter" +"R/generateLearningCurve.R",138,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((facet == ""learner"" & nlearn == 1L) | (facet == ""measure"" & nmeas == 1L)) {","vector_logic_linter" +"R/generateLearningCurve.R",138,43,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((facet == ""learner"" & nlearn == 1L) | (facet == ""measure"" & nmeas == 1L)) {","vector_logic_linter" +"R/generateLearningCurve.R",138,65,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((facet == ""learner"" & nlearn == 1L) | (facet == ""measure"" & nmeas == 1L)) {","vector_logic_linter" +"R/generatePartialDependence.R",113,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (obj$learner$predict.type == ""se"" & individual) {","vector_logic_linter" +"R/generatePartialDependence.R",116,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (obj$learner$predict.type == ""se"" & derivative) {","vector_logic_linter" +"R/generatePartialDependence.R",144,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (derivative & interaction) {","vector_logic_linter" +"R/generatePartialDependence.R",166,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(names(test.fun)) & !individual) {","vector_logic_linter" +"R/generatePartialDependence.R",406,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (obj$interaction & length(obj$features) > 2L & geom != ""tile"") {","vector_logic_linter" +"R/generatePartialDependence.R",406,51,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (obj$interaction & length(obj$features) > 2L & geom != ""tile"") {","vector_logic_linter" +"R/generatePartialDependence.R",444,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(features) > 1L & !(length(features) == 2L & geom == ""tile"")) {","vector_logic_linter" +"R/generatePartialDependence.R",444,58,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(features) > 1L & !(length(features) == 2L & geom == ""tile"")) {","vector_logic_linter" +"R/generatePartialDependence.R",497,53,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (obj$task.desc$type %in% c(""regr"", ""surv"") |","vector_logic_linter" +"R/generatePartialDependence.R",498,42,"warning","Conditional expressions require scalar logical operators (&& and ||)"," (obj$task.desc$type == ""classif"" & length(obj$task.desc$class.levels) <= 2L)) {","vector_logic_linter" +"R/generatePartialDependence.R",506,53,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (obj$task.desc$type %in% c(""regr"", ""surv"") |","vector_logic_linter" +"R/generatePartialDependence.R",507,42,"warning","Conditional expressions require scalar logical operators (&& and ||)"," (obj$task.desc$type == ""classif"" & length(obj$task.desc$class.levels) <= 2L)) {","vector_logic_linter" +"R/generateThreshVsPerf.R",203,3,"style","`else` should come on the same line as the previous `}`."," else if (length(obj$measures) == 1L) {","brace_linter" +"R/getCaretParamSet.R",95,5,"style","Variable and function name style should be snake_case or CamelCase."," par.vals[vlapply(par.vals, testIntegerish)] =","object_name_linter" +"R/getNestedTuneResults.R",53,5,"style","Variable and function name style should be snake_case or CamelCase."," op.dfs[[i]][, ""iter""] = i","object_name_linter" +"R/getResamplingIndices.R",42,5,"style","Variable and function name style should be snake_case or CamelCase."," outer.inds = object$pred$instance[c(""train.inds"", ""test.inds"")]","object_name_linter" +"R/helpers_FDGAMBoost.R",46,11,"style","Variable and function name style should be snake_case or CamelCase."," names(fd.grids) = fdns","object_name_linter" +"R/helpers_FDGAMBoost.R",55,7,"warning","local variable β€˜gn’ assigned but may not be used"," gn = stri_paste(fdn, "".grid"")","object_usage_linter" +"R/helpers_FDGAMBoost.R",57,7,"style","Variable and function name style should be snake_case or CamelCase."," mat.list[[fdn]] = mdata[, fdn]","object_name_linter" +"R/helpers_FDGAMBoost.R",81,3,"style","Variable and function name style should be snake_case or CamelCase."," mat.list[[targetname]] = mdata[, targetname]","object_name_linter" +"R/helpers_FDGAMBoost.R",112,11,"style","Variable and function name style should be snake_case or CamelCase."," names(fd.grids) = fdns","object_name_linter" +"R/helpers_FDGAMBoost.R",123,7,"style","Variable and function name style should be snake_case or CamelCase."," mat.list[[fdn]] = tdata[, fdn]","object_name_linter" +"R/helpers_FDGAMBoost.R",137,5,"style","Variable and function name style should be snake_case or CamelCase."," mat.list[[fsn]] = as.vector(as.matrix(tdata[, fsn, drop = FALSE]))","object_name_linter" +"R/helpers_FDGAMBoost.R",143,3,"style","Variable and function name style should be snake_case or CamelCase."," mat.list[[tn]] = tdata[, tn]","object_name_linter" +"R/helpers.R",59,11,"style","Variable and function name style should be snake_case or CamelCase."," attr(x, ""mlr.train.info"") = info","object_name_linter" +"R/helpers.R",113,3,"style","Variable and function name style should be snake_case or CamelCase."," meas.names[dupes] = new.names","object_name_linter" +"R/helpLearner.R",70,7,"style","Variable and function name style should be snake_case or CamelCase."," next.learner = current.learner$next.learner","object_name_linter" +"R/helpLearner.R",99,3,"style","Variable and function name style should be snake_case or CamelCase."," all.param = getParamIds(learner$par.set)","object_name_linter" +"R/helpLearner.R",217,11,"style","Variable and function name style should be snake_case or CamelCase."," help.list[[par.name]] = stri_join(""Argument of: "",","object_name_linter" +"R/Impute.R",257,9,"style","Variable and function name style should be snake_case or CamelCase."," names(dummy.cols) = sprintf(""%s.dummy"", desc$dummies)","object_name_linter" +"R/Learner_properties.R",86,3,"style","Variable and function name style should be snake_case or CamelCase."," all.props = c(listTaskTypes(), ""any"")","object_name_linter" +"R/Learner.R",7,11,"style","Variable and function name style should be snake_case or CamelCase."," names(par.vals) = character(0L)","object_name_linter" +"R/listLearners.R",6,3,"warning","local variable β€˜slots’ assigned but may not be used"," slots = c(""cl"", ""name"", ""short.name"", ""package"", ""properties"", ""note"")","object_usage_linter" +"R/Measure_colAUC.R",42,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (n1 > 0 & n2 > 0) {","vector_logic_linter" +"R/measures.R",808,3,"style","Variable and function name style should be snake_case or CamelCase."," class.values = seq_along(levels(truth)) - 1L","object_name_linter" +"R/measures.R",1450,5,"style","Variable and function name style should be snake_case or CamelCase."," max.time = assertNumber(extra.args$max.time, null.ok = TRUE) %??% max(getTaskTargets(task)[, 1L])","object_name_linter" +"R/measures.R",1471,5,"style","Variable and function name style should be snake_case or CamelCase."," max.time = assertNumber(extra.args$max.time, null.ok = TRUE) %??% max(getTaskTargets(task)[, 1L])","object_name_linter" +"R/measures.R",1499,5,"style","Variable and function name style should be snake_case or CamelCase."," max.time = extra.args$max.time %??% max(newdata[[tn[1L]]])","object_name_linter" +"R/mergeBenchmarkResults.R",40,3,"style","Variable and function name style should be snake_case or CamelCase."," all.combos = expand.grid(task.id = task.ids, learner.id = learner.ids)","object_name_linter" +"R/mergeBenchmarkResults.R",41,3,"style","Variable and function name style should be snake_case or CamelCase."," all.combos = stri_paste(all.combos$task.id, all.combos$learner.id, sep = "" - "")","object_name_linter" +"R/mergeBenchmarkResults.R",67,7,"style","Variable and function name style should be snake_case or CamelCase."," res.merged[[i]][[j]] = addRRMeasure(res.merged[[i]][[j]], measures.merged)","object_name_linter" +"R/ModelMultiplexerParamSet.R",69,7,"style","Variable and function name style should be snake_case or CamelCase."," for.learner = stri_replace(found, """", regex = long.pid.end)","object_name_linter" +"R/ModelMultiplexerParamSet.R",70,7,"style","Variable and function name style should be snake_case or CamelCase."," for.pars = pss[[for.learner]]$pars","object_name_linter" +"R/ModelMultiplexerParamSet.R",71,7,"style","Variable and function name style should be snake_case or CamelCase."," for.pars[[pid]] = p","object_name_linter" +"R/MulticlassWrapper.R",148,3,"style","Variable and function name style should be snake_case or CamelCase."," row.inds = lapply(binary.targets, function(v) which(v != 0))","object_name_linter" +"R/MulticlassWrapper.R",149,9,"style","Variable and function name style should be snake_case or CamelCase."," names(row.inds) = NULL","object_name_linter" +"R/MultilabelDBRWrapper.R",48,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(true.label.data) = setdiff(targets, tn)","object_name_linter" +"R/MultilabelDBRWrapper.R",51,5,"style","Variable and function name style should be snake_case or CamelCase."," models.meta[[tn]] = train(.learner$next.learner, ctask, weights = .weights)","object_name_linter" +"R/MultilabelNestedStackingWrapper.R",67,7,"style","Variable and function name style should be snake_case or CamelCase."," data.nst[[tnprevious]] = predlabel","object_name_linter" +"R/MultilabelStackingWrapper.R",77,12,"style","Variable and function name style should be snake_case or CamelCase."," colnames(pred.lvl1) = paste(.model$task.desc$target, "".1"", sep = """")","object_name_linter" +"R/options.R",11,9,"style","Variable and function name style should be snake_case or CamelCase."," names(mlr.options) = stri_sub(names(mlr.options), from = 5L)","object_name_linter" +"R/plotBMRBoxplots.R",41,13,"style","Variable and function name style should be snake_case or CamelCase."," names(learner.short.names) = learner.ids","object_name_linter" +"R/plotBMRRanksAsBarChart.R",33,18,"style","Variable and function name style should be snake_case or CamelCase."," pos = ""stack"", order.lrns = NULL, order.tsks = NULL, pretty.names = TRUE) {","object_name_linter" +"R/plotBMRRanksAsBarChart.R",33,37,"style","Variable and function name style should be snake_case or CamelCase."," pos = ""stack"", order.lrns = NULL, order.tsks = NULL, pretty.names = TRUE) {","object_name_linter" +"R/plotBMRRanksAsBarChart.R",50,11,"style","Variable and function name style should be snake_case or CamelCase."," names(learner.short.names) = learner.ids","object_name_linter" +"R/plotCritDifferences.R",117,5,"style","Variable and function name style should be snake_case or CamelCase."," nem.df$y = seq(from = 0.1, to = 0.35, length.out = dim(nem.df)[1])","object_name_linter" +"R/predict.R",111,5,"style","Variable and function name style should be snake_case or CamelCase."," debug.seed = getMlrOption(""debug.seed"", NULL)","object_name_linter" +"R/Prediction_operators.R",2,40,"style","Variable and function name style should be snake_case or CamelCase.","as.data.frame.Prediction = function(x, row.names = NULL, optional = FALSE, ...) {","object_name_linter" +"R/PreprocWrapperCaret.R",54,5,"style","Variable and function name style should be snake_case or CamelCase."," all.methods = c(","object_name_linter" +"R/PreprocWrapperCaret.R",102,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (par.vals$ppc.bagImpute | par.vals$ppc.knnImpute | par.vals$ppc.medianImpute) {","vector_logic_linter" +"R/PreprocWrapperCaret.R",102,55,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (par.vals$ppc.bagImpute | par.vals$ppc.knnImpute | par.vals$ppc.medianImpute) {","vector_logic_linter" +"R/relativeOverfitting.R",49,3,"warning","local variable β€˜mids’ assigned but may not be used"," mids = vcapply(measures, function(m) m$id)","object_usage_linter" +"R/relativeOverfitting.R",76,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.permuted$data = data.frame(truth = rep(c(predish$data$truth, pred.train$data$truth), each = nrows),","object_name_linter" +"R/resample.R",112,5,"style","Variable and function name style should be snake_case or CamelCase."," more.args$weights = weights","object_name_linter" +"R/resample.R",114,5,"style","Variable and function name style should be snake_case or CamelCase."," more.args$weights = getTaskWeights(task)","object_name_linter" +"R/resample.R",163,5,"style","Variable and function name style should be snake_case or CamelCase."," err.msgs[1L] = getFailureModelMsg(m)","object_name_linter" +"R/resample.R",164,5,"style","Variable and function name style should be snake_case or CamelCase."," err.dumps$train = getFailureModelDump(m)","object_name_linter" +"R/resample.R",182,35,"style","Variable and function name style should be snake_case or CamelCase."," if (!is.na(pred.train$error)) err.msgs[2L] = pred.train$error","object_name_linter" +"R/resample.R",184,11,"style","Variable and function name style should be snake_case or CamelCase."," names(ms.train) = vcapply(measures, measureAggrName)","object_name_linter" +"R/resample.R",185,5,"style","Variable and function name style should be snake_case or CamelCase."," err.dumps$predict.train = getPredictionDump(pred.train)","object_name_linter" +"R/resample.R",188,34,"style","Variable and function name style should be snake_case or CamelCase."," if (!is.na(pred.test$error)) err.msgs[2L] = pred.test$error","object_name_linter" +"R/resample.R",190,11,"style","Variable and function name style should be snake_case or CamelCase."," names(ms.test) = vcapply(measures, measureAggrName)","object_name_linter" +"R/resample.R",191,5,"style","Variable and function name style should be snake_case or CamelCase."," err.dumps$predict.test = getPredictionDump(pred.test)","object_name_linter" +"R/resample.R",200,35,"style","Variable and function name style should be snake_case or CamelCase."," if (!is.na(pred.train$error)) err.msgs[2L] = pred.train$error","object_name_linter" +"R/resample.R",202,11,"style","Variable and function name style should be snake_case or CamelCase."," names(ms.train) = vcapply(measures, measureAggrName)","object_name_linter" +"R/resample.R",203,5,"style","Variable and function name style should be snake_case or CamelCase."," err.dumps$predict.train = getPredictionDump(pred.train)","object_name_linter" +"R/resample.R",206,34,"style","Variable and function name style should be snake_case or CamelCase."," if (!is.na(pred.test$error)) err.msgs[2L] = paste(err.msgs[2L], pred.test$error)","object_name_linter" +"R/resample.R",208,11,"style","Variable and function name style should be snake_case or CamelCase."," names(ms.test) = vcapply(measures, measureAggrName)","object_name_linter" +"R/resample.R",209,5,"style","Variable and function name style should be snake_case or CamelCase."," err.dumps$predict.test = getPredictionDump(pred.test)","object_name_linter" +"R/resample.R",214,5,"style","Variable and function name style should be snake_case or CamelCase."," err.dumps$predict.train = NULL","object_name_linter" +"R/resample.R",215,5,"style","Variable and function name style should be snake_case or CamelCase."," err.dumps$predict.test = NULL","object_name_linter" +"R/resample.R",274,12,"style","Variable and function name style should be snake_case or CamelCase."," colnames(ms.test) = mids","object_name_linter" +"R/resample.R",275,12,"style","Variable and function name style should be snake_case or CamelCase."," rownames(ms.test) = NULL","object_name_linter" +"R/resample.R",277,12,"style","Variable and function name style should be snake_case or CamelCase."," colnames(ms.train) = mids","object_name_linter" +"R/resample.R",278,12,"style","Variable and function name style should be snake_case or CamelCase."," rownames(ms.train) = NULL","object_name_linter" +"R/resample.R",282,12,"style","Variable and function name style should be snake_case or CamelCase."," rownames(err.msgs) = NULL","object_name_linter" +"R/resample.R",283,12,"style","Variable and function name style should be snake_case or CamelCase."," colnames(err.msgs) = c(""train"", ""predict"")","object_name_linter" +"R/ResampleInstance.R",129,9,"style","Variable and function name style should be snake_case or CamelCase."," train.inds[[i]] = lapply(inst$train.inds, function(j) ci[j])","object_name_linter" +"R/ResampleInstance.R",130,9,"style","Variable and function name style should be snake_case or CamelCase."," test.inds[[i]] = lapply(inst$test.inds, function(j) ci[j])","object_name_linter" +"R/ResampleInstance.R",132,9,"style","Variable and function name style should be snake_case or CamelCase."," train.inds[[i]] = test.inds[[i]] = replicate(desc$iters, integer(0L), simplify = FALSE)","object_name_linter" +"R/ResampleInstance.R",132,27,"style","Variable and function name style should be snake_case or CamelCase."," train.inds[[i]] = test.inds[[i]] = replicate(desc$iters, integer(0L), simplify = FALSE)","object_name_linter" +"R/ResampleInstances.R",53,7,"style","Variable and function name style should be snake_case or CamelCase."," test.inds[[index]] = NULL","object_name_linter" +"R/ResampleResult_operators.R",102,7,"style","Variable and function name style should be snake_case or CamelCase."," p.split[[i]]$time = time[i]","object_name_linter" +"R/ResampleResult_operators.R",129,3,"style","Variable and function name style should be snake_case or CamelCase."," missing.measures = setdiff(measures.id, colnames(res$measures.test))","object_name_linter" +"R/RLearner_classif_dcSVM.R",44,5,"style","Variable and function name style should be snake_case or CamelCase."," max.levels = 1","object_name_linter" +"R/RLearner_classif_dcSVM.R",47,5,"style","Variable and function name style should be snake_case or CamelCase."," max.levels = pars$max.levels","object_name_linter" +"R/RLearner_classif_dcSVM.R",55,3,"style","Variable and function name style should be snake_case or CamelCase."," min.cluster = ceiling(5 * m / (k^max.levels))","object_name_linter" +"R/RLearner_classif_evtree.R",52,5,"warning","local variable β€˜p’ assigned but may not be used"," p = predict(.model$learner.model, newdata = .newdata, type = ""prob"", ...)","object_usage_linter" +"R/RLearner_classif_fdausc.kernel.R",43,3,"warning","local variable β€˜trainfun’ assigned but may not be used"," trainfun = getFromNamespace(""classif.kernel"", ""fda.usc"")","object_usage_linter" +"R/RLearner_classif_fdausc.kernel.R",44,3,"warning","local variable β€˜mod’ assigned but may not be used"," mod = do.call(""trainfun"",","object_usage_linter" +"R/RLearner_classif_fdausc.knn.R",37,3,"warning","local variable β€˜trainfun’ assigned but may not be used"," trainfun = getFromNamespace(""classif.knn"", ""fda.usc"")","object_usage_linter" +"R/RLearner_classif_fdausc.knn.R",39,3,"warning","local variable β€˜mod’ assigned but may not be used"," mod = suppressAll(do.call(""trainfun"",","object_usage_linter" +"R/RLearner_classif_fdausc.np.R",42,3,"warning","local variable β€˜trainfun’ assigned but may not be used"," trainfun = getFromNamespace(""classif.np"", ""fda.usc"")","object_usage_linter" +"R/RLearner_classif_featureless.R",22,3,"warning","local variable β€˜lvls’ assigned but may not be used"," lvls = getTaskClassLevels(.task)","object_usage_linter" +"R/RLearner_classif_fnn.R",32,11,"style","Variable and function name style should be snake_case or CamelCase."," attr(p, ""nn.index"") = NULL","object_name_linter" +"R/RLearner_classif_fnn.R",33,11,"style","Variable and function name style should be snake_case or CamelCase."," attr(p, ""nn.dist"") = NULL","object_name_linter" +"R/RLearner_classif_h2odeeplearning.R",271,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(p.df)[pcol] = stri_sub(colnames(p.df)[pcol], 2L)","object_name_linter" +"R/RLearner_classif_h2odeeplearning.R",277,5,"style","Variable and function name style should be snake_case or CamelCase."," p.df$predict = NULL","object_name_linter" +"R/RLearner_classif_h2ogbm.R",63,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(p.df)[pcol] = stri_sub(colnames(p.df)[pcol], 2L)","object_name_linter" +"R/RLearner_classif_h2ogbm.R",69,5,"style","Variable and function name style should be snake_case or CamelCase."," p.df$predict = NULL","object_name_linter" +"R/RLearner_classif_h2oglm.R",66,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(p.df)[pcol] = stri_sub(colnames(p.df)[pcol], 2L)","object_name_linter" +"R/RLearner_classif_h2oglm.R",72,5,"style","Variable and function name style should be snake_case or CamelCase."," p.df$predict = NULL","object_name_linter" +"R/RLearner_classif_h2orandomForest.R",55,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(p.df)[pcol] = stri_sub(colnames(p.df)[pcol], 2L)","object_name_linter" +"R/RLearner_classif_h2orandomForest.R",61,5,"style","Variable and function name style should be snake_case or CamelCase."," p.df$predict = NULL","object_name_linter" +"R/RLearner_classif_lvq1.R",20,3,"style","Variable and function name style should be snake_case or CamelCase."," cdbk.args$x = d$data","object_name_linter" +"R/RLearner_classif_lvq1.R",21,3,"style","Variable and function name style should be snake_case or CamelCase."," cdbk.args$cl = d$target","object_name_linter" +"R/RLearner_classif_lvq1.R",25,3,"style","Variable and function name style should be snake_case or CamelCase."," lvq.args$x = d$data","object_name_linter" +"R/RLearner_classif_lvq1.R",26,3,"style","Variable and function name style should be snake_case or CamelCase."," lvq.args$cl = d$target","object_name_linter" +"R/RLearner_classif_lvq1.R",27,3,"style","Variable and function name style should be snake_case or CamelCase."," lvq.args$codebk = codebk","object_name_linter" +"R/RLearner_regr_bcart.R",34,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(d$data, function(x) class(x))","object_name_linter" +"R/RLearner_regr_bcart.R",35,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" +"R/RLearner_regr_bcart.R",51,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(.newdata, function(x) class(x))","object_name_linter" +"R/RLearner_regr_bcart.R",52,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" +"R/RLearner_regr_btgp.R",42,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(d$data, function(x) class(x))","object_name_linter" +"R/RLearner_regr_btgp.R",43,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" +"R/RLearner_regr_btgp.R",59,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(.newdata, function(x) class(x))","object_name_linter" +"R/RLearner_regr_btgp.R",60,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" +"R/RLearner_regr_btgpllm.R",44,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(d$data, function(x) class(x))","object_name_linter" +"R/RLearner_regr_btgpllm.R",45,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" +"R/RLearner_regr_btgpllm.R",61,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(.newdata, function(x) class(x))","object_name_linter" +"R/RLearner_regr_btgpllm.R",62,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" +"R/RLearner_regr_btlm.R",36,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(d$data, function(x) class(x))","object_name_linter" +"R/RLearner_regr_btlm.R",37,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" +"R/RLearner_regr_btlm.R",53,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(.newdata, function(x) class(x))","object_name_linter" +"R/RLearner_regr_btlm.R",54,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" +"R/RLearner_regr_evtree.R",51,3,"warning","local variable β€˜p’ assigned but may not be used"," p = predict(.model$learner.model, newdata = .newdata, ...)","object_usage_linter" +"R/RLearner_regr_randomForest.R",88,3,"style","Variable and function name style should be snake_case or CamelCase."," single.model = getLearnerModel(.model)$single.model # get raw RF model","object_name_linter" +"R/RLearner_surv_gamboost.R",47,5,"warning","local variable β€˜model’ assigned but may not be used"," model = mboost::gamboost(f, data = data, control = ctrl, family = family, ...)","object_usage_linter" +"R/selectFeaturesGA.R",24,10,"style","Variable and function name style should be snake_case or CamelCase."," mode(pop.featmat) = ""integer""","object_name_linter" +"R/smote.R",79,9,"style","Variable and function name style should be snake_case or CamelCase."," x.min.matrix[, i] = as.numeric(as.integer(x.min.matrix[, i]))","object_name_linter" +"R/smote.R",85,16,"style","Variable and function name style should be snake_case or CamelCase."," storage.mode(x.min.matrix) = ""numeric""","object_name_linter" +"R/smote.R",100,13,"style","Variable and function name style should be snake_case or CamelCase."," x.scaled[, j] = (x.scaled[, j] != 0)","object_name_linter" +"R/smote.R",128,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/smote.R",131,10,"style","Variable and function name style should be snake_case or CamelCase."," diag(minclass.dist) = NA","object_name_linter" +"R/StackedLearner.R",106,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(resampling) & method != ""stack.cv"") {","vector_logic_linter" +"R/StackedLearner.R",124,55,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((method == ""average"" || method == ""hill.climb"") & (!is.null(super.learner) || is.null(predict.type))) {","vector_logic_linter" +"R/StackedLearner.R",127,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (method != ""average"" & method != ""hill.climb"" & is.null(super.learner)) {","vector_logic_linter" +"R/StackedLearner.R",127,52,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (method != ""average"" & method != ""hill.climb"" & is.null(super.learner)) {","vector_logic_linter" +"R/StackedLearner.R",132,55,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((method == ""average"" || method == ""hill.climb"") & use.feat) {","vector_logic_linter" +"R/StackedLearner.R",327,5,"style","Variable and function name style should be snake_case or CamelCase."," base.models[[i]] = model","object_name_linter" +"R/StackedLearner.R",349,5,"style","Variable and function name style should be snake_case or CamelCase."," base.models[[i]] = model","object_name_linter" +"R/StackedLearner.R",396,5,"style","Variable and function name style should be snake_case or CamelCase."," base.models[[i]] = train(bl, task)","object_name_linter" +"R/StackedLearner.R",475,5,"style","Variable and function name style should be snake_case or CamelCase."," base.models[[i]] = train(bl, task)","object_name_linter" +"R/StackedLearner.R",599,16,"style","Variable and function name style should be snake_case or CamelCase."," colnames(pred.return) = td$class.levels","object_name_linter" +"R/train.R",44,5,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," } # I believe this is a bug, see #2098","brace_linter" +"R/train.R",45,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/train.R",85,5,"style","Variable and function name style should be snake_case or CamelCase."," debug.seed = getMlrOption(""debug.seed"", NULL)","object_name_linter" +"R/train.R",113,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.levels = getTaskFactorLevels(task)","object_name_linter" +"R/tuneCMAES.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," ctrl.cmaes$lambda = 4 + floor(3 * log(N))","object_name_linter" +"R/tuneCMAES.R",42,3,"style","Variable and function name style should be snake_case or CamelCase."," ctrl.cmaes$maxit = maxit","object_name_linter" +"R/TuneControl.R",39,5,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = logFunTune","object_name_linter" +"R/TuneControl.R",41,5,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = logFunTuneMemory","object_name_linter" +"R/tuneIrace.R",37,3,"style","Variable and function name style should be snake_case or CamelCase."," log.file = tempfile()","object_name_linter" +"R/TuneMultiCritControl.R",47,5,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = logFunTune","object_name_linter" +"R/TuneMultiCritControl.R",49,5,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = logFunTuneMemory","object_name_linter" +"R/utils_imbalancy.R",7,3,"style","Variable and function name style should be snake_case or CamelCase."," min.name = ns[j.small]","object_name_linter" +"R/utils_imbalancy.R",8,3,"style","Variable and function name style should be snake_case or CamelCase."," max.name = ns[-j.small]","object_name_linter" +"R/WeightedClassesWrapper.R",113,11,"style","Variable and function name style should be snake_case or CamelCase."," names(wcw.weight) = c(td$positive, td$negative)","object_name_linter" +"R/WeightedClassesWrapper.R",116,11,"style","Variable and function name style should be snake_case or CamelCase."," names(wcw.weight) = levs","object_name_linter" +"tests/testthat/helper_helpers.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," cv.instance$train.inds[[i]] = inds[[i]]","object_name_linter" +"tests/testthat/helper_helpers.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," cv.instance$test.inds[[i]] = setdiff(1:size, inds[[i]])","object_name_linter" +"tests/testthat/helper_helpers.R",39,5,"style","Variable and function name style should be snake_case or CamelCase."," bs.instance$train.inds[[i]] = inds[[i]]","object_name_linter" +"tests/testthat/helper_helpers.R",40,5,"style","Variable and function name style should be snake_case or CamelCase."," bs.instance$test.inds[[i]] = setdiff(1:size, inds[[i]])","object_name_linter" +"tests/testthat/helper_helpers.R",96,3,"warning","local variable β€˜train’ assigned but may not be used"," train = df[inds, ]","object_usage_linter" +"tests/testthat/helper_helpers.R",97,3,"warning","local variable β€˜test’ assigned but may not be used"," test = df[-inds, ]","object_usage_linter" +"tests/testthat/helper_helpers.R",102,5,"warning","no visible global function definition for β€˜testSimple’"," testSimple(t.name, df, target, train.inds, old.predicts, parset)","object_usage_linter" +"tests/testthat/helper_helpers.R",123,21,"warning","no visible binding for global variable β€˜old.predicts’"," expect_s3_class(old.predicts, ""try-error"")","object_usage_linter" +"tests/testthat/helper_helpers.R",128,13,"style","Variable and function name style should be snake_case or CamelCase."," names(old.probs) = NULL","object_name_linter" +"tests/testthat/helper_helpers.R",138,28,"style","Variable and function name style should be snake_case or CamelCase."," colnames(p) = colnames(old.probs) = NULL","object_name_linter" +"tests/testthat/helper_helpers.R",139,28,"style","Variable and function name style should be snake_case or CamelCase."," rownames(p) = rownames(old.probs) = NULL","object_name_linter" +"tests/testthat/helper_helpers.R",140,11,"style","Variable and function name style should be snake_case or CamelCase."," class(old.probs) = NULL","object_name_linter" +"tests/testthat/helper_helpers.R",162,21,"warning","no visible binding for global variable β€˜old.predicts’"," expect_s3_class(old.predicts, ""try-error"")","object_usage_linter" +"tests/testthat/helper_helpers.R",167,13,"style","Variable and function name style should be snake_case or CamelCase."," names(old.probs) = NULL","object_name_linter" +"tests/testthat/helper_helpers.R",177,28,"style","Variable and function name style should be snake_case or CamelCase."," colnames(p) = colnames(old.probs) = NULL","object_name_linter" +"tests/testthat/helper_helpers.R",178,28,"style","Variable and function name style should be snake_case or CamelCase."," rownames(p) = rownames(old.probs) = NULL","object_name_linter" +"tests/testthat/helper_helpers.R",179,11,"style","Variable and function name style should be snake_case or CamelCase."," class(old.probs) = NULL","object_name_linter" +"tests/testthat/helper_helpers.R",180,44,"warning","no visible binding for global variable β€˜tol’"," expect_equal(p, old.probs, tolerance = tol)","object_usage_linter" +"tests/testthat/helper_helpers.R",187,3,"warning","local variable β€˜train’ assigned but may not be used"," train = df[inds, ]","object_usage_linter" +"tests/testthat/helper_helpers.R",188,3,"warning","local variable β€˜test’ assigned but may not be used"," test = df[-inds, ]","object_usage_linter" +"tests/testthat/helper_helpers.R",193,5,"warning","no visible global function definition for β€˜testProb’"," testProb(t.name, df, target, train.inds, old.probs, parset)","object_usage_linter" +"tests/testthat/helper_helpers.R",201,3,"warning","local variable β€˜train’ assigned but may not be used"," train = df[inds, ]","object_usage_linter" +"tests/testthat/helper_helpers.R",202,3,"warning","local variable β€˜test’ assigned but may not be used"," test = df[-inds, ]","object_usage_linter" +"tests/testthat/helper_helpers.R",207,5,"warning","no visible global function definition for β€˜testProbWithTol’"," testProbWithTol(t.name, df, target, train.inds, old.probs, parset, tolerance = tol)","object_usage_linter" +"tests/testthat/helper_helpers.R",207,84,"warning","no visible binding for global variable β€˜tol’"," testProbWithTol(t.name, df, target, train.inds, old.probs, parset, tolerance = tol)","object_usage_linter" +"tests/testthat/helper_helpers.R",261,5,"warning","no visible global function definition for β€˜testCV’"," testCV(t.name, df, target, folds, parset, tune.train, tune.predict)","object_usage_linter" +"tests/testthat/helper_helpers.R",313,44,"warning","no visible binding for global variable β€˜ns.svg’"," nodes = XML::getNodeSet(doc, text.paths, ns.svg)","object_usage_linter" +"tests/testthat/helper_learners_all.R",24,3,"warning","local variable β€˜rin’ assigned but may not be used"," rin = makeResampleInstance(""Holdout"", task = task)","object_usage_linter" +"tests/testthat/helper_learners_all.R",128,3,"warning","no visible global function definition for β€˜testBasicLearnerProperties’"," testBasicLearnerProperties(lrn = lrn, task = task, hyperpars = hyperpars)","object_usage_linter" +"tests/testthat/helper_learners_all.R",145,3,"warning","no visible global function definition for β€˜testBasicLearnerProperties’"," testBasicLearnerProperties(lrn = lrn, task = task, hyperpars = hyperpars)","object_usage_linter" +"tests/testthat/helper_learners_all.R",163,3,"warning","no visible global function definition for β€˜testBasicLearnerProperties’"," testBasicLearnerProperties(lrn = lrn, task = task, hyperpars = hyperpars)","object_usage_linter" +"tests/testthat/helper_learners_all.R",236,3,"warning","local variable β€˜ses’ assigned but may not be used"," ses = getPredictionSE(res$pred)","object_usage_linter" +"tests/testthat/helper_objects.R",50,1,"style","Variable and function name style should be snake_case or CamelCase.","multilabel.df[, ""y1""] = rep(c(TRUE, FALSE), 75L)","object_name_linter" +"tests/testthat/helper_objects.R",51,1,"style","Variable and function name style should be snake_case or CamelCase.","multilabel.df[, ""y2""] = rep(c(FALSE, TRUE), 75L)","object_name_linter" +"tests/testthat/helper_objects.R",101,1,"style","Variable and function name style should be snake_case or CamelCase.","regr.na.num.df[1, 1] = NA","object_name_linter" +"tests/testthat/helper_objects.R",125,3,"style","Variable and function name style should be snake_case or CamelCase."," obs.time[i] = q","object_name_linter" +"tests/testthat/helper_objects.R",126,3,"style","Variable and function name style should be snake_case or CamelCase."," cens.time[i] = FALSE","object_name_linter" +"tests/testthat/helper_objects.R",222,1,"style","Variable and function name style should be snake_case or CamelCase.","task.filters.rank$env$data = structure(list(trt = c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1,","object_name_linter" +"tests/testthat/test_base_benchmark.R",358,3,"style","Variable and function name style should be snake_case or CamelCase."," stop.learner = makeLearner(""classif.__mlrmocklearners__3"",","object_name_linter" +"tests/testthat/test_base_benchmark.R",360,3,"style","Variable and function name style should be snake_case or CamelCase."," stop.learner = makeFilterWrapper(stop.learner,","object_name_linter" +"tests/testthat/test_base_benchmark.R",363,3,"style","Variable and function name style should be snake_case or CamelCase."," stop.learner = makeTuneWrapper(stop.learner,","object_name_linter" +"tests/testthat/test_base_createDummyFeatures.R",22,3,"style","Variable and function name style should be snake_case or CamelCase."," dummy.task$env = NULL","object_name_linter" +"tests/testthat/test_base_createDummyFeatures.R",23,3,"style","Variable and function name style should be snake_case or CamelCase."," iris.task$env = NULL","object_name_linter" +"tests/testthat/test_base_getHyperPars.R",8,9,"style","Variable and function name style should be snake_case or CamelCase."," names(named.list) = character(0)","object_name_linter" +"tests/testthat/test_base_measures.R",167,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.regr$data$response = pred.art.regr","object_name_linter" +"tests/testthat/test_base_measures.R",177,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.classif$data$response = pred.art.classif","object_name_linter" +"tests/testthat/test_base_measures.R",187,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.bin$data$response = pred.art.bin","object_name_linter" +"tests/testthat/test_base_measures.R",199,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.multilabel$data[, 4:5] = pred.art.multilabel","object_name_linter" +"tests/testthat/test_base_measures.R",214,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.surv$data[, ""response""] = pred.art.surv","object_name_linter" +"tests/testthat/test_base_measures.R",228,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.costsens$data$response = pred.art.costsens","object_name_linter" +"tests/testthat/test_base_measures.R",237,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.cluster$data$response = pred.art.cluster","object_name_linter" +"tests/testthat/test_base_measures.R",267,3,"style","Variable and function name style should be snake_case or CamelCase."," abs.errs = abs(c(5 - 4, 10 - 11, 0 - 0, 5 - 4))","object_name_linter" +"tests/testthat/test_base_measures.R",347,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.regr.mape$data$truth = c(5, 10, 1, 5) # we change the 0 target because mape is undefined","object_name_linter" +"tests/testthat/test_base_measures.R",365,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.art.regr.neg[[1L]] = -3","object_name_linter" +"tests/testthat/test_base_measures.R",488,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.probs[pred.probs > 1 - 1e-15] = 1 - 1e-15","object_name_linter" +"tests/testthat/test_base_measures.R",489,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.probs[pred.probs < 1e-15] = 1e-15","object_name_linter" +"tests/testthat/test_base_measures.R",549,10,"style","Variable and function name style should be snake_case or CamelCase."," levels(tar.classif2) = as.numeric(levels(tar.classif))^2","object_name_linter" +"tests/testthat/test_base_measures.R",550,10,"style","Variable and function name style should be snake_case or CamelCase."," levels(pred.art.classif2) = as.numeric(levels(pred.art.classif))^2","object_name_linter" +"tests/testthat/test_base_measures.R",744,3,"style","Variable and function name style should be snake_case or CamelCase."," f1.test[is.na(f1.test)] = 1","object_name_linter" +"tests/testthat/test_base_measures.R",767,3,"style","Variable and function name style should be snake_case or CamelCase."," acc.test[is.na(acc.test)] = 1","object_name_linter" +"tests/testthat/test_base_multilabel.R",40,3,"style","Variable and function name style should be snake_case or CamelCase."," multilabel.df2[c(2, 10, 14), c(1, 5)] = NA","object_name_linter" +"tests/testthat/test_base_multilabel.R",71,23,"warning","no visible binding for global variable β€˜multilabel.task’"," mod = train(lrn2, multilabel.task)","object_usage_linter" +"tests/testthat/test_base_multilabel.R",72,25,"warning","no visible binding for global variable β€˜multilabel.task’"," pred = predict(mod, multilabel.task)","object_usage_linter" +"tests/testthat/test_base_multilabel.R",79,35,"warning","no visible binding for global variable β€˜multilabel.df’"," pred = predict(mod, newdata = multilabel.df)","object_usage_linter" +"tests/testthat/test_base_multilabel.R",85,55,"warning","no visible binding for global variable β€˜multilabel.task’"," expect_equal(rownames(pmulti), getTaskTargetNames(multilabel.task))","object_usage_linter" +"tests/testthat/test_base_multilabel.R",88,23,"warning","no visible binding for global variable β€˜multilabel.task’"," r = holdout(lrn2, multilabel.task)","object_usage_linter" +"tests/testthat/test_base_multilabel.R",93,55,"warning","no visible binding for global variable β€˜multilabel.task’"," expect_equal(rownames(pmulti), getTaskTargetNames(multilabel.task))","object_usage_linter" +"tests/testthat/test_base_multilabel.R",97,23,"warning","no visible binding for global variable β€˜multilabel.task’"," r = holdout(lrn2, multilabel.task)","object_usage_linter" +"tests/testthat/test_base_multilabel.R",101,63,"warning","no visible binding for global variable β€˜multilabel.task’"," p = getPredictionProbabilities(r$pred, getTaskClassLevels(multilabel.task))","object_usage_linter" +"tests/testthat/test_base_multilabel.R",107,23,"warning","no visible binding for global variable β€˜multilabel.task’"," r = holdout(lrn2, multilabel.task)","object_usage_linter" +"tests/testthat/test_base_multilabel.R",110,30,"warning","no visible binding for global variable β€˜multilabel.task’"," cls = getTaskClassLevels(multilabel.task)","object_usage_linter" +"tests/testthat/test_base_multilabel.R",122,59,"warning","no visible binding for global variable β€˜multilabel.task’"," expect_equal(length(tr$th), length(getTaskClassLevels(multilabel.task)))","object_usage_linter" +"tests/testthat/test_base_multilabel.R",128,5,"style","Variable and function name style should be snake_case or CamelCase."," multilabel.df2[c(2, 10, 14), c(1, 5)] = NA","object_name_linter" +"tests/testthat/test_base_multilabel.R",137,23,"warning","no visible binding for global variable β€˜multilabel.task’"," mod = train(lrn2, multilabel.task)","object_usage_linter" +"tests/testthat/test_base_multilabel.R",138,25,"warning","no visible binding for global variable β€˜multilabel.task’"," pred = predict(mod, multilabel.task)","object_usage_linter" +"tests/testthat/test_base_multilabel.R",143,5,"style","Variable and function name style should be snake_case or CamelCase."," three.target.df$y3 = three.target.df$y2","object_name_linter" +"tests/testthat/test_base_resample_operators.R",46,21,"style","Variable and function name style should be snake_case or CamelCase."," attr(ptrain$data, ""row.names"") = as.integer(row.names(ptrain$data))","object_name_linter" +"tests/testthat/test_base_resample_operators.R",49,20,"style","Variable and function name style should be snake_case or CamelCase."," attr(ptest$data, ""row.names"") = as.integer(row.names(ptest$data))","object_name_linter" +"tests/testthat/test_base_UnsupervisedTask.R",11,3,"style","Variable and function name style should be snake_case or CamelCase."," sub.task = subsetTask(noclass.task, features = 1:2)","object_name_linter" +"tests/testthat/test_classif_ada.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p[, 1]","object_name_linter" +"tests/testthat/test_classif_ada.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(binaryclass.class.levs[ifelse(p[, 2] > 0.5, 2, 1)])","object_name_linter" +"tests/testthat/test_classif_adaboostm1.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p[, 1]","object_name_linter" +"tests/testthat/test_classif_adaboostm1.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(binaryclass.class.levs[ifelse(p[, 2] > 0.5, 2, 1)])","object_name_linter" +"tests/testthat/test_classif_adaboostm1.R",44,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_adaboostm1.R",45,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_bartMachine.R",33,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_bartMachine.R",34,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_binomial.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p.class","object_name_linter" +"tests/testthat/test_classif_binomial.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_boost.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(p$class)","object_name_linter" +"tests/testthat/test_classif_boost.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = setColNames(p$prob, levels(multiclass.df[, multiclass.target]))","object_name_linter" +"tests/testthat/test_classif_bst.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = ifelse(p > 0, binaryclass.class.levs[2], binaryclass.class.levs[1])","object_name_linter" +"tests/testthat/test_classif_C50.R",31,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_C50.R",32,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_cforest.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, newdata = binaryclass.test)","object_name_linter" +"tests/testthat/test_classif_cforest.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = sapply(p, ""["", 1)","object_name_linter" +"tests/testthat/test_classif_clusterSVM.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, data.matrix(binaryclass.test[, -61]))$predictions","object_name_linter" +"tests/testthat/test_classif_ctree.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_ctree.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_cvglmnet.R",34,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_cvglmnet.R",35,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = 1 - p2","object_name_linter" +"tests/testthat/test_classif_dbnDNN.R",37,7,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(colnames(p)[max.col(p)])","object_name_linter" +"tests/testthat/test_classif_earth.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = 1 - p","object_name_linter" +"tests/testthat/test_classif_earth.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(binaryclass.class.levs[ifelse(p > 0.5, 2, 1)])","object_name_linter" +"tests/testthat/test_classif_earth.R",61,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_earth.R",62,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(predict(m,","object_name_linter" +"tests/testthat/test_classif_evtree.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, newdata = binaryclass.test)","object_name_linter" +"tests/testthat/test_classif_evtree.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p[, 1]","object_name_linter" +"tests/testthat/test_classif_extraTrees.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, x.test)","object_name_linter" +"tests/testthat/test_classif_extraTrees.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = predict(m, x.test, probability = TRUE)[, 1L]","object_name_linter" +"tests/testthat/test_classif_FDboost.R",17,9,"style","Variable and function name style should be snake_case or CamelCase."," names(fd.grids) = fdns","object_name_linter" +"tests/testthat/test_classif_fnn.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list1[[i]] = do.call(FNN::knn, pars)","object_name_linter" +"tests/testthat/test_classif_fnn.R",28,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list2[[i]] = do.call(FNN::knn, pars)","object_name_linter" +"tests/testthat/test_classif_gamboost.R",30,7,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] <- predict(m, newdata = binaryclass.test, type = ""class"")","object_name_linter" +"tests/testthat/test_classif_gamboost.R",33,7,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] <- 1 - predict(m, newdata = binaryclass.test, type = ""response"")[, 1]","object_name_linter" +"tests/testthat/test_classif_gausspr.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_gausspr.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_gbm.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_gbm.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_glmboost.R",28,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, newdata = binaryclass.test, type = ""class"")","object_name_linter" +"tests/testthat/test_classif_glmboost.R",29,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = 1 - predict(m, newdata = binaryclass.test, type = ""response"")[, 1]","object_name_linter" +"tests/testthat/test_classif_glmnet.R",39,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_glmnet.R",40,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = 1 - p2","object_name_linter" +"tests/testthat/test_classif_h2odeeplearning.R",15,3,"style","Variable and function name style should be snake_case or CamelCase."," debug.seed = getOption(""mlr.debug.seed"")","object_name_linter" +"tests/testthat/test_classif_h2odeeplearning.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = as.data.frame(p)[, 2L]","object_name_linter" +"tests/testthat/test_classif_h2ogbm.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = as.data.frame(p)[, 2L]","object_name_linter" +"tests/testthat/test_classif_h2oglm.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = as.data.frame(p)[, 2]","object_name_linter" +"tests/testthat/test_classif_h2oglm.R",55,9,"style","Variable and function name style should be snake_case or CamelCase."," names(feat.imp) = names(feat.imp.h2o)","object_name_linter" +"tests/testthat/test_classif_h2orandomForest.R",14,3,"style","Variable and function name style should be snake_case or CamelCase."," debug.seed = getOption(""mlr.debug.seed"")","object_name_linter" +"tests/testthat/test_classif_h2orandomForest.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = as.data.frame(p)[, 2L]","object_name_linter" +"tests/testthat/test_classif_h2orandomForest.R",56,9,"style","Variable and function name style should be snake_case or CamelCase."," names(feat.imp) = names(feat.imp.h2o)","object_name_linter" +"tests/testthat/test_classif_IBk.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_IBk.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_J48.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_J48.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_JRip.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_JRip.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_kknn.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_kknn.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = m$prob","object_name_linter" +"tests/testthat/test_classif_knn.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_ksvm.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = kernlab::predict(m, newdata = multiclass.test)","object_name_linter" +"tests/testthat/test_classif_ksvm.R",31,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = kernlab::predict(m, newdata = multiclass.test, type = ""prob"")","object_name_linter" +"tests/testthat/test_classif_ksvm.R",55,51,"style","Use TRUE instead of the symbol T."," B = factor(sample(c(""A"", ""B""), 10, replace = T))","T_and_F_symbol_linter" +"tests/testthat/test_classif_ksvm.R",59,56,"style","Use TRUE instead of the symbol T."," B = factor(sample(c(""A"", ""B"", ""C""), 10, replace = T))","T_and_F_symbol_linter" +"tests/testthat/test_classif_LiblineaRL1L2SVC.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(p$predictions)","object_name_linter" +"tests/testthat/test_classif_LiblineaRL1LogReg.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(p$predictions)","object_name_linter" +"tests/testthat/test_classif_LiblineaRL1LogReg.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p$probabilities[, 2L]","object_name_linter" +"tests/testthat/test_classif_LiblineaRL2L1SVC.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(p$predictions)","object_name_linter" +"tests/testthat/test_classif_LiblineaRL2LogReg.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(p$predictions)","object_name_linter" +"tests/testthat/test_classif_LiblineaRL2LogReg.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p$probabilities[, 2L]","object_name_linter" +"tests/testthat/test_classif_LiblineaRL2SVC.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(p$predictions)","object_name_linter" +"tests/testthat/test_classif_LibLineaRMultiClassSVC.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(p$predictions)","object_name_linter" +"tests/testthat/test_classif_lssvm.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = suppressMessages(kernlab::predict(m, newdata = multiclass.test))","object_name_linter" +"tests/testthat/test_classif_mda.R",28,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_mda.R",29,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_nodeHarvest.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = ifelse(p > 0.5, binaryclass.class.levs[1],","object_name_linter" +"tests/testthat/test_classif_nodeHarvest.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_OneR.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_OneR.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_pamr.R",28,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = pamr::pamr.predict(m, newdata,","object_name_linter" +"tests/testthat/test_classif_pamr.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = pamr::pamr.predict(m, newdata,","object_name_linter" +"tests/testthat/test_classif_PART.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_PART.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_penalized.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = 1 - penalized::predict(m, data = binaryclass.test)","object_name_linter" +"tests/testthat/test_classif_plr.R",34,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_plr.R",35,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_plsdaCaret.R",28,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_plsdaCaret.R",29,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_plsdaCaret.R",63,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_plsdaCaret.R",64,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_randomForest.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_randomForest.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_randomForestSRC.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p$class","object_name_linter" +"tests/testthat/test_classif_randomForestSRC.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p$predicted[, 1]","object_name_linter" +"tests/testthat/test_classif_ranger.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p$predictions[, 1]","object_name_linter" +"tests/testthat/test_classif_rda.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p$class","object_name_linter" +"tests/testthat/test_classif_rda.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p$posterior","object_name_linter" +"tests/testthat/test_classif_rFerns.R",18,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = factor(predict(m, binaryclass.test))","object_name_linter" +"tests/testthat/test_classif_rknn.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_rotationForest.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," binaryclass.test[, binaryclass.target] = NULL","object_name_linter" +"tests/testthat/test_classif_rotationForest.R",29,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_rotationForest.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_rpart.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_rpart.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_RRF.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_classif_RRF.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" +"tests/testthat/test_classif_sparseLDA.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = sparseLDA:::predict.sda(m,","object_name_linter" +"tests/testthat/test_classif_sparseLDA.R",28,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = sparseLDA:::predict.sda(m,","object_name_linter" +"tests/testthat/test_classif_svm.R",32,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m1, newdata = multiclass.test)","object_name_linter" +"tests/testthat/test_classif_svm.R",33,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = predict(m2, newdata = multiclass.test,","object_name_linter" +"tests/testthat/test_classif_xgboost.R",29,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = factor(as.numeric(pred > 0.5),","object_name_linter" +"tests/testthat/test_classif_xgboost.R",49,7,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = y[, 1]","object_name_linter" +"tests/testthat/test_classif_xgboost.R",51,7,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = 1 - pred","object_name_linter" +"tests/testthat/test_cluster_cmeans.R",19,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_cluster_Cobweb.R",16,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_cluster_dbscan.R",15,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_cluster_EM.R",18,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_cluster_FarthestFirst.R",17,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_cluster_kkmeans.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_cluster_kmeans.R",19,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_cluster_MiniBatchKmeans.R",31,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_cluster_SimpleKMeans.R",17,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_cluster_XMeans.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_featsel_generateFilterValuesData.R",16,3,"style","Variable and function name style should be snake_case or CamelCase."," binaryclass.task.cp$env = NULL","object_name_linter" +"tests/testthat/test_learners_all_classif.R",90,3,"style","Variable and function name style should be snake_case or CamelCase."," min.task = makeClassifTask(""oneCol"", data.frame(","object_name_linter" +"tests/testthat/test_learners_all_regr.R",71,3,"style","Variable and function name style should be snake_case or CamelCase."," min.task = makeRegrTask(""oneCol"", data.frame(x = 1:10, y = 1:10),","object_name_linter" +"tests/testthat/test_learners_all_surv.R",12,3,"style","Variable and function name style should be snake_case or CamelCase."," sub.task = subsetTask(surv.task, subset = c(1:70),","object_name_linter" +"tests/testthat/test_multilabel_cforest.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = data.frame(p2)","object_name_linter" +"tests/testthat/test_multilabel_randomForestSRC.R",19,7,"style","Variable and function name style should be snake_case or CamelCase."," multilabel.train[j] = factor(multilabel.train[[j]],","object_name_linter" +"tests/testthat/test_multilabel_randomForestSRC.R",21,7,"style","Variable and function name style should be snake_case or CamelCase."," multilabel.test[j] = factor(multilabel.test[[j]],","object_name_linter" +"tests/testthat/test_multilabel_randomForestSRC.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.data.frame(lapply(p$classOutput,","object_name_linter" +"tests/testthat/test_multilabel_randomForestSRC.R",32,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = as.data.frame(lapply(p$classOutput,","object_name_linter" +"tests/testthat/test_regr_bartMachine.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, new_data = regr.test[, xind])","object_name_linter" +"tests/testthat/test_regr_bcart.R",15,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(df, function(x) class(x))","object_name_linter" +"tests/testthat/test_regr_bcart.R",16,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" +"tests/testthat/test_regr_bcart.R",33,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, XX = test, pred.n = FALSE)$ZZ.km","object_name_linter" +"tests/testthat/test_regr_bgp.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m,","object_name_linter" +"tests/testthat/test_regr_bgpllm.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m,","object_name_linter" +"tests/testthat/test_regr_blm.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m,","object_name_linter" +"tests/testthat/test_regr_brnn.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_bst.R",29,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, regr.num.test[, xind])","object_name_linter" +"tests/testthat/test_regr_btgp.R",13,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(df, function(x) class(x))","object_name_linter" +"tests/testthat/test_regr_btgp.R",14,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" +"tests/testthat/test_regr_btgp.R",31,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, XX = test, pred.n = FALSE)$ZZ.km","object_name_linter" +"tests/testthat/test_regr_btgpllm.R",12,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(df, function(x) class(x))","object_name_linter" +"tests/testthat/test_regr_btgpllm.R",13,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" +"tests/testthat/test_regr_btgpllm.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, XX = test, pred.n = FALSE)$ZZ.km","object_name_linter" +"tests/testthat/test_regr_btlm.R",16,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(df, function(x) class(x))","object_name_linter" +"tests/testthat/test_regr_btlm.R",17,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" +"tests/testthat/test_regr_btlm.R",34,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, XX = test, pred.n = FALSE)$ZZ.km","object_name_linter" +"tests/testthat/test_regr_cforest.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.vector(predict(m, newdata = regr.test))","object_name_linter" +"tests/testthat/test_regr_crs.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = pred","object_name_linter" +"tests/testthat/test_regr_ctree.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_cubist.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_cvglmnet.R",35,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_earth.R",18,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, newdata = regr.test)[, 1]","object_name_linter" +"tests/testthat/test_regr_evtree.R",18,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.vector(predict(m, newdata = regr.test))","object_name_linter" +"tests/testthat/test_regr_extraTrees.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, x.test)","object_name_linter" +"tests/testthat/test_regr_FDboost.R",17,9,"style","Variable and function name style should be snake_case or CamelCase."," names(fd.grids) = fdns","object_name_linter" +"tests/testthat/test_regr_fnn.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list1[[i]] = do.call(FNN::knn.reg, pars)$pred","object_name_linter" +"tests/testthat/test_regr_frbs.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_gamboost.R",35,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = suppressWarnings(as.vector(predict(m,","object_name_linter" +"tests/testthat/test_regr_gamboost.R",47,3,"style","Variable and function name style should be snake_case or CamelCase."," new.regr.df[, regr.target] = as.integer(floor(new.regr.df[, regr.target]))","object_name_linter" +"tests/testthat/test_regr_gamboost.R",48,3,"style","Variable and function name style should be snake_case or CamelCase."," new.regr.df[, ""chas""] = NULL","object_name_linter" +"tests/testthat/test_regr_gamboost.R",68,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = suppressWarnings(as.vector(predict(m,","object_name_linter" +"tests/testthat/test_regr_gausspr.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p[, 1]","object_name_linter" +"tests/testthat/test_regr_gbm.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_gbm.R",27,3,"style","Variable and function name style should be snake_case or CamelCase."," parset.list[[4]]$distribution = ""quantile""","object_name_linter" +"tests/testthat/test_regr_gbm.R",28,3,"style","Variable and function name style should be snake_case or CamelCase."," parset.list[[4]]$alpha = 0.2","object_name_linter" +"tests/testthat/test_regr_glm.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_glm.R",25,3,"style","Variable and function name style should be snake_case or CamelCase."," parset.list[[4]]$family = ""Gamma""","object_name_linter" +"tests/testthat/test_regr_glm.R",27,3,"style","Variable and function name style should be snake_case or CamelCase."," parset.list[[5]]$family = ""gaussian""","object_name_linter" +"tests/testthat/test_regr_glmboost.R",31,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.vector(predict(m, newdata = regr.test))","object_name_linter" +"tests/testthat/test_regr_glmboost.R",40,3,"style","Variable and function name style should be snake_case or CamelCase."," new.regr.df[, regr.target] = as.integer(floor(new.regr.df[, regr.target]))","object_name_linter" +"tests/testthat/test_regr_glmboost.R",59,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.vector(predict(m, newdata = new.regr.test))","object_name_linter" +"tests/testthat/test_regr_glmnet.R",35,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, as.matrix(newx), s = s)[, 1]","object_name_linter" +"tests/testthat/test_regr_glmnet.R",38,3,"style","Variable and function name style should be snake_case or CamelCase."," test.dat$chas = as.numeric(test.dat$chas)","object_name_linter" +"tests/testthat/test_regr_GPfit.R",11,12,"style","Variable and function name style should be snake_case or CamelCase."," colnames(gpfit.test.df) = c(""x1"", ""x2"", ""y"")","object_name_linter" +"tests/testthat/test_regr_h2odeeplearning.R",15,3,"style","Variable and function name style should be snake_case or CamelCase."," debug.seed = getOption(""mlr.debug.seed"")","object_name_linter" +"tests/testthat/test_regr_h2odeeplearning.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.data.frame(p)[, 1L]","object_name_linter" +"tests/testthat/test_regr_h2ogbm.R",46,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.data.frame(p)[, 1L]","object_name_linter" +"tests/testthat/test_regr_h2oglm.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.data.frame(p)[, 1L]","object_name_linter" +"tests/testthat/test_regr_h2orandomForest.R",13,3,"style","Variable and function name style should be snake_case or CamelCase."," debug.seed = getOption(""mlr.debug.seed"")","object_name_linter" +"tests/testthat/test_regr_h2orandomForest.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.data.frame(p)[, 1L]","object_name_linter" +"tests/testthat/test_regr_IBk.R",19,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_kknn.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_km.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = DiceKriging::predict(m, newdata = des2,","object_name_linter" +"tests/testthat/test_regr_ksvm.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p[, 1]","object_name_linter" +"tests/testthat/test_regr_laGP.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = do.call(laGP::aGP, pars)$mean","object_name_linter" +"tests/testthat/test_regr_LiblineaRL2L1SVR.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p$predictions","object_name_linter" +"tests/testthat/test_regr_LiblineaRL2L2SVR.R",33,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p$predictions","object_name_linter" +"tests/testthat/test_regr_mob.R",38,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_nodeHarvest.R",19,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, regr.df[-regr.train.inds, ])","object_name_linter" +"tests/testthat/test_regr_penalized.R",35,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p[, ""mu""]","object_name_linter" +"tests/testthat/test_regr_plsr.R",18,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = pls:::predict.mvr(m, newdata = regr.test,","object_name_linter" +"tests/testthat/test_regr_randomForest.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_randomForestSRC.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_ranger.R",19,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p$predictions","object_name_linter" +"tests/testthat/test_regr_ranger.R",42,5,"style","Variable and function name style should be snake_case or CamelCase."," parset.list[[i]] = c(parset, predict.type = ""se"")","object_name_linter" +"tests/testthat/test_regr_ranger.R",53,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = cbind(p$predictions, p$se)","object_name_linter" +"tests/testthat/test_regr_rknn.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_rknn.R",32,3,"style","Variable and function name style should be snake_case or CamelCase."," parset.list[[9]] = NULL","object_name_linter" +"tests/testthat/test_regr_rpart.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_RRF.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_svm.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_regr_xgboost.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(model,","object_name_linter" +"tests/testthat/test_surv_cforest.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = -1 * predict(m, newdata = surv.test)","object_name_linter" +"tests/testthat/test_surv_coxph.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_surv_cvglmnet.R",31,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.numeric(p)","object_name_linter" +"tests/testthat/test_surv_gamboost.R",36,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = drop(p)","object_name_linter" +"tests/testthat/test_surv_gbm.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_surv_glmboost.R",33,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = drop(p)","object_name_linter" +"tests/testthat/test_surv_glmnet.R",32,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.numeric(p)","object_name_linter" +"tests/testthat/test_surv_randomForestSRC.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = drop(p)","object_name_linter" +"tests/testthat/test_surv_ranger.R",28,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = rowMeans(p$chf)","object_name_linter" +"tests/testthat/test_surv_rpart.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"tests/testthat/test_tune_tuneGrid.R",30,3,"style","Variable and function name style should be snake_case or CamelCase."," op1.2$C = as.numeric(as.character(op1.2$C))","object_name_linter" +"tests/testthat/test_tune_tuneGrid.R",31,3,"style","Variable and function name style should be snake_case or CamelCase."," op1.2$sigma = as.numeric(as.character(op1.2$sigma))","object_name_linter" +"vignettes/tutorial/_mlr-tutorial_intro.Rmd",42,1,"style","Variable and function name style should be snake_case or CamelCase.","train.set = sample(n, size = 2 / 3 * n)","object_name_linter" +"vignettes/tutorial/_mlr-tutorial_intro.Rmd",43,1,"style","Variable and function name style should be snake_case or CamelCase.","test.set = setdiff(1:n, train.set)","object_name_linter" +"vignettes/tutorial/advanced_tune.Rmd",52,1,"style","Variable and function name style should be snake_case or CamelCase.","base.learners = list(","object_name_linter" +"vignettes/tutorial/bagging.Rmd",38,1,"style","Variable and function name style should be snake_case or CamelCase.","bag.lrn = makeBaggingWrapper(lrn, bw.iters = 50, bw.replace = TRUE,","object_name_linter" +"vignettes/tutorial/bagging.Rmd",69,1,"style","Variable and function name style should be snake_case or CamelCase.","bag.lrn = setPredictType(bag.lrn, predict.type = ""prob"")","object_name_linter" +"vignettes/tutorial/bagging.Rmd",80,1,"style","Variable and function name style should be snake_case or CamelCase.","train.inds = seq(1, n, 3)","object_name_linter" +"vignettes/tutorial/bagging.Rmd",81,1,"style","Variable and function name style should be snake_case or CamelCase.","test.inds = setdiff(1:n, train.inds)","object_name_linter" +"vignettes/tutorial/bagging.Rmd",83,1,"style","Variable and function name style should be snake_case or CamelCase.","bag.lrn = makeBaggingWrapper(lrn)","object_name_linter" +"vignettes/tutorial/bagging.Rmd",84,1,"style","Variable and function name style should be snake_case or CamelCase.","bag.lrn = setPredictType(bag.lrn, predict.type = ""se"")","object_name_linter" +"vignettes/tutorial/benchmark_experiments.Rmd",316,1,"style","Variable and function name style should be snake_case or CamelCase.","ring.task = convertMLBenchObjToTask(""mlbench.ringnorm"", n = 600)","object_name_linter" +"vignettes/tutorial/benchmark_experiments.Rmd",317,1,"style","Variable and function name style should be snake_case or CamelCase.","wave.task = convertMLBenchObjToTask(""mlbench.waveform"", n = 600)","object_name_linter" +"vignettes/tutorial/benchmark_experiments.Rmd",334,1,"style","Variable and function name style should be snake_case or CamelCase.","ring.task = convertMLBenchObjToTask(""mlbench.ringnorm"", n = 600)","object_name_linter" +"vignettes/tutorial/benchmark_experiments.Rmd",335,1,"style","Variable and function name style should be snake_case or CamelCase.","wave.task = convertMLBenchObjToTask(""mlbench.waveform"", n = 600)","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",92,1,"style","Variable and function name style should be snake_case or CamelCase.","credit.task = makeClassifTask(data = GermanCredit, target = ""Class"")","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",93,1,"style","Variable and function name style should be snake_case or CamelCase.","credit.task = removeConstantFeatures(credit.task)","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",157,1,"style","Variable and function name style should be snake_case or CamelCase.","pred.th = setThreshold(pred, th)","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",166,1,"style","Variable and function name style should be snake_case or CamelCase.","credit.costs = makeCostMeasure(id = ""credit.costs"", name = ""Credit costs"", costs = costs,","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",249,1,"style","Variable and function name style should be snake_case or CamelCase.","tune.res = tuneThreshold(pred = r$pred, measure = credit.costs)","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",267,1,"style","Variable and function name style should be snake_case or CamelCase.","tune.res = tuneThreshold(pred = r$pred, measure = credit.costs)","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",396,1,"style","Variable and function name style should be snake_case or CamelCase.","tune.res = tuneParams(lrn, credit.task, resampling = rin, par.set = ps,","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",411,1,"style","Variable and function name style should be snake_case or CamelCase.","credit.task.over = oversample(credit.task, rate = w, cl = ""Bad"")","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",467,1,"style","Variable and function name style should be snake_case or CamelCase.","tune.res = tuneParams(lrn, credit.task, rin, par.set = ps, measures = list(credit.costs, mmce),","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",488,1,"style","Variable and function name style should be snake_case or CamelCase.","wf.task = makeClassifTask(id = ""waveform"", data = as.data.frame(df), target = ""classes"")","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",495,1,"style","Variable and function name style should be snake_case or CamelCase.","wf.costs = makeCostMeasure(id = ""wf.costs"", name = ""Waveform costs"", costs = costs,","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",523,1,"style","Variable and function name style should be snake_case or CamelCase.","pred.th = setThreshold(r$pred, threshold = th)","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",547,1,"style","Variable and function name style should be snake_case or CamelCase.","pred.th = setThreshold(r$pred, threshold = th)","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",565,1,"style","Variable and function name style should be snake_case or CamelCase.","tune.res = tuneThreshold(pred = r$pred, measure = wf.costs)","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",589,1,"style","Variable and function name style should be snake_case or CamelCase.","tune.res = tuneParams(lrn, wf.task, resampling = rin, par.set = ps,","object_name_linter" +"vignettes/tutorial/cost_sensitive_classif.Rmd",610,1,"style","Variable and function name style should be snake_case or CamelCase.","costsens.task = makeCostSensTask(id = ""iris"", data = df, cost = cost)","object_name_linter" +"vignettes/tutorial/create_filter.Rmd",125,1,"style","Variable and function name style should be snake_case or CamelCase.","iris.task.filtered = filterFeatures(iris.task, method = ""nonsense.filter"", abs = 2)","object_name_linter" +"vignettes/tutorial/create_imputation.Rmd",32,1,"style","Variable and function name style should be snake_case or CamelCase.","showFunctionDef = function(fun, name = sub(""^[^:]*:+"", """", deparse(substitute(fun)))) {","object_name_linter" +"vignettes/tutorial/create_imputation.Rmd",63,1,"style","Variable and function name style should be snake_case or CamelCase.","imputeLOCF = function() {","object_name_linter" +"vignettes/tutorial/create_imputation.Rmd",69,7,"style","Variable and function name style should be snake_case or CamelCase."," lastValue = which(dind == 1) # position of the last observed value previous to NA","object_name_linter" +"vignettes/tutorial/create_imputation.Rmd",70,7,"style","Variable and function name style should be snake_case or CamelCase."," lastNA = which(dind == -1) # position of the last of potentially several consecutive NA's","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",121,1,"style","Variable and function name style should be snake_case or CamelCase.","showFunctionDef = function(fun, name = gsub(""^[^:]*:+"", """", deparse(substitute(fun)))) {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",129,1,"style","Variable and function name style should be snake_case or CamelCase.","makeRLearner.classif.lda = function() {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",159,58,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","function(.learner, .task, .subset, .weights = NULL, ...) { }","brace_linter" +"vignettes/tutorial/create_learner.Rmd",159,60,"style","Closing curly-braces should always be on their own line, unless they are followed by an else.","function(.learner, .task, .subset, .weights = NULL, ...) { }","brace_linter" +"vignettes/tutorial/create_learner.Rmd",173,1,"style","Variable and function name style should be snake_case or CamelCase.","trainLearner.classif.lda = function(.learner, .task, .subset, .weights = NULL, ...) {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",186,43,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","function(.learner, .model, .newdata, ...) { }","brace_linter" +"vignettes/tutorial/create_learner.Rmd",186,45,"style","Closing curly-braces should always be on their own line, unless they are followed by an else.","function(.learner, .model, .newdata, ...) { }","brace_linter" +"vignettes/tutorial/create_learner.Rmd",199,1,"style","Variable and function name style should be snake_case or CamelCase.","predictLearner.classif.lda = function(.learner, .model, .newdata, predict.method = ""plug-in"", ...) {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",218,1,"style","Variable and function name style should be snake_case or CamelCase.","makeRLearner.regr.earth = function() {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",247,1,"style","Variable and function name style should be snake_case or CamelCase.","trainLearner.regr.earth = function(.learner, .task, .subset, .weights = NULL, ...) {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",254,1,"style","Variable and function name style should be snake_case or CamelCase.","predictLearner.regr.earth = function(.learner, .model, .newdata, ...) {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",273,1,"style","Variable and function name style should be snake_case or CamelCase.","makeRLearner.surv.coxph = function() {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",301,1,"style","Variable and function name style should be snake_case or CamelCase.","trainLearner.surv.coxph = function(.learner, .task, .subset, .weights = NULL, ...) {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",317,1,"style","Variable and function name style should be snake_case or CamelCase.","predictLearner.surv.coxph = function(.learner, .model, .newdata, ...) {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",321,5,"style","Variable and function name style should be snake_case or CamelCase."," surv.range = getTrainingInfo(.model$learner.model)$surv.range","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",342,1,"style","Variable and function names should not be longer than 30 characters.","makeRLearner.cluster.FarthestFirst = function() {","object_length_linter" +"vignettes/tutorial/create_learner.Rmd",342,1,"style","Variable and function name style should be snake_case or CamelCase.","makeRLearner.cluster.FarthestFirst = function() {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",360,1,"style","Variable and function names should not be longer than 30 characters.","trainLearner.cluster.FarthestFirst = function(.learner, .task, .subset, .weights = NULL, ...) {","object_length_linter" +"vignettes/tutorial/create_learner.Rmd",360,1,"style","Variable and function name style should be snake_case or CamelCase.","trainLearner.cluster.FarthestFirst = function(.learner, .task, .subset, .weights = NULL, ...) {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",367,1,"style","Variable and function names should not be longer than 30 characters.","predictLearner.cluster.FarthestFirst = function(.learner, .model, .newdata, ...) {","object_length_linter" +"vignettes/tutorial/create_learner.Rmd",367,1,"style","Variable and function name style should be snake_case or CamelCase.","predictLearner.cluster.FarthestFirst = function(.learner, .model, .newdata, ...) {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",390,1,"style","Variable and function name style should be snake_case or CamelCase.","makeRLearner.multilabel.rFerns = function() {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",407,1,"style","Variable and function name style should be snake_case or CamelCase.","trainLearner.multilabel.rFerns = function(.learner, .task, .subset, .weights = NULL, ...) {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",414,1,"style","Variable and function names should not be longer than 30 characters.","predictLearner.multilabel.rFerns = function(.learner, .model, .newdata, ...) {","object_length_linter" +"vignettes/tutorial/create_learner.Rmd",414,1,"style","Variable and function name style should be snake_case or CamelCase.","predictLearner.multilabel.rFerns = function(.learner, .model, .newdata, ...) {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",435,1,"style","Variable and function names should not be longer than 30 characters.","getFeatureImportanceLearner.classif.rpart = function(.learner, .model, ...) {","object_length_linter" +"vignettes/tutorial/create_learner.Rmd",435,1,"style","Variable and function name style should be snake_case or CamelCase.","getFeatureImportanceLearner.classif.rpart = function(.learner, .model, ...) {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",444,1,"style","Variable and function names should not be longer than 30 characters.","getFeatureImportanceLearner.classif.randomForestSRC = function(.learner, .model, ...) {","object_length_linter" +"vignettes/tutorial/create_learner.Rmd",444,1,"style","Variable and function name style should be snake_case or CamelCase.","getFeatureImportanceLearner.classif.randomForestSRC = function(.learner, .model, ...) {","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",560,3,"style","Variable and function name style should be snake_case or CamelCase."," parset.list = list(","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",568,3,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list = list()","object_name_linter" +"vignettes/tutorial/create_learner.Rmd",570,13,"warning","1:length(...) is likely to be wrong in the empty edge case. Use seq_along() instead."," for (i in 1:length(parset.list)) {","seq_linter" +"vignettes/tutorial/create_learner.Rmd",578,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" +"vignettes/tutorial/create_measure.Rmd",141,1,"style","Variable and function name style should be snake_case or CamelCase.","my.mmce.fun = function(task, model, pred, feats, extra.args) {","object_name_linter" +"vignettes/tutorial/create_measure.Rmd",141,50,"style","Variable and function name style should be snake_case or CamelCase.","my.mmce.fun = function(task, model, pred, feats, extra.args) {","object_name_linter" +"vignettes/tutorial/create_measure.Rmd",147,1,"style","Variable and function name style should be snake_case or CamelCase.","my.mmce = makeMeasure(","object_name_linter" +"vignettes/tutorial/create_measure.Rmd",182,1,"style","Variable and function name style should be snake_case or CamelCase.","my.costs = makeCostMeasure(","object_name_linter" +"vignettes/tutorial/create_measure.Rmd",214,1,"style","Variable and function name style should be snake_case or CamelCase.","my.range.aggr = makeAggregation(id = ""test.range"", name = ""Test Range"",","object_name_linter" +"vignettes/tutorial/create_measure.Rmd",216,24,"style","Variable and function name style should be snake_case or CamelCase."," fun = function(task, perf.test, perf.train, measure, group, pred) {","object_name_linter" +"vignettes/tutorial/create_measure.Rmd",216,35,"style","Variable and function name style should be snake_case or CamelCase."," fun = function(task, perf.test, perf.train, measure, group, pred) {","object_name_linter" +"vignettes/tutorial/create_measure.Rmd",244,1,"style","Variable and function name style should be snake_case or CamelCase.","perf.data = as.data.frame(res$opt.path)","object_name_linter" +"vignettes/tutorial/example_tasks.Rmd",14,1,"style","Variable and function name style should be snake_case or CamelCase.","urlMlrFunctions = ""https://mlr-org.github.io/mlr/reference/""","object_name_linter" +"vignettes/tutorial/example_tasks.Rmd",27,1,"style","Variable and function name style should be snake_case or CamelCase.","linkTask = function(x) {","object_name_linter" +"vignettes/tutorial/example_tasks.Rmd",28,47,"warning","no visible binding for global variable β€˜urlMlrFunctions’"," collapse(sprintf(""[%1$s](%2$s%1$s%3$s)"", x, urlMlrFunctions, ext), sep = ""
"")","object_usage_linter" +"vignettes/tutorial/example_tasks.Rmd",28,64,"warning","no visible binding for global variable β€˜ext’"," collapse(sprintf(""[%1$s](%2$s%1$s%3$s)"", x, urlMlrFunctions, ext), sep = ""
"")","object_usage_linter" +"vignettes/tutorial/feature_selection.Rmd",99,1,"style","Variable and function name style should be snake_case or CamelCase.","filtered.task = filterFeatures(iris.task, method = ""FSelectorRcpp_information.gain"", abs = 2)","object_name_linter" +"vignettes/tutorial/feature_selection.Rmd",102,1,"style","Variable and function name style should be snake_case or CamelCase.","filtered.task = filterFeatures(iris.task, fval = fv, perc = 0.25)","object_name_linter" +"vignettes/tutorial/feature_selection.Rmd",105,1,"style","Variable and function name style should be snake_case or CamelCase.","filtered.task = filterFeatures(iris.task, fval = fv, threshold = 0.5)","object_name_linter" +"vignettes/tutorial/feature_selection.Rmd",325,1,"style","Variable and function name style should be snake_case or CamelCase.","out.rdesc = makeResampleDesc(""CV"", iters = 5)","object_name_linter" +"vignettes/tutorial/filter_methods.Rmd",14,1,"style","Variable and function name style should be snake_case or CamelCase.","urlContribPackages = ""https://cran.r-project.org/package=""","object_name_linter" +"vignettes/tutorial/filter_methods.Rmd",29,1,"style","Variable and function name style should be snake_case or CamelCase.","linkPkg = function(x) {","object_name_linter" +"vignettes/tutorial/filter_methods.Rmd",30,63,"warning","no visible binding for global variable β€˜urlContribPackages’"," ifelse(x == """", """", collapse(sprintf(""[%1$s](%2$s%1$s)"", x, urlContribPackages), sep = ""
""))","object_usage_linter" +"vignettes/tutorial/filter_methods.Rmd",45,121,"style","Lines should not be more than 120 characters.","pandoc.table(dfnd, style = ""rmarkdown"", split.tables = Inf, split.cells = Inf, emphasize.rownames = FALSE, justify = just)","line_length_linter" +"vignettes/tutorial/functional_data.Rmd",118,1,"style","Variable and function name style should be snake_case or CamelCase.","fd.features = list(""UVVIS"" = 3:136, ""NIR"" = 137:367)","object_name_linter" +"vignettes/tutorial/functional_data.Rmd",157,1,"style","Variable and function name style should be snake_case or CamelCase.","knn.lrn = makeLearner(""classif.fdausc.knn"")","object_name_linter" +"vignettes/tutorial/functional_data.Rmd",203,1,"style","Variable and function name style should be snake_case or CamelCase.","rpart.lrn = makeLearner(""regr.rpart"")","object_name_linter" +"vignettes/tutorial/functional_data.Rmd",230,1,"style","Variable and function name style should be snake_case or CamelCase.","feat.methods = list(""UVVIS"" = extractFDAFourier(), ""NIR"" = extractFDAFPCA())","object_name_linter" +"vignettes/tutorial/functional_data.Rmd",250,1,"style","Variable and function name style should be snake_case or CamelCase.","feat.methods = list(""UVVIS"" = extractFDAWavelets(filter = ""haar""))","object_name_linter" +"vignettes/tutorial/functional_data.Rmd",251,1,"style","Variable and function name style should be snake_case or CamelCase.","task.w = extractFDAFeatures(tsk1, feat.methods = feat.methods)","object_name_linter" +"vignettes/tutorial/functional_data.Rmd",254,1,"style","Variable and function name style should be snake_case or CamelCase.","feat.methods = list(""NIR"" = extractFDAWavelets(filter = ""d4""))","object_name_linter" +"vignettes/tutorial/functional_data.Rmd",255,1,"style","Variable and function name style should be snake_case or CamelCase.","task.wd4 = extractFDAFeatures(tsk1, feat.methods = feat.methods)","object_name_linter" +"vignettes/tutorial/functional_data.Rmd",269,1,"style","Variable and function name style should be snake_case or CamelCase.","feat.methods = list(""NIR"" = extractFDAFourier(trafo.coeff = ""amplitude""),","object_name_linter" +"vignettes/tutorial/functional_data.Rmd",271,1,"style","Variable and function name style should be snake_case or CamelCase.","task.fourier = extractFDAFeatures(tsk1, feat.methods = feat.methods)","object_name_linter" +"vignettes/tutorial/functional_data.Rmd",283,1,"style","Variable and function name style should be snake_case or CamelCase.","feat.methods = list(""NIR"" = extractFDAFourier())","object_name_linter" +"vignettes/tutorial/functional_data.Rmd",284,1,"style","Variable and function name style should be snake_case or CamelCase.","wrapped.lrn = makeExtractFDAFeatsWrapper(""regr.rpart"", feat.methods = feat.methods)","object_name_linter" +"vignettes/tutorial/handling_of_spatial_data.Rmd",90,1,"style","Variable and function name style should be snake_case or CamelCase.","learner.rf = makeLearner(""classif.ranger"", predict.type = ""prob"")","object_name_linter" +"vignettes/tutorial/handling_of_spatial_data.Rmd",108,1,"style","Variable and function name style should be snake_case or CamelCase.","learner.rf = makeLearner(""classif.ranger"", predict.type = ""prob"")","object_name_linter" +"vignettes/tutorial/hyperpar_tuning_effects.Rmd",75,43,"style","Use TRUE instead of the symbol T.","generateHyperParsEffectData(res, trafo = T, include.diagnostics = FALSE)","T_and_F_symbol_linter" +"vignettes/tutorial/hyperpar_tuning_effects.Rmd",86,43,"style","Use TRUE instead of the symbol T.","generateHyperParsEffectData(res, trafo = T, include.diagnostics = FALSE)","T_and_F_symbol_linter" +"vignettes/tutorial/hyperpar_tuning_effects.Rmd",114,43,"style","Use TRUE instead of the symbol T.","generateHyperParsEffectData(res, trafo = T, include.diagnostics = FALSE)","T_and_F_symbol_linter" +"vignettes/tutorial/hyperpar_tuning_effects.Rmd",126,43,"style","Use TRUE instead of the symbol T.","generateHyperParsEffectData(res, trafo = T, include.diagnostics = FALSE)","T_and_F_symbol_linter" +"vignettes/tutorial/impute.Rmd",104,1,"style","Variable and function name style should be snake_case or CamelCase.","airq.train = airq[1:100, ]","object_name_linter" +"vignettes/tutorial/impute.Rmd",105,1,"style","Variable and function name style should be snake_case or CamelCase.","airq.test = airq[-c(1:100), ]","object_name_linter" +"vignettes/tutorial/impute.Rmd",134,1,"style","Variable and function name style should be snake_case or CamelCase.","airq.test.imp = reimpute(airq.test, imp$desc)","object_name_linter" +"vignettes/tutorial/integrated_learners.Rmd",14,1,"style","Variable and function name style should be snake_case or CamelCase.","urlContribPackages = urlBasePackages = ""http://www.rdocumentation.org/packages/""","object_name_linter" +"vignettes/tutorial/integrated_learners.Rmd",14,22,"style","Variable and function name style should be snake_case or CamelCase.","urlContribPackages = urlBasePackages = ""http://www.rdocumentation.org/packages/""","object_name_linter" +"vignettes/tutorial/integrated_learners.Rmd",31,1,"style","Variable and function name style should be snake_case or CamelCase.","linkPkg = function(x) {","object_name_linter" +"vignettes/tutorial/integrated_learners.Rmd",34,7,"warning","no visible binding for global variable β€˜urlBasePackages’"," if (urlBasePackages != urlContribPackages) {","object_usage_linter" +"vignettes/tutorial/integrated_learners.Rmd",34,26,"warning","no visible binding for global variable β€˜urlContribPackages’"," if (urlBasePackages != urlContribPackages) {","object_usage_linter" +"vignettes/tutorial/integrated_learners.Rmd",35,18,"warning","no visible binding for global variable β€˜baseR’"," ind = x %in% baseR","object_usage_linter" +"vignettes/tutorial/integrated_learners.Rmd",36,13,"warning","no visible binding for global variable β€˜urlContribPackages’"," url = c(urlContribPackages, urlBasePackages)[ind + 1]","object_usage_linter" +"vignettes/tutorial/integrated_learners.Rmd",36,33,"warning","no visible binding for global variable β€˜urlBasePackages’"," url = c(urlContribPackages, urlBasePackages)[ind + 1]","object_usage_linter" +"vignettes/tutorial/integrated_learners.Rmd",38,11,"warning","no visible binding for global variable β€˜urlContribPackages’"," url = urlContribPackages","object_usage_linter" +"vignettes/tutorial/integrated_learners.Rmd",43,1,"style","Variable and function name style should be snake_case or CamelCase.","getTab = function(type) {","object_name_linter" +"vignettes/tutorial/integrated_learners.Rmd",54,121,"style","Lines should not be more than 120 characters."," cols = c(""class"", ""type"", ""package"", ""short.name"", ""name"", ""numerics"", ""factors"", ""ordered"", ""missings"", ""weights"", ""note"", ""installed"")","line_length_linter" +"vignettes/tutorial/integrated_learners.Rmd",57,3,"style","Variable and function name style should be snake_case or CamelCase."," colNames = c(""Class / Short Name / Name"", ""Packages"", ""Num."", ""Fac."", ""Ord."", ""NAs"", ""Weights"", ""Props"", ""Note"")","object_name_linter" +"vignettes/tutorial/integrated_learners.Rmd",59,121,"style","Lines should not be more than 120 characters."," col.types = c(""character"", ""character"", ""logical"", ""logical"", ""logical"", ""logical"", ""logical"", ""character"", ""character""))","line_length_linter" +"vignettes/tutorial/integrated_learners.Rmd",65,38,"warning","no visible binding for global variable β€˜linkPkg’"," df$Packages = sapply(lrns$package, linkPkg)","object_usage_linter" +"vignettes/tutorial/integrated_learners.Rmd",74,1,"style","Variable and function name style should be snake_case or CamelCase.","makeTab = function(df) {","object_name_linter" +"vignettes/tutorial/learner.Rmd",39,1,"style","Variable and function name style should be snake_case or CamelCase.","classif.lrn = makeLearner(""classif.randomForest"", predict.type = ""prob"", fix.factors.prediction = TRUE)","object_name_linter" +"vignettes/tutorial/learner.Rmd",42,1,"style","Variable and function name style should be snake_case or CamelCase.","regr.lrn = makeLearner(""regr.gbm"", par.vals = list(n.trees = 500, interaction.depth = 3))","object_name_linter" +"vignettes/tutorial/learner.Rmd",45,1,"style","Variable and function name style should be snake_case or CamelCase.","surv.lrn = makeLearner(""surv.coxph"", id = ""cph"")","object_name_linter" +"vignettes/tutorial/learner.Rmd",48,1,"style","Variable and function name style should be snake_case or CamelCase.","cluster.lrn = makeLearner(""cluster.kmeans"", centers = 5)","object_name_linter" +"vignettes/tutorial/learner.Rmd",51,1,"style","Variable and function name style should be snake_case or CamelCase.","multilabel.lrn = makeLearner(""multilabel.rFerns"")","object_name_linter" +"vignettes/tutorial/learner.Rmd",142,1,"style","Variable and function name style should be snake_case or CamelCase.","surv.lrn = setLearnerId(surv.lrn, ""CoxModel"")","object_name_linter" +"vignettes/tutorial/learner.Rmd",146,1,"style","Variable and function name style should be snake_case or CamelCase.","classif.lrn = setPredictType(classif.lrn, ""response"")","object_name_linter" +"vignettes/tutorial/learner.Rmd",149,1,"style","Variable and function name style should be snake_case or CamelCase.","cluster.lrn = setHyperPars(cluster.lrn, centers = 4)","object_name_linter" +"vignettes/tutorial/learner.Rmd",152,1,"style","Variable and function name style should be snake_case or CamelCase.","regr.lrn = removeHyperPars(regr.lrn, c(""n.trees"", ""interaction.depth""))","object_name_linter" +"vignettes/tutorial/measures.Rmd",14,1,"style","Variable and function name style should be snake_case or CamelCase.","urlMlrFunctions = ""https://mlr-org.github.io/mlr/reference/""","object_name_linter" +"vignettes/tutorial/measures.Rmd",46,1,"style","Variable and function name style should be snake_case or CamelCase.","linkFct = function(x, y) {","object_name_linter" +"vignettes/tutorial/measures.Rmd",47,50,"warning","no visible binding for global variable β€˜urlMlrFunctions’"," collapse(sprintf(""[%1$s](%3$s%2$s%4$s)"", x, y, urlMlrFunctions, ext), sep = ""
"")","object_usage_linter" +"vignettes/tutorial/measures.Rmd",47,67,"warning","no visible binding for global variable β€˜ext’"," collapse(sprintf(""[%1$s](%3$s%2$s%4$s)"", x, y, urlMlrFunctions, ext), sep = ""
"")","object_usage_linter" +"vignettes/tutorial/measures.Rmd",54,1,"style","Variable and function name style should be snake_case or CamelCase.","getTab = function(type) {","object_name_linter" +"vignettes/tutorial/measures.Rmd",67,121,"style","Lines should not be more than 120 characters."," cols = c(""ID / Name"", ""Minim."", ""Best"", ""Worst"", ""Multi"", ""Pred."", ""Truth"", ""Probs"", ""Model"", ""Task"", ""Feats"", ""Aggr."", ""Note"")","line_length_linter" +"vignettes/tutorial/measures.Rmd",69,121,"style","Lines should not be more than 120 characters."," col.types = c(""character"", ""logical"", ""numeric"", ""numeric"", ""logical"", ""logical"", ""logical"", ""logical"", ""logical"", ""logical"", ""logical"", ""character"", ""character""))","line_length_linter" +"vignettes/tutorial/measures.Rmd",74,29,"warning","no visible global function definition for β€˜linkFct’"," df[i, 1] = paste0(""**"", linkFct(mea$id, ""measures""), ""**
"", mea$name)","object_usage_linter" +"vignettes/tutorial/measures.Rmd",85,17,"warning","no visible global function definition for β€˜linkFct’"," df[i, 12] = linkFct(mea$aggr$id, ""aggregations"")","object_usage_linter" +"vignettes/tutorial/measures.Rmd",86,17,"warning","no visible global function definition for β€˜urls’"," df[i, 13] = urls(cn(mea$note))","object_usage_linter" +"vignettes/tutorial/measures.Rmd",86,22,"warning","no visible global function definition for β€˜cn’"," df[i, 13] = urls(cn(mea$note))","object_usage_linter" +"vignettes/tutorial/measures.Rmd",89,121,"style","Lines should not be more than 120 characters."," just = c(""left"", ""center"", ""right"", ""right"", ""center"", ""center"", ""center"", ""center"", ""center"", ""center"", ""center"", ""left"", ""left"")","line_length_linter" +"vignettes/tutorial/multilabel.Rmd",37,1,"style","Variable and function name style should be snake_case or CamelCase.","yeast.task = makeMultilabelTask(id = ""multi"", data = yeast, target = labels)","object_name_linter" +"vignettes/tutorial/multilabel.Rmd",55,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.rfsrc = makeLearner(""multilabel.randomForestSRC"")","object_name_linter" +"vignettes/tutorial/multilabel.Rmd",56,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.rFerns = makeLearner(""multilabel.rFerns"")","object_name_linter" +"vignettes/tutorial/multilabel.Rmd",68,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.br = makeLearner(""classif.rpart"", predict.type = ""prob"")","object_name_linter" +"vignettes/tutorial/multilabel.Rmd",69,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.br = makeMultilabelBinaryRelevanceWrapper(lrn.br)","object_name_linter" +"vignettes/tutorial/multilabel.Rmd",72,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.br2 = makeMultilabelBinaryRelevanceWrapper(""classif.rpart"")","object_name_linter" +"vignettes/tutorial/nested_resampling.Rmd",145,1,"style","Variable and function name style should be snake_case or CamelCase.","opt.paths = getNestedTuneResultsOptPathDf(r)","object_name_linter" +"vignettes/tutorial/nested_resampling.Rmd",150,1,"style","Variable and function name style should be snake_case or CamelCase.","opt.paths = getNestedTuneResultsOptPathDf(r)","object_name_linter" +"vignettes/tutorial/nested_resampling.Rmd",265,1,"style","Variable and function name style should be snake_case or CamelCase.","opt.paths = lapply(r$extract, function(x) as.data.frame(x$opt.path))","object_name_linter" +"vignettes/tutorial/nested_resampling.Rmd",270,1,"style","Variable and function name style should be snake_case or CamelCase.","opt.paths = lapply(r$extract, function(x) as.data.frame(x$opt.path))","object_name_linter" +"vignettes/tutorial/nested_resampling.Rmd",363,1,"style","Variable and function name style should be snake_case or CamelCase.","opt.paths = lapply(res, function(x) as.data.frame(x$opt.path))","object_name_linter" +"vignettes/tutorial/nested_resampling.Rmd",458,1,"style","Variable and function name style should be snake_case or CamelCase.","tune.res = getBMRTuneResults(res,","object_name_linter" +"vignettes/tutorial/nested_resampling.Rmd",514,1,"style","Variable and function name style should be snake_case or CamelCase.","opt.paths = lapply(feats, function(x) as.data.frame(x$opt.path))","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",64,1,"style","Variable and function name style should be snake_case or CamelCase.","data.imbal.train = rbind(","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",69,1,"style","Variable and function name style should be snake_case or CamelCase.","task.over = oversample(task, rate = 8)","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",70,1,"style","Variable and function name style should be snake_case or CamelCase.","task.under = undersample(task, rate = 1 / 8)","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",87,1,"style","Variable and function name style should be snake_case or CamelCase.","mod.over = train(lrn, task.over)","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",88,1,"style","Variable and function name style should be snake_case or CamelCase.","mod.under = train(lrn, task.under)","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",89,1,"style","Variable and function name style should be snake_case or CamelCase.","data.imbal.test = rbind(","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",113,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.over = makeOversampleWrapper(lrn, osw.rate = 8)","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",114,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.under = makeUndersampleWrapper(lrn, usw.rate = 1 / 8)","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",116,1,"style","Variable and function name style should be snake_case or CamelCase.","mod.over = train(lrn.over, task)","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",117,1,"style","Variable and function name style should be snake_case or CamelCase.","mod.under = train(lrn.under, task)","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",140,1,"style","Variable and function name style should be snake_case or CamelCase.","task.smote = smote(task, rate = 8, nn = 5)","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",149,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.smote = makeSMOTEWrapper(lrn, sw.rate = 8, sw.nn = 5)","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",150,1,"style","Variable and function name style should be snake_case or CamelCase.","mod.smote = train(lrn.smote, task)","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",170,1,"style","Variable and function name style should be snake_case or CamelCase.","obw.lrn = makeOverBaggingWrapper(lrn, obw.rate = 8, obw.iters = 3)","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",186,1,"style","Variable and function name style should be snake_case or CamelCase.","obw.lrn = setPredictType(obw.lrn, ""prob"")","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",196,1,"style","Variable and function name style should be snake_case or CamelCase.","obw.lrn = makeOverBaggingWrapper(lrn, obw.rate = 8, obw.iters = 3)","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",203,1,"style","Variable and function name style should be snake_case or CamelCase.","obw.lrn = setPredictType(obw.lrn, ""prob"")","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",317,1,"style","Variable and function name style should be snake_case or CamelCase.","wcw.lrn = makeWeightedClassesWrapper(lrn, wcw.weight = 0.01)","object_name_linter" +"vignettes/tutorial/over_and_undersampling.Rmd",328,1,"style","Variable and function name style should be snake_case or CamelCase.","wcw.lrn = makeWeightedClassesWrapper(lrn, wcw.weight = 0.01)","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",66,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.classif = makeLearner(""classif.ksvm"", predict.type = ""prob"")","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",67,1,"style","Variable and function name style should be snake_case or CamelCase.","fit.classif = train(lrn.classif, iris.task)","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",80,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.lst = generatePartialDependenceData(fit.classif, iris.task, c(""Petal.Width"", ""Petal.Length""), FALSE)","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",87,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.int = generatePartialDependenceData(fit.classif, iris.task, c(""Petal.Width"", ""Petal.Length""), TRUE)","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",104,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.regr = makeLearner(""regr.ksvm"")","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",105,1,"style","Variable and function name style should be snake_case or CamelCase.","fit.regr = train(lrn.regr, bh.task)","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",106,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.regr = generatePartialDependenceData(fit.regr, bh.task, ""lstat"", fun = median)","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",111,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.ci = generatePartialDependenceData(fit.regr, bh.task, ""lstat"",","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",117,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.classif = generatePartialDependenceData(fit.classif, iris.task, ""Petal.Length"", fun = median)","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",126,1,"style","Variable and function name style should be snake_case or CamelCase.","fit.se = train(makeLearner(""regr.randomForest"", predict.type = ""se""), bh.task)","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",127,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.se = generatePartialDependenceData(fit.se, bh.task, c(""lstat"", ""crim""))","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",137,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.ind.regr = generatePartialDependenceData(fit.regr, bh.task, ""lstat"", individual = TRUE)","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",146,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.ind.classif = generatePartialDependenceData(fit.classif, iris.task, ""Petal.Length"", individual = TRUE)","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",155,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.regr.der = generatePartialDependenceData(fit.regr, bh.task, ""lstat"", derivative = TRUE)","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",160,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.regr.der.ind = generatePartialDependenceData(fit.regr, bh.task, ""lstat"", derivative = TRUE,","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",166,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.classif.der = generatePartialDependenceData(fit.classif, iris.task, ""Petal.Width"", derivative = TRUE)","object_name_linter" +"vignettes/tutorial/partial_dependence.Rmd",171,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.classif.der.ind = generatePartialDependenceData(fit.classif, iris.task, ""Petal.Width"", derivative = TRUE,","object_name_linter" +"vignettes/tutorial/predict.Rmd",36,1,"style","Variable and function name style should be snake_case or CamelCase.","train.set = seq(1, n, by = 2)","object_name_linter" +"vignettes/tutorial/predict.Rmd",37,1,"style","Variable and function name style should be snake_case or CamelCase.","test.set = seq(2, n, by = 2)","object_name_linter" +"vignettes/tutorial/predict.Rmd",41,1,"style","Variable and function name style should be snake_case or CamelCase.","task.pred = predict(mod, task = bh.task, subset = test.set)","object_name_linter" +"vignettes/tutorial/predict.Rmd",47,1,"style","Variable and function name style should be snake_case or CamelCase.","train.set = seq(1, n, by = 2)","object_name_linter" +"vignettes/tutorial/predict.Rmd",48,1,"style","Variable and function name style should be snake_case or CamelCase.","test.set = seq(2, n, by = 2)","object_name_linter" +"vignettes/tutorial/predict.Rmd",52,1,"style","Variable and function name style should be snake_case or CamelCase.","task.pred = predict(mod, task = bh.task, subset = test.set)","object_name_linter" +"vignettes/tutorial/predict.Rmd",77,1,"style","Variable and function name style should be snake_case or CamelCase.","iris.train = iris[seq(1, n, by = 2), -5]","object_name_linter" +"vignettes/tutorial/predict.Rmd",78,1,"style","Variable and function name style should be snake_case or CamelCase.","iris.test = iris[seq(2, n, by = 2), -5]","object_name_linter" +"vignettes/tutorial/predict.Rmd",82,1,"style","Variable and function name style should be snake_case or CamelCase.","newdata.pred = predict(mod, newdata = iris.test)","object_name_linter" +"vignettes/tutorial/predict.Rmd",88,1,"style","Variable and function name style should be snake_case or CamelCase.","iris.train = iris[seq(1, n, by = 2), -5]","object_name_linter" +"vignettes/tutorial/predict.Rmd",89,1,"style","Variable and function name style should be snake_case or CamelCase.","iris.test = iris[seq(2, n, by = 2), -5]","object_name_linter" +"vignettes/tutorial/predict.Rmd",93,1,"style","Variable and function name style should be snake_case or CamelCase.","newdata.pred = predict(mod, newdata = iris.test)","object_name_linter" +"vignettes/tutorial/predict.Rmd",156,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.lm = makeLearner(""regr.lm"", predict.type = ""se"")","object_name_linter" +"vignettes/tutorial/predict.Rmd",157,1,"style","Variable and function name style should be snake_case or CamelCase.","mod.lm = train(lrn.lm, bh.task, subset = train.set)","object_name_linter" +"vignettes/tutorial/predict.Rmd",158,1,"style","Variable and function name style should be snake_case or CamelCase.","task.pred.lm = predict(mod.lm, task = bh.task, subset = test.set)","object_name_linter" +"vignettes/tutorial/predict.Rmd",163,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.lm = makeLearner(""regr.lm"", predict.type = ""se"")","object_name_linter" +"vignettes/tutorial/predict.Rmd",164,1,"style","Variable and function name style should be snake_case or CamelCase.","mod.lm = train(lrn.lm, bh.task, subset = train.set)","object_name_linter" +"vignettes/tutorial/predict.Rmd",165,1,"style","Variable and function name style should be snake_case or CamelCase.","task.pred.lm = predict(mod.lm, task = bh.task, subset = test.set)","object_name_linter" +"vignettes/tutorial/predict.Rmd",246,1,"style","Variable and function name style should be snake_case or CamelCase.","conf.matrix = calculateConfusionMatrix(pred, relative = TRUE)","object_name_linter" +"vignettes/tutorial/preproc.Rmd",376,1,"style","Variable and function name style should be snake_case or CamelCase.","makePreprocWrapperScale = function(learner, center = TRUE, scale = TRUE) {","object_name_linter" +"vignettes/tutorial/resample.Rmd",182,121,"style","Lines should not be more than 120 characters.","## Aggregated Result: mmce.test.mean=0.2904762,fpr.test.mean=0.2932609,fnr.test.mean=0.2615067,timetrain.test.mean=0.0128000","line_length_linter" +"vignettes/tutorial/resample.Rmd",207,121,"style","Lines should not be more than 120 characters.","## Aggr perf: mmce.test.mean=0.2904762,fpr.test.mean=0.2932609,fnr.test.mean=0.2615067,timetrain.test.mean=0.0128000,ber.test.mean=0.2773838,timepredict.test.mean=0.0032000","line_length_linter" +"vignettes/tutorial/resample.Rmd",346,1,"style","Variable and function name style should be snake_case or CamelCase.","predList = getRRPredictionList(r)","object_name_linter" +"vignettes/tutorial/resample.Rmd",351,1,"style","Variable and function name style should be snake_case or CamelCase.","predList = getRRPredictionList(r)","object_name_linter" +"vignettes/tutorial/resample.Rmd",635,1,"style","Variable and function name style should be snake_case or CamelCase.","r.lda = resample(""classif.lda"", iris.task, rin, show.info = FALSE)","object_name_linter" +"vignettes/tutorial/resample.Rmd",636,1,"style","Variable and function name style should be snake_case or CamelCase.","r.rpart = resample(""classif.rpart"", iris.task, rin, show.info = FALSE)","object_name_linter" +"vignettes/tutorial/resample.Rmd",693,1,"style","Variable and function name style should be snake_case or CamelCase.","mseTestMedian = setAggregation(mse, test.median)","object_name_linter" +"vignettes/tutorial/resample.Rmd",694,1,"style","Variable and function name style should be snake_case or CamelCase.","mseTestMin = setAggregation(mse, test.min)","object_name_linter" +"vignettes/tutorial/resample.Rmd",695,1,"style","Variable and function name style should be snake_case or CamelCase.","mseTestMax = setAggregation(mse, test.max)","object_name_linter" +"vignettes/tutorial/resample.Rmd",704,1,"style","Variable and function name style should be snake_case or CamelCase.","mseTestMedian = setAggregation(mse, test.median)","object_name_linter" +"vignettes/tutorial/resample.Rmd",705,1,"style","Variable and function name style should be snake_case or CamelCase.","mseTestMin = setAggregation(mse, test.min)","object_name_linter" +"vignettes/tutorial/resample.Rmd",706,1,"style","Variable and function name style should be snake_case or CamelCase.","mseTestMax = setAggregation(mse, test.max)","object_name_linter" +"vignettes/tutorial/resample.Rmd",726,121,"style","Lines should not be more than 120 characters.","## Aggregated Result: mse.test.mean=24.0886607,mse.test.median=24.0782026,mse.test.min=18.6894718,mse.test.max=29.4983077","line_length_linter" +"vignettes/tutorial/resample.Rmd",748,1,"style","Variable and function name style should be snake_case or CamelCase.","mmceTrainMean = setAggregation(mmce, train.mean)","object_name_linter" +"vignettes/tutorial/resample.Rmd",777,1,"style","Variable and function name style should be snake_case or CamelCase.","mmceB632 = setAggregation(mmce, b632)","object_name_linter" +"vignettes/tutorial/resample.Rmd",778,1,"style","Variable and function name style should be snake_case or CamelCase.","mmceB632plus = setAggregation(mmce, b632plus)","object_name_linter" +"vignettes/tutorial/roc_analysis.Rmd",65,1,"style","Variable and function name style should be snake_case or CamelCase.","train.set = sample(n, size = round(2 / 3 * n))","object_name_linter" +"vignettes/tutorial/roc_analysis.Rmd",66,1,"style","Variable and function name style should be snake_case or CamelCase.","test.set = setdiff(seq_len(n), train.set)","object_name_linter" +"vignettes/tutorial/roc_analysis.Rmd",160,1,"style","Variable and function name style should be snake_case or CamelCase.","rdesc.inner = makeResampleDesc(""Holdout"")","object_name_linter" +"vignettes/tutorial/roc_analysis.Rmd",175,1,"style","Variable and function name style should be snake_case or CamelCase.","rdesc.outer = makeResampleDesc(""CV"", iters = 5)","object_name_linter" +"vignettes/tutorial/roc_analysis.Rmd",247,1,"style","Variable and function name style should be snake_case or CamelCase.","train.set = sample(n, size = round(2 / 3 * n))","object_name_linter" +"vignettes/tutorial/roc_analysis.Rmd",248,1,"style","Variable and function name style should be snake_case or CamelCase.","test.set = setdiff(seq_len(n), train.set)","object_name_linter" +"vignettes/tutorial/task.Rmd",46,1,"style","Variable and function name style should be snake_case or CamelCase.","regr.task = makeRegrTask(id = ""bh"", data = BostonHousing, target = ""medv"")","object_name_linter" +"vignettes/tutorial/task.Rmd",65,1,"style","Variable and function name style should be snake_case or CamelCase.","classif.task = makeClassifTask(id = ""BreastCancer"", data = df, target = ""Class"")","object_name_linter" +"vignettes/tutorial/task.Rmd",77,1,"style","Variable and function name style should be snake_case or CamelCase.","classif.task = makeClassifTask(id = ""BreastCancer"", data = df, target = ""Class"", positive = ""malignant"")","object_name_linter" +"vignettes/tutorial/task.Rmd",89,1,"style","Variable and function name style should be snake_case or CamelCase.","surv.task = makeSurvTask(data = lung, target = c(""time"", ""status""))","object_name_linter" +"vignettes/tutorial/task.Rmd",109,1,"style","Variable and function name style should be snake_case or CamelCase.","yeast.task = makeMultilabelTask(id = ""multi"", data = yeast, target = labels)","object_name_linter" +"vignettes/tutorial/task.Rmd",122,1,"style","Variable and function name style should be snake_case or CamelCase.","cluster.task = makeClusterTask(data = mtcars)","object_name_linter" +"vignettes/tutorial/task.Rmd",147,1,"style","Variable and function name style should be snake_case or CamelCase.","costsens.task = makeCostSensTask(data = df, cost = cost)","object_name_linter" +"vignettes/tutorial/task.Rmd",227,1,"style","Variable and function name style should be snake_case or CamelCase.","cluster.task = subsetTask(cluster.task, subset = 4:17)","object_name_linter" +"vignettes/tutorial/train.Rmd",74,1,"style","Variable and function name style should be snake_case or CamelCase.","ruspini.task = makeClusterTask(data = ruspini)","object_name_linter" +"vignettes/tutorial/train.Rmd",106,1,"style","Variable and function name style should be snake_case or CamelCase.","train.set = sample(n, size = n / 3)","object_name_linter" +"vignettes/tutorial/usecase_regression.Rmd",44,1,"style","Variable and function name style should be snake_case or CamelCase.","regr.task = makeRegrTask(data = BostonHousing, target = ""medv"")","object_name_linter" +"vignettes/tutorial/usecase_regression.Rmd",92,1,"style","Variable and function name style should be snake_case or CamelCase.","tuned.ksvm = makeTuneWrapper(learner = ""regr.ksvm"", resampling = rdesc, measures = meas,","object_name_linter" +"vignettes/tutorial/usecase_regression.Rmd",94,1,"style","Variable and function name style should be snake_case or CamelCase.","tuned.rf = makeTuneWrapper(learner = ""regr.ranger"", resampling = rdesc, measures = meas,","object_name_linter" +"vignettes/tutorial/wrapper.Rmd",56,1,"style","Variable and function name style should be snake_case or CamelCase.","base.lrn = makeLearner(""classif.rpart"")","object_name_linter" +"vignettes/tutorial/wrapper.Rmd",57,1,"style","Variable and function name style should be snake_case or CamelCase.","wrapped.lrn = makeBaggingWrapper(base.lrn, bw.iters = 100, bw.feats = 0.5)","object_name_linter" +"vignettes/tutorial/wrapper.Rmd",81,1,"style","Variable and function name style should be snake_case or CamelCase.","par.set = makeParamSet(","object_name_linter" +"vignettes/tutorial/wrapper.Rmd",85,1,"style","Variable and function name style should be snake_case or CamelCase.","tuned.lrn = makeTuneWrapper(wrapped.lrn, rdesc, mmce, par.set, ctrl)","object_name_linter" diff --git a/.dev/revdep_emails/mlr/attachments/mlr.warnings b/.dev/revdep_emails/mlr/attachments/mlr.warnings new file mode 100644 index 000000000..be09e01a7 --- /dev/null +++ b/.dev/revdep_emails/mlr/attachments/mlr.warnings @@ -0,0 +1,2 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Trying to remove β€˜todo_comment_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/mlr/email-body b/.dev/revdep_emails/mlr/email-body new file mode 100644 index 000000000..b3ee6d900 --- /dev/null +++ b/.dev/revdep_emails/mlr/email-body @@ -0,0 +1,29 @@ +Hello Patrick Schratz! Thank you for using {lintr} in your package {mlr}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/mlr-org/mlr (hash: 3f70ac162d764eca87a6a2c122fb7989a1bd2d4a) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 356s on CRAN vs. 213s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/mlrCPO/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/mlrCPO/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..914c55203 --- /dev/null +++ b/.dev/revdep_emails/mlrCPO/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,4 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/makeCPO.R",110,28,"style","Variable and function name style should be snake_case."," predict.type.map = c(response = ""response""),","object_name_linter" +"R/makeCPO.R",140,28,"style","Variable and function name style should be snake_case."," predict.type.map = c(response = ""response""),","object_name_linter" +"tests/testthat/test_core_datasplit.R",400,11,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" diff --git a/.dev/revdep_emails/mlrCPO/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/mlrCPO/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..62b9ad28a --- /dev/null +++ b/.dev/revdep_emails/mlrCPO/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,441 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/doc/toc/vignettetoc.Rmd",16,3,"style","Commented code should be removed.","# path = names(knitr::opts_knit$get(""encoding""))[1]","commented_code_linter" +"inst/doc/toc/vignettetoc.Rmd",16,3,"style","Commented code should be removed.","# path = names(knitr::opts_knit$get(""encoding""))[1]","commented_code_linter" +"inst/doc/toc/vignettetoc.Rmd",17,6,"style","Use <-, not =, for assignment.","base = knitr::opts_knit$get(""output.dir"")","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",17,6,"style","Use <-, not =, for assignment.","base = knitr::opts_knit$get(""output.dir"")","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",18,6,"style","Use <-, not =, for assignment.","file = sys.frame(min(grep(""^knitr::knit$|^knit$"", sapply(sys.calls(), function(x) as.character(x)[1]))))$input","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",18,6,"style","Use <-, not =, for assignment.","file = sys.frame(min(grep(""^knitr::knit$|^knit$"", sapply(sys.calls(), function(x) as.character(x)[1]))))$input","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",18,81,"style","Lines should not be more than 80 characters.","file = sys.frame(min(grep(""^knitr::knit$|^knit$"", sapply(sys.calls(), function(x) as.character(x)[1]))))$input","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",18,81,"style","Lines should not be more than 80 characters.","file = sys.frame(min(grep(""^knitr::knit$|^knit$"", sapply(sys.calls(), function(x) as.character(x)[1]))))$input","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",19,6,"style","Use <-, not =, for assignment.","file = basename(file)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",19,6,"style","Use <-, not =, for assignment.","file = basename(file)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",20,6,"style","Use <-, not =, for assignment.","path = file.path(base, file)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",20,6,"style","Use <-, not =, for assignment.","path = file.path(base, file)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",21,7,"style","Use <-, not =, for assignment.","rpath = gsub(""\\.[^.]*$"", "".R"", path)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",21,7,"style","Use <-, not =, for assignment.","rpath = gsub(""\\.[^.]*$"", "".R"", path)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",26,11,"style","Use <-, not =, for assignment."," lines = readLines(rpath)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",26,11,"style","Use <-, not =, for assignment."," lines = readLines(rpath)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",27,11,"style","Use <-, not =, for assignment."," lines = gsub("" *(\n|$)"", ""\\1"", lines)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",27,11,"style","Use <-, not =, for assignment."," lines = gsub("" *(\n|$)"", ""\\1"", lines)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",36,10,"style","Use <-, not =, for assignment.","fullfile = file","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",36,10,"style","Use <-, not =, for assignment.","fullfile = file","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",38,10,"style","Use <-, not =, for assignment.","allfiles = list.files(path = base, pattern = "".*\\.Rmd$"")","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",38,10,"style","Use <-, not =, for assignment.","allfiles = list.files(path = base, pattern = "".*\\.Rmd$"")","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",42,14,"style","Use <-, not =, for assignment.","fileinfolist = list()","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",42,14,"style","Use <-, not =, for assignment.","fileinfolist = list()","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",44,10,"style","Use <-, not =, for assignment."," ismain = TRUE","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",44,10,"style","Use <-, not =, for assignment."," ismain = TRUE","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",46,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""^z_"", """", cf)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",46,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""^z_"", """", cf)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",47,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""_terse\\.Rmd$"", """", infoslot)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",47,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""_terse\\.Rmd$"", """", infoslot)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",48,13,"style","Use <-, not =, for assignment."," subslot = ""compact""","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",48,13,"style","Use <-, not =, for assignment."," subslot = ""compact""","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",50,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""^a_"", """", cf)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",50,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""^a_"", """", cf)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",51,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""\\.Rmd$"", """", infoslot)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",51,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""\\.Rmd$"", """", infoslot)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",52,13,"style","Use <-, not =, for assignment."," subslot = ""main""","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",52,13,"style","Use <-, not =, for assignment."," subslot = ""main""","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",55,11,"style","Use <-, not =, for assignment."," content = scan(paste(base, cf, sep = ""/""), what = ""character"", quiet = TRUE)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",55,11,"style","Use <-, not =, for assignment."," content = scan(paste(base, cf, sep = ""/""), what = ""character"", quiet = TRUE)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",56,7,"style","Use <-, not =, for assignment."," pos = min(c(which(content == ""title:""), Inf))","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",56,7,"style","Use <-, not =, for assignment."," pos = min(c(which(content == ""title:""), Inf))","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",60,12,"style","Use <-, not =, for assignment."," infolist = list(title = content[pos + 1], url = cf, iscurrent = cf == file)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",60,12,"style","Use <-, not =, for assignment."," infolist = list(title = content[pos + 1], url = cf, iscurrent = cf == file)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",62,11,"style","Use <-, not =, for assignment."," applist = list(infolist)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",62,11,"style","Use <-, not =, for assignment."," applist = list(infolist)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",63,18,"style","Use <-, not =, for assignment."," names(applist) = subslot","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",63,18,"style","Use <-, not =, for assignment."," names(applist) = subslot","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",64,28,"style","Use <-, not =, for assignment."," fileinfolist[[infoslot]] = c(fileinfolist[[infoslot]], applist)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",64,28,"style","Use <-, not =, for assignment."," fileinfolist[[infoslot]] = c(fileinfolist[[infoslot]], applist)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",68,9,"style","Use <-, not =, for assignment.","linkify = function(info, title) {","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",68,9,"style","Use <-, not =, for assignment.","linkify = function(info, title) {","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",78,11,"style","Use <-, not =, for assignment."," content = fileinfolist[[sort(names(fileinfolist))[idx]]]","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",78,11,"style","Use <-, not =, for assignment."," content = fileinfolist[[sort(names(fileinfolist))[idx]]]","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",80,81,"style","Lines should not be more than 80 characters."," if (paste(sub(""[0-9]\\. "", """", content$main$title), ""(No Output)"") != sub(""^z "", """", content$compact$title)) {","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",80,81,"style","Lines should not be more than 80 characters."," if (paste(sub(""[0-9]\\. "", """", content$main$title), ""(No Output)"") != sub(""^z "", """", content$compact$title)) {","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",81,81,"style","Lines should not be more than 80 characters."," stop(sprintf(""File %s and its compact version %s have incompatible titles\nThe compact version must be paste(main_title, \""(No Output)\""). Is: '%s', expected: '%s'"",","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",81,81,"style","Lines should not be more than 80 characters."," stop(sprintf(""File %s and its compact version %s have incompatible titles\nThe compact version must be paste(main_title, \""(No Output)\""). Is: '%s', expected: '%s'"",","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",82,81,"style","Lines should not be more than 80 characters."," content$main$url, content$compact$url, content$compact$title, paste(content$main$title, ""(No Output)"")))","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",82,81,"style","Lines should not be more than 80 characters."," content$main$url, content$compact$url, content$compact$title, paste(content$main$title, ""(No Output)"")))","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",84,10,"style","Use <-, not =, for assignment."," line = sprintf(""%s (%s)"", linkify(content$main, content$main$title), linkify(content$compact, ""compact version""))","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",84,10,"style","Use <-, not =, for assignment."," line = sprintf(""%s (%s)"", linkify(content$main, content$main$title), linkify(content$compact, ""compact version""))","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",84,81,"style","Lines should not be more than 80 characters."," line = sprintf(""%s (%s)"", linkify(content$main, content$main$title), linkify(content$compact, ""compact version""))","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",84,81,"style","Lines should not be more than 80 characters."," line = sprintf(""%s (%s)"", linkify(content$main, content$main$title), linkify(content$compact, ""compact version""))","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",86,10,"style","Use <-, not =, for assignment."," line = linkify(content$main, content$main$title)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",86,10,"style","Use <-, not =, for assignment."," line = linkify(content$main, content$main$title)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",90,14,"style","Use <-, not =, for assignment."," fullfile = content$main$url","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",90,14,"style","Use <-, not =, for assignment."," fullfile = content$main$url","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",94,10,"style","Use <-, not =, for assignment.","fullpath = file.path(base, fullfile)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",94,10,"style","Use <-, not =, for assignment.","fullpath = file.path(base, fullfile)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",102,1,"style","Variable and function name style should be snake_case or symbols.","printToc = function(print.level = 3) {","object_name_linter" +"inst/doc/toc/vignettetoc.Rmd",102,1,"style","Variable and function name style should be snake_case or symbols.","printToc = function(print.level = 3) {","object_name_linter" +"inst/doc/toc/vignettetoc.Rmd",102,10,"style","Use <-, not =, for assignment.","printToc = function(print.level = 3) {","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",102,10,"style","Use <-, not =, for assignment.","printToc = function(print.level = 3) {","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",103,14,"style","Use <-, not =, for assignment."," owncontent = readLines(fullpath)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",103,14,"style","Use <-, not =, for assignment."," owncontent = readLines(fullpath)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",103,26,"warning","no visible binding for global variable β€˜fullpath’"," owncontent = readLines(fullpath)","object_usage_linter" +"inst/doc/toc/vignettetoc.Rmd",103,26,"warning","no visible binding for global variable β€˜fullpath’"," owncontent = readLines(fullpath)","object_usage_linter" +"inst/doc/toc/vignettetoc.Rmd",104,13,"style","Use <-, not =, for assignment."," tripletic = grepl(""^```"", owncontent)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",104,13,"style","Use <-, not =, for assignment."," tripletic = grepl(""^```"", owncontent)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",105,14,"style","Use <-, not =, for assignment."," owncontent = owncontent[cumsum(tripletic) %% 2 == 0] # exclude ```-delimited code","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",105,14,"style","Use <-, not =, for assignment."," owncontent = owncontent[cumsum(tripletic) %% 2 == 0] # exclude ```-delimited code","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",105,81,"style","Lines should not be more than 80 characters."," owncontent = owncontent[cumsum(tripletic) %% 2 == 0] # exclude ```-delimited code","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",105,81,"style","Lines should not be more than 80 characters."," owncontent = owncontent[cumsum(tripletic) %% 2 == 0] # exclude ```-delimited code","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",106,13,"style","Use <-, not =, for assignment."," headlines = grep(""^#+ +"", owncontent, value = TRUE)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",106,13,"style","Use <-, not =, for assignment."," headlines = grep(""^#+ +"", owncontent, value = TRUE)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",107,14,"style","Use <-, not =, for assignment."," headlevels = nchar(gsub("" .*"", """", headlines))","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",107,14,"style","Use <-, not =, for assignment."," headlevels = nchar(gsub("" .*"", """", headlines))","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",108,13,"style","Use <-, not =, for assignment."," headlines = gsub(""^[#]+ +"", """", headlines)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",108,13,"style","Use <-, not =, for assignment."," headlines = gsub(""^[#]+ +"", """", headlines)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",109,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"inst/doc/toc/vignettetoc.Rmd",109,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"inst/doc/toc/vignettetoc.Rmd",110,9,"style","Use <-, not =, for assignment."," links = gsub(""[^-a-z. ]"", """", tolower(headlines))","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",110,9,"style","Use <-, not =, for assignment."," links = gsub(""[^-a-z. ]"", """", tolower(headlines))","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",111,9,"style","Use <-, not =, for assignment."," links = gsub("" +"", ""-"", links)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",111,9,"style","Use <-, not =, for assignment."," links = gsub("" +"", ""-"", links)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",112,9,"style","Use <-, not =, for assignment."," links = gsub(""-$"", """", links)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",112,9,"style","Use <-, not =, for assignment."," links = gsub(""-$"", """", links)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",117,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"inst/doc/toc/vignettetoc.Rmd",117,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"inst/doc/toc/vignettetoc.Rmd",118,81,"style","Lines should not be more than 80 characters."," cat(""Table of Contents\n
\n"", sep = """")","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",118,81,"style","Lines should not be more than 80 characters."," cat(""Table of Contents\n
\n"", sep = """")","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",120,13,"style","Use <-, not =, for assignment."," lastlevel = headlevels[1] - 1","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",120,13,"style","Use <-, not =, for assignment."," lastlevel = headlevels[1] - 1","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",122,10,"style","Use <-, not =, for assignment."," line = headlines[idx]","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",122,10,"style","Use <-, not =, for assignment."," line = headlines[idx]","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",123,11,"style","Use <-, not =, for assignment."," level = headlevels[idx]","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",123,11,"style","Use <-, not =, for assignment."," level = headlevels[idx]","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",124,10,"style","Use <-, not =, for assignment."," link = links[idx]","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",124,10,"style","Use <-, not =, for assignment."," link = links[idx]","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",129,81,"style","Lines should not be more than 80 characters."," stop(""First headline level must be the lowest one used, but '"", line, ""' is lower."")","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",129,81,"style","Lines should not be more than 80 characters."," stop(""First headline level must be the lowest one used, but '"", line, ""' is lower."")","line_length_linter" +"inst/doc/toc/vignettetoc.Rmd",131,13,"style","Use <-, not =, for assignment."," lvldiff = level - lastlevel","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",131,13,"style","Use <-, not =, for assignment."," lvldiff = level - lastlevel","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",148,15,"style","Use <-, not =, for assignment."," lastlevel = level","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",148,15,"style","Use <-, not =, for assignment."," lastlevel = level","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",151,11,"style","Use <-, not =, for assignment."," lvldiff = lastlevel - headlevels[1]","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",151,11,"style","Use <-, not =, for assignment."," lvldiff = lastlevel - headlevels[1]","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",165,14,"style","Use <-, not =, for assignment.","replaceprint = function(ofunc) {","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",165,14,"style","Use <-, not =, for assignment.","replaceprint = function(ofunc) {","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",168,8,"style","Use <-, not =, for assignment."," cu = capture.output({ret = ofunc(x, ...)})","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",168,8,"style","Use <-, not =, for assignment."," cu = capture.output({ret = ofunc(x, ...)})","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",168,25,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," cu = capture.output({ret = ofunc(x, ...)})","brace_linter" +"inst/doc/toc/vignettetoc.Rmd",168,25,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," cu = capture.output({ret = ofunc(x, ...)})","brace_linter" +"inst/doc/toc/vignettetoc.Rmd",168,30,"style","Use <-, not =, for assignment."," cu = capture.output({ret = ofunc(x, ...)})","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",168,30,"style","Use <-, not =, for assignment."," cu = capture.output({ret = ofunc(x, ...)})","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",169,8,"style","Use <-, not =, for assignment."," cu = grep(""time: [-+e0-9.]{1,6}"", cu, value = TRUE, invert = TRUE)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",169,8,"style","Use <-, not =, for assignment."," cu = grep(""time: [-+e0-9.]{1,6}"", cu, value = TRUE, invert = TRUE)","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",179,9,"style","Use <-, not =, for assignment."," ofunc = get(pfunc, asNamespace(""mlr""))","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",179,9,"style","Use <-, not =, for assignment."," ofunc = get(pfunc, asNamespace(""mlr""))","assignment_linter" +"inst/doc/toc/vignettetoc.Rmd",182,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" +"inst/doc/toc/vignettetoc.Rmd",182,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" +"inst/doc/toc/vignettetoc.Rmd",183,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" +"inst/doc/toc/vignettetoc.Rmd",183,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" +"R/CPO_encode.R",25,18,"style","Any function spanning multiple lines should use curly braces."," lapply(data, function(col)","brace_linter" +"R/CPO_encode.R",26,35,"style","Any function spanning multiple lines should use curly braces."," sapply(levels(target[[1]]), function(tl)","brace_linter" +"R/CPO_encode.R",27,37,"style","Any function spanning multiple lines should use curly braces."," vnapply(c(levels(col), NA), function(cl)","brace_linter" +"R/CPO_encode.R",79,18,"style","Any function spanning multiple lines should use curly braces."," lapply(data, function(col)","brace_linter" +"R/CPO_encode.R",137,18,"style","Any function spanning multiple lines should use curly braces."," lapply(data, function(col)","brace_linter" +"R/CPO_quantileBinNumerics.R",17,18,"style","Any function spanning multiple lines should use curly braces."," lapply(data, function(d)","brace_linter" +"tests/testthat/helper_cpo.R",408,5,"warning","no visible global function definition for β€˜pss’"," pss(numrows: integer[0, ],","object_usage_linter" +"tests/testthat/helper_cpo.R",408,9,"warning","no visible binding for global variable β€˜numrows’"," pss(numrows: integer[0, ],","object_usage_linter" +"tests/testthat/helper_cpo.R",409,7,"warning","no visible binding for global variable β€˜numtarget’"," numtarget: integer[0, ],","object_usage_linter" +"tests/testthat/helper_cpo.R",410,7,"warning","no visible binding for global variable β€˜numnumeric’"," numnumeric: integer[0, ] [[requires = quote(!isdf && !istask)]],","object_usage_linter" +"tests/testthat/helper_cpo.R",411,7,"warning","no visible binding for global variable β€˜numfactor’"," numfactor: integer[0, ] [[requires = quote(!isdf && !istask)]],","object_usage_linter" +"tests/testthat/helper_cpo.R",412,7,"warning","no visible binding for global variable β€˜numother’"," numother: integer[0, ] [[requires = quote(!isdf && !istask)]],","object_usage_linter" +"tests/testthat/helper_makecpo.R",333,57,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, target = target, param = param,","object_usage_linter" +"tests/testthat/helper_makecpo.R",333,57,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, target = target, param = param,","object_usage_linter" +"tests/testthat/helper_makecpo.R",342,44,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, param = param,","object_usage_linter" +"tests/testthat/helper_makecpo.R",342,44,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, param = param,","object_usage_linter" +"tests/testthat/helper_makecpo.R",350,46,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, param = param, control = control)","object_usage_linter" +"tests/testthat/helper_makecpo.R",356,59,"warning","no visible binding for global variable β€˜param’"," train(data = data, target = target, param = param)","object_usage_linter" +"tests/testthat/helper_makecpo.R",359,44,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, param = param, control = control)","object_usage_linter" +"tests/testthat/helper_makecpo.R",369,46,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, param = param, control = control)","object_usage_linter" +"tests/testthat/helper_makecpo.R",381,44,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, param = param, control = control)","object_usage_linter" +"tests/testthat/helper_makecpo.R",410,61,"warning","no visible binding for global variable β€˜param’"," train(data = data, target = target, param = param)","object_usage_linter" +"tests/testthat/helper_makecpo.R",449,73,"warning","no visible binding for global variable β€˜param’"," traininvert(data = data, control = control, param = param)","object_usage_linter" +"tests/testthat/helper_makecpo.R",492,63,"warning","no visible binding for global variable β€˜param’"," train(data = data, target = target, param = param)","object_usage_linter" +"tests/testthat/helper_makecpo.R",495,71,"warning","no visible binding for global variable β€˜param’"," traininvert(data = data, control = control, param = param)","object_usage_linter" +"tests/testthat/helper_makecpo.R",642,33,"warning","no visible binding for global variable β€˜allowedGMC’"," for (lineno in seq_len(nrow(allowedGMC))) {","object_usage_linter" +"tests/testthat/test_core_properties.R",34,33,"style","Any function spanning multiple lines should use curly braces."," lapply(getCPOProperties(x), function(y)","brace_linter" +"tests/testthat/test_meta_multiplex.R",158,38,"style","Variable and function name style should be snake_case or symbols."," cpo.build = function(data, target, logical.param, a, b) {","object_name_linter" +"vignettes/a_1_getting_started.Rmd",55,81,"style","Lines should not be more than 80 characters.","cpoScale(center = FALSE) # create a CPO object that scales, but does not center, data","line_length_linter" +"vignettes/a_1_getting_started.Rmd",66,1,"style","Variable and function name style should be snake_case or symbols.","iris.demo = iris[c(1, 2, 3, 51, 52, 102, 103), ]","object_name_linter" +"vignettes/a_1_getting_started.Rmd",66,11,"style","Use <-, not =, for assignment.","iris.demo = iris[c(1, 2, 3, 51, 52, 102, 103), ]","assignment_linter" +"vignettes/a_1_getting_started.Rmd",67,81,"style","Lines should not be more than 80 characters.","tail(iris.demo %>>% cpoQuantileBinNumerics()) # bin the data in below & above median","line_length_linter" +"vignettes/a_1_getting_started.Rmd",78,13,"style","Use <-, not =, for assignment.","quantilenum = cpoQuantileBinNumerics(numsplits = 3) %>>% cpoAsNumeric()","assignment_linter" +"vignettes/a_1_getting_started.Rmd",88,1,"style","Variable and function name style should be snake_case or symbols.","quantilenum.restricted = cpoQuantileBinNumerics(numsplits = 3) %>>%","object_name_linter" +"vignettes/a_1_getting_started.Rmd",88,24,"style","Use <-, not =, for assignment.","quantilenum.restricted = cpoQuantileBinNumerics(numsplits = 3) %>>%","assignment_linter" +"vignettes/a_1_getting_started.Rmd",97,1,"style","Variable and function name style should be snake_case or symbols.","demo.task = makeClassifTask(data = iris.demo, target = ""Species"")","object_name_linter" +"vignettes/a_1_getting_started.Rmd",97,11,"style","Use <-, not =, for assignment.","demo.task = makeClassifTask(data = iris.demo, target = ""Species"")","assignment_linter" +"vignettes/a_1_getting_started.Rmd",98,8,"style","Use <-, not =, for assignment.","result = demo.task %>>% quantilenum","assignment_linter" +"vignettes/a_1_getting_started.Rmd",114,5,"style","Use <-, not =, for assignment.","cpo = cpoScale()","assignment_linter" +"vignettes/a_1_getting_started.Rmd",129,6,"style","Use <-, not =, for assignment.","cpo2 = setHyperPars(cpo, scale.scale = FALSE)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",147,5,"style","Use <-, not =, for assignment.","cpo = cpoScale(id = ""a"") %>>% cpoScale(id = ""b"") # not very useful example","assignment_linter" +"vignettes/a_1_getting_started.Rmd",160,5,"style","Use <-, not =, for assignment.","cpo = cpoPca(export = c(""center"", ""rank""))","assignment_linter" +"vignettes/a_1_getting_started.Rmd",176,13,"style","Use <-, not =, for assignment.","transformed = iris.demo %>>% cpoPca(rank = 3)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",180,5,"style","Use <-, not =, for assignment.","ret = retrafo(transformed)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",198,4,"style","Use <-, not =, for assignment.","t2 = transformed %>>% cpoScale()","assignment_linter" +"vignettes/a_1_getting_started.Rmd",202,4,"style","Use <-, not =, for assignment.","t3 = clearRI(transformed) %>>% cpoScale()","assignment_linter" +"vignettes/a_1_getting_started.Rmd",222,1,"style","Variable and function name style should be snake_case or symbols.","iris.regr = makeRegrTask(data = iris.demo, target = ""Petal.Width"")","object_name_linter" +"vignettes/a_1_getting_started.Rmd",222,11,"style","Use <-, not =, for assignment.","iris.regr = makeRegrTask(data = iris.demo, target = ""Petal.Width"")","assignment_linter" +"vignettes/a_1_getting_started.Rmd",223,1,"style","Variable and function name style should be snake_case or symbols.","iris.logd = iris.regr %>>% cpoLogTrafoRegr()","object_name_linter" +"vignettes/a_1_getting_started.Rmd",223,11,"style","Use <-, not =, for assignment.","iris.logd = iris.regr %>>% cpoLogTrafoRegr()","assignment_linter" +"vignettes/a_1_getting_started.Rmd",229,5,"style","Use <-, not =, for assignment.","inv = inverter(iris.logd) # inverter object","assignment_linter" +"vignettes/a_1_getting_started.Rmd",235,10,"style","Use <-, not =, for assignment.","logmodel = train(""regr.lm"", iris.logd)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",236,6,"style","Use <-, not =, for assignment.","pred = predict(logmodel, iris.logd) # prediction on the task itself","assignment_linter" +"vignettes/a_1_getting_started.Rmd",246,9,"style","Use <-, not =, for assignment.","newdata = makeRegrTask(""newiris"", iris[7:9, ], target = ""Petal.Width"",","assignment_linter" +"vignettes/a_1_getting_started.Rmd",253,1,"style","Variable and function name style should be snake_case or symbols.","newdata.transformed = newdata %>>% retrafo(iris.logd)","object_name_linter" +"vignettes/a_1_getting_started.Rmd",253,21,"style","Use <-, not =, for assignment.","newdata.transformed = newdata %>>% retrafo(iris.logd)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",257,6,"style","Use <-, not =, for assignment.","pred = predict(logmodel, newdata.transformed)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",264,1,"style","Variable and function name style should be snake_case or symbols.","inv.newdata = inverter(newdata.transformed)","object_name_linter" +"vignettes/a_1_getting_started.Rmd",264,13,"style","Use <-, not =, for assignment.","inv.newdata = inverter(newdata.transformed)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",290,1,"style","Variable and function name style should be snake_case or symbols.","iris.resid = iris.regr %>>% cpoRegrResiduals(""regr.lm"")","object_name_linter" +"vignettes/a_1_getting_started.Rmd",290,12,"style","Use <-, not =, for assignment.","iris.resid = iris.regr %>>% cpoRegrResiduals(""regr.lm"")","assignment_linter" +"vignettes/a_1_getting_started.Rmd",295,1,"style","Variable and function name style should be snake_case or symbols.","model.resid = train(""regr.randomForest"", iris.resid)","object_name_linter" +"vignettes/a_1_getting_started.Rmd",295,13,"style","Use <-, not =, for assignment.","model.resid = train(""regr.randomForest"", iris.resid)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",297,1,"style","Variable and function name style should be snake_case or symbols.","newdata.resid = newdata %>>% retrafo(iris.resid)","object_name_linter" +"vignettes/a_1_getting_started.Rmd",297,15,"style","Use <-, not =, for assignment.","newdata.resid = newdata %>>% retrafo(iris.resid)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",298,81,"style","Lines should not be more than 80 characters.","getTaskData(newdata.resid) # Petal.Width are now the residuals of lm model predictions","line_length_linter" +"vignettes/a_1_getting_started.Rmd",302,6,"style","Use <-, not =, for assignment.","pred = predict(model.resid, newdata.resid)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",308,1,"style","Variable and function name style should be snake_case or symbols.","inv.newdata = inverter(newdata.resid)","object_name_linter" +"vignettes/a_1_getting_started.Rmd",308,13,"style","Use <-, not =, for assignment.","inv.newdata = inverter(newdata.resid)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",317,9,"style","Use <-, not =, for assignment.","sampled = iris %>>% cpoSample(size = 3)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",334,5,"style","Use <-, not =, for assignment.","lrn = cpoRegrResiduals(""regr.lm"") %>>% makeLearner(""regr.randomForest"")","assignment_linter" +"vignettes/a_1_getting_started.Rmd",338,7,"style","Use <-, not =, for assignment.","model = train(lrn, iris.regr)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",340,6,"style","Use <-, not =, for assignment.","pred = predict(model, newdata)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",353,8,"style","Use <-, not =, for assignment.","icalrn = cpoIca() %>>% makeLearner(""classif.logreg"")","assignment_linter" +"vignettes/a_1_getting_started.Rmd",358,4,"style","Use <-, not =, for assignment.","ps = makeParamSet(","assignment_linter" +"vignettes/a_1_getting_started.Rmd",362,3,"style","Commented code should be removed.","# ps = pSS(ica.n.comp: integer[1, 8], ica.alg.typ: discrete[parallel, deflation])","commented_code_linter" +"vignettes/a_1_getting_started.Rmd",362,81,"style","Lines should not be more than 80 characters.","# ps = pSS(ica.n.comp: integer[1, 8], ica.alg.typ: discrete[parallel, deflation])","line_length_linter" +"vignettes/a_1_getting_started.Rmd",405,7,"style","Use <-, not =, for assignment.","repca = retrafo(iris.demo %>>% cpoPca())","assignment_linter" +"vignettes/a_1_getting_started.Rmd",406,7,"style","Use <-, not =, for assignment.","state = getCPOTrainedState(repca)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",412,22,"style","Use <-, not =, for assignment.","state$control$center = FALSE","assignment_linter" +"vignettes/a_1_getting_started.Rmd",413,21,"style","Use <-, not =, for assignment.","state$control$scale = FALSE","assignment_linter" +"vignettes/a_1_getting_started.Rmd",414,1,"style","Variable and function name style should be snake_case or symbols.","nosc.repca = makeCPOTrainedFromState(cpoPca, state)","object_name_linter" +"vignettes/a_1_getting_started.Rmd",414,12,"style","Use <-, not =, for assignment.","nosc.repca = makeCPOTrainedFromState(cpoPca, state)","assignment_linter" +"vignettes/a_1_getting_started.Rmd",442,5,"style","Use <-, not =, for assignment.","cpm = cpoMultiplex(list(cpoIca, cpoPca(export = ""export.all"")))","assignment_linter" +"vignettes/a_1_getting_started.Rmd",456,5,"style","Use <-, not =, for assignment.","cpa = cpoWrap()","assignment_linter" +"vignettes/a_1_getting_started.Rmd",474,7,"style","Use <-, not =, for assignment.","scale = cpoSelect(pattern = ""Sepal"", id = ""first"") %>>% cpoScale(id = ""scale"")","assignment_linter" +"vignettes/a_1_getting_started.Rmd",475,11,"style","Use <-, not =, for assignment.","scale.pca = scale %>>% cpoPca()","assignment_linter" +"vignettes/a_1_getting_started.Rmd",476,9,"style","Use <-, not =, for assignment.","cbinder = cpoCbind(scale, scale.pca, cpoSelect(pattern = ""Petal"", id = ""second""))","assignment_linter" +"vignettes/a_1_getting_started.Rmd",476,81,"style","Lines should not be more than 80 characters.","cbinder = cpoCbind(scale, scale.pca, cpoSelect(pattern = ""Petal"", id = ""second""))","line_length_linter" +"vignettes/a_2_mlrCPO_core.Rmd",41,40,"style","Commented code should be removed.","print(cpoAsNumeric, verbose = TRUE) # alternative: !cpoAsNumeric","commented_code_linter" +"vignettes/a_2_mlrCPO_core.Rmd",61,6,"style","Use <-, not =, for assignment.","(cpo = cpoScale()) # construct CPO with default Hyperparameter values","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",107,6,"style","Use <-, not =, for assignment.","task = applyCPO(cpoPca(), iris.task)","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",118,7,"style","Use <-, not =, for assignment.","scale = cpoScale()","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",119,5,"style","Use <-, not =, for assignment.","pca = cpoPca()","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",122,10,"style","Use <-, not =, for assignment.","compound = scale %>>% pca","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",157,5,"style","Use <-, not =, for assignment.","lrn = makeLearner(""classif.logreg"")","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",158,9,"style","Use <-, not =, for assignment.","(cpolrn = cpo %>>% lrn) # the new learner has the CPO hyperparameters","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",168,5,"style","Use <-, not =, for assignment.","lrn = cpoLogTrafoRegr() %>>% makeLearner(""regr.lm"")","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",169,7,"style","Use <-, not =, for assignment.","model = train(lrn, subsetTask(bh.task, 1:300))","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",174,7,"style","Use <-, not =, for assignment.","trafo = subsetTask(bh.task, 1:300) %>>% cpoLogTrafoRegr()","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",175,7,"style","Use <-, not =, for assignment.","model = train(""regr.lm"", trafo)","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",177,9,"style","Use <-, not =, for assignment.","newdata = subsetTask(bh.task, 301:500) %>>% retrafo(trafo)","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",178,6,"style","Use <-, not =, for assignment.","pred = predict(model, newdata)","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",198,13,"style","Use <-, not =, for assignment.","transformed = iris %>>% cpoScale()","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",200,6,"style","Use <-, not =, for assignment.","(ret = retrafo(transformed))","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",205,13,"style","Use <-, not =, for assignment.","transformed = bh.task %>>% cpoLogTrafoRegr()","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",207,6,"style","Use <-, not =, for assignment.","(inv = inverter(transformed))","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",219,5,"style","Use <-, not =, for assignment.","bh2 = bh.task","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",220,14,"style","Use <-, not =, for assignment.","retrafo(bh2) = ret","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",224,14,"style","Use <-, not =, for assignment.","retrafo(bh2) = NULLCPO","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",226,3,"style","Commented code should be removed.","# retrafo(bh2) = NULL","commented_code_linter" +"vignettes/a_2_mlrCPO_core.Rmd",232,5,"style","Use <-, not =, for assignment.","bh3 = clearRI(transformed)","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",275,8,"style","Use <-, not =, for assignment.","(state = getCPOTrainedState(retrafo(iris %>>% cpoScale())))","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",276,25,"style","Use <-, not =, for assignment.","state$control$center[1] = 1000 # will now subtract 1000 from the first column","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",277,1,"style","Variable and function name style should be snake_case or symbols.","new.retrafo = makeCPOTrainedFromState(cpoScale, state)","object_name_linter" +"vignettes/a_2_mlrCPO_core.Rmd",277,13,"style","Use <-, not =, for assignment.","new.retrafo = makeCPOTrainedFromState(cpoScale, state)","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",286,6,"style","Use <-, not =, for assignment.","data = head(iris) %>>% cpoPca()","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",288,7,"style","Use <-, not =, for assignment.","data2 = data %>>% cpoScale()","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",296,6,"style","Use <-, not =, for assignment.","data = clearRI(data)","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",297,7,"style","Use <-, not =, for assignment.","data2 = data %>>% cpoScale()","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",302,15,"style","Use <-, not =, for assignment.","retrafo(data) = NULL","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",303,16,"style","Use <-, not =, for assignment.","inverter(data) = NULL","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",304,7,"style","Use <-, not =, for assignment.","data3 = data %>>% cpoScale()","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",312,1,"style","Variable and function name style should be snake_case or symbols.","compound.retrafo = retrafo(head(iris) %>>% compound)","object_name_linter" +"vignettes/a_2_mlrCPO_core.Rmd",312,18,"style","Use <-, not =, for assignment.","compound.retrafo = retrafo(head(iris) %>>% compound)","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",316,14,"style","Use <-, not =, for assignment.","(retrafolist = as.list(compound.retrafo))","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",328,13,"style","Use <-, not =, for assignment.","transformed = iris %>>% cpoScale()","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",346,13,"style","Use <-, not =, for assignment.","transformed = bh.task %>>% cpoLogTrafoRegr()","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",347,12,"style","Use <-, not =, for assignment.","prediction = predict(train(""regr.lm"", transformed), transformed)","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",348,5,"style","Use <-, not =, for assignment.","inv = inverter(transformed)","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",352,5,"style","Use <-, not =, for assignment.","ret = retrafo(transformed)","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",381,81,"style","Lines should not be more than 80 characters.","# applying NULLCPO leads to a retrafo() of NULLCPO, so it is its own CPOTrainedCPO","line_length_linter" +"vignettes/a_2_mlrCPO_core.Rmd",401,5,"style","Use <-, not =, for assignment.","cpo = cpoPca()","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",436,81,"style","Lines should not be more than 80 characters.","train(cpoDummyEncode(reference.cat = TRUE) %>>% makeLearner(""classif.geoDA""), bc.task)","line_length_linter" +"vignettes/a_2_mlrCPO_core.Rmd",469,5,"style","Use <-, not =, for assignment.","cpo = cpoPca(affect.pattern = "".Length"")","assignment_linter" +"vignettes/a_2_mlrCPO_core.Rmd",473,8,"style","Use <-, not =, for assignment.","triris = iris %>>% cpo","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",27,5,"style","Use <-, not =, for assignment.","tab = listCPO()[, c(""name"", ""category"", ""subcategory"")]","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",28,12,"style","Use <-, not =, for assignment.","owncontent = readLines(path)","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",29,11,"style","Use <-, not =, for assignment.","headlines = grep(""^#+ +"", owncontent, value = TRUE)","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",30,11,"style","Use <-, not =, for assignment.","headlines = gsub(""^#+ +"", """", headlines)","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",31,10,"style","Use <-, not =, for assignment.","tab[[1]] = sapply(tab[[1]], function(x)","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",31,29,"style","Any function spanning multiple lines should use curly braces.","tab[[1]] = sapply(tab[[1]], function(x)","brace_linter" +"vignettes/a_3_all_CPOs.Rmd",54,5,"style","Use <-, not =, for assignment.","cpa = cpoWrap()","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",58,81,"style","Lines should not be more than 80 characters.","# attaching the cpo applicator to a learner gives this learner a ""cpo"" hyperparameter","line_length_linter" +"vignettes/a_3_all_CPOs.Rmd",67,5,"style","Use <-, not =, for assignment.","cpm = cpoMultiplex(list(cpoScale, cpoPca))","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",79,1,"style","Variable and function name style should be snake_case or symbols.","s.and.p = cpoCase(pSS(logical.param: logical),","object_name_linter" +"vignettes/a_3_all_CPOs.Rmd",79,9,"style","Use <-, not =, for assignment.","s.and.p = cpoCase(pSS(logical.param: logical),","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",80,33,"style","Trailing whitespace is superfluous."," export.cpos = list(cpoScale(), ","trailing_whitespace_linter" +"vignettes/a_3_all_CPOs.Rmd",82,38,"style","Variable and function name style should be snake_case or symbols."," cpo.build = function(data, target, logical.param, scale, pca) {","object_name_linter" +"vignettes/a_3_all_CPOs.Rmd",99,7,"style","Use <-, not =, for assignment.","scale = cpoScale(id = ""scale"")","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",100,11,"style","Use <-, not =, for assignment.","scale.pca = scale %>>% cpoPca()","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",101,9,"style","Use <-, not =, for assignment.","cbinder = cpoCbind(scaled = scale, pcad = scale.pca, original = NULLCPO)","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",104,81,"style","Lines should not be more than 80 characters.","# cpoCbind recognises that ""scale.scale"" happens before ""pca.pca"" but is also fed to the","line_length_linter" +"vignettes/a_3_all_CPOs.Rmd",110,81,"style","Lines should not be more than 80 characters.","# the unnecessary copies of ""Species"" are unfortunate. Remove them with cpoSelect:","line_length_linter" +"vignettes/a_3_all_CPOs.Rmd",111,10,"style","Use <-, not =, for assignment.","selector = cpoSelect(type = ""numeric"")","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",112,1,"style","Variable and function name style should be snake_case or symbols.","cbinder.select = cpoCbind(scaled = selector %>>% scale, pcad = selector %>>% scale.pca, original = NULLCPO)","object_name_linter" +"vignettes/a_3_all_CPOs.Rmd",112,16,"style","Use <-, not =, for assignment.","cbinder.select = cpoCbind(scaled = selector %>>% scale, pcad = selector %>>% scale.pca, original = NULLCPO)","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",112,81,"style","Lines should not be more than 80 characters.","cbinder.select = cpoCbind(scaled = selector %>>% scale, pcad = selector %>>% scale.pca, original = NULLCPO)","line_length_linter" +"vignettes/a_3_all_CPOs.Rmd",126,5,"style","Use <-, not =, for assignment.","cpo = cpoTransformParams(cpoPca(), alist(pca.scale = pca.center))","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",127,6,"style","Use <-, not =, for assignment.","retr = pid.task %>|% setHyperPars(cpo, pca.center = FALSE)","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",132,6,"style","Use <-, not =, for assignment.","mplx = cpoMultiplex(list(cpoIca(export = ""n.comp""), cpoPca(export = ""rank"")))","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",134,5,"style","Use <-, not =, for assignment.","mtx = cpoTransformParams(mplx, alist(ica.n.comp = comp, pca.rank = comp),","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",146,4,"style","Use <-, not =, for assignment.","df = data.frame(a = 1:3, b = -(1:3) * 10)","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",148,36,"style","Commented code should be removed.","df %>>% cpoScale(scale = FALSE) # center = TRUE","commented_code_linter" +"vignettes/a_3_all_CPOs.Rmd",190,9,"style","Use <-, not =, for assignment.","irisfix = head(iris) %>>% cpoFixFactors() # Species only has level 'setosa' in train","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",190,81,"style","Lines should not be more than 80 characters.","irisfix = head(iris) %>>% cpoFixFactors() # Species only has level 'setosa' in train","line_length_linter" +"vignettes/a_3_all_CPOs.Rmd",194,4,"style","Use <-, not =, for assignment.","rf = retrafo(irisfix)","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",203,9,"style","Use <-, not =, for assignment.","impdata = df","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",204,17,"style","Use <-, not =, for assignment.","impdata[[1]][1] = NA","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",233,7,"style","Use <-, not =, for assignment.","iris2 = iris","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",234,15,"style","Use <-, not =, for assignment.","iris2$Species = factor(c(""a"", ""b"", ""c"", ""b"", ""b"", ""c"", ""b"", ""c"",","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",281,81,"style","Lines should not be more than 80 characters.","impdata %>>% cpoImputeAll(cols = list(b = imputeMedian())) # error, since NAs remain","line_length_linter" +"vignettes/a_3_all_CPOs.Rmd",285,1,"style","Variable and function name style should be snake_case or symbols.","missing.task = makeRegrTask(""missing.task"", impdata, target = ""b"")","object_name_linter" +"vignettes/a_3_all_CPOs.Rmd",285,14,"style","Use <-, not =, for assignment.","missing.task = makeRegrTask(""missing.task"", impdata, target = ""b"")","assignment_linter" +"vignettes/a_3_all_CPOs.Rmd",286,81,"style","Lines should not be more than 80 characters.","# the following gives an error, since 'cpoImpute' does not make sure all missings are removed","line_length_linter" +"vignettes/a_3_all_CPOs.Rmd",288,81,"style","Lines should not be more than 80 characters.","train(cpoImpute(cols = list(a = imputeMedian())) %>>% makeLearner(""regr.lm""), missing.task)","line_length_linter" +"vignettes/a_3_all_CPOs.Rmd",292,81,"style","Lines should not be more than 80 characters.","train(cpoImputeAll(cols = list(a = imputeMedian())) %>>% makeLearner(""regr.lm""), missing.task)","line_length_linter" +"vignettes/a_3_all_CPOs.Rmd",302,81,"style","Lines should not be more than 80 characters.","listCPO()[listCPO()$category == ""imputation"" & listCPO()$subcategory == ""specialised"",","line_length_linter" +"vignettes/a_3_all_CPOs.Rmd",315,81,"style","Lines should not be more than 80 characters.","head(getTaskData(iris.task %>>% cpoFilterFeatures(method = ""variance"", perc = 0.5)))","line_length_linter" +"vignettes/a_3_all_CPOs.Rmd",318,81,"style","Lines should not be more than 80 characters.","listCPO()[listCPO()$category == ""featurefilter"" & listCPO()$subcategory == ""specialised"",","line_length_linter" +"vignettes/a_4_custom_CPOs.Rmd",109,13,"style","Use <-, not =, for assignment."," newsize = round(nrow(data) * fraction)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",110,5,"style","Variable and function name style should be snake_case or symbols."," row.indices = sample(nrow(data), newsize)","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",110,17,"style","Use <-, not =, for assignment."," row.indices = sample(nrow(data), newsize)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",114,5,"style","Use <-, not =, for assignment.","cpo = xmpSample(0.01)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",126,13,"style","Use <-, not =, for assignment."," newsize = round(nrow(data) * fraction)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",127,5,"style","Variable and function name style should be snake_case or symbols."," row.indices = sample(nrow(data), newsize)","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",127,17,"style","Use <-, not =, for assignment."," row.indices = sample(nrow(data), newsize)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",153,38,"style","Variable and function name style should be snake_case or symbols."," cpo.train = function(data, target, n.col) {","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",157,41,"style","Variable and function name style should be snake_case or symbols."," cpo.retrafo = function(data, control, n.col) {","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",162,14,"style","Use <-, not =, for assignment."," greatest = order(-control) # columns, ordered greatest to smallest var","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",166,5,"style","Use <-, not =, for assignment.","cpo = xmpFilterVar(2)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",172,8,"style","Use <-, not =, for assignment.","(trafd = head(iris) %>>% cpo)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",201,38,"style","Variable and function name style should be snake_case or symbols."," cpo.train = function(data, target, n.col) {","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",203,10,"style","Use <-, not =, for assignment."," ctrl = sapply(data, var, na.rm = TRUE)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",212,16,"style","Use <-, not =, for assignment."," greatest = order(-ctrl) # columns, ordered greatest to smallest var","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",217,5,"style","Use <-, not =, for assignment.","cpo = xmpFilterVarFunc(2)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",222,8,"style","Use <-, not =, for assignment.","(trafd = head(iris) %>>% cpo)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",241,5,"style","Use <-, not =, for assignment.","cpo = xmpAsNum()","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",246,8,"style","Use <-, not =, for assignment.","(trafd = head(iris) %>>% cpo)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",264,38,"style","Variable and function name style should be snake_case or symbols."," cpo.trafo = function(data, target, n.col) {","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",266,9,"style","Use <-, not =, for assignment."," pcr = prcomp(as.matrix(data), center = FALSE, scale. = FALSE, rank = n.col)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",268,13,"style","Use <-, not =, for assignment."," control = pcr$rotation","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",271,41,"style","Variable and function name style should be snake_case or symbols."," cpo.retrafo = function(data, control, n.col) {","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",277,5,"style","Use <-, not =, for assignment.","cpo = xmpPca(2)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",282,8,"style","Use <-, not =, for assignment.","(trafd = head(iris) %>>% cpo)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",302,38,"style","Variable and function name style should be snake_case or symbols."," cpo.trafo = function(data, target, n.col) {","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",304,9,"style","Use <-, not =, for assignment."," pcr = prcomp(as.matrix(data), center = FALSE, scale. = FALSE, rank = n.col)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",306,5,"style","Variable and function name style should be snake_case or symbols."," cpo.retrafo = function(data) {","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",306,17,"style","Use <-, not =, for assignment."," cpo.retrafo = function(data) {","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",314,5,"style","Use <-, not =, for assignment.","cpo = xmpPcaFunc(2)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",318,8,"style","Use <-, not =, for assignment.","(trafd = head(iris) %>>% cpo)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",368,9,"style","Use <-, not =, for assignment."," lrn = setPredictType(lrn, ""prob"")","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",373,16,"style","Use <-, not =, for assignment."," prediction = predict(control, target)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",374,11,"style","Use <-, not =, for assignment."," tname = getTaskTargetNames(target)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",375,11,"style","Use <-, not =, for assignment."," tdata = getTaskData(target)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",376,20,"style","Use <-, not =, for assignment."," tdata[[tname]] = factor(prediction$data$response == prediction$data$truth)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",384,33,"style","Variable and function name style should be snake_case or symbols."," cpo.invert = function(target, control.invert, predict.type, lrn) {","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",387,14,"style","Use <-, not =, for assignment."," outmat = as.matrix(control.invert[grep(""^prob\\."", names(control.invert))])","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",387,81,"style","Lines should not be more than 80 characters."," outmat = as.matrix(control.invert[grep(""^prob\\."", names(control.invert))])","line_length_linter" +"vignettes/a_4_custom_CPOs.Rmd",388,14,"style","Use <-, not =, for assignment."," revmat = outmat[, c(2, 1)]","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",393,7,"style","Variable and function name style should be snake_case or symbols."," numeric.prediction = as.numeric(control.invert$response)","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",393,26,"style","Use <-, not =, for assignment."," numeric.prediction = as.numeric(control.invert$response)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",394,7,"style","Variable and function name style should be snake_case or symbols."," numeric.res = ifelse(target == ""TRUE"",","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",394,19,"style","Use <-, not =, for assignment."," numeric.res = ifelse(target == ""TRUE"",","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",402,5,"style","Use <-, not =, for assignment.","cpo = xmpMetaLearn(makeLearner(""classif.logreg""))","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",409,7,"style","Use <-, not =, for assignment.","split = makeResampleInstance(hout, pid.task)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",410,1,"style","Variable and function name style should be snake_case or symbols.","train.task = subsetTask(pid.task, split$train.inds[[1]])","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",410,12,"style","Use <-, not =, for assignment.","train.task = subsetTask(pid.task, split$train.inds[[1]])","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",411,1,"style","Variable and function name style should be snake_case or symbols.","test.task = subsetTask(pid.task, split$predict.inds[[1]])","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",411,11,"style","Use <-, not =, for assignment.","test.task = subsetTask(pid.task, split$predict.inds[[1]])","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",417,7,"style","Use <-, not =, for assignment.","trafd = train.task %>>% cpo","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",426,7,"style","Use <-, not =, for assignment.","model = train(makeLearner(""classif.logreg"", predict.type = ""prob""), train.task)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",433,6,"style","Use <-, not =, for assignment.","retr = test.task %>>% retrafo(trafd)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",439,1,"style","Variable and function name style should be snake_case or symbols.","retr.df = getTaskData(test.task, target.extra = TRUE)$data %>>% retrafo(trafd)","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",439,9,"style","Use <-, not =, for assignment.","retr.df = getTaskData(test.task, target.extra = TRUE)$data %>>% retrafo(trafd)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",446,1,"style","Variable and function name style should be snake_case or symbols.","ext.model = train(""classif.svm"", trafd)","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",446,11,"style","Use <-, not =, for assignment.","ext.model = train(""classif.svm"", trafd)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",447,1,"style","Variable and function name style should be snake_case or symbols.","ext.pred = predict(ext.model, retr)","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",447,10,"style","Use <-, not =, for assignment.","ext.pred = predict(ext.model, retr)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",448,9,"style","Use <-, not =, for assignment.","newpred = invert(inverter(retr), ext.pred)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",455,1,"style","Variable and function name style should be snake_case or symbols.","cpo.learner = cpo %>>% makeLearner(""classif.svm"")","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",455,13,"style","Use <-, not =, for assignment.","cpo.learner = cpo %>>% makeLearner(""classif.svm"")","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",456,1,"style","Variable and function name style should be snake_case or symbols.","cpo.model = train(cpo.learner, train.task)","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",456,11,"style","Use <-, not =, for assignment.","cpo.model = train(cpo.learner, train.task)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",459,9,"style","Use <-, not =, for assignment.","lrnpred = predict(cpo.model, test.task)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",488,9,"style","Use <-, not =, for assignment."," lrn = setPredictType(lrn, ""prob"")","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",489,11,"style","Use <-, not =, for assignment."," model = train(lrn, data)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",490,5,"style","Variable and function name style should be snake_case or symbols."," cpo.retrafo = function(data, target) {","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",490,17,"style","Use <-, not =, for assignment."," cpo.retrafo = function(data, target) {","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",492,18,"style","Use <-, not =, for assignment."," prediction = predict(model, target)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",493,13,"style","Use <-, not =, for assignment."," tname = getTaskTargetNames(target)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",494,13,"style","Use <-, not =, for assignment."," tdata = getTaskData(target)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",495,22,"style","Use <-, not =, for assignment."," tdata[[tname]] = factor(prediction$data$response == prediction$data$truth)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",499,5,"style","Variable and function name style should be snake_case or symbols."," cpo.train.invert = function(data) {","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",499,22,"style","Use <-, not =, for assignment."," cpo.train.invert = function(data) {","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",501,18,"style","Use <-, not =, for assignment."," prediction = predict(model, newdata = data)$data","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",505,18,"style","Use <-, not =, for assignment."," outmat = as.matrix(prediction[grep(""^prob\\."", names(prediction))])","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",506,18,"style","Use <-, not =, for assignment."," revmat = outmat[, c(2, 1)]","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",511,11,"style","Variable and function name style should be snake_case or symbols."," numeric.prediction = as.numeric(prediction$response)","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",511,30,"style","Use <-, not =, for assignment."," numeric.prediction = as.numeric(prediction$response)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",512,11,"style","Variable and function name style should be snake_case or symbols."," numeric.res = ifelse(target == ""TRUE"",","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",512,23,"style","Use <-, not =, for assignment."," numeric.res = ifelse(target == ""TRUE"",","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",517,10,"style","Trailing whitespace is superfluous."," } ","trailing_whitespace_linter" +"vignettes/a_4_custom_CPOs.Rmd",543,17,"style","Use <-, not =, for assignment."," target[[1]] = target[[1]] - control","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",546,47,"style","Variable and function name style should be snake_case or symbols."," cpo.invert = function(target, predict.type, control.invert) {","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",550,5,"style","Use <-, not =, for assignment.","cpo = xmpRegCenter()","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",555,1,"style","Variable and function name style should be snake_case or symbols.","train.task = subsetTask(bh.task, 150:155)","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",555,12,"style","Use <-, not =, for assignment.","train.task = subsetTask(bh.task, 150:155)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",559,14,"style","Use <-, not =, for assignment.","predict.task = subsetTask(bh.task, 156:160)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",565,7,"style","Use <-, not =, for assignment.","trafd = train.task %>>% cpo","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",574,6,"style","Use <-, not =, for assignment.","retr = retrafo(trafd)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",575,14,"style","Use <-, not =, for assignment.","predict.traf = predict.task %>>% retr","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",581,7,"style","Use <-, not =, for assignment.","model = train(""regr.lm"", trafd)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",582,6,"style","Use <-, not =, for assignment.","pred = predict(model, predict.traf)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",591,7,"style","Use <-, not =, for assignment.","model = train(""regr.lm"", train.task)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",618,17,"style","Use <-, not =, for assignment."," target[[1]] = log(target[[1]])","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",625,5,"style","Use <-, not =, for assignment.","cpo = xmpLogRegr()","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",630,7,"style","Use <-, not =, for assignment.","trafd = train.task %>>% cpo","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",635,6,"style","Use <-, not =, for assignment.","retr = retrafo(trafd)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",636,14,"style","Use <-, not =, for assignment.","predict.traf = predict.task %>>% retr","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",641,7,"style","Use <-, not =, for assignment.","model = train(""regr.lm"", trafd)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",642,6,"style","Use <-, not =, for assignment.","pred = predict(model, predict.traf)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",670,17,"style","Use <-, not =, for assignment."," target[[1]] = target[[1]] + 1","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",671,13,"style","Use <-, not =, for assignment."," control = ""control created in cpo.trafo""","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",672,5,"style","Variable and function name style should be snake_case or symbols."," control.invert = ""control.invert created in cpo.trafo""","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",672,20,"style","Use <-, not =, for assignment."," control.invert = ""control.invert created in cpo.trafo""","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",677,5,"style","Variable and function name style should be snake_case or symbols."," control.invert = ""control.invert created in cpo.retrafo""","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",677,20,"style","Use <-, not =, for assignment."," control.invert = ""control.invert created in cpo.retrafo""","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",680,19,"style","Use <-, not =, for assignment."," target[[1]] = target[[1]] - 1","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",683,81,"style","Lines should not be more than 80 characters."," cat(""target is NULL, no transformation (but control.invert was created)\n"")","line_length_linter" +"vignettes/a_4_custom_CPOs.Rmd",687,33,"style","Variable and function name style should be snake_case or symbols."," cpo.invert = function(target, control.invert, predict.type) {","object_name_linter" +"vignettes/a_4_custom_CPOs.Rmd",693,5,"style","Use <-, not =, for assignment.","cpo = xmpSynCPO()","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",698,7,"style","Use <-, not =, for assignment.","trafd = train.task %>>% cpo","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",703,9,"style","Use <-, not =, for assignment.","retrafd = train.task %>>% retrafo(trafd)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",711,9,"style","Use <-, not =, for assignment.","retrafd = getTaskData(train.task, target.extra = TRUE)$data %>>% retrafo(trafd)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",717,5,"style","Use <-, not =, for assignment.","inv = invert(inverter(trafd), 1:6)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",720,5,"style","Use <-, not =, for assignment.","inv = invert(inverter(retrafd), 1:6)","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",727,9,"style","Use <-, not =, for assignment.","oscipen = options(""scipen"")","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",731,10,"style","Use <-, not =, for assignment.","learners = list(","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",741,7,"style","Use <-, not =, for assignment.","perfs = sapply(learners, function(lrn) {","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",753,7,"style","Use <-, not =, for assignment.","pvals = c(","assignment_linter" +"vignettes/a_4_custom_CPOs.Rmd",754,75,"style","Trailing whitespace is superfluous."," logreg = t.test(perfs[, ""logreg""], perfs[, ""cpo""], ""greater"")$p.value, ","trailing_whitespace_linter" +"vignettes/z_1_getting_started_terse.Rmd",13,81,"style","Lines should not be more than 80 characters.","cat(knitr::knit_child(""a_1_getting_started.Rmd"", options = list(eval = FALSE)), sep = ""\n"")","line_length_linter" +"vignettes/z_2_mlrCPO_core_terse.Rmd",13,81,"style","Lines should not be more than 80 characters.","cat(knitr::knit_child(""a_2_mlrCPO_core.Rmd"", options = list(eval = FALSE)), sep = ""\n"")","line_length_linter" +"vignettes/z_3_all_CPOs_terse.Rmd",13,81,"style","Lines should not be more than 80 characters.","cat(knitr::knit_child(""a_3_all_CPOs.Rmd"", options = list(eval = FALSE)), sep = ""\n"")","line_length_linter" +"vignettes/z_4_custom_CPOs_terse.Rmd",13,81,"style","Lines should not be more than 80 characters.","cat(knitr::knit_child(""a_4_custom_CPOs.Rmd"", options = list(eval = FALSE)), sep = ""\n"")","line_length_linter" diff --git a/.dev/revdep_emails/mlrCPO/email-body b/.dev/revdep_emails/mlrCPO/email-body new file mode 100644 index 000000000..ff82ad381 --- /dev/null +++ b/.dev/revdep_emails/mlrCPO/email-body @@ -0,0 +1,29 @@ +Hello Martin Binder! Thank you for using {lintr} in your package {mlrCPO}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/mlr-org/mlrCPO (hash: b7736cb7a8dc1b31c3a65fb574053aec37bd4810) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 234s on CRAN vs. 111s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/modules/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/modules/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..f1e08b6de --- /dev/null +++ b/.dev/revdep_emails/modules/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,12 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/module-helper.R",49,5,"style","Either both or neither branch in `if`/`else` should use curly braces."," else {","brace_linter" +"vignettes/modulesAsObjects.Rmd",63,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/modulesAsObjects.Rmd",83,5,"warning","local variable β€˜fun’ assigned but may not be used"," fun <- function() param","object_usage_linter" +"vignettes/modulesAsObjects.Rmd",95,5,"warning","local variable β€˜fun’ assigned but may not be used"," fun <- function() param","object_usage_linter" +"vignettes/modulesAsObjects.Rmd",122,1,"style","Variable and function name style should be camelCase.","B <- function(a) {","object_name_linter" +"vignettes/modulesAsObjects.Rmd",124,5,"warning","local variable β€˜foo’ assigned but may not be used"," foo <- function() a$foo()","object_usage_linter" +"vignettes/modulesAsObjects.Rmd",194,1,"style","Variable and function name style should be camelCase.","A <- function() {","object_name_linter" +"vignettes/modulesAsObjects.Rmd",196,5,"warning","local variable β€˜foo’ assigned but may not be used"," foo <- function() ""foo""","object_usage_linter" +"vignettes/modulesAsObjects.Rmd",200,1,"style","Variable and function name style should be camelCase.","B <- function(a) {","object_name_linter" +"vignettes/modulesAsObjects.Rmd",203,5,"warning","local variable β€˜bar’ assigned but may not be used"," bar <- function() ""bar""","object_usage_linter" +"vignettes/modulesInR.Rmd",12,91,"style","Lines should not be more than 90 characters.","cat(gsub(""\\n "", """", packageDescription(""modules"", fields = ""Description"", encoding = NA)))","line_length_linter" diff --git a/.dev/revdep_emails/modules/attachments/modules.warnings b/.dev/revdep_emails/modules/attachments/modules.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/modules/attachments/modules.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/modules/email-body b/.dev/revdep_emails/modules/email-body new file mode 100644 index 000000000..fcd0f2dd0 --- /dev/null +++ b/.dev/revdep_emails/modules/email-body @@ -0,0 +1,29 @@ +Hello Sebastian Warnholz! Thank you for using {lintr} in your package {modules}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/wahani/modules (hash: 911b43715690bde8edf5a614932689b4a5aa9bc1) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 17s on CRAN vs. 10s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/nLTT/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/nLTT/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..cb4447ed8 --- /dev/null +++ b/.dev/revdep_emails/nLTT/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,2 @@ +"filename","line_number","column_number","type","message","line","linter" +"vignettes/nltt_diff.Rmd",84,45,"style","Compound semicolons are discouraged. Replace them by a newline.","nLTT::nltt_plot(phylogeny_1, ylim = c(0, 1)); nLTT::nltt_lines(phylogeny_2)","semicolon_linter" diff --git a/.dev/revdep_emails/nLTT/email-body b/.dev/revdep_emails/nLTT/email-body new file mode 100644 index 000000000..90ec2b2d2 --- /dev/null +++ b/.dev/revdep_emails/nLTT/email-body @@ -0,0 +1,29 @@ +Hello Thijs Janzen! Thank you for using {lintr} in your package {nLTT}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/thijsjanzen/nLTT (hash: 5b66bdb4384fa7deed4100c6fac5b049a972ff37) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 22s on CRAN vs. 14s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/newsmd/email-body b/.dev/revdep_emails/newsmd/email-body new file mode 100644 index 000000000..17db4eff0 --- /dev/null +++ b/.dev/revdep_emails/newsmd/email-body @@ -0,0 +1,29 @@ +Hello Jakob Gepp! Thank you for using {lintr} in your package {newsmd}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/Dschaykib/newsmd (hash: a5683da1d49acd6a4720bf5d01579a99657b4b62) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 3s on CRAN vs. 2s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/openbankeR/attachments/openbankeR.warnings b/.dev/revdep_emails/openbankeR/attachments/openbankeR.warnings new file mode 100644 index 000000000..5602e2ffd --- /dev/null +++ b/.dev/revdep_emails/openbankeR/attachments/openbankeR.warnings @@ -0,0 +1,68 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Linter closed_curly_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. +Trying to remove β€˜open_curly_linter’, β€˜undesirable_function_linter’, β€˜undesirable_operator_linter’ and β€˜todo_comment_linter’, which are not in `defaults`. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. +Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. + Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. diff --git a/.dev/revdep_emails/openbankeR/email-body b/.dev/revdep_emails/openbankeR/email-body new file mode 100644 index 000000000..d8e520dd7 --- /dev/null +++ b/.dev/revdep_emails/openbankeR/email-body @@ -0,0 +1,29 @@ +Hello Nik Lilovski! Thank you for using {lintr} in your package {openbankeR}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/nik01010/openbankeR (hash: 4cb40cffd95dd984130ffa1cd8fe0ecd52e1252e) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 2s on CRAN vs. 2s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/osfr/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/osfr/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..56b534d6a --- /dev/null +++ b/.dev/revdep_emails/osfr/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,8 @@ +"filename","line_number","column_number","type","message","line","linter" +"data-raw/create-test-project.R",40,1,"style","Variable and function name style should be snake_case or symbols.","dev.null <- mapply(","object_name_linter" +"R/osf_tbl-compat.R",9,32,"style","Variable and function name style should be snake_case or symbols.","rbind.osf_tbl <- function(..., deparse.level = 1) {","object_name_linter" +"R/osf_tbl.R",77,23,"style","Any function spanning multiple lines should use curly braces.","as_osf_tbl.default <- function(x, subclass = NULL)","brace_linter" +"R/osf_tbl.R",92,3,"warning","local variable β€˜name_field’ assigned but may not be used"," name_field <- switch(subclass,","object_usage_linter" +"R/utils-file-operations.R",34,15,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (verbose & action == ""move"") message(sprintf(""Moved '%s' to '%s'."", x$name, to$name))","vector_logic_linter" +"R/utils-file-operations.R",35,15,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (verbose & action == ""copy"") message(sprintf(""Copied '%s' to '%s'."", x$name, to$name))","vector_logic_linter" +"R/utils-uploads.R",21,3,"warning","local variable β€˜msg’ assigned but may not be used"," msg <- bullet_msg(","object_usage_linter" diff --git a/.dev/revdep_emails/osfr/attachments/osfr.warnings b/.dev/revdep_emails/osfr/attachments/osfr.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/osfr/attachments/osfr.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/osfr/email-body b/.dev/revdep_emails/osfr/email-body new file mode 100644 index 000000000..6df95963a --- /dev/null +++ b/.dev/revdep_emails/osfr/email-body @@ -0,0 +1,29 @@ +Hello Aaron Wolen! Thank you for using {lintr} in your package {osfr}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/ropensci/osfr (hash: 7d38bed19c0ed0259ce3fc8d8c0b6b4f5ef96bce) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 38s on CRAN vs. 23s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/packager/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/packager/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..cda5a9cc8 --- /dev/null +++ b/.dev/revdep_emails/packager/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,5 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/templates/zzz.R",1,1,"style","Variable and function name style should be snake_case.",".onLoad <- function(libname, pkgname) {","object_name_linter" +"R/devtools.R",395,7,"style","Variable and function name style should be snake_case."," pkg$Rmd <- TRUE","object_name_linter" +"R/remotes_modified.R",2,1,"style","Variable and function name style should be snake_case.","`%::%` <- function(p, f) get(f, envir = asNamespace(p))","object_name_linter" +"R/zzz.R",1,1,"style","Variable and function name style should be snake_case.",".onLoad <- function(libname, pkgname) {","object_name_linter" diff --git a/.dev/revdep_emails/packager/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/packager/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..5c0411512 --- /dev/null +++ b/.dev/revdep_emails/packager/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,29 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/files/An_Introduction_to_packager.Rmd",69,72,"style","Trailing whitespace is superfluous.","if (""myFirstPackage"" %in% .packages()) detach(""package:myFirstPackage"", ","trailing_whitespace_linter" +"inst/files/An_Introduction_to_packager.Rmd",80,76,"style","Trailing whitespace is superfluous.","a <- utils::person(given = ""Your"", family = ""Name"", email = ""some@whe.re"", ","trailing_whitespace_linter" +"inst/files/An_Introduction_to_packager.Rmd",99,71,"style","Trailing whitespace is superfluous.","help_file <- system.file(""man"", paste0(package_title, ""-package.Rd""), ","trailing_whitespace_linter" +"inst/files/An_Introduction_to_packager.Rmd",101,18,"style","Only use double-quotes.","captured <- gsub('_\b', '', capture.output(tools:::Rd2txt(help_file) ))","single_quotes_linter" +"inst/files/An_Introduction_to_packager.Rmd",101,25,"style","Only use double-quotes.","captured <- gsub('_\b', '', capture.output(tools:::Rd2txt(help_file) ))","single_quotes_linter" +"inst/files/An_Introduction_to_packager.Rmd",101,70,"style","Do not place spaces before parentheses.","captured <- gsub('_\b', '', capture.output(tools:::Rd2txt(help_file) ))","spaces_inside_linter" +"inst/files/An_Introduction_to_packager.Rmd",143,39,"style","Trailing whitespace is superfluous.","suppressMessages(withr::with_dir(path, ","trailing_whitespace_linter" +"inst/files/An_Introduction_to_packager.Rmd",144,68,"style","Trailing whitespace is superfluous."," print(fakemake::make(""build"", ml, ","trailing_whitespace_linter" +"inst/files/An_Introduction_to_packager.Rmd",171,39,"style","Trailing whitespace is superfluous.","suppressMessages(withr::with_dir(path, ","trailing_whitespace_linter" +"inst/files/An_Introduction_to_packager.Rmd",172,67,"style","Trailing whitespace is superfluous."," print(fakemake::make(""check"", ml, ","trailing_whitespace_linter" +"inst/files/An_Introduction_to_packager.Rmd",199,81,"style","Lines should not be more than 80 characters.","system.time(withr::with_dir(path, print(fakemake::make(""check"", ml, verbose = FALSE))))","line_length_linter" +"inst/files/An_Introduction_to_packager.Rmd",210,81,"style","Lines should not be more than 80 characters.","withr::with_dir(path, print(fakemake::make(""cran_comments"", ml, verbose = FALSE)))","line_length_linter" +"inst/files/An_Introduction_to_packager.Rmd",223,56,"style","Trailing whitespace is superfluous.","packager::git_add_commit(path = path, untracked = TRUE, ","trailing_whitespace_linter" +"inst/files/An_Introduction_to_packager.Rmd",246,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" +"inst/runit_tests/test_internal.R",51,23,"style","Any function spanning multiple lines should use curly braces.","test_warn_and_stop <- function()","brace_linter" +"inst/templates/README.Rmd",37,20,"style","Only use double-quotes."," captured <- gsub('_\b', '', capture.output(tools:::Rd2txt(help_file) ))","single_quotes_linter" +"inst/templates/README.Rmd",37,27,"style","Only use double-quotes."," captured <- gsub('_\b', '', capture.output(tools:::Rd2txt(help_file) ))","single_quotes_linter" +"inst/templates/README.Rmd",37,72,"style","Do not place spaces before parentheses."," captured <- gsub('_\b', '', capture.output(tools:::Rd2txt(help_file) ))","spaces_inside_linter" +"R/convert_vignette.R",76,24,"style","Any function spanning multiple lines should use curly braces.","convert_code_blocks <- function(lines)","brace_linter" +"R/devtools.R",478,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/devtools.R",532,7,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/devtools.R",536,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/git.R",55,20,"style","Any function spanning multiple lines should use curly braces."," function(x)","brace_linter" +"R/internal.R",110,16,"style","Variable and function name style should be snake_case or symbols."," substr(Rdep, start, stop) <- paste(numeric_version, collapse = ""."")","object_name_linter" +"R/remotes_modified.R",8,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/upload_cran.R",24,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/usethis.R",92,5,"style","`else` should come on the same line as the previous `}`."," else if (delta == 0 && !is.null(min_version)) {","brace_linter" +"R/usethis.R",101,5,"style","`else` should come on the same line as the previous `}`."," else if (delta > 0) {","brace_linter" diff --git a/.dev/revdep_emails/packager/attachments/packager.warnings b/.dev/revdep_emails/packager/attachments/packager.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/packager/attachments/packager.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/packager/email-body b/.dev/revdep_emails/packager/email-body new file mode 100644 index 000000000..1422622dd --- /dev/null +++ b/.dev/revdep_emails/packager/email-body @@ -0,0 +1,29 @@ +Hello Andreas Dominik Cullmann! Thank you for using {lintr} in your package {packager}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://gitlab.com/fvafrCU/packager (hash: 6d347e64d33669689d0022577f32beeb91241951) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 43s on CRAN vs. 23s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/physiology/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/physiology/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..e58e63851 --- /dev/null +++ b/.dev/revdep_emails/physiology/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,58 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/JOSS/paper.Rmd",14,33,"style","Trailing whitespace is superfluous.","egfr(creatinine_mgdl_to_uM(1.4), ","trailing_whitespace_linter" +"inst/JOSS/paper.Rmd",17,19,"style","Trailing whitespace is superfluous."," male = FALSE, ","trailing_whitespace_linter" +"inst/JOSS/paper.Rmd",25,54,"style","Trailing whitespace is superfluous."," #Height = c(seq.default(1.2, 1.8, by = 0.2)), ","trailing_whitespace_linter" +"inst/JOSS/paper.Rmd",33,57,"style","Trailing whitespace is superfluous."," height_m = as.integer(x[""Height""]), ","trailing_whitespace_linter" +"inst/JOSS/paper.Rmd",35,49,"style","Trailing whitespace is superfluous."," male = x[""Male""] == ""Male"", ","trailing_whitespace_linter" +"inst/JOSS/paper.Rmd",36,52,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," black = x[""Black""] == ""Black"")}","brace_linter" +"inst/JOSS/paper.Rmd",40,38,"style","Trailing whitespace is superfluous.","ggplot(plt, aes(x = Age, y = eGFR)) + ","trailing_whitespace_linter" +"inst/JOSS/paper.Rmd",41,21,"style","Trailing whitespace is superfluous."," geom_col() + ","trailing_whitespace_linter" +"R/bmi.R",30,23,"style","Any function spanning multiple lines should use curly braces.","ideal_weight_adult <- function(height_m, male, ...)","brace_linter" +"R/bmi.R",35,23,"style","Any function spanning multiple lines should use curly braces.","ideal_weight_child <- function(height_m, age_y = NULL, ...)","brace_linter" +"R/bmi.R",79,24,"style","Any function spanning multiple lines should use curly braces.","ideal_weight_Devine <- function(height_m, male, ...)","brace_linter" +"R/bmi.R",89,26,"style","Any function spanning multiple lines should use curly braces.","ideal_weight_Robinson <- function(height_m, male, ...)","brace_linter" +"R/bmi.R",99,24,"style","Any function spanning multiple lines should use curly braces.","ideal_weight_Miller <- function(height_m, male, ...)","brace_linter" +"R/bmi.R",108,23,"style","Any function spanning multiple lines should use curly braces.","ideal_weight_Broca <- function(height_m, male, ...)","brace_linter" +"R/deadspace.R",87,31,"style","Any function spanning multiple lines should use curly braces.","deadspace_intrathoracic_ml <- function(ideal_weight_kg)","brace_linter" +"R/eGFR.R",208,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (any(ret > 60) & warn_ckdepi_preferred)","vector_logic_linter" +"R/eGFR.R",248,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (any(ret < 60) & warn_mdrd_preferred) {","vector_logic_linter" +"R/physics.R",5,16,"style","Any function spanning multiple lines should use curly braces.","temp_c_to_k <- function(temp_c)","brace_linter" +"R/physics.R",12,18,"style","Any function spanning multiple lines should use curly braces.","svp_sea_level <- function(temp_k)","brace_linter" +"R/valid.R",86,20,"style","Any function spanning multiple lines should use curly braces.","valid_age_adult <- function(age_y, age_min = 18, age_max = 150,","brace_linter" +"R/valid.R",106,42,"style","Put spaces around all infix operators."," scr_min_hard=0, scr_max_hard = 4000,","infix_spaces_linter" +"tests/testthat/test-bmi.R",25,54,"style","Use FALSE instead of the symbol F."," expect_equal(ideal_weight_adult(60 / inch, male = F), 45.5)","T_and_F_symbol_linter" +"tests/testthat/test-bmi.R",207,42,"style","Use TRUE instead of the symbol T."," expect_error(do.call(f, list(male = T)), info = f)","T_and_F_symbol_linter" +"tests/testthat/test-bmi.R",213,64,"style","Use TRUE instead of the symbol T."," expect_error(do.call(f, list(height_m = c(1.5, 2), male = T)), info = f)","T_and_F_symbol_linter" +"tests/testthat/test-bmi.R",214,58,"style","Use TRUE instead of the symbol T."," expect_error(do.call(f, list(height_m = 2, male = c(T, F))), info = f)","T_and_F_symbol_linter" +"tests/testthat/test-bmi.R",214,61,"style","Use FALSE instead of the symbol F."," expect_error(do.call(f, list(height_m = 2, male = c(T, F))), info = f)","T_and_F_symbol_linter" +"tests/testthat/test-bmi.R",216,61,"style","Use TRUE instead of the symbol T."," expect_error(do.call(f, list(height_m = NULL, male = c(T, F))), info = f)","T_and_F_symbol_linter" +"tests/testthat/test-bmi.R",216,64,"style","Use FALSE instead of the symbol F."," expect_error(do.call(f, list(height_m = NULL, male = c(T, F))), info = f)","T_and_F_symbol_linter" +"tests/testthat/test-bmi.R",217,65,"style","Use TRUE instead of the symbol T."," expect_error(do.call(f, list(height_m = c(1.5, NA), male = T)), info = f)","T_and_F_symbol_linter" +"tests/testthat/test-bmi.R",218,62,"style","Use TRUE instead of the symbol T."," expect_error(do.call(f, list(height_m = 2, male = c(NA, T))), info = f)","T_and_F_symbol_linter" +"tests/testthat/test-bmi.R",219,59,"style","Use FALSE instead of the symbol F."," expect_error(do.call(f, list(height_m = NULL, male = F)), info = f)","T_and_F_symbol_linter" +"tests/testthat/test-bmi.R",226,46,"style","Use TRUE instead of the symbol T."," do.call(f, list(height_m = -1, male = T, do.stop = TRUE)), info = f)","T_and_F_symbol_linter" +"tests/testthat/test-bmi.R",228,46,"style","Use TRUE instead of the symbol T."," do.call(f, list(height_m = 0, male = T, do.stop = TRUE)), info = f)","T_and_F_symbol_linter" +"tests/testthat/test-bmi.R",236,45,"style","Use TRUE instead of the symbol T."," do.call(f, list(height_m = 8, male = T, do.stop = TRUE)), info = f)","T_and_F_symbol_linter" +"vignettes/Everest.Rmd",37,8,"style","Use <-, not =, for assignment.","temp_k = temp_c_to_k(37)","assignment_linter" +"vignettes/Everest.Rmd",45,18,"style","Use <-, not =, for assignment.","pres_atm_everest = 760 * pres_atm_frac(8850)","assignment_linter" +"vignettes/Everest.Rmd",51,19,"style","Trailing whitespace is superfluous."," PACO2_mmHg = 40, ","trailing_whitespace_linter" +"vignettes/Everest.Rmd",63,35,"style","Trailing whitespace is superfluous."," PACO2_mmHg = PACO2_mmHg_Grocott, ","trailing_whitespace_linter" +"vignettes/Everest.Rmd",76,35,"style","Trailing whitespace is superfluous."," PACO2_mmHg = PACO2_mmHg_Grocott, ","trailing_whitespace_linter" +"vignettes/Everest.Rmd",81,35,"style","Trailing whitespace is superfluous."," PACO2_mmHg = PACO2_mmHg_Grocott, ","trailing_whitespace_linter" +"vignettes/Everest.Rmd",92,43,"style","Trailing whitespace is superfluous.","results <- c(""sea\nlevel"" = PAO2_sealevel, ","trailing_whitespace_linter" +"vignettes/Everest.Rmd",93,54,"style","Trailing whitespace is superfluous."," ""summit\nresting"" = PAO2_summit_resting, ","trailing_whitespace_linter" +"vignettes/Everest.Rmd",94,55,"style","Trailing whitespace is superfluous."," ""summit\nexertion"" = PAO2_summit_exerted, ","trailing_whitespace_linter" +"vignettes/Everest.Rmd",95,56,"style","Trailing whitespace is superfluous."," ""summit\nfatty diet"" = PAO2_summit_lipids, ","trailing_whitespace_linter" +"vignettes/Everest.Rmd",98,17,"style","Trailing whitespace is superfluous.","barplot(results, ","trailing_whitespace_linter" +"vignettes/IdealWeightComparison.Rmd",19,14,"style","Use TRUE instead of the symbol T.","male <- rep(T, times = length(hts))","T_and_F_symbol_linter" +"vignettes/NeonatalVentilation.Rmd",36,23,"style","Trailing whitespace is superfluous."," childsds::who.ref, ","trailing_whitespace_linter" +"vignettes/NeonatalVentilation.Rmd",39,18,"style","Trailing whitespace is superfluous."," stack = TRUE, ","trailing_whitespace_linter" +"vignettes/NeonatalVentilation.Rmd",42,36,"style","Trailing whitespace is superfluous."," dplyr::rename(weight = value) %>% ","trailing_whitespace_linter" +"vignettes/NeonatalVentilation.Rmd",50,40,"style","Trailing whitespace is superfluous."," mutate(tidal_volume = 7 * weight) %>% ","trailing_whitespace_linter" +"vignettes/NeonatalVentilation.Rmd",53,41,"style","Trailing whitespace is superfluous.","plot(dat[c(""weight"", ""error_fraction"")], ","trailing_whitespace_linter" +"vignettes/NeonatalVentilation.Rmd",64,26,"style","Trailing whitespace is superfluous.","cleft_repair_deadspace <- ","trailing_whitespace_linter" +"vignettes/NeonatalVentilation.Rmd",66,40,"style","Trailing whitespace is superfluous."," elbow = FALSE, ","trailing_whitespace_linter" +"vignettes/NeonatalVentilation.Rmd",68,27,"style","Trailing whitespace is superfluous.","cleft_repair_deadspace2 <- ","trailing_whitespace_linter" +"vignettes/NeonatalVentilation.Rmd",70,40,"style","Trailing whitespace is superfluous."," elbow = FALSE, ","trailing_whitespace_linter" +"vignettes/NeonatalVentilation.Rmd",80,37,"style","Trailing whitespace is superfluous.","plot(dat$months, dat$equip_err_frac, ","trailing_whitespace_linter" +"vignettes/NeonatalVentilation.Rmd",93,27,"style","Put spaces around all infix operators.","axis(1, at = seq(0, 12, 12/6), labels = wts, line = 2)","infix_spaces_linter" diff --git a/.dev/revdep_emails/physiology/attachments/physiology.warnings b/.dev/revdep_emails/physiology/attachments/physiology.warnings new file mode 100644 index 000000000..182961f94 --- /dev/null +++ b/.dev/revdep_emails/physiology/attachments/physiology.warnings @@ -0,0 +1,2 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. +Trying to remove β€˜camel_case_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/physiology/email-body b/.dev/revdep_emails/physiology/email-body new file mode 100644 index 000000000..b87e626f9 --- /dev/null +++ b/.dev/revdep_emails/physiology/email-body @@ -0,0 +1,29 @@ +Hello Jack O. Wasey! Thank you for using {lintr} in your package {physiology}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/jackwasey/physiology (hash: 2a2d8daff08e9fcf4f6aecf1559a665ff0b8aeee) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 21s on CRAN vs. 13s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/precommit/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/precommit/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..858073cfe --- /dev/null +++ b/.dev/revdep_emails/precommit/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,8 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/hooks/exported/style-files.R",77,3,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" +"R/exec.R",207,5,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" +"R/release.R",46,3,"warning","local variable β€˜last_release’ assigned but may not be used"," last_release <- call_and_capture(""git"", ""tag -l --sort=-taggerdate"")$stdout[1]","object_usage_linter" +"R/release.R",49,3,"warning","local variable β€˜msg1’ assigned but may not be used"," msg1 <- glue::glue(""Release {new_version}, see NEWS.md for details."")","object_usage_linter" +"R/setup.R",193,7,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" +"R/zzz.R",1,1,"style","Variable and function name style should be snake_case.",".onLoad <- function(libname, pkgname) {","object_name_linter" +"tests/testthat/test-conda.R",157,7,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" diff --git a/.dev/revdep_emails/precommit/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/precommit/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..f79a2fb4a --- /dev/null +++ b/.dev/revdep_emails/precommit/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,17 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/hooks/exported/deps-in-desc.R",9,3,"style","Use <-, not ->, for assignment.",""" -> doc","assignment_linter" +"inst/hooks/exported/lintr.R",11,3,"style","Use <-, not ->, for assignment.",""" -> doc","assignment_linter" +"inst/hooks/exported/readme-rmd-rendered.R",2,31,"warning","Conditional expressions require scalar logical operators (&& and ||)","if (file.exists(""README.Rmd"") & file.exists(""README.md"")) {","vector_logic_linter" +"inst/hooks/exported/roxygenize.R",22,3,"style","Use <-, not ->, for assignment.",""" -> doc","assignment_linter" +"inst/hooks/exported/spell-check.R",10,3,"style","Use <-, not ->, for assignment.",""" -> doc","assignment_linter" +"inst/hooks/exported/style-files.R",13,3,"style","Use <-, not ->, for assignment.","' -> doc","assignment_linter" +"inst/hooks/local/consistent-release-tag.R",8,3,"style","Use <-, not ->, for assignment.",""" -> doc","assignment_linter" +"R/call.R",13,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(command) != 1 | !inherits(command, ""character"")) {","vector_logic_linter" +"R/config.R",43,49,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!file_exists(fs::path(root, name_target)) | force) {","vector_logic_linter" +"R/install.R",3,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is_installed() | force) {","vector_logic_linter" +"tests/testthat/in/parsable-R-fail.Rmd",7,3,"error","unexpected numeric constant","1 1j1j ΓΆj1 ",NA +"tests/testthat/in/parsable-R-fail.Rmd",7,11,"style","Trailing whitespace is superfluous.","1 1j1j ΓΆj1 ","trailing_whitespace_linter" +"tests/testthat/in/parsable-R-success.Rmd",16,11,"error","unexpected numeric constant"," fas / fk 12 -",NA +"tests/testthat/in/parsable-R-success.Rmd",21,8,"style","Trailing whitespace is superfluous.","this is ","trailing_whitespace_linter" +"tests/testthat/in/parsable-R-success.Rmd",25,8,"style","Trailing whitespace is superfluous.","this is ","trailing_whitespace_linter" +"tests/testthat/in/parsable-R-success.Rmd",29,8,"style","Trailing whitespace is superfluous.","this is ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/precommit/email-body b/.dev/revdep_emails/precommit/email-body new file mode 100644 index 000000000..9a429ca21 --- /dev/null +++ b/.dev/revdep_emails/precommit/email-body @@ -0,0 +1,29 @@ +Hello Lorenz Walthert! Thank you for using {lintr} in your package {precommit}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/lorenzwalthert/precommit (hash: 5466ad513d4ca1f0f439cc49e4935870f5179488) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 32s on CRAN vs. 17s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/prettyB/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/prettyB/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..7bb0db986 --- /dev/null +++ b/.dev/revdep_emails/prettyB/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,23 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/barplot.R",33,23,"style","Compound semicolons are discouraged. Replace them by a newline."," args$height = height; args$width = width; args$space = space","semicolon_linter" +"R/barplot.R",33,43,"style","Compound semicolons are discouraged. Replace them by a newline."," args$height = height; args$width = width; args$space = space","semicolon_linter" +"R/barplot.R",34,29,"style","Compound semicolons are discouraged. Replace them by a newline."," args$names.arg = names.arg; args$legend.text = legend.text","semicolon_linter" +"R/barplot.R",35,23,"style","Compound semicolons are discouraged. Replace them by a newline."," args$beside = beside; args$horiz = horiz","semicolon_linter" +"R/barplot.R",36,25,"style","Compound semicolons are discouraged. Replace them by a newline."," args$density = density; args$angle = angle","semicolon_linter" +"R/barplot.R",41,17,"style","Compound semicolons are discouraged. Replace them by a newline."," args$xpd = xpd; args$log = log","semicolon_linter" +"R/barplot.R",42,29,"style","Compound semicolons are discouraged. Replace them by a newline."," args$axisnames = axisnames; args$cex.axis = cex.axis","semicolon_linter" +"R/boxplot.R",44,13,"style","Compound semicolons are discouraged. Replace them by a newline."," args$x = x; args$range = range; args$width = width","semicolon_linter" +"R/boxplot.R",44,33,"style","Compound semicolons are discouraged. Replace them by a newline."," args$x = x; args$range = range; args$width = width","semicolon_linter" +"R/boxplot.R",45,27,"style","Compound semicolons are discouraged. Replace them by a newline."," args$varwidth = varwidth; args$notch = notch; args$outline = outline","semicolon_linter" +"R/boxplot.R",45,47,"style","Compound semicolons are discouraged. Replace them by a newline."," args$varwidth = varwidth; args$notch = notch; args$outline = outline","semicolon_linter" +"R/boxplot.R",47,19,"style","Compound semicolons are discouraged. Replace them by a newline."," args$plot = plot; args$border = border; args$log = log","semicolon_linter" +"R/boxplot.R",47,41,"style","Compound semicolons are discouraged. Replace them by a newline."," args$plot = plot; args$border = border; args$log = log","semicolon_linter" +"R/boxplot.R",48,19,"style","Compound semicolons are discouraged. Replace them by a newline."," args$pars = pars; args$horizontal = horizontal; args$add = add","semicolon_linter" +"R/boxplot.R",48,49,"style","Compound semicolons are discouraged. Replace them by a newline."," args$pars = pars; args$horizontal = horizontal; args$add = add","semicolon_linter" +"R/boxplot.R",52,19,"style","Compound semicolons are discouraged. Replace them by a newline."," main = args$main; sub = args$sub","semicolon_linter" +"R/boxplot.R",97,29,"style","Compound semicolons are discouraged. Replace them by a newline."," args$xlim = name_axis$lim; args$ylim = number_axis$lim","semicolon_linter" +"R/boxplot.R",98,32,"style","Compound semicolons are discouraged. Replace them by a newline."," ticks_names = name_axis$ticks; ticks_numbers = number_axis$ticks","semicolon_linter" +"R/boxplot.R",114,19,"style","Compound semicolons are discouraged. Replace them by a newline."," args$yaxt = NULL; args$add = TRUE","semicolon_linter" +"vignettes/introduction.Rmd",10,52,"style","Do not place spaces before parentheses.","knitr::opts_chunk$set(results = ""hide"", echo = TRUE )","spaces_inside_linter" +"vignettes/introduction.Rmd",51,53,"style","Trailing whitespace is superfluous.","hist(y, main = ""Base Graphics"", sub = ""Sub heading"", ","trailing_whitespace_linter" +"vignettes/introduction.Rmd",121,41,"style","Trailing whitespace is superfluous.","boxplot_p(rnorm(100), horizontal = TRUE, ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/prettyB/attachments/prettyB.warnings b/.dev/revdep_emails/prettyB/attachments/prettyB.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/prettyB/attachments/prettyB.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/prettyB/email-body b/.dev/revdep_emails/prettyB/email-body new file mode 100644 index 000000000..abf598063 --- /dev/null +++ b/.dev/revdep_emails/prettyB/email-body @@ -0,0 +1,29 @@ +Hello Colin Gillespie! Thank you for using {lintr} in your package {prettyB}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/jumpingrivers/prettyB (hash: 881a63a22e5010f35f43f48333550ec2d634bbff) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 6s on CRAN vs. 3s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/rBiasCorrection/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/rBiasCorrection/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..165042a71 --- /dev/null +++ b/.dev/revdep_emails/rBiasCorrection/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,110 @@ +"filename","line_number","column_number","type","message","line","linter" +"data-raw/devstuffs.R",11,79,"style","Only use double-quotes."," person(""Lorenz A."", ""Kapsner"", email = ""lorenz.kapsner@gmail.com"", role = c('cre', 'aut', 'cph'),","single_quotes_linter" +"data-raw/devstuffs.R",11,81,"style","Lines should not be more than 80 characters."," person(""Lorenz A."", ""Kapsner"", email = ""lorenz.kapsner@gmail.com"", role = c('cre', 'aut', 'cph'),","line_length_linter" +"data-raw/devstuffs.R",11,86,"style","Only use double-quotes."," person(""Lorenz A."", ""Kapsner"", email = ""lorenz.kapsner@gmail.com"", role = c('cre', 'aut', 'cph'),","single_quotes_linter" +"data-raw/devstuffs.R",11,93,"style","Only use double-quotes."," person(""Lorenz A."", ""Kapsner"", email = ""lorenz.kapsner@gmail.com"", role = c('cre', 'aut', 'cph'),","single_quotes_linter" +"data-raw/devstuffs.R",43,2,"style","Commented code should be removed.","#usethis::use_gpl3_license(name=""Lorenz Kapsner"")","commented_code_linter" +"data-raw/devstuffs.R",46,53,"style","Put spaces around all infix operators.","usethis::use_package(""R"", min_version = ""2.10"", type=""Depends"")","infix_spaces_linter" +"data-raw/devstuffs.R",49,81,"style","Lines should not be more than 80 characters.","# https://cran.r-project.org/web/packages/data.table/vignettes/datatable-importing.html","line_length_linter" +"data-raw/devstuffs.R",50,40,"style","Put spaces around all infix operators.","usethis::use_package(""data.table"", type=""Imports"")","infix_spaces_linter" +"data-raw/devstuffs.R",51,37,"style","Put spaces around all infix operators.","usethis::use_package(""ggplot2"", type=""Imports"")","infix_spaces_linter" +"data-raw/devstuffs.R",52,38,"style","Put spaces around all infix operators.","usethis::use_package(""magrittr"", type=""Imports"")","infix_spaces_linter" +"data-raw/devstuffs.R",53,37,"style","Put spaces around all infix operators.","usethis::use_package(""polynom"", type=""Imports"")","infix_spaces_linter" +"data-raw/devstuffs.R",54,34,"style","Put spaces around all infix operators.","usethis::use_package(""nls2"", type=""Imports"")","infix_spaces_linter" +"data-raw/devstuffs.R",55,35,"style","Put spaces around all infix operators.","usethis::use_package(""stats"", type=""Imports"")","infix_spaces_linter" +"data-raw/devstuffs.R",56,42,"style","Put spaces around all infix operators.","usethis::use_package(""future.apply"", type=""Imports"")","infix_spaces_linter" +"data-raw/devstuffs.R",66,36,"style","Put spaces around all infix operators.","usethis::use_package(""ggpubr"", type=""Suggests"")","infix_spaces_linter" +"data-raw/devstuffs.R",70,3,"style","Commented code should be removed.","# tag <- ""master""","commented_code_linter" +"data-raw/devstuffs.R",71,3,"style","Commented code should be removed.","# devtools::install_github(repo = ""r-lib/testthat"", ref = tag, upgrade = ""always"")","commented_code_linter" +"data-raw/devstuffs.R",71,81,"style","Lines should not be more than 80 characters.","# devtools::install_github(repo = ""r-lib/testthat"", ref = tag, upgrade = ""always"")","line_length_linter" +"data-raw/devstuffs.R",72,3,"style","Commented code should be removed.","# # https://cran.r-project.org/web/packages/devtools/vignettes/dependencies.html","commented_code_linter" +"data-raw/devstuffs.R",73,3,"style","Commented code should be removed.","# desc::desc_set_remotes(paste0(""github::r-lib/testthat@"", tag), file = usethis::proj_get())","commented_code_linter" +"data-raw/devstuffs.R",73,81,"style","Lines should not be more than 80 characters.","# desc::desc_set_remotes(paste0(""github::r-lib/testthat@"", tag), file = usethis::proj_get())","line_length_linter" +"data-raw/devstuffs.R",133,3,"style","Commented code should be removed.","# experimental = ""../19_PCR-bias/data/example_data/type1/example_data_type1_experimentaldata.csv""","commented_code_linter" +"data-raw/devstuffs.R",133,81,"style","Lines should not be more than 80 characters.","# experimental = ""../19_PCR-bias/data/example_data/type1/example_data_type1_experimentaldata.csv""","line_length_linter" +"data-raw/devstuffs.R",134,3,"style","Commented code should be removed.","# calibration = ""../19_PCR-bias/data/example_data/type1/example_data_type1_calibrationdata.csv""","commented_code_linter" +"data-raw/devstuffs.R",134,81,"style","Lines should not be more than 80 characters.","# calibration = ""../19_PCR-bias/data/example_data/type1/example_data_type1_calibrationdata.csv""","line_length_linter" +"data-raw/devstuffs.R",136,1,"style","Variable and function name style should be snake_case or symbols.","example.data_experimental <- data.table::fread(""./tests/testthat/testdata/exp_type_1.csv"")","object_name_linter" +"data-raw/devstuffs.R",136,81,"style","Lines should not be more than 80 characters.","example.data_experimental <- data.table::fread(""./tests/testthat/testdata/exp_type_1.csv"")","line_length_linter" +"data-raw/devstuffs.R",137,1,"style","Variable and function name style should be snake_case or symbols.","example.data_calibration <- data.table::fread(""./tests/testthat/testdata/cal_type_1.csv"")","object_name_linter" +"data-raw/devstuffs.R",137,81,"style","Lines should not be more than 80 characters.","example.data_calibration <- data.table::fread(""./tests/testthat/testdata/cal_type_1.csv"")","line_length_linter" +"data-raw/devstuffs.R",139,3,"style","Commented code should be removed.","# vec <- colnames(example.data_experimental)","commented_code_linter" +"data-raw/devstuffs.R",140,3,"style","Commented code should be removed.","# vec <- vec[2:length(vec)]","commented_code_linter" +"data-raw/devstuffs.R",142,5,"style","Commented code should be removed.","# as.numeric(gsub(""\\,"", ""."", x))","commented_code_linter" +"data-raw/devstuffs.R",145,3,"style","Commented code should be removed.","# data.table::fwrite(example.data_experimental, ""./tests/testthat/testdata/exp_type_1.csv"")","commented_code_linter" +"data-raw/devstuffs.R",145,81,"style","Lines should not be more than 80 characters.","# data.table::fwrite(example.data_experimental, ""./tests/testthat/testdata/exp_type_1.csv"")","line_length_linter" +"data-raw/devstuffs.R",147,3,"style","Commented code should be removed.","# vec <- colnames(example.data_calibration)","commented_code_linter" +"data-raw/devstuffs.R",149,5,"style","Commented code should be removed.","# as.numeric(gsub(""\\,"", ""."", x))","commented_code_linter" +"data-raw/devstuffs.R",152,3,"style","Commented code should be removed.","# data.table::fwrite(example.data_calibration, ""./tests/testthat/testdata/cal_type_1.csv"")","commented_code_linter" +"data-raw/devstuffs.R",152,81,"style","Lines should not be more than 80 characters.","# data.table::fwrite(example.data_calibration, ""./tests/testthat/testdata/cal_type_1.csv"")","line_length_linter" +"data-raw/devstuffs.R",154,1,"style","Variable and function name style should be snake_case or symbols.","example.data_experimental <- rBiasCorrection::clean_dt(example.data_experimental,","object_name_linter" +"data-raw/devstuffs.R",154,81,"style","Lines should not be more than 80 characters.","example.data_experimental <- rBiasCorrection::clean_dt(example.data_experimental,","line_length_linter" +"data-raw/devstuffs.R",158,1,"style","Variable and function name style should be snake_case or symbols.","example.data_calibration <- rBiasCorrection::clean_dt(example.data_calibration,","object_name_linter" +"data-raw/devstuffs.R",164,1,"style","Variable and function name style should be snake_case or symbols.","example._plot.df_agg <- rBiasCorrection:::create_agg_df(","object_name_linter" +"data-raw/devstuffs.R",171,31,"style","Use FALSE instead of the symbol F."," internal = F,","T_and_F_symbol_linter" +"data-raw/devstuffs.R",172,32,"style","Use FALSE instead of the symbol F."," overwrite = F)","T_and_F_symbol_linter" +"data-raw/devstuffs.R",175,3,"style","Commented code should be removed.","# BiasCorrection(experimental = ""../19_PCR-bias/data/example_data/type1/example_data_type1_experimentaldata.csv"", calibration = ""../19_PCR-bias/data/example_data/type1/example_data_type1_calibrationdata.csv"", samplelocusname = ""Test"")","commented_code_linter" +"data-raw/devstuffs.R",175,81,"style","Lines should not be more than 80 characters.","# BiasCorrection(experimental = ""../19_PCR-bias/data/example_data/type1/example_data_type1_experimentaldata.csv"", calibration = ""../19_PCR-bias/data/example_data/type1/example_data_type1_calibrationdata.csv"", samplelocusname = ""Test"")","line_length_linter" +"data-raw/devstuffs.R",176,2,"style","Commented code should be removed.","#covr::package_coverage()","commented_code_linter" +"data-raw/devstuffs.R",177,2,"style","Commented code should be removed.","#lintr::lint_package()","commented_code_linter" +"data-raw/devstuffs.R",178,2,"style","Commented code should be removed.","#styler::style_pkg()","commented_code_linter" +"R/better_model.R",106,55,"style","Use FALSE instead of the symbol F."," ""SSE_cubic""), with = F]","T_and_F_symbol_linter" +"R/better_model.R",113,80,"style","Use FALSE instead of the symbol F."," x_dat <- statstable_post_hyperbolic[, c(""Name"", ""relative_error""), with = F]","T_and_F_symbol_linter" +"R/better_model.R",115,75,"style","Use FALSE instead of the symbol F."," y_dat <- statstable_post_cubic[, c(""Name"", ""relative_error""), with = F]","T_and_F_symbol_linter" +"R/better_model.R",119,28,"style","Use TRUE instead of the symbol T."," all = T,","T_and_F_symbol_linter" +"R/biascorrection.R",178,49,"style","Use TRUE instead of the symbol T."," data.table::fread(experimental, header = T),","T_and_F_symbol_linter" +"R/biascorrection.R",188,69,"style","Use TRUE instead of the symbol T."," cal_type_1 <- clean_dt(data.table::fread(calibration, header = T),","T_and_F_symbol_linter" +"R/biascorrection.R",278,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" +"R/biascorrection.R",376,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" +"R/biascorrection.R",485,60,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" +"R/biascorrection.R",490,60,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" +"R/clean_dt.R",125,36,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (description == ""calibration"" & type == ""1"") {","vector_logic_linter" +"R/clean_dt.R",153,60,"style","Use TRUE instead of the symbol T."," datatable <- datatable[rowSums(datatable[, -1], na.rm = T) != 0, ]","T_and_F_symbol_linter" +"R/clean_dt.R",161,34,"style","Use FALSE instead of the symbol F."," datatable[, vec_cal, with = F], na.rm = T","T_and_F_symbol_linter" +"R/clean_dt.R",161,46,"style","Use TRUE instead of the symbol T."," datatable[, vec_cal, with = F], na.rm = T","T_and_F_symbol_linter" +"R/clean_dt.R",173,43,"style","Use FALSE instead of the symbol F."," !is.na(datatable[, vec[-1], with = F])","T_and_F_symbol_linter" +"R/clean_dt.R",193,68,"style","Use TRUE instead of the symbol T."," datatable <- datatable[order(get(""CpG_count""), decreasing = T)]","T_and_F_symbol_linter" +"R/create_agg_df.R",20,59,"style","Use FALSE instead of the symbol F."," df <- datatable[, c(""true_methylation"", index), with = F]","T_and_F_symbol_linter" +"R/create_agg_df.R",32,41,"style","Use TRUE instead of the symbol T."," ""CpG"" = mean(get(""CpG""), na.rm = T),","T_and_F_symbol_linter" +"R/create_agg_df.R",33,45,"style","Use TRUE instead of the symbol T."," ""sd"" = stats::sd(get(""CpG""), na.rm = T)","T_and_F_symbol_linter" +"R/create_agg_df.R",50,54,"style","Use FALSE instead of the symbol F."," df <- datatable[, c(""sample_id"", index), with = F]","T_and_F_symbol_linter" +"R/create_agg_df.R",56,43,"style","Use TRUE instead of the symbol T."," ""CpG"" = mean(get(""CpG""), na.rm = T),","T_and_F_symbol_linter" +"R/create_agg_df.R",57,47,"style","Use TRUE instead of the symbol T."," ""sd"" = stats::sd(get(""CpG""), na.rm = T)","T_and_F_symbol_linter" +"R/create_agg_df.R",62,53,"style","Use FALSE instead of the symbol F."," df <- datatable[, c(""locus_id"", index), with = F]","T_and_F_symbol_linter" +"R/create_agg_df.R",67,43,"style","Use TRUE instead of the symbol T."," ""CpG"" = mean(get(""CpG""), na.rm = T),","T_and_F_symbol_linter" +"R/create_agg_df.R",68,47,"style","Use TRUE instead of the symbol T."," ""sd"" = stats::sd(get(""CpG""), na.rm = T)","T_and_F_symbol_linter" +"R/create_exampleplot.R",90,16,"style","Use FALSE instead of the symbol F."," parse = F","T_and_F_symbol_linter" +"R/createbarerrorplots.R",155,70,"style","Use FALSE instead of the symbol F."," stats_pre <- statstable_pre[, c(""Name"", ""relative_error""), with = F]","T_and_F_symbol_linter" +"R/createbarerrorplots.R",156,72,"style","Use FALSE instead of the symbol F."," stats_post <- statstable_post[, c(""Name"", ""relative_error""), with = F]","T_and_F_symbol_linter" +"R/createbarerrorplots.R",170,13,"style","Use FALSE instead of the symbol F."," sort = F,","T_and_F_symbol_linter" +"R/cubic.R",129,7,"warning","local variable β€˜ret’ assigned but may not be used"," ret <- nls2::nls2(CpG ~ cubic_eq_minmax(","object_usage_linter" +"R/cubic.R",171,62,"style","Use TRUE instead of the symbol T."," sse <- as.numeric(dat[, sum(get(""squared_error""), na.rm = T)])","T_and_F_symbol_linter" +"R/cubic.R",177,66,"style","Use TRUE instead of the symbol T."," tss <- as.numeric(dat[, sum(get(""squared_dist_mean""), na.rm = T)])","T_and_F_symbol_linter" +"R/hyperbolic.R",118,7,"warning","local variable β€˜ret’ assigned but may not be used"," ret <- nls2::nls2(CpG ~ hyperbolic_eq(","object_usage_linter" +"R/hyperbolic.R",231,7,"warning","local variable β€˜ret’ assigned but may not be used"," ret <- nls2::nls2(CpG ~ hyperbolic_eq_minmax(","object_usage_linter" +"R/hyperbolic.R",271,62,"style","Use TRUE instead of the symbol T."," sse <- as.numeric(dat[, sum(get(""squared_error""), na.rm = T)])","T_and_F_symbol_linter" +"R/hyperbolic.R",277,66,"style","Use TRUE instead of the symbol T."," tss <- as.numeric(dat[, sum(get(""squared_dist_mean""), na.rm = T)])","T_and_F_symbol_linter" +"R/hyperbolic.R",282,60,"style","Use TRUE instead of the symbol T."," , mean(get(""relative_error""), na.rm = T)],","T_and_F_symbol_linter" +"R/solving_equations.R",208,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (find_x[[k]] >= 0 & find_x[[k]] <= 100) {","vector_logic_linter" +"R/solving_equations.R",377,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (h_solv >= 0 & h_solv <= 100) {","vector_logic_linter" +"R/solving_equations.R",392,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (h_solv < 0 & h_solv > -10) {","vector_logic_linter" +"R/solving_equations.R",402,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (h_solv > 100 & h_solv < 110) {","vector_logic_linter" +"R/utils.R",118,32,"style","Use TRUE instead of the symbol T."," unlink(plotdir, recursive = T)","T_and_F_symbol_linter" +"R/utils.R",120,31,"style","Use TRUE instead of the symbol T."," unlink(csvdir, recursive = T)","T_and_F_symbol_linter" +"R/utils.R",149,52,"style","Use TRUE instead of the symbol T."," write(message_out, file = logfilename, append = T)","T_and_F_symbol_linter" +"R/utils.R",178,42,"style","Use FALSE instead of the symbol F."," row.names = F,","T_and_F_symbol_linter" +"tests/testthat/test-algorithm_minmax_FALSE_re.R",71,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" +"tests/testthat/test-algorithm_minmax_FALSE_re.R",106,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" +"tests/testthat/test-algorithm_minmax_FALSE.R",194,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" +"tests/testthat/test-algorithm_minmax_FALSE.R",276,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" +"tests/testthat/test-algorithm_minmax_TRUE_re.R",71,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" +"tests/testthat/test-algorithm_minmax_TRUE_re.R",106,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" +"tests/testthat/test-algorithm_minmax_TRUE.R",188,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" +"tests/testthat/test-algorithm_minmax_TRUE.R",265,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" +"tests/testthat/test-clean_dt.R",27,74,"style","Use TRUE instead of the symbol T."," exp_type_1 <- fread(""./testdata/exp_type_1_empty_col.csv"", header = T)","T_and_F_symbol_linter" +"tests/testthat/test-clean_dt.R",75,74,"style","Use TRUE instead of the symbol T."," exp_type_2 <- fread(""./testdata/exp_type_2_empty_col.csv"", header = T)","T_and_F_symbol_linter" +"vignettes/rBiasCorrection_howto.Rmd",55,77,"style","Use FALSE instead of the symbol F.","temp_file <- rBiasCorrection::example.data_experimental$dat[, cols, with = F]","T_and_F_symbol_linter" +"vignettes/rBiasCorrection_howto.Rmd",58,76,"style","Use FALSE instead of the symbol F.","temp_file <- rBiasCorrection::example.data_calibration$dat[, cols, with = F]","T_and_F_symbol_linter" +"vignettes/rBiasCorrection_howto.Rmd",165,81,"style","Lines should not be more than 80 characters.","filename <- list.files(csvdir)[grepl(""regression_stats_[[:digit:]]"", list.files(csvdir))]","line_length_linter" +"vignettes/rBiasCorrection_howto.Rmd",167,25,"style","Commas should always have a space after.","knitr::kable(reg_stats[,1:9])","commas_linter" +"vignettes/rBiasCorrection_howto.Rmd",168,25,"style","Commas should always have a space after.","knitr::kable(reg_stats[,11:16])","commas_linter" diff --git a/.dev/revdep_emails/rBiasCorrection/attachments/rBiasCorrection.warnings b/.dev/revdep_emails/rBiasCorrection/attachments/rBiasCorrection.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/rBiasCorrection/attachments/rBiasCorrection.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/rBiasCorrection/email-body b/.dev/revdep_emails/rBiasCorrection/email-body new file mode 100644 index 000000000..347a1ffc6 --- /dev/null +++ b/.dev/revdep_emails/rBiasCorrection/email-body @@ -0,0 +1,29 @@ +Hello Lorenz A. Kapsner! Thank you for using {lintr} in your package {rBiasCorrection}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/kapsner/rBiasCorrection (hash: 5dc394c787399e7c0963b7e93435c5ad610fab3e) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 29s on CRAN vs. 12s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/rasterpdf/email-body b/.dev/revdep_emails/rasterpdf/email-body new file mode 100644 index 000000000..5347568fe --- /dev/null +++ b/.dev/revdep_emails/rasterpdf/email-body @@ -0,0 +1,29 @@ +Hello Ilari Scheinin! Thank you for using {lintr} in your package {rasterpdf}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/ilarischeinin/rasterpdf (hash: defbefa078648608ae9310167fe07c29d39640c3) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 4s on CRAN vs. 2s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/rbokeh/email-body b/.dev/revdep_emails/rbokeh/email-body new file mode 100644 index 000000000..69aa7b888 --- /dev/null +++ b/.dev/revdep_emails/rbokeh/email-body @@ -0,0 +1,29 @@ +Hello Ryan Hafen! Thank you for using {lintr} in your package {rbokeh}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/bokeh/rbokeh (hash: f577cc16fb205ef12d2cf31d031fe6a1bb25e5e3) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 0s on CRAN vs. 0s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/rde/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/rde/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..04fab8175 --- /dev/null +++ b/.dev/revdep_emails/rde/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,12 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/load.R",65,26,"style","Variable and function name style should be snake_case or symbols."," load.fcn,","object_name_linter" +"R/save.R",100,5,"style","`else` should come on the same line as the previous `}`."," else if (length(r1) == 0 && length(r2) == 0) {","brace_linter" +"R/save.R",106,5,"style","`else` should come on the same line as the previous `}`."," else if (length(r2) == 0) {","brace_linter" +"vignettes/rde_tutorial.Rmd",48,1,"style","Variable and function name style should be snake_case or symbols.","pop.data <- read.csv(fname, stringsAsFactors = FALSE)","object_name_linter" +"vignettes/rde_tutorial.Rmd",74,1,"style","Variable and function name style should be snake_case or symbols.","pop.data <- load_rde_var(","object_name_linter" +"vignettes/rde_tutorial.Rmd",109,1,"style","Variable and function name style should be snake_case or symbols.","pop.data <- load_rde_var(","object_name_linter" +"vignettes/rde_tutorial.Rmd",116,81,"style","Lines should not be more than 80 characters."," rde1QlpoOTFBWSZTWQy+/kYAAIB3/v//6EJABRg/WlQv797wYkAAAMQiABBAACAAAZGwANk0RTKejU9T","line_length_linter" +"vignettes/rde_tutorial.Rmd",117,81,"style","Lines should not be more than 80 characters."," RoBoGgGjTRoBoGgaGymE0Kp+qemmkDNQ0YmJk0AA0xNADQNPUaA0JRhDTJoANAAAAAAAAEJx2Eja7QBK","line_length_linter" +"vignettes/rde_tutorial.Rmd",118,81,"style","Lines should not be more than 80 characters."," MKPPkRAx63wSAWt31AABs1zauhwHifs5WlltyIyQKAAAZEAZGQYMIZEA6ZAPHVMEB71jSCqdlsiR/eSY","line_length_linter" +"vignettes/rde_tutorial.Rmd",119,81,"style","Lines should not be more than 80 characters."," kzQkRq5RoXgvNNZnB5RSOvKaTGFtc/SXc74AhzqhMEJvdisEGVfo7UYngc0AwGqTvTHx8CBZTzE9OQZZ","line_length_linter" +"vignettes/rde_tutorial.Rmd",120,81,"style","Lines should not be more than 80 characters."," VY8KAhHAhrG4RCeilM0rXKkdpjGqyNgJwAkmnPQOMYrLlQ4YTIv0WyxfYdkd9WSWUsvggC/i7kinChIB","line_length_linter" diff --git a/.dev/revdep_emails/rde/email-body b/.dev/revdep_emails/rde/email-body new file mode 100644 index 000000000..b4bd2adca --- /dev/null +++ b/.dev/revdep_emails/rde/email-body @@ -0,0 +1,29 @@ +Hello Stefan Kloppenborg! Thank you for using {lintr} in your package {rde}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/kloppen/rde (hash: 6e25e635b0b152358065573a876e10620f0c82ac) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 5s on CRAN vs. 3s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/rdomains/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/rdomains/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..624736350 --- /dev/null +++ b/.dev/revdep_emails/rdomains/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,13 @@ +"filename","line_number","column_number","type","message","line","linter" +"inst/doc/rdomains.Rmd",19,2,"style","Commented code should be removed.","#library(devtools)","commented_code_linter" +"inst/doc/rdomains.Rmd",120,17,"style","Put spaces around all infix operators.","alexa_cat(domain=""http://www.google.com"")[1,]","infix_spaces_linter" +"inst/doc/rdomains.Rmd",120,45,"style","Commas should always have a space after.","alexa_cat(domain=""http://www.google.com"")[1,]","commas_linter" +"R/alexa_cat.R",23,54,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (identical(Sys.getenv(""AWS_ACCESS_KEY_ID""), """") |","vector_logic_linter" +"R/get_alexa_data.R",16,34,"style","Put spaces around all infix operators.","get_alexa_data <- function(outdir=""."", overwrite=FALSE) {","infix_spaces_linter" +"R/get_alexa_data.R",16,49,"style","Put spaces around all infix operators.","get_alexa_data <- function(outdir=""."", overwrite=FALSE) {","infix_spaces_linter" +"R/get_alexa_data.R",20,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (file.exists(alexa_file) & overwrite == FALSE) {","vector_logic_linter" +"R/get_dmoz_data.R",22,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (file.exists(dmoz_file) & overwrite == FALSE) {","vector_logic_linter" +"R/get_shalla_data.R",23,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (overwrite == FALSE & file.exists(output_file)) {","vector_logic_linter" +"vignettes/rdomains.Rmd",19,2,"style","Commented code should be removed.","#library(devtools)","commented_code_linter" +"vignettes/rdomains.Rmd",120,17,"style","Put spaces around all infix operators.","alexa_cat(domain=""http://www.google.com"")[1,]","infix_spaces_linter" +"vignettes/rdomains.Rmd",120,45,"style","Commas should always have a space after.","alexa_cat(domain=""http://www.google.com"")[1,]","commas_linter" diff --git a/.dev/revdep_emails/rdomains/email-body b/.dev/revdep_emails/rdomains/email-body new file mode 100644 index 000000000..3247d8a27 --- /dev/null +++ b/.dev/revdep_emails/rdomains/email-body @@ -0,0 +1,29 @@ +Hello Gaurav Sood! Thank you for using {lintr} in your package {rdomains}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cran/rdomains (hash: 68724a883ad441abef0c95c0755144c643a09e51) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 8s on CRAN vs. 10s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/requiRements/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/requiRements/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..a278adbd1 --- /dev/null +++ b/.dev/revdep_emails/requiRements/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,20 @@ +"filename","line_number","column_number","type","message","line","linter" +"data-raw/devstuffs.R",63,3,"style","Commented code should be removed.","# my_desc$set(""VignetteBuilder"" = ""knitr"")","commented_code_linter" +"data-raw/devstuffs.R",76,2,"style","Commented code should be removed.","#usethis::use_gpl3_license(name = ""UniversitΓ€tsklinikum Erlangen"")","commented_code_linter" +"data-raw/devstuffs.R",80,81,"style","Lines should not be more than 80 characters.","# Listing a package in either Depends or Imports ensures that it’s installed when needed","line_length_linter" +"data-raw/devstuffs.R",82,81,"style","Lines should not be more than 80 characters.","# Loading will load code, data and any DLLs; register S3 and S4 methods; and run the .onLoad() function.","line_length_linter" +"data-raw/devstuffs.R",83,81,"style","Lines should not be more than 80 characters.","## After loading, the package is available in memory, but because it’s not in the search path,","line_length_linter" +"data-raw/devstuffs.R",85,81,"style","Lines should not be more than 80 characters.","## Confusingly, :: will also load a package automatically if it isn’t already loaded.","line_length_linter" +"data-raw/devstuffs.R",86,81,"style","Lines should not be more than 80 characters.","## It’s rare to load a package explicitly, but you can do so with requireNamespace() or loadNamespace().","line_length_linter" +"data-raw/devstuffs.R",87,81,"style","Lines should not be more than 80 characters.","# Attaching puts the package in the search path. You can’t attach a package without first loading it,","line_length_linter" +"data-raw/devstuffs.R",95,3,"style","Commented code should be removed.","# usethis::use_package(""utils"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",97,3,"style","Commented code should be removed.","# usethis::use_package(""httr"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",98,3,"style","Commented code should be removed.","# usethis::use_package(""jsonlite"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",99,3,"style","Commented code should be removed.","# usethis::use_package(""rapportools"", type = ""Imports"")","commented_code_linter" +"data-raw/devstuffs.R",117,3,"style","Commented code should be removed.","# usethis::use_build_ignore(""NEWS.md"")","commented_code_linter" +"data-raw/devstuffs.R",147,3,"style","Commented code should be removed.","# covr::package_coverage()","commented_code_linter" +"data-raw/devstuffs.R",150,3,"style","Commented code should be removed.","# lintr::lint_package()","commented_code_linter" +"data-raw/devstuffs.R",153,3,"style","Commented code should be removed.","# devtools::test()","commented_code_linter" +"data-raw/devstuffs.R",156,3,"style","Commented code should be removed.","# rcmdcheck::rcmdcheck()","commented_code_linter" +"data-raw/devstuffs.R",157,3,"style","Commented code should be removed.","# rcmdcheck::rcmdcheck(args = ""--no-vignettes"", build_args = ""--no-build-vignettes"")","commented_code_linter" +"data-raw/devstuffs.R",157,81,"style","Lines should not be more than 80 characters.","# rcmdcheck::rcmdcheck(args = ""--no-vignettes"", build_args = ""--no-build-vignettes"")","line_length_linter" diff --git a/.dev/revdep_emails/requiRements/attachments/requiRements.warnings b/.dev/revdep_emails/requiRements/attachments/requiRements.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/requiRements/attachments/requiRements.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/requiRements/email-body b/.dev/revdep_emails/requiRements/email-body new file mode 100644 index 000000000..5f7437c97 --- /dev/null +++ b/.dev/revdep_emails/requiRements/email-body @@ -0,0 +1,29 @@ +Hello Jonathan M. Mang! Thank you for using {lintr} in your package {requiRements}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/joundso/requirements (hash: 35992b870e7656608dd20e4eb16dcb13ec61473a) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 1s on CRAN vs. 1s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/rhino/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/rhino/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..f7daa711e --- /dev/null +++ b/.dev/revdep_emails/rhino/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,2 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/config.R",17,21,"style","Any function spanning multiple lines should use curly braces.","option_validator <- function(...) list(","brace_linter" diff --git a/.dev/revdep_emails/rhino/attachments/rhino.warnings b/.dev/revdep_emails/rhino/attachments/rhino.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/rhino/attachments/rhino.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/rhino/email-body b/.dev/revdep_emails/rhino/email-body new file mode 100644 index 000000000..d8c7abea0 --- /dev/null +++ b/.dev/revdep_emails/rhino/email-body @@ -0,0 +1,29 @@ +Hello Kamil Zyla! Thank you for using {lintr} in your package {rhino}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/Appsilon/rhino (hash: 95b7260060ce069b8dfdb09c15047dc54ad27b06) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 9s on CRAN vs. 6s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/rnrfa/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/rnrfa/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..24aa9c6d7 --- /dev/null +++ b/.dev/revdep_emails/rnrfa/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,65 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/catalogue.R",84,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(column_name) & !is.null(column_value)) {","vector_logic_linter" +"R/catalogue.R",87,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(column_name) & is.null(column_value)) {","vector_logic_linter" +"R/catalogue.R",90,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(column_name) & !is.null(column_value)) {","vector_logic_linter" +"R/catalogue.R",99,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (condition_2 | condition_3 | condition_4) {","vector_logic_linter" +"R/catalogue.R",99,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (condition_2 | condition_3 | condition_4) {","vector_logic_linter" +"R/catalogue.R",101,11,"warning","local variable β€˜threshold’ assigned but may not be used"," threshold <- as.numeric(as.character(substr(column_value, 3,","object_usage_linter" +"R/catalogue.R",108,14,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/catalogue.R",118,12,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/catalogue.R",123,10,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/get_ts.R",71,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/get_ts.R",78,12,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/get_ts.R",79,77,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (type %in% c(""pot-stage"", ""pot-flow"", ""amax-stage"", ""amax-flow"") &","vector_logic_linter" +"R/get_ts.R",83,14,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/get_ts.R",89,10,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/get_ts.R",94,42,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (""SOCKcluster"" %in% class(cl) | ""cluster"" %in% class(cl)) {","vector_logic_linter" +"R/get_ts.R",103,14,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/get_ts.R",107,12,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/internals.R",90,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/internals.R",100,73,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (type %in% c(""pot-stage"", ""pot-flow"", ""amax-stage"", ""amax-flow"") &","vector_logic_linter" +"R/internals.R",143,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"R/osg_parse.R",67,26,"style","Put spaces around all infix operators."," padz <- function(x, n=max(nchar(x))) gsub("" "", ""0"", formatC(x, width = -n))","infix_spaces_linter" +"R/plot_rain_flow.R",44,55,"style","Use TRUE instead of the symbol T."," proportion <- ceiling((max(converted_flow, na.rm = T) -","T_and_F_symbol_linter" +"R/plot_rain_flow.R",45,57,"style","Use TRUE instead of the symbol T."," min(converted_flow, na.rm = T)) / 3)","T_and_F_symbol_linter" +"R/plot_rain_flow.R",54,35,"style","Use TRUE instead of the symbol T."," graphics::par(bty = ""n"", new = T)","T_and_F_symbol_linter" +"R/plot_rain_flow.R",57,49,"style","Use FALSE instead of the symbol F."," yaxt = ""n"", xaxt = ""n"", ann = F, # do not plot x and y axis","T_and_F_symbol_linter" +"R/plot_rain_flow.R",69,35,"style","Use FALSE instead of the symbol F."," graphics::par(bty = ""o"", new = F)","T_and_F_symbol_linter" +"R/seasonal_averages.R",28,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" +"tests/testthat.R",7,6,"style","There should be a space before an opening curly brace.","}else{","brace_linter" +"vignettes/rnrfa-vignette.Rmd",32,81,"style","Lines should not be more than 80 characters.","install.packages(c(""cowplot"", ""httr"", ""xts"", ""ggmap"", ""ggplot2"", ""sp"", ""rgdal"", ""parallel"", ""tibble""))","line_length_linter" +"vignettes/rnrfa-vignette.Rmd",70,1,"style","Variable and function name style should be snake_case or symbols.","allIDs <- station_ids()","object_name_linter" +"vignettes/rnrfa-vignette.Rmd",79,1,"style","Variable and function name style should be snake_case or symbols.","allStations <- catalogue()","object_name_linter" +"vignettes/rnrfa-vignette.Rmd",142,22,"style","Put spaces around all infix operators.","catalogue(column_name=""river"", column_value=""Wye"")","infix_spaces_linter" +"vignettes/rnrfa-vignette.Rmd",142,44,"style","Put spaces around all infix operators.","catalogue(column_name=""river"", column_value=""Wye"")","infix_spaces_linter" +"vignettes/rnrfa-vignette.Rmd",145,28,"style","Put spaces around all infix operators.","catalogue(bbox, column_name=""river"", column_value=""Wye"")","infix_spaces_linter" +"vignettes/rnrfa-vignette.Rmd",145,50,"style","Put spaces around all infix operators.","catalogue(bbox, column_name=""river"", column_value=""Wye"")","infix_spaces_linter" +"vignettes/rnrfa-vignette.Rmd",148,28,"style","Put spaces around all infix operators.","catalogue(bbox, column_name=""catchment-area"", column_value="">1"")","infix_spaces_linter" +"vignettes/rnrfa-vignette.Rmd",148,59,"style","Put spaces around all infix operators.","catalogue(bbox, column_name=""catchment-area"", column_value="">1"")","infix_spaces_linter" +"vignettes/rnrfa-vignette.Rmd",154,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/rnrfa-vignette.Rmd",156,22,"style","Put spaces around all infix operators.","catalogue(column_name=""id"", column_value=c(3001,3002,3003))","infix_spaces_linter" +"vignettes/rnrfa-vignette.Rmd",156,41,"style","Put spaces around all infix operators.","catalogue(column_name=""id"", column_value=c(3001,3002,3003))","infix_spaces_linter" +"vignettes/rnrfa-vignette.Rmd",156,49,"style","Commas should always have a space after.","catalogue(column_name=""id"", column_value=c(3001,3002,3003))","commas_linter" +"vignettes/rnrfa-vignette.Rmd",156,54,"style","Commas should always have a space after.","catalogue(column_name=""id"", column_value=c(3001,3002,3003))","commas_linter" +"vignettes/rnrfa-vignette.Rmd",161,1,"style","Variable and function name style should be snake_case or symbols.","someStations <- catalogue(bbox,","object_name_linter" +"vignettes/rnrfa-vignette.Rmd",163,50,"style","Commas should always have a space after."," column_value = c(54022,54090,54091,54092,54097),","commas_linter" +"vignettes/rnrfa-vignette.Rmd",163,56,"style","Commas should always have a space after."," column_value = c(54022,54090,54091,54092,54097),","commas_linter" +"vignettes/rnrfa-vignette.Rmd",163,62,"style","Commas should always have a space after."," column_value = c(54022,54090,54091,54092,54097),","commas_linter" +"vignettes/rnrfa-vignette.Rmd",163,68,"style","Commas should always have a space after."," column_value = c(54022,54090,54091,54092,54097),","commas_linter" +"vignettes/rnrfa-vignette.Rmd",214,21,"style","Put spaces around all infix operators.","plot(info$data, main=paste(""Monthly rainfall data for the"",","infix_spaces_linter" +"vignettes/rnrfa-vignette.Rmd",215,50,"style","Commas should always have a space after."," info$meta$stationName,""catchment""), ","commas_linter" +"vignettes/rnrfa-vignette.Rmd",215,63,"style","Trailing whitespace is superfluous."," info$meta$stationName,""catchment""), ","trailing_whitespace_linter" +"vignettes/rnrfa-vignette.Rmd",216,10,"style","Put spaces around all infix operators."," xlab="""", ylab=info$meta$units)","infix_spaces_linter" +"vignettes/rnrfa-vignette.Rmd",216,19,"style","Put spaces around all infix operators."," xlab="""", ylab=info$meta$units)","infix_spaces_linter" +"vignettes/rnrfa-vignette.Rmd",228,21,"style","Put spaces around all infix operators.","plot(info$data, main=paste0(""Daily flow data for the "",","infix_spaces_linter" +"vignettes/rnrfa-vignette.Rmd",239,17,"style","Commas should always have a space after.","s <- cmr(c(3002,3003), metadata = TRUE)","commas_linter" +"vignettes/rnrfa-vignette.Rmd",242,18,"style","Trailing whitespace is superfluous.","plot(s[[1]]$data, ","trailing_whitespace_linter" +"vignettes/rnrfa-vignette.Rmd",244,23,"style","Put spaces around all infix operators.","lines(s[[2]]$data, col=""green"")","infix_spaces_linter" +"vignettes/rnrfa-vignette.Rmd",261,45,"style","`%>%` should always have a space before it and a new line after it, unless the full pipeline fits on one line.","leaflet(data = someStations) %>% addTiles() %>%","pipe_continuation_linter" +"vignettes/rnrfa-vignette.Rmd",262,68,"style","Commas should always have a space after."," addMarkers(~longitude, ~latitude, popup = ~as.character(paste(id,name)))","commas_linter" +"vignettes/rnrfa-vignette.Rmd",279,1,"style","Variable and function name style should be snake_case or symbols.","someStations <- catalogue(bbox)","object_name_linter" +"vignettes/rnrfa-vignette.Rmd",294,1,"style","Variable and function name style should be snake_case or symbols.","someStations$meangdf <- unlist(lapply(s2, mean))","object_name_linter" +"vignettes/rnrfa-vignette.Rmd",301,49,"style","Commas should always have a space after."," xlab(expression(paste(""Catchment area [Km^2]"",sep=""""))) +","commas_linter" +"vignettes/rnrfa-vignette.Rmd",301,52,"style","Put spaces around all infix operators."," xlab(expression(paste(""Catchment area [Km^2]"",sep=""""))) +","infix_spaces_linter" +"vignettes/rnrfa-vignette.Rmd",302,45,"style","Commas should always have a space after."," ylab(expression(paste(""Mean flow [m^3/s]"",sep="""")))","commas_linter" +"vignettes/rnrfa-vignette.Rmd",302,48,"style","Put spaces around all infix operators."," ylab(expression(paste(""Mean flow [m^3/s]"",sep="""")))","infix_spaces_linter" diff --git a/.dev/revdep_emails/rnrfa/email-body b/.dev/revdep_emails/rnrfa/email-body new file mode 100644 index 000000000..1e88a7898 --- /dev/null +++ b/.dev/revdep_emails/rnrfa/email-body @@ -0,0 +1,29 @@ +Hello Claudia Vitolo! Thank you for using {lintr} in your package {rnrfa}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cvitolo/rnrfa (hash: d79d53d614549cc93942ec1bb75e51811d37c0c6) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 11s on CRAN vs. 15s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/roadoi/email-body b/.dev/revdep_emails/roadoi/email-body new file mode 100644 index 000000000..da06b5246 --- /dev/null +++ b/.dev/revdep_emails/roadoi/email-body @@ -0,0 +1,29 @@ +Hello Najko Jahn! Thank you for using {lintr} in your package {roadoi}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/ropensci/roadoi (hash: 531ec3c43bbae6858be976c8ef8e756d8f9cf2b8) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 3s on CRAN vs. 2s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/scriptexec/attachments/scriptexec.warnings b/.dev/revdep_emails/scriptexec/attachments/scriptexec.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/scriptexec/attachments/scriptexec.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/scriptexec/email-body b/.dev/revdep_emails/scriptexec/email-body new file mode 100644 index 000000000..26264e0a1 --- /dev/null +++ b/.dev/revdep_emails/scriptexec/email-body @@ -0,0 +1,29 @@ +Hello Sagie Gur-Ari! Thank you for using {lintr} in your package {scriptexec}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/sagiegurari/scriptexec (hash: b6d4d97c5472e1f70587c3d44ba8d0547c48f042) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 7s on CRAN vs. 4s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/secuTrialR/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/secuTrialR/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..632ca0212 --- /dev/null +++ b/.dev/revdep_emails/secuTrialR/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,17 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/completeness.R",28,1,"style","Variable and function names should not be longer than 30 characters.","form_status_counts.secuTrialdata <- function(object, ...) {","object_length_linter" +"R/completeness.R",105,25,"style","Variable and function name style should be snake_case."," spread_summary0$""partly filled"" <- NA","object_name_linter" +"R/completeness.R",108,25,"style","Variable and function name style should be snake_case."," spread_summary0$""completely filled"" <- NA","object_name_linter" +"R/completeness.R",114,25,"style","Variable and function name style should be snake_case."," spread_summary1$""with errors"" <- NA","object_name_linter" +"R/completeness.R",120,25,"style","Variable and function name style should be snake_case."," spread_summary2$""with warnings"" <- NA","object_name_linter" +"R/completeness.R",170,1,"style","Variable and function names should not be longer than 30 characters.","form_status_summary.secuTrialdata <- function(object, ...) {","object_length_linter" +"R/factorize.R",28,1,"style","Variable and function names should not be longer than 30 characters.","factorize_secuTrial.secuTrialdata <- function(object, ...) {","object_length_linter" +"R/factorize.R",68,1,"style","Variable and function name style should be snake_case.","factorize_secuTrial.data.frame <- function(data, cl, form, items, short_names) {","object_name_linter" +"R/labels_secuTrial.R",151,1,"style","Variable and function name style should be snake_case.","label_secuTrial.data.frame <- function(data, it) {","object_name_linter" +"R/labels_secuTrial.R",181,1,"style","Variable and function name style should be snake_case.","""label<-"" <- function(x, value) {","object_name_linter" +"R/labels_secuTrial.R",190,1,"style","Variable and function name style should be snake_case.","""units<-"" <- function(x, value) {","object_name_linter" +"R/read_export_options.R",33,11,"style","Variable and function name style should be snake_case."," files$Name <- as.character(files$Name)","object_name_linter" +"R/visit_structure.R",64,39,"style","Place a space before left parenthesis, except in a function call."," z_input <- !is.na(as.matrix(ro[, -(1:2)]))","spaces_left_parentheses_linter" +"R/visit_structure.R",82,30,"style","Place a space before left parenthesis, except in a function call."," z <- !is.na(as.matrix(x[, -(1:2)]))","spaces_left_parentheses_linter" +"tests/testthat/test-visit_structure.R",73,23,"style","Place a space before left parenthesis, except in a function call."," cs <- colSums(vs[, -(1:2)], na.rm = TRUE)","spaces_left_parentheses_linter" +"tests/testthat/test-visit_structure.R",75,23,"style","Place a space before left parenthesis, except in a function call."," rs <- rowSums(vs[, -(1:2)], na.rm = TRUE)","spaces_left_parentheses_linter" diff --git a/.dev/revdep_emails/secuTrialR/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/secuTrialR/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..335a9f069 --- /dev/null +++ b/.dev/revdep_emails/secuTrialR/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,41 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/asdataframe.R",56,13,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!meta & is.null(data.frames)) {","vector_logic_linter" +"R/assess_form_variable_completeness.R",74,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (occ_in_vp > 1 & completeness == ""savedforms"") {","vector_logic_linter" +"R/assess_form_variable_completeness.R",84,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (any(""position"" %in% names(form)) & completeness == ""allforms"") {","vector_logic_linter" +"R/build_secuTrial_url.R",74,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (!is.na(projid) & (is.na(customer) | is.na(instance))) {","vector_logic_linter" +"R/build_secuTrial_url.R",74,48,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (!is.na(projid) & (is.na(customer) | is.na(instance))) {","vector_logic_linter" +"R/build_secuTrial_url.R",76,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (!is.na(customer) & is.na(instance)) {","vector_logic_linter" +"R/diff_secuTrial.R",34,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (class(x) == ""secuTrialdata"" & class(y) == ""secuTrialdata"") {","vector_logic_linter" +"R/diff_secuTrial.R",37,39,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (! x$export_options$proj_setup & y$export_options$proj_setup) {","vector_logic_linter" +"R/factorize.R",92,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (""mnpsubdocid"" %in% names(data) & short_names) {","vector_logic_linter" +"R/factorize.R",140,44,"warning","Conditional expressions require scalar logical operators (&& and ||)"," length(which(is.na(data[, name]))) &","vector_logic_linter" +"R/factorize.R",145,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," ! (grepl(""^mnpfs"", name) | grepl(""^at"", form))) {","vector_logic_linter" +"R/internals.R",15,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(language) & any(grep(""lang"", names(dict)))) {","vector_logic_linter" +"R/internals.R",77,3,"style","`else` should come on the same line as the previous `}`."," else if (new_col_idx == ncol(df)) {","brace_linter" +"R/internals.R",95,43,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (! (col_name_after %in% names(df)) & col_name_after != ""first"") {","vector_logic_linter" +"R/internals.R",246,12,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (warn & length(datevars) == 0) {","vector_logic_linter" +"R/internals.R",249,12,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (warn & length(meta_datevars) == 0) {","vector_logic_linter" +"R/internals.R",252,12,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (warn & length(timevars) == 0) {","vector_logic_linter" +"R/internals.R",255,12,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (warn & length(meta_timevars) == 0) {","vector_logic_linter" +"R/plot_recruitment.R",48,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (return_data & (! show_centres)) {","vector_logic_linter" +"R/read_export_options.R",147,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (rectangular_table & short_names) {","vector_logic_linter" +"R/read_export_table.R",82,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (curr_encoding == ""ISO-8859-1"" | curr_encoding == ""ISO-8859-15"") {","vector_logic_linter" +"R/read_export_table.R",119,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (add_pat_id & (""mnppid"" %in% names(loaded_table))) {","vector_logic_linter" +"R/return_random_participants.R",63,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (percent <= 0 | percent >= 1) {","vector_logic_linter" +"R/subset.R",53,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(participant) & !dat$export_options$add_id) {","vector_logic_linter" +"R/subset.R",56,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(centre) & !dat$export_options$centre_info) {","vector_logic_linter" +"R/subset.R",59,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(centre) & is.null(participant)) {","vector_logic_linter" +"R/subset.R",101,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(centre) & ""centre"" %in% names(new_dat[[tab]])) {","vector_logic_linter" +"tests/testthat/test-subset.R",40,46,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (any(names(dat[[tab]]) %in% ""pat_id"") & nrow(dat[[tab]]) > 0) {","vector_logic_linter" +"tests/testthat/test-subset.R",42,53,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (any(names(dat[[tab]]) %in% ""mnpaid"") & nrow(dat[[tab]]) > 0) {","vector_logic_linter" +"tests/testthat/test-subset.R",44,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" +"vignettes/secuTrialR-package-vignette.Rmd",44,2,"style","Commented code should be removed.","#rm(list = ls()) # removed this at the request of the CRAN submission","commented_code_linter" +"vignettes/secuTrialR-package-vignette.Rmd",419,81,"style","Lines should not be more than 80 characters.","# randomly retrieve at least 25 percent of participants recorded after March 18th 2019","line_length_linter" +"vignettes/secuTrialR-package-vignette.Rmd",485,81,"style","Lines should not be more than 80 characters.","ctu06_v1 <- read_secuTrial(system.file(""extdata"", ""sT_exports"", ""change_tracking"",","line_length_linter" +"vignettes/secuTrialR-package-vignette.Rmd",489,81,"style","Lines should not be more than 80 characters.","ctu06_v2 <- read_secuTrial(system.file(""extdata"", ""sT_exports"", ""change_tracking"",","line_length_linter" +"vignettes/secuTrialR-package-vignette.Rmd",538,81,"style","Lines should not be more than 80 characters.","ctu05_data_berlin <- subset_secuTrial(ctu05_data, centre = centres, exclude = TRUE)","line_length_linter" +"vignettes/secuTrialR-package-vignette.Rmd",570,81,"style","Lines should not be more than 80 characters.","ctu05_data_bern <- subset_secuTrial(ctu05_data, centre = ""Inselspital Bern (RPACK)"")","line_length_linter" +"vignettes/secuTrialR-package-vignette.Rmd",581,81,"style","Lines should not be more than 80 characters."," centre = c(""Inselspital Bern (RPACK)"",","line_length_linter" +"vignettes/secuTrialR-package-vignette.Rmd",724,81,"style","Lines should not be more than 80 characters.","Likely the label was changed from its original state in the secuTrial project setup.","line_length_linter" +"vignettes/secuTrialR-package-vignette.Rmd",761,81,"style","Lines should not be more than 80 characters.","bl_surg <- merge(x = ctu05_data$baseline, y = ctu05_data$esurgeries, by = ""mnpdocid"")","line_length_linter" +"vignettes/secuTrialR-package-vignette.Rmd",816,81,"style","Lines should not be more than 80 characters.","surg_wide <- pivot_wider(surg, names_from = surgery_organ.factor, values_from = count)","line_length_linter" diff --git a/.dev/revdep_emails/secuTrialR/email-body b/.dev/revdep_emails/secuTrialR/email-body new file mode 100644 index 000000000..a29080e4e --- /dev/null +++ b/.dev/revdep_emails/secuTrialR/email-body @@ -0,0 +1,29 @@ +Hello Alan G. Haynes! Thank you for using {lintr} in your package {secuTrialR}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/SwissClinicalTrialOrganisation/secuTrialR (hash: 3761b90ee799a5a4ec72e3cc086eb1ebed26c61e) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 57s on CRAN vs. 34s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/semantic.dashboard/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/semantic.dashboard/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..c987dd1b3 --- /dev/null +++ b/.dev/revdep_emails/semantic.dashboard/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,5 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/box.R",44,3,"warning","local variable β€˜icon_selector’ assigned but may not be used"," icon_selector <- glue::glue(""'#{title_id} > .label > .icon'"")","object_usage_linter" +"R/semantic_dashboard.R",135,20,"style","There should be a space between right parenthesis and an opening curly brace.","#' if(interactive()){","paren_brace_linter" +"R/semantic_dashboard.R",202,20,"style","There should be a space between right parenthesis and an opening curly brace.","#' if(interactive()){","paren_brace_linter" +"R/semantic_dashboard.R",249,20,"style","There should be a space between right parenthesis and an opening curly brace.","#' if(interactive()){","paren_brace_linter" diff --git a/.dev/revdep_emails/semantic.dashboard/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/semantic.dashboard/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..2a77caad3 --- /dev/null +++ b/.dev/revdep_emails/semantic.dashboard/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,8 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/menu_item.R",51,3,"style","`else` should come on the same line as the previous `}`."," else if (is.null(href)) {","brace_linter" +"R/menu_item.R",54,3,"style","`else` should come on the same line as the previous `}`."," else if (newtab) {","brace_linter" +"vignettes/intro.Rmd",52,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/intro.Rmd",73,81,"style","Lines should not be more than 80 characters."," taskItem(""Project progress..."", 50.777, color = ""red"")))","line_length_linter" +"vignettes/intro.Rmd",128,81,"style","Lines should not be more than 80 characters."," taskItem(""Project progress..."", 50.777, color = ""red""))),","line_length_linter" +"vignettes/intro.Rmd",151,44,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","server <- function(input, output, session) {}","brace_linter" +"vignettes/intro.Rmd",151,45,"style","Closing curly-braces should always be on their own line, unless they are followed by an else.","server <- function(input, output, session) {}","brace_linter" diff --git a/.dev/revdep_emails/semantic.dashboard/email-body b/.dev/revdep_emails/semantic.dashboard/email-body new file mode 100644 index 000000000..b1d84f930 --- /dev/null +++ b/.dev/revdep_emails/semantic.dashboard/email-body @@ -0,0 +1,29 @@ +Hello Developers Appsilon! Thank you for using {lintr} in your package {semantic.dashboard}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/Appsilon/semantic.dashboard (hash: 308829f467855c66b3e63b7cabb40dddab6fff3a) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 14s on CRAN vs. 10s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/shiny.info/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/shiny.info/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..75d413ea2 --- /dev/null +++ b/.dev/revdep_emails/shiny.info/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,3 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/display.R",14,3,"warning","local variable β€˜fixed_layout’ assigned but may not be used"," fixed_layout <- ""fixed""","object_usage_linter" +"R/hide.R",73,3,"warning","local variable β€˜shortcut_condition’ assigned but may not be used"," shortcut_condition <- .shortcut_condition(shortcut)","object_usage_linter" diff --git a/.dev/revdep_emails/shiny.info/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/shiny.info/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..e3bd822ee --- /dev/null +++ b/.dev/revdep_emails/shiny.info/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,3 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/display.R",74,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(company_name) & is.null(logo)) {","vector_logic_linter" +"tests/testthat/test_powered_by.R",10,3,"style","Missing terminal newline.","})","trailing_blank_lines_linter" diff --git a/.dev/revdep_emails/shiny.info/email-body b/.dev/revdep_emails/shiny.info/email-body new file mode 100644 index 000000000..806daaba6 --- /dev/null +++ b/.dev/revdep_emails/shiny.info/email-body @@ -0,0 +1,29 @@ +Hello Jakub Nowicki! Thank you for using {lintr} in your package {shiny.info}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/Appsilon/shiny.info (hash: 48b8d81f3268aeaee5b57df2e88c90bbe974d149) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 7s on CRAN vs. 4s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/shiny.react/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/shiny.react/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..1178e62c1 --- /dev/null +++ b/.dev/revdep_emails/shiny.react/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,6 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/experimental.R",2,3,"style","Any function spanning multiple lines should use curly braces."," function(...) reactElement(","brace_linter" +"R/reactData.R",14,24,"style","Any function spanning multiple lines should use curly braces.","asReactData.default <- function(x) ReactData(","brace_linter" +"R/reactData.R",21,32,"style","Any function spanning multiple lines should use curly braces.","asReactData.html_dependency <- function(x) ReactData(","brace_linter" +"R/reactData.R",28,24,"style","Any function spanning multiple lines should use curly braces.","asReactData.JS_EVAL <- function(x) ReactData(","brace_linter" +"R/reactData.R",69,3,"style","Either both or neither branch in `if`/`else` should use curly braces."," if (is.null(data)) {","brace_linter" diff --git a/.dev/revdep_emails/shiny.react/email-body b/.dev/revdep_emails/shiny.react/email-body new file mode 100644 index 000000000..a49db97f8 --- /dev/null +++ b/.dev/revdep_emails/shiny.react/email-body @@ -0,0 +1,29 @@ +Hello Kamil Zyla! Thank you for using {lintr} in your package {shiny.react}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cran/shiny.react (hash: 3fa603b37258f097de4ebcda9a5baec53ae1bd2e) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 5s on CRAN vs. 5s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/shiny.semantic/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/shiny.semantic/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..7a8116241 --- /dev/null +++ b/.dev/revdep_emails/shiny.semantic/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,30 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/button.R",11,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/button.R",42,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/button.R",82,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/button.R",155,3,"warning","local variable β€˜big_mark_regex’ assigned but may not be used"," big_mark_regex <- if (big_mark == "" "") ""\\s"" else big_mark","object_usage_linter" +"R/checkbox.R",17,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/dsl.R",12,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/dsl.R",80,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/dsl.R",153,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/dsl.R",206,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/dsl.R",248,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/dsl.R",280,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/dsl.R",323,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/dsl.R",356,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/dsl.R",391,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/dsl.R",443,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/dsl.R",480,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/dsl.R",528,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/dsl.R",673,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/dsl.R",794,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/grid.R",79,7,"warning","local variable β€˜mustache_id’ assigned but may not be used"," mustache_id <- ""{{ grid_id }}""","object_usage_linter" +"R/grid.R",80,7,"warning","local variable β€˜mustache_css’ assigned but may not be used"," mustache_css <- paste0(""{{ "", name, ""_custom_css }}"")","object_usage_linter" +"R/grid.R",81,7,"warning","local variable β€˜mustache_area’ assigned but may not be used"," mustache_area <- paste(""{{"", name, ""}}"")","object_usage_linter" +"R/grid.R",224,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/layouts.R",45,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/layouts.R",86,3,"warning","local variable β€˜sidebar_width’ assigned but may not be used"," sidebar_width <- sidebar_panel$width","object_usage_linter" +"R/layouts.R",87,3,"warning","local variable β€˜main_width’ assigned but may not be used"," main_width <- main_panel$width","object_usage_linter" +"R/menu.R",65,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/tables.R",9,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" +"R/toast.R",163,14,"style","Variable and function name style should be snake_case."," toast_tags$closeIcon <- closeButton","object_name_linter" diff --git a/.dev/revdep_emails/shiny.semantic/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/shiny.semantic/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..178637a22 --- /dev/null +++ b/.dev/revdep_emails/shiny.semantic/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,24 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/grid.R",290,5,"style","Any function spanning multiple lines should use curly braces."," function(color) glue::glue(","brace_linter" +"R/grid.R",310,23,"style","Use TRUE instead of the symbol T."," launch.browser = T","T_and_F_symbol_linter" +"R/menu.R",14,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/menu.R",80,3,"style","Either both or neither branch in `if`/`else` should use curly braces."," else {","brace_linter" +"R/semanticPage.R",154,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"tests/testthat/test_layouts.R",104,53,"style","Use FALSE instead of the symbol F."," v1 <- vertical_layout(p(""a""), adjusted_to_page = F)","T_and_F_symbol_linter" +"vignettes/basics.Rmd",79,12,"style","Put spaces around all infix operators."," a(class=""ui green ribbon label"", ""Link""),","infix_spaces_linter" +"vignettes/basics.Rmd",90,14,"style","Put spaces around all infix operators."," a(class=""ui green ribbon label"", ""Link""),","infix_spaces_linter" +"vignettes/intro.Rmd",31,81,"style","Lines should not be more than 80 characters."," list(header = ""Item 1"", description = ""My text for item 1"", icon = ""cat""),","line_length_linter" +"vignettes/intro.Rmd",32,81,"style","Lines should not be more than 80 characters."," list(header = ""Item 2"", description = ""My text for item 2"", icon = ""tree""),","line_length_linter" +"vignettes/intro.Rmd",33,81,"style","Lines should not be more than 80 characters."," list(header = ""Item 3"", description = ""My text for item 3"", icon = ""dog"")","line_length_linter" +"vignettes/intro.Rmd",51,44,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","server <- function(input, output, session) {}","brace_linter" +"vignettes/intro.Rmd",51,45,"style","Closing curly-braces should always be on their own line, unless they are followed by an else.","server <- function(input, output, session) {}","brace_linter" +"vignettes/intro.Rmd",73,44,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","server <- function(input, output, session) {}","brace_linter" +"vignettes/intro.Rmd",73,45,"style","Closing curly-braces should always be on their own line, unless they are followed by an else.","server <- function(input, output, session) {}","brace_linter" +"vignettes/intro.Rmd",112,44,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","server <- function(input, output, session) {}","brace_linter" +"vignettes/intro.Rmd",112,45,"style","Closing curly-braces should always be on their own line, unless they are followed by an else.","server <- function(input, output, session) {}","brace_linter" +"vignettes/intro.Rmd",127,81,"style","Lines should not be more than 80 characters."," dropdown_input(""mtcars_dropdown"", c(""mpg"", ""cyl"", ""disp"", ""hp""), value = ""mpg""),","line_length_linter" +"vignettes/intro.Rmd",172,81,"style","Lines should not be more than 80 characters."," dropdown_input(""mtcars_dropdown"", c(""mpg"", ""cyl"", ""disp"", ""hp""), value = ""mpg"")","line_length_linter" +"vignettes/intro.Rmd",237,81,"style","Lines should not be more than 80 characters."," dropdown_input(""mtcars_dropdown"", c(""mpg"", ""cyl"", ""disp"", ""hp""), value = ""mpg"")","line_length_linter" +"vignettes/semantic_integration.Rmd",37,12,"style","Put spaces around all infix operators."," a(class=""ui green ribbon label"", ""Plotly demo""),","infix_spaces_linter" +"vignettes/semantic_integration.Rmd",45,13,"warning","no visible binding for global variable β€˜economics’"," plot_ly(economics, x = ~date, color = I(""black"")) %>%","object_usage_linter" +"vignettes/semantic_integration.Rmd",67,12,"style","Put spaces around all infix operators."," a(class=""ui blue ribbon label"", ""Leaflet demo""),","infix_spaces_linter" diff --git a/.dev/revdep_emails/shiny.semantic/email-body b/.dev/revdep_emails/shiny.semantic/email-body new file mode 100644 index 000000000..179ff47b0 --- /dev/null +++ b/.dev/revdep_emails/shiny.semantic/email-body @@ -0,0 +1,29 @@ +Hello Developers Appsilon! Thank you for using {lintr} in your package {shiny.semantic}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/Appsilon/shiny.semantic (hash: 64eef81ec206304de819c2b181388f8e5c3d92a0) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 66s on CRAN vs. 46s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/smerc/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/smerc/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..a55157e94 --- /dev/null +++ b/.dev/revdep_emails/smerc/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,93 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/arg_check_functions.R",6,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(is.matrix(coords) | is.data.frame(coords))) {","vector_logic_linter" +"R/arg_check_functions.R",195,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (min(pvalue) < 0 | max(pvalue) > 1) {","vector_logic_linter" +"R/arg_check_functions.R",204,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nrow(d) != N | ncol(d) != N) {","vector_logic_linter" +"R/arg_check_functions.R",280,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (min(angle_all) < 0 | max(angle_all) >= 360) {","vector_logic_linter" +"R/arg_check_functions.R",312,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.matrix(w) & !is.data.frame(w)) {","vector_logic_linter" +"R/arg_check_functions.R",315,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nrow(w) != N | ncol(w) != N) {","vector_logic_linter" +"R/arg_check_functions.R",530,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.matrix(w) & !is.data.frame(w)) {","vector_logic_linter" +"R/arg_check_functions.R",533,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nrow(w) != N | ncol(w) != N) {","vector_logic_linter" +"R/arg_check_functions.R",606,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(ein) | is.null(eout)) {","vector_logic_linter" +"R/arg_check_functions.R",630,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(popin) | is.null(popout) | is.null(tpop)) {","vector_logic_linter" +"R/arg_check_functions.R",630,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(popin) | is.null(popout) | is.null(tpop)) {","vector_logic_linter" +"R/arg_check_functions.R",669,16,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (ubd <= 0 | ubd > 1) {","vector_logic_linter" +"R/clusters-smerc_cluster.R",4,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (min(idx) < 1 | max(idx) > length(x$clusters)) {","vector_logic_linter" +"R/color.clusters.R",36,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (class(x) != ""scan"" & class(x) != ""smerc_cluster"") {","vector_logic_linter" +"R/color.clusters.R",39,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (min(idx) < 1 | max(idx) > length(x$clusters)) {","vector_logic_linter" +"R/combine.zones.R",18,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.list(z1) | !is.list(z2)) {","vector_logic_linter" +"R/dist.ellipse.R",61,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (angle < 00 | angle >= 360) {","vector_logic_linter" +"R/dmst.zones.R",102,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(progress) != 1 | !is.logical(progress)) {","vector_logic_linter" +"R/elliptic.nn.R",31,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(ubpop) != 1 | ubpop <= 0 | ubpop > 1) {","vector_logic_linter" +"R/elliptic.nn.R",31,39,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(ubpop) != 1 | ubpop <= 0 | ubpop > 1) {","vector_logic_linter" +"R/elliptic.sim.R",50,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(nsim) != 1 | !is.numeric(nsim) | nsim < 1) {","vector_logic_linter" +"R/elliptic.sim.R",50,45,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(nsim) != 1 | !is.numeric(nsim) | nsim < 1) {","vector_logic_linter" +"R/elliptic.test.R",57,22,"style","Variable and function name style should be snake_case or symbols."," min.cases = 2) {","object_name_linter" +"R/fast.zones.R",41,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(ubpop) != 1 | !is.numeric(ubpop)) {","vector_logic_linter" +"R/fast.zones.R",44,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (ubpop <= 0 | ubpop > 1) {","vector_logic_linter" +"R/fast.zones.R",47,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(simple) != 1 | !is.logical(simple)) {","vector_logic_linter" +"R/flex.sim.R",57,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(nsim) != 1 | !is.numeric(nsim) | nsim < 1) {","vector_logic_linter" +"R/flex.sim.R",57,45,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(nsim) != 1 | !is.numeric(nsim) | nsim < 1) {","vector_logic_linter" +"R/flex.sim.R",63,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(type) != 1 | !is.element(type, c(""poisson"", ""binomial""))) {","vector_logic_linter" +"R/flex.sim.R",67,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(ein) | is.null(eout)) {","vector_logic_linter" +"R/flex.sim.R",78,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(popin) | is.null(popout) | is.null(tpop)) {","vector_logic_linter" +"R/flex.sim.R",78,42,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(popin) | is.null(popout) | is.null(tpop)) {","vector_logic_linter" +"R/knn.R",33,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(longlat) != 1 | !is.logical(longlat)) {","vector_logic_linter" +"R/knn.R",37,13,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (k < 1 | k > n) {","vector_logic_linter" +"R/knn.R",41,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nrow(d) != n | ncol(d) != n) {","vector_logic_linter" +"R/morancr.stat.R",62,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.matrix(w) & !is.data.frame(w)) {","vector_logic_linter" +"R/morancr.stat.R",65,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nrow(w) != N | ncol(w) != N) {","vector_logic_linter" +"R/mst.seq.R",120,16,"warning","Conditional expressions require scalar logical operators (&& and ||)"," while (!stop & i < length(neighbors)) {","vector_logic_linter" +"R/mst.seq.R",133,16,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (i == 1 | nlinks == ""one"") {","vector_logic_linter" +"R/mst.seq.R",164,17,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (early & (stat_cand[max_idx] <= loglikrat[i])) {","vector_logic_linter" +"R/nndist.R",29,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(ubd) != 1 | !is.numeric(ubd) | ubd <= 0) {","vector_logic_linter" +"R/nndist.R",29,43,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(ubd) != 1 | !is.numeric(ubd) | ubd <= 0) {","vector_logic_linter" +"R/noz.R",40,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" +"R/optimal_ubpop.R",43,22,"style","Variable and function name style should be snake_case or symbols."," min.cases = 0,","object_name_linter" +"R/optimal_ubpop.R",195,36,"style","Variable and function name style should be snake_case or symbols."," min.cases) {","object_name_linter" +"R/rflex_zones.R",142,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(alpha1) != 1 | alpha1 <= 0) {","vector_logic_linter" +"R/rflex_zones.R",153,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(loop) != 1 | !is.logical(loop)) {","vector_logic_linter" +"R/rflex_zones.R",156,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(pfreq) != 1 | pfreq < 1) {","vector_logic_linter" +"R/rflex_zones.R",159,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(verbose) != 1 | !is.logical(verbose)) {","vector_logic_linter" +"R/rflex.midp.R",43,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.numeric(cases) | !is.numeric(ex)) {","vector_logic_linter" +"R/rflex.midp.R",46,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(type) != 1 |","vector_logic_linter" +"R/rflex.midp.R",50,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (type == ""binomial"" & is.null(pop)) {","vector_logic_linter" +"R/rflex.sim.R",32,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(nsim) != 1 | !is.numeric(nsim) | nsim < 1) {","vector_logic_linter" +"R/rflex.sim.R",32,45,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(nsim) != 1 | !is.numeric(nsim) | nsim < 1) {","vector_logic_linter" +"R/rflex.zones.R",149,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(alpha1) != 1 | alpha1 <= 0) {","vector_logic_linter" +"R/rflex.zones.R",160,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(loop) != 1 | !is.logical(loop)) {","vector_logic_linter" +"R/rflex.zones.R",163,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(pfreq) != 1 | pfreq < 1) {","vector_logic_linter" +"R/rflex.zones.R",166,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(verbose) != 1 | !is.logical(verbose)) {","vector_logic_linter" +"R/scan_stat.R",90,15,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (a > 0 & length(shape) == 1) {","vector_logic_linter" +"R/scan_stat.R",120,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(ein) & is.null(popin)) {","vector_logic_linter" +"R/scan_stat.R",133,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(type) != 1 | !is.element(type, c(""poisson"", ""binomial""))) {","vector_logic_linter" +"R/scan_stat.R",136,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(a) != 1 | a < 0 | a > 1) {","vector_logic_linter" +"R/scan_stat.R",136,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(a) != 1 | a < 0 | a > 1) {","vector_logic_linter" +"R/scan_stat.R",139,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(shape) != 1 & length(shape) != length(yin)) {","vector_logic_linter" +"R/scan_stat.R",142,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (type == ""binomial"" & is.null(tpop)) {","vector_logic_linter" +"R/scan.sim.R",121,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (simdist == ""binomial"" & is.null(pop)) {","vector_logic_linter" +"R/scan.stat.R",140,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(ein) & is.null(popin)) {","vector_logic_linter" +"R/scan.stat.R",153,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(type) != 1 | !is.element(type, c(""poisson"", ""binomial""))) {","vector_logic_linter" +"R/scan.stat.R",156,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(a) != 1 | a < 0 | a > 1) {","vector_logic_linter" +"R/scan.stat.R",156,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(a) != 1 | a < 0 | a > 1) {","vector_logic_linter" +"R/scan.stat.R",159,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(shape) != 1 & length(shape) != length(yin)) {","vector_logic_linter" +"R/scan.stat.R",162,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (type == ""binomial"" & is.null(tpop)) {","vector_logic_linter" +"R/scan.test.R",96,22,"style","Variable and function name style should be snake_case or symbols."," min.cases = 2,","object_name_linter" +"R/scan.test.R",215,28,"style","Variable and function name style should be snake_case or symbols."," simdist = NULL, min.cases = NULL) {","object_name_linter" +"R/seq_scan_sim.R",25,21,"style","Variable and function name style should be snake_case or symbols."," min.cases = 0,","object_name_linter" +"R/seq_scan_sim.R",132,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (simdist == ""binomial"" & is.null(pop)) {","vector_logic_linter" +"R/seq_scan_test.R",21,22,"style","Variable and function name style should be snake_case or symbols."," min.cases = 0,","object_name_linter" +"R/seq_scan_test.R",140,36,"style","Variable and function name style should be snake_case or symbols."," min.cases) {","object_name_linter" +"R/smerc_cluster-plot.R",53,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (min(idx) < 1 | max(idx) > length(x$clusters)) {","vector_logic_linter" +"R/smerc_cluster-print.R",19,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(extra) != 1 | !is.logical(extra)) {","vector_logic_linter" +"R/smerc_cluster-summary.R",37,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (min(idx) < 1 | max(idx) > length(object$clusters)) {","vector_logic_linter" +"R/tango.weights.R",83,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (type == ""rogerson"" & is.null(pop)) {","vector_logic_linter" +"vignettes/smerc_demo.Rmd",43,8,"style","Use <-, not =, for assignment.","coords = nydf[,c(""x"", ""y"")] # extract coordinates","assignment_linter" +"vignettes/smerc_demo.Rmd",43,16,"style","Commas should always have a space after.","coords = nydf[,c(""x"", ""y"")] # extract coordinates","commas_linter" +"vignettes/smerc_demo.Rmd",44,7,"style","Use <-, not =, for assignment.","cases = nydf$cases # extract cases","assignment_linter" +"vignettes/smerc_demo.Rmd",45,5,"style","Use <-, not =, for assignment.","pop = nydf$population # extract population","assignment_linter" +"vignettes/smerc_demo.Rmd",46,10,"style","Use <-, not =, for assignment.","scan_out = scan.test(coords, cases, pop, nsim = 99) # perform scan test","assignment_linter" +"vignettes/smerc_demo.Rmd",106,8,"style","Use <-, not =, for assignment.","bn_out = bn.test(coords = coords, cases = cases, pop = pop, cstar = 20,","assignment_linter" +"vignettes/smerc_demo.Rmd",117,10,"style","Use <-, not =, for assignment.","cepp_out = cepp.test(coords = coords, cases = cases, pop = pop,","assignment_linter" +"vignettes/smerc_demo.Rmd",129,3,"style","Use <-, not =, for assignment.","w = dweights(coords, kappa = 1) # construct weights matrix","assignment_linter" +"vignettes/smerc_demo.Rmd",130,11,"style","Use <-, not =, for assignment.","tango_out = tango.test(cases, pop, w, nsim = 49) # perform tango's test","assignment_linter" +"vignettes/smerc_demo.Rmd",143,8,"style","Use <-, not =, for assignment.","ezones = elliptic.zones(coords, pop, ubpop = 0.1)","assignment_linter" diff --git a/.dev/revdep_emails/smerc/email-body b/.dev/revdep_emails/smerc/email-body new file mode 100644 index 000000000..cef4bbad2 --- /dev/null +++ b/.dev/revdep_emails/smerc/email-body @@ -0,0 +1,29 @@ +Hello Joshua French! Thank you for using {lintr} in your package {smerc}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/jfrench/smerc (hash: 69a744182b10a265c34b6ecbcf133bfd981695de) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 112s on CRAN vs. 68s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/stencilaschema/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/stencilaschema/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..4fdc22035 --- /dev/null +++ b/.dev/revdep_emails/stencilaschema/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,3 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/typing.R",196,3,"style","`else` should come on the same line as the previous `}`."," else if (is_class(type, ""Array"")) {","brace_linter" +"R/typing.R",205,5,"style","`else` should come on the same line as the previous `}`."," else if (","brace_linter" diff --git a/.dev/revdep_emails/stencilaschema/attachments/stencilaschema.warnings b/.dev/revdep_emails/stencilaschema/attachments/stencilaschema.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/stencilaschema/attachments/stencilaschema.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/stencilaschema/email-body b/.dev/revdep_emails/stencilaschema/email-body new file mode 100644 index 000000000..c6a19f0b2 --- /dev/null +++ b/.dev/revdep_emails/stencilaschema/email-body @@ -0,0 +1,29 @@ +Hello Nokome Bentley! Thank you for using {lintr} in your package {stencilaschema}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/stencila/schema (hash: cf9fb90cca6af101a2f00799098cbe0687fbce79) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 3s on CRAN vs. 2s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/supernova/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/supernova/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..0faf4ad8c --- /dev/null +++ b/.dev/revdep_emails/supernova/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,4 @@ +"filename","line_number","column_number","type","message","line","linter" +"data-raw/class_data.R",18,3,"warning","local variable β€˜number_of_teachers’ assigned but may not be used"," number_of_teachers <- 3","object_usage_linter" +"R/equation.R",9,3,"warning","local variable β€˜format_term’ assigned but may not be used"," format_term <- function(value, name, digits) {","object_usage_linter" +"R/supernova.R",436,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," bar_col <- if (!is_lmer_model & is_verbose) ""description"" else ""term""","vector_logic_linter" diff --git a/.dev/revdep_emails/supernova/attachments/supernova.warnings b/.dev/revdep_emails/supernova/attachments/supernova.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/supernova/attachments/supernova.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/supernova/email-body b/.dev/revdep_emails/supernova/email-body new file mode 100644 index 000000000..eb4cfaabb --- /dev/null +++ b/.dev/revdep_emails/supernova/email-body @@ -0,0 +1,29 @@ +Hello Adam Blake! Thank you for using {lintr} in your package {supernova}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/UCLATALL/supernova (hash: 8b93f1d3b3eb5284df63abd357528d53353ec56c) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 31s on CRAN vs. 16s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/tsviz/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/tsviz/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..7c641185a --- /dev/null +++ b/.dev/revdep_emails/tsviz/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,2 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/tsviz.R",12,20,"style","There should be a space between right parenthesis and an opening curly brace.","#' if(interactive()){","paren_brace_linter" diff --git a/.dev/revdep_emails/tsviz/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/tsviz/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..a4bc7c8e8 --- /dev/null +++ b/.dev/revdep_emails/tsviz/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,2 @@ +"filename","line_number","column_number","type","message","line","linter" +"data-raw/rhub_check.R",3,3,"style","Commented code should be removed.","# validate_email()","commented_code_linter" diff --git a/.dev/revdep_emails/tsviz/attachments/tsviz.warnings b/.dev/revdep_emails/tsviz/attachments/tsviz.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/tsviz/attachments/tsviz.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/tsviz/email-body b/.dev/revdep_emails/tsviz/email-body new file mode 100644 index 000000000..7ce1801b9 --- /dev/null +++ b/.dev/revdep_emails/tsviz/email-body @@ -0,0 +1,29 @@ +Hello Emanuele Fabbiani! Thank you for using {lintr} in your package {tsviz}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/donlelef/tsviz (hash: 040deb3846da10a4a595c7e75ada8f9b0136b76a) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 4s on CRAN vs. 2s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/tuber/attachments/tuber.failure b/.dev/revdep_emails/tuber/attachments/tuber.failure new file mode 100644 index 000000000..08edf6748 --- /dev/null +++ b/.dev/revdep_emails/tuber/attachments/tuber.failure @@ -0,0 +1 @@ +`defaults` must be a named list. diff --git a/.dev/revdep_emails/tuber/attachments/tuber.warnings b/.dev/revdep_emails/tuber/attachments/tuber.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/tuber/attachments/tuber.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/tuber/email-body b/.dev/revdep_emails/tuber/email-body new file mode 100644 index 000000000..e2c788a5f --- /dev/null +++ b/.dev/revdep_emails/tuber/email-body @@ -0,0 +1,29 @@ +Hello Gaurav Sood! Thank you for using {lintr} in your package {tuber}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at http://github.com/soodoku/tuber (hash: 0cb96e9d1bbf3cd7faa25837eedada7e4453b499) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 3s on CRAN vs. 0s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/unifir/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/unifir/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..c3a23e34e --- /dev/null +++ b/.dev/revdep_emails/unifir/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,5 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/associate_coordinates.R",52,33,"style","Place a space before left parenthesis, except in a function call."," stopifnot(side_length %in% (2^(5:12) + 1))","spaces_left_parentheses_linter" +"R/associate_coordinates.R",68,10,"style","Variable and function name style should be snake_case."," coords$X <- (side_length *","object_name_linter" +"R/associate_coordinates.R",71,10,"style","Variable and function name style should be snake_case."," coords$Y <- bounds[[4]] - coords$Y","object_name_linter" +"tests/testthat/test-find_unity.R",68,5,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" diff --git a/.dev/revdep_emails/unifir/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/unifir/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..69b35ea5c --- /dev/null +++ b/.dev/revdep_emails/unifir/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,8 @@ +"filename","line_number","column_number","type","message","line","linter" +"vignettes/unifir-asset-guide.Rmd",108,63,"style","Trailing whitespace is superfluous."," prefab_path = file.path(""Assets"", ","trailing_whitespace_linter" +"vignettes/unifir-dev-guide.Rmd",127,41,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," build = function(script, prop, debug) {},","brace_linter" +"vignettes/unifir-user-guide.Rmd",232,45,"style","Trailing whitespace is superfluous."," terrainr::transform_elevation(raster_file, ","trailing_whitespace_linter" +"vignettes/unifir-user-guide.Rmd",247,59,"style","Trailing whitespace is superfluous."," # Where should the ""top-left"" corner of the terrain sit? ","trailing_whitespace_linter" +"vignettes/unifir-user-guide.Rmd",248,62,"style","Trailing whitespace is superfluous."," # Note that Unity uses a left-handed Y-up coordinate system ","trailing_whitespace_linter" +"vignettes/unifir-user-guide.Rmd",256,81,"style","Lines should not be more than 80 characters."," height = as.numeric(terra::global(r, max)), # Max height of the terrain (Y axis)","line_length_linter" +"vignettes/unifir-user-guide.Rmd",258,38,"style","Trailing whitespace is superfluous."," heightmap_resolution = terrain_size ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/unifir/email-body b/.dev/revdep_emails/unifir/email-body new file mode 100644 index 000000000..ddefbd72c --- /dev/null +++ b/.dev/revdep_emails/unifir/email-body @@ -0,0 +1,29 @@ +Hello Michael Mahoney! Thank you for using {lintr} in your package {unifir}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/ropensci/unifir (hash: 6c827a33c88d90c1c639fe4f4f8ce223be05aa00) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 25s on CRAN vs. 17s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/upsetjs/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/upsetjs/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..e486bd5b6 --- /dev/null +++ b/.dev/revdep_emails/upsetjs/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,189 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/data.R",179,3,"warning","local variable β€˜degrees’ assigned but may not be used"," degrees <- sapply(names(value), function(x) {","object_usage_linter" +"vignettes/colors.Rmd",28,26,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/colors.Rmd",28,31,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/colors.Rmd",28,36,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/colors.Rmd",28,41,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/colors.Rmd",28,46,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/colors.Rmd",28,51,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/colors.Rmd",28,56,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/colors.Rmd",28,61,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/colors.Rmd",28,66,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/colors.Rmd",28,79,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/colors.Rmd",28,84,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/colors.Rmd",28,89,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/colors.Rmd",28,94,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/colors.Rmd",28,99,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/colors.Rmd",28,112,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/colors.Rmd",28,117,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/colors.Rmd",28,122,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/colors.Rmd",28,127,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/colors.Rmd",28,132,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/colors.Rmd",28,137,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/colors.Rmd",28,142,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/colors.Rmd",28,147,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/colors.Rmd",28,152,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/colors.Rmd",29,21,"style","Only use double-quotes.","colors <- list(s1 = '#1f77b4', s2 = '#2ca02c', s3 = '#d62728', `s1&s2` = '#9467bd', `s1&s3` = '#8c564b', `s2&s3` = '#e377c2', `s1&s2&s3` = '#bcbd22')","single_quotes_linter" +"vignettes/colors.Rmd",29,37,"style","Only use double-quotes.","colors <- list(s1 = '#1f77b4', s2 = '#2ca02c', s3 = '#d62728', `s1&s2` = '#9467bd', `s1&s3` = '#8c564b', `s2&s3` = '#e377c2', `s1&s2&s3` = '#bcbd22')","single_quotes_linter" +"vignettes/colors.Rmd",29,53,"style","Only use double-quotes.","colors <- list(s1 = '#1f77b4', s2 = '#2ca02c', s3 = '#d62728', `s1&s2` = '#9467bd', `s1&s3` = '#8c564b', `s2&s3` = '#e377c2', `s1&s2&s3` = '#bcbd22')","single_quotes_linter" +"vignettes/colors.Rmd",29,74,"style","Only use double-quotes.","colors <- list(s1 = '#1f77b4', s2 = '#2ca02c', s3 = '#d62728', `s1&s2` = '#9467bd', `s1&s3` = '#8c564b', `s2&s3` = '#e377c2', `s1&s2&s3` = '#bcbd22')","single_quotes_linter" +"vignettes/colors.Rmd",29,95,"style","Only use double-quotes.","colors <- list(s1 = '#1f77b4', s2 = '#2ca02c', s3 = '#d62728', `s1&s2` = '#9467bd', `s1&s3` = '#8c564b', `s2&s3` = '#e377c2', `s1&s2&s3` = '#bcbd22')","single_quotes_linter" +"vignettes/colors.Rmd",29,116,"style","Only use double-quotes.","colors <- list(s1 = '#1f77b4', s2 = '#2ca02c', s3 = '#d62728', `s1&s2` = '#9467bd', `s1&s3` = '#8c564b', `s2&s3` = '#e377c2', `s1&s2&s3` = '#bcbd22')","single_quotes_linter" +"vignettes/colors.Rmd",29,140,"style","Only use double-quotes.","colors <- list(s1 = '#1f77b4', s2 = '#2ca02c', s3 = '#d62728', `s1&s2` = '#9467bd', `s1&s3` = '#8c564b', `s2&s3` = '#e377c2', `s1&s2&s3` = '#bcbd22')","single_quotes_linter" +"vignettes/colors.Rmd",32,41,"style","Put spaces around all infix operators."," upsetjs %>% fromList(listInput, colors=colors) %>% chartTheme(selection.color="""", has.selection.opacity=0.3) %>% interactiveChart()","infix_spaces_linter" +"vignettes/colors.Rmd",32,80,"style","Put spaces around all infix operators."," upsetjs %>% fromList(listInput, colors=colors) %>% chartTheme(selection.color="""", has.selection.opacity=0.3) %>% interactiveChart()","infix_spaces_linter" +"vignettes/colors.Rmd",32,106,"style","Put spaces around all infix operators."," upsetjs %>% fromList(listInput, colors=colors) %>% chartTheme(selection.color="""", has.selection.opacity=0.3) %>% interactiveChart()","infix_spaces_linter" +"vignettes/kmap.Rmd",28,27,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/kmap.Rmd",28,32,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/kmap.Rmd",28,37,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/kmap.Rmd",28,42,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/kmap.Rmd",28,47,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/kmap.Rmd",28,52,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/kmap.Rmd",28,57,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/kmap.Rmd",28,62,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/kmap.Rmd",28,67,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/kmap.Rmd",28,81,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/kmap.Rmd",28,86,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/kmap.Rmd",28,91,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/kmap.Rmd",28,96,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/kmap.Rmd",28,101,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/kmap.Rmd",28,117,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/kmap.Rmd",28,122,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/kmap.Rmd",28,127,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/kmap.Rmd",28,132,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/kmap.Rmd",28,137,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/kmap.Rmd",28,142,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/kmap.Rmd",28,147,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/kmap.Rmd",28,152,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/kmap.Rmd",28,157,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",38,27,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",38,32,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",38,37,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",38,42,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",38,47,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",38,52,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",38,57,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",38,62,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",38,67,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",38,81,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",38,86,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",38,91,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",38,96,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",38,101,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",38,117,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",38,122,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",38,127,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",38,132,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",38,137,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",38,142,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",38,147,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",38,152,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",38,157,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",62,37,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" +"vignettes/upsetjs.Rmd",62,42,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" +"vignettes/upsetjs.Rmd",62,47,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" +"vignettes/upsetjs.Rmd",62,52,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" +"vignettes/upsetjs.Rmd",62,57,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" +"vignettes/upsetjs.Rmd",62,62,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" +"vignettes/upsetjs.Rmd",62,67,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" +"vignettes/upsetjs.Rmd",62,72,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" +"vignettes/upsetjs.Rmd",62,77,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" +"vignettes/upsetjs.Rmd",62,91,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" +"vignettes/upsetjs.Rmd",62,96,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" +"vignettes/upsetjs.Rmd",62,101,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" +"vignettes/upsetjs.Rmd",62,106,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" +"vignettes/upsetjs.Rmd",62,111,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" +"vignettes/upsetjs.Rmd",62,127,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" +"vignettes/upsetjs.Rmd",62,132,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" +"vignettes/upsetjs.Rmd",62,137,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" +"vignettes/upsetjs.Rmd",62,142,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" +"vignettes/upsetjs.Rmd",62,147,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" +"vignettes/upsetjs.Rmd",62,152,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" +"vignettes/upsetjs.Rmd",62,157,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" +"vignettes/upsetjs.Rmd",62,162,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" +"vignettes/upsetjs.Rmd",62,167,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" +"vignettes/upsetjs.Rmd",89,6,"style","Put spaces around all infix operators."," one=c(1, 1, 1, 0, 1, 0, 1, 1, 0, 0, 1, 1, 1),","infix_spaces_linter" +"vignettes/upsetjs.Rmd",90,6,"style","Put spaces around all infix operators."," two=c(1, 1, 0, 1, 1, 0, 0, 0, 0, 1, 0, 0, 0),","infix_spaces_linter" +"vignettes/upsetjs.Rmd",91,8,"style","Put spaces around all infix operators."," three=c(1, 0, 0, 0, 1, 1, 1, 1, 1, 1, 0, 1, 1)),","infix_spaces_linter" +"vignettes/upsetjs.Rmd",92,12,"style","Put spaces around all infix operators."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","infix_spaces_linter" +"vignettes/upsetjs.Rmd",92,15,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",92,20,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",92,25,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",92,30,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",92,35,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",92,40,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",92,45,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",92,50,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",92,55,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",92,60,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",92,65,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",92,70,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",92,75,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",113,35,"style","`%>%` should always have a space before it and a new line after it, unless the full pipeline fits on one line.","upsetjs() %>% fromList(listInput) %>%","pipe_continuation_linter" +"vignettes/upsetjs.Rmd",119,35,"style","`%>%` should always have a space before it and a new line after it, unless the full pipeline fits on one line.","upsetjs() %>% fromList(listInput) %>%","pipe_continuation_linter" +"vignettes/upsetjs.Rmd",120,28,"style","Put spaces around all infix operators."," generateIntersections(min=2, max=NULL, empty=T, order.by='cardinality', limit=NULL)","infix_spaces_linter" +"vignettes/upsetjs.Rmd",120,35,"style","Put spaces around all infix operators."," generateIntersections(min=2, max=NULL, empty=T, order.by='cardinality', limit=NULL)","infix_spaces_linter" +"vignettes/upsetjs.Rmd",120,47,"style","Put spaces around all infix operators."," generateIntersections(min=2, max=NULL, empty=T, order.by='cardinality', limit=NULL)","infix_spaces_linter" +"vignettes/upsetjs.Rmd",120,49,"style","Use TRUE instead of the symbol T."," generateIntersections(min=2, max=NULL, empty=T, order.by='cardinality', limit=NULL)","T_and_F_symbol_linter" +"vignettes/upsetjs.Rmd",120,59,"style","Put spaces around all infix operators."," generateIntersections(min=2, max=NULL, empty=T, order.by='cardinality', limit=NULL)","infix_spaces_linter" +"vignettes/upsetjs.Rmd",120,60,"style","Only use double-quotes."," generateIntersections(min=2, max=NULL, empty=T, order.by='cardinality', limit=NULL)","single_quotes_linter" +"vignettes/upsetjs.Rmd",120,80,"style","Put spaces around all infix operators."," generateIntersections(min=2, max=NULL, empty=T, order.by='cardinality', limit=NULL)","infix_spaces_linter" +"vignettes/upsetjs.Rmd",125,35,"style","`%>%` should always have a space before it and a new line after it, unless the full pipeline fits on one line.","upsetjs() %>% fromList(listInput) %>%","pipe_continuation_linter" +"vignettes/upsetjs.Rmd",126,21,"style","Put spaces around all infix operators."," generateUnions(min=0, max=2, empty=T, order.by='degree', limit=NULL)","infix_spaces_linter" +"vignettes/upsetjs.Rmd",126,28,"style","Put spaces around all infix operators."," generateUnions(min=0, max=2, empty=T, order.by='degree', limit=NULL)","infix_spaces_linter" +"vignettes/upsetjs.Rmd",126,37,"style","Put spaces around all infix operators."," generateUnions(min=0, max=2, empty=T, order.by='degree', limit=NULL)","infix_spaces_linter" +"vignettes/upsetjs.Rmd",126,39,"style","Use TRUE instead of the symbol T."," generateUnions(min=0, max=2, empty=T, order.by='degree', limit=NULL)","T_and_F_symbol_linter" +"vignettes/upsetjs.Rmd",126,49,"style","Put spaces around all infix operators."," generateUnions(min=0, max=2, empty=T, order.by='degree', limit=NULL)","infix_spaces_linter" +"vignettes/upsetjs.Rmd",126,50,"style","Only use double-quotes."," generateUnions(min=0, max=2, empty=T, order.by='degree', limit=NULL)","single_quotes_linter" +"vignettes/upsetjs.Rmd",126,65,"style","Put spaces around all infix operators."," generateUnions(min=0, max=2, empty=T, order.by='degree', limit=NULL)","infix_spaces_linter" +"vignettes/upsetjs.Rmd",176,23,"style","Put spaces around all infix operators."," addQuery(""Q1"", color=""red"", elems=c('a', 'b', 'c')) %>%","infix_spaces_linter" +"vignettes/upsetjs.Rmd",176,36,"style","Put spaces around all infix operators."," addQuery(""Q1"", color=""red"", elems=c('a', 'b', 'c')) %>%","infix_spaces_linter" +"vignettes/upsetjs.Rmd",176,39,"style","Only use double-quotes."," addQuery(""Q1"", color=""red"", elems=c('a', 'b', 'c')) %>%","single_quotes_linter" +"vignettes/upsetjs.Rmd",176,44,"style","Only use double-quotes."," addQuery(""Q1"", color=""red"", elems=c('a', 'b', 'c')) %>%","single_quotes_linter" +"vignettes/upsetjs.Rmd",176,49,"style","Only use double-quotes."," addQuery(""Q1"", color=""red"", elems=c('a', 'b', 'c')) %>%","single_quotes_linter" +"vignettes/upsetjs.Rmd",177,23,"style","Put spaces around all infix operators."," addQuery(""Q2"", color=""blue"", set='two')","infix_spaces_linter" +"vignettes/upsetjs.Rmd",177,35,"style","Put spaces around all infix operators."," addQuery(""Q2"", color=""blue"", set='two')","infix_spaces_linter" +"vignettes/upsetjs.Rmd",177,36,"style","Only use double-quotes."," addQuery(""Q2"", color=""blue"", set='two')","single_quotes_linter" +"vignettes/upsetjs.Rmd",189,6,"style","Put spaces around all infix operators."," one=c(1, 1, 1, 0, 1, 0, 1, 1, 0, 0, 1, 1, 1),","infix_spaces_linter" +"vignettes/upsetjs.Rmd",190,6,"style","Put spaces around all infix operators."," two=c(1, 1, 0, 1, 1, 0, 0, 0, 0, 1, 0, 0, 0),","infix_spaces_linter" +"vignettes/upsetjs.Rmd",191,8,"style","Put spaces around all infix operators."," three=c(1, 0, 0, 0, 1, 1, 1, 1, 1, 1, 0, 1, 1)),","infix_spaces_linter" +"vignettes/upsetjs.Rmd",192,12,"style","Put spaces around all infix operators."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","infix_spaces_linter" +"vignettes/upsetjs.Rmd",192,15,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",192,20,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",192,25,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",192,30,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",192,35,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",192,40,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",192,45,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",192,50,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",192,55,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",192,60,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",192,65,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",192,70,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",192,75,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" +"vignettes/upsetjs.Rmd",195,50,"style","Put spaces around all infix operators."," fromDataFrame(dataFrame, attributes = list(attr=runif(nrow(dataFrame))))","infix_spaces_linter" +"vignettes/upsetjs.Rmd",208,14,"style","Only use double-quotes."," chartTheme('dark')","single_quotes_linter" +"vignettes/upsetjs.Rmd",234,33,"style","Only use double-quotes."," chartLayout(numerical.scale = 'log')","single_quotes_linter" +"vignettes/venn.Rmd",28,27,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/venn.Rmd",28,32,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/venn.Rmd",28,37,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/venn.Rmd",28,42,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/venn.Rmd",28,47,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/venn.Rmd",28,52,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/venn.Rmd",28,57,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/venn.Rmd",28,62,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/venn.Rmd",28,67,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/venn.Rmd",28,81,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/venn.Rmd",28,86,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/venn.Rmd",28,91,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/venn.Rmd",28,96,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/venn.Rmd",28,101,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/venn.Rmd",28,117,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/venn.Rmd",28,122,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/venn.Rmd",28,127,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/venn.Rmd",28,132,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/venn.Rmd",28,137,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/venn.Rmd",28,142,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/venn.Rmd",28,147,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/venn.Rmd",28,152,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" +"vignettes/venn.Rmd",28,157,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" diff --git a/.dev/revdep_emails/upsetjs/attachments/upsetjs.warnings b/.dev/revdep_emails/upsetjs/attachments/upsetjs.warnings new file mode 100644 index 000000000..959c4ba83 --- /dev/null +++ b/.dev/revdep_emails/upsetjs/attachments/upsetjs.warnings @@ -0,0 +1 @@ +Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/upsetjs/email-body b/.dev/revdep_emails/upsetjs/email-body new file mode 100644 index 000000000..6fae125c5 --- /dev/null +++ b/.dev/revdep_emails/upsetjs/email-body @@ -0,0 +1,29 @@ +Hello Samuel Gratzl! Thank you for using {lintr} in your package {upsetjs}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/upsetjs/upsetjs_r (hash: 4b375a8e0ba7e28cee3c8b68df3562c2d435bca3) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 13s on CRAN vs. 6s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/urlshorteneR/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/urlshorteneR/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..ac084e486 --- /dev/null +++ b/.dev/revdep_emails/urlshorteneR/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,2 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/zzz.R",1,1,"style","Variable and function name style should be snake_case.",".onAttach <- function(libname, pkgname) {","object_name_linter" diff --git a/.dev/revdep_emails/urlshorteneR/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/urlshorteneR/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..59b081a93 --- /dev/null +++ b/.dev/revdep_emails/urlshorteneR/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,23 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/ApiKey.R",90,3,"style","Variable and function name style should be snake_case or symbols."," .urlshorteneREnv$access_token <- token$credentials$access_token","object_name_linter" +"R/ApiKey.R",91,3,"style","Variable and function name style should be snake_case or symbols."," .urlshorteneREnv$token <- token","object_name_linter" +"R/ApiKey.R",108,5,"style","Variable and function name style should be snake_case or symbols."," .urlshorteneREnv$token <- bitly_auth()","object_name_linter" +"R/ApiKey.R",112,5,"style","Variable and function name style should be snake_case or symbols."," .urlshorteneREnv$token <- readRDS(""../bitly_local_token.rds"")","object_name_linter" +"R/ApiKey.R",114,3,"style","Variable and function name style should be snake_case or symbols."," .urlshorteneREnv$acc_token <- .urlshorteneREnv$token$credentials$access_token","object_name_linter" +"R/bitly_links.R",80,67,"style","Use TRUE instead of the symbol T."," body_req_query_cleaned <- toJSON(body_req_query, auto_unbox = T)","T_and_F_symbol_linter" +"R/bitly_links.R",325,61,"style","Use TRUE instead of the symbol T."," body_req_query_cleaned <- toJSON(body_upd, auto_unbox = T)","T_and_F_symbol_linter" +"R/bitly_links.R",366,80,"style","Use FALSE instead of the symbol F."," df_bitlink <- data.frame(t(do.call(rbind, df_bitlink)), stringsAsFactors = F)","T_and_F_symbol_linter" +"tests/testthat/test-Links.R",13,78,"style","Use TRUE instead of the symbol T."," tags = list(""msft"", ""apple""), showRequestURL = T)","T_and_F_symbol_linter" +"vignettes/Tutorial.R",5,3,"style","Place a space before left parenthesis, except in a function call.","if(interactive()) {","spaces_left_parentheses_linter" +"vignettes/Tutorial.R",10,3,"style","Commented code should be removed.","# bitly_token <- bitly_auth(key = ""xxx"", secret = ""xxx"")","commented_code_linter" +"vignettes/Tutorial.R",11,3,"style","Commented code should be removed.","# bitly_token <- bitly_auth()","commented_code_linter" +"vignettes/Tutorial.R",46,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/Tutorial.R",47,7,"style","Use <-, not =, for assignment."," fin = NULL","assignment_linter" +"vignettes/Tutorial.R",48,13,"warning","1:length(...) is likely to be wrong in the empty edge case. Use seq_along() instead."," for (p in 1:length(df$link)) {","seq_linter" +"vignettes/Tutorial.R",58,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" +"vignettes/Tutorial.Rmd",29,3,"style","Place a space before left parenthesis, except in a function call.","if(interactive()) {","spaces_left_parentheses_linter" +"vignettes/Tutorial.Rmd",34,3,"style","Commented code should be removed.","# bitly_token <- bitly_auth(key = ""xxx"", secret = ""xxx"")","commented_code_linter" +"vignettes/Tutorial.Rmd",35,3,"style","Commented code should be removed.","# bitly_token <- bitly_auth()","commented_code_linter" +"vignettes/Tutorial.Rmd",93,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" +"vignettes/Tutorial.Rmd",94,7,"style","Use <-, not =, for assignment."," fin = NULL","assignment_linter" +"vignettes/Tutorial.Rmd",95,13,"warning","1:length(...) is likely to be wrong in the empty edge case. Use seq_along() instead."," for (p in 1:length(df$link)) {","seq_linter" diff --git a/.dev/revdep_emails/urlshorteneR/email-body b/.dev/revdep_emails/urlshorteneR/email-body new file mode 100644 index 000000000..98fa829c9 --- /dev/null +++ b/.dev/revdep_emails/urlshorteneR/email-body @@ -0,0 +1,29 @@ +Hello John Malc! Thank you for using {lintr} in your package {urlshorteneR}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/dmpe/urlshorteneR (hash: 635c75c0129528eb27a65c9e952d5a3ba5fe3744) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 28s on CRAN vs. 17s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/virustotal/email-body b/.dev/revdep_emails/virustotal/email-body new file mode 100644 index 000000000..e79633489 --- /dev/null +++ b/.dev/revdep_emails/virustotal/email-body @@ -0,0 +1,29 @@ +Hello Gaurav Sood! Thank you for using {lintr} in your package {virustotal}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/themains/virustotal (hash: 408832811b28ad6b27575042476ae82c4fb388ea) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 0s on CRAN vs. 0s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/wavefunction/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/wavefunction/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..ce06f167c --- /dev/null +++ b/.dev/revdep_emails/wavefunction/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,4 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/wavefunction.R",23,3,"style","Variable and function name style should be snake_case or symbols."," H[, 1] <- 1.0","object_name_linter" +"R/wavefunction.R",27,3,"style","Variable and function name style should be snake_case or symbols."," H[, 2] <- 2.0 * x","object_name_linter" +"R/wavefunction.R",32,5,"style","Variable and function name style should be snake_case or symbols."," H[, d + 1] <- 2 * x * H[, d] - 2 * (d - 1) * H[, d - 1]","object_name_linter" diff --git a/.dev/revdep_emails/wavefunction/email-body b/.dev/revdep_emails/wavefunction/email-body new file mode 100644 index 000000000..93787dc17 --- /dev/null +++ b/.dev/revdep_emails/wavefunction/email-body @@ -0,0 +1,29 @@ +Hello Madeleine B. Thompson! Thank you for using {lintr} in your package {wavefunction}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/cran/wavefunction (hash: b11132bdf71195fc312424cb38739a5ce0961958) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 2s on CRAN vs. 2s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + diff --git a/.dev/revdep_emails/xgboost/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/xgboost/attachments/lints_in_cran_not_devel.csv new file mode 100644 index 000000000..f4e629123 --- /dev/null +++ b/.dev/revdep_emails/xgboost/attachments/lints_in_cran_not_devel.csv @@ -0,0 +1,29 @@ +"filename","line_number","column_number","type","message","line","linter" +"R/callbacks.R",753,1,"style","Variable and function name style should be snake_case.","format.eval.string <- function(iter, eval_res, eval_err = NULL) {","object_name_linter" +"R/xgb.Booster.R",471,1,"style","Variable and function name style should be snake_case.","predict.xgb.Booster.handle <- function(object, ...) {","object_name_linter" +"R/xgb.cv.R",278,1,"style","Variable and function name style should be snake_case.","print.xgb.cv.synchronous <- function(x, verbose = FALSE, ...) {","object_name_linter" +"R/xgb.DMatrix.R",117,1,"style","Variable and function name style should be snake_case.","dim.xgb.DMatrix <- function(x) {","object_name_linter" +"R/xgb.DMatrix.R",146,1,"style","Variable and function name style should be snake_case.","dimnames.xgb.DMatrix <- function(x) {","object_name_linter" +"R/xgb.DMatrix.R",152,1,"style","Variable and function name style should be snake_case.","`dimnames<-.xgb.DMatrix` <- function(x, value) {","object_name_linter" +"R/xgb.DMatrix.R",204,1,"style","Variable and function name style should be snake_case.","getinfo.xgb.DMatrix <- function(object, name, ...) {","object_name_linter" +"R/xgb.DMatrix.R",329,1,"style","Variable and function name style should be snake_case.","slice.xgb.DMatrix <- function(object, idxset, ...) {","object_name_linter" +"R/xgb.DMatrix.R",355,1,"style","Variable and function name style should be snake_case.","`[.xgb.DMatrix` <- function(object, idxset, colset = NULL) {","object_name_linter" +"R/xgb.DMatrix.R",378,1,"style","Variable and function name style should be snake_case.","print.xgb.DMatrix <- function(x, verbose = FALSE, ...) {","object_name_linter" +"R/xgb.ggplot.R",21,23,"style","Variable and function name style should be snake_case."," importance_matrix[, Cluster := as.character(clusters$cluster)]","object_name_linter" +"R/xgb.model.dt.tree.R",101,16,"style","Variable and function name style should be snake_case."," td[position, Tree := 1L]","object_name_linter" +"R/xgb.model.dt.tree.R",102,8,"style","Variable and function name style should be snake_case."," td[, Tree := cumsum(ifelse(is.na(Tree), 0L, Tree)) - 1L]","object_name_linter" +"R/xgb.model.dt.tree.R",111,8,"style","Variable and function name style should be snake_case."," td[, Node := as.integer(sub(""^([0-9]+):.*"", ""\\1"", t))]","object_name_linter" +"R/xgb.model.dt.tree.R",112,25,"style","Variable and function name style should be snake_case."," if (!use_int_id) td[, ID := add.tree.id(Node, Tree)]","object_name_linter" +"R/xgb.model.dt.tree.R",113,8,"style","Variable and function name style should be snake_case."," td[, isLeaf := grepl(""leaf"", t, fixed = TRUE)]","object_name_linter" +"R/xgb.model.dt.tree.R",143,25,"style","Variable and function name style should be snake_case."," td[isLeaf == FALSE, Feature := feature_names[as.numeric(Feature) + 1]]","object_name_linter" +"R/xgb.model.dt.tree.R",171,8,"style","Variable and function name style should be snake_case."," td[, isLeaf := NULL]","object_name_linter" +"R/xgb.plot.deepness.R",130,25,"style","Variable and function name style should be snake_case."," dt_edges[is.na(Leaf), Leaf := FALSE]","object_name_linter" +"R/xgb.plot.importance.R",95,25,"style","Variable and function name style should be snake_case."," importance_matrix[, Importance := Importance / max(abs(Importance))]","object_name_linter" +"R/xgb.plot.multi.trees.R",71,35,"style","Variable and function name style should be snake_case."," tree.matrix[ID %in% root.nodes, abs.node.position := root.nodes]","object_name_linter" +"R/xgb.plot.multi.trees.R",86,28,"style","Variable and function name style should be snake_case."," tree.matrix[!is.na(Yes), Yes := paste0(abs.node.position, ""_0"")]","object_name_linter" +"R/xgb.plot.multi.trees.R",87,27,"style","Variable and function name style should be snake_case."," tree.matrix[!is.na(No), No := paste0(abs.node.position, ""_1"")]","object_name_linter" +"R/xgb.plot.multi.trees.R",116,14,"style","Variable and function name style should be snake_case."," edges.dt[, N := NULL]","object_name_linter" +"tests/testthat/test_callbacks.R",262,11,"style","Variable and function name style should be snake_case."," titanic$Pclass <- as.factor(titanic$Pclass)","object_name_linter" +"tests/testthat/test_helpers.R",17,6,"style","Variable and function name style should be snake_case.","df[, AgeDiscret := as.factor(round(Age / 10, 0))]","object_name_linter" +"tests/testthat/test_helpers.R",18,6,"style","Variable and function name style should be snake_case.","df[, AgeCat := as.factor(ifelse(Age > 30, ""Old"", ""Young""))]","object_name_linter" +"tests/testthat/test_helpers.R",19,6,"style","Variable and function name style should be snake_case.","df[, ID := NULL]","object_name_linter" diff --git a/.dev/revdep_emails/xgboost/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/xgboost/attachments/lints_in_devel_not_cran.csv new file mode 100644 index 000000000..d660a746d --- /dev/null +++ b/.dev/revdep_emails/xgboost/attachments/lints_in_devel_not_cran.csv @@ -0,0 +1,367 @@ +"filename","line_number","column_number","type","message","line","linter" +"demo/basic_walkthrough.R",6,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" +"demo/basic_walkthrough.R",7,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" +"demo/basic_walkthrough.R",10,81,"style","Lines should not be more than 80 characters.","# the loaded data is stored in sparseMatrix, and label is a numeric vector in {0,1}","line_length_linter" +"demo/basic_walkthrough.R",16,81,"style","Lines should not be more than 80 characters.","# note: we are putting in sparse matrix here, xgboost naturally handles sparse input","line_length_linter" +"demo/basic_walkthrough.R",17,81,"style","Lines should not be more than 80 characters.","# use sparse matrix when your feature is sparse(e.g. when you are using one-hot encoding vector)","line_length_linter" +"demo/basic_walkthrough.R",19,81,"style","Lines should not be more than 80 characters.","bst <- xgboost(data = train$data, label = train$label, max_depth = 2, eta = 1, nrounds = 2,","line_length_linter" +"demo/basic_walkthrough.R",23,81,"style","Lines should not be more than 80 characters.","bst <- xgboost(data = as.matrix(train$data), label = train$label, max_depth = 2, eta = 1, nrounds = 2,","line_length_linter" +"demo/basic_walkthrough.R",26,81,"style","Lines should not be more than 80 characters.","# you can also put in xgb.DMatrix object, which stores label, data and other meta datas needed for advanced features","line_length_linter" +"demo/basic_walkthrough.R",44,81,"style","Lines should not be more than 80 characters.","# since we do not have this file with us, the following line is just for illustration","line_length_linter" +"demo/basic_walkthrough.R",45,3,"style","Commented code should be removed.","# bst <- xgboost(data = 'agaricus.train.svm', max_depth = 2, eta = 1, nrounds = 2,objective = ""binary:logistic"")","commented_code_linter" +"demo/basic_walkthrough.R",45,81,"style","Lines should not be more than 80 characters.","# bst <- xgboost(data = 'agaricus.train.svm', max_depth = 2, eta = 1, nrounds = 2,objective = ""binary:logistic"")","line_length_linter" +"demo/basic_walkthrough.R",81,81,"style","Lines should not be more than 80 characters.","bst <- xgb.train(data = dtrain, max_depth = 2, eta = 1, nrounds = 2, watchlist = watchlist,","line_length_linter" +"demo/basic_walkthrough.R",85,81,"style","Lines should not be more than 80 characters.","bst <- xgb.train(data = dtrain, max_depth = 2, eta = 1, nrounds = 2, watchlist = watchlist,","line_length_linter" +"demo/basic_walkthrough.R",93,81,"style","Lines should not be more than 80 characters.","bst <- xgb.train(data = dtrain2, max_depth = 2, eta = 1, nrounds = 2, watchlist = watchlist,","line_length_linter" +"demo/basic_walkthrough.R",102,35,"style","Only use double-quotes.","dump_path <- file.path(tempdir(), 'dump.raw.txt')","single_quotes_linter" +"demo/boost_from_prediction.R",3,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" +"demo/boost_from_prediction.R",4,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" +"demo/boost_from_prediction.R",12,7,"style","Only use double-quotes.","print('start running example to start from a initial prediction')","single_quotes_linter" +"demo/boost_from_prediction.R",14,64,"style","Only use double-quotes.","param <- list(max_depth = 2, eta = 1, nthread = 2, objective = 'binary:logistic')","single_quotes_linter" +"demo/boost_from_prediction.R",14,81,"style","Lines should not be more than 80 characters.","param <- list(max_depth = 2, eta = 1, nthread = 2, objective = 'binary:logistic')","line_length_linter" +"demo/boost_from_prediction.R",16,81,"style","Lines should not be more than 80 characters.","# Note: we need the margin value instead of transformed prediction in set_base_margin","line_length_linter" +"demo/boost_from_prediction.R",17,81,"style","Lines should not be more than 80 characters.","# do predict with output_margin=TRUE, will always give you margin values before logistic transformation","line_length_linter" +"demo/boost_from_prediction.R",25,7,"style","Only use double-quotes.","print('this is result of boost from initial prediction')","single_quotes_linter" +"demo/boost_from_prediction.R",26,81,"style","Lines should not be more than 80 characters.","bst <- xgb.train(params = param, data = dtrain, nrounds = 1, watchlist = watchlist)","line_length_linter" +"demo/caret_wrapper.R",11,81,"style","Lines should not be more than 80 characters.","# Create a copy of the dataset with data.table package (data.table is 100% compliant with R dataframe but its syntax is a lot more consistent and its performance are really good).","line_length_linter" +"demo/caret_wrapper.R",14,81,"style","Lines should not be more than 80 characters.","# Let's add some new categorical features to see if it helps. Of course these feature are highly correlated to the Age feature. Usually it's not a good thing in ML, but Tree algorithms (including boosted trees) are able to select the best features, even in case of highly correlated features.","line_length_linter" +"demo/caret_wrapper.R",15,81,"style","Lines should not be more than 80 characters.","# For the first feature we create groups of age by rounding the real age. Note that we transform it to factor (categorical data) so the algorithm treat them as independant values.","line_length_linter" +"demo/caret_wrapper.R",18,81,"style","Lines should not be more than 80 characters.","# Here is an even stronger simplification of the real age with an arbitrary split at 30 years old. I choose this value based on nothing. We will see later if simplifying the information based on arbitrary values is a good strategy (I am sure you already have an idea of how well it will work!).","line_length_linter" +"demo/caret_wrapper.R",21,81,"style","Lines should not be more than 80 characters.","# We remove ID as there is nothing to learn from this feature (it will just add some noise as the dataset is small).","line_length_linter" +"demo/caret_wrapper.R",26,81,"style","Lines should not be more than 80 characters.","# Here we use 10-fold cross-validation, repeating twice, and using random search for tuning hyper-parameters.","line_length_linter" +"demo/caret_wrapper.R",27,1,"style","Variable and function name style should be snake_case or symbols.","fitControl <- trainControl(method = ""repeatedcv"", number = 10, repeats = 2, search = ""random"")","object_name_linter" +"demo/caret_wrapper.R",27,81,"style","Lines should not be more than 80 characters.","fitControl <- trainControl(method = ""repeatedcv"", number = 10, repeats = 2, search = ""random"")","line_length_linter" +"demo/caret_wrapper.R",29,32,"style","Put spaces around all infix operators.","model <- train(factor(Improved)~., data = df, method = ""xgbTree"", trControl = fitControl)","infix_spaces_linter" +"demo/caret_wrapper.R",29,81,"style","Lines should not be more than 80 characters.","model <- train(factor(Improved)~., data = df, method = ""xgbTree"", trControl = fitControl)","line_length_linter" +"demo/caret_wrapper.R",31,81,"style","Lines should not be more than 80 characters.","# Instead of tree for our boosters, you can also fit a linear regression or logistic regression model using xgbLinear","line_length_linter" +"demo/caret_wrapper.R",32,3,"style","Commented code should be removed.","# model <- train(factor(Improved)~., data = df, method = ""xgbLinear"", trControl = fitControl)","commented_code_linter" +"demo/caret_wrapper.R",32,81,"style","Lines should not be more than 80 characters.","# model <- train(factor(Improved)~., data = df, method = ""xgbLinear"", trControl = fitControl)","line_length_linter" +"demo/create_sparse_matrix.R",5,20,"style","Only use double-quotes."," install.packages('vcd') #Available in CRAN. Used for its dataset with categorical values.","single_quotes_linter" +"demo/create_sparse_matrix.R",5,81,"style","Lines should not be more than 80 characters."," install.packages('vcd') #Available in CRAN. Used for its dataset with categorical values.","line_length_linter" +"demo/create_sparse_matrix.R",10,81,"style","Lines should not be more than 80 characters.","# A categorical variable is one which have a fixed number of values. By example, if for each observation a variable called ""Colour"" can have only ""red"", ""blue"" or ""green"" as value, it is a categorical variable.","line_length_linter" +"demo/create_sparse_matrix.R",15,81,"style","Lines should not be more than 80 characters.","# In this demo we will see how to transform a dense dataframe with categorical variables to a sparse matrix before analyzing it in XGBoost.","line_length_linter" +"demo/create_sparse_matrix.R",21,81,"style","Lines should not be more than 80 characters.","# create a copy of the dataset with data.table package (data.table is 100% compliant with R dataframe but its syntax is a lot more consistent and its performance are really good).","line_length_linter" +"demo/create_sparse_matrix.R",28,81,"style","Lines should not be more than 80 characters.","# 2 columns have factor type, one has ordinal type (ordinal variable is a categorical variable with values which can be ordered, here: None > Some > Marked).","line_length_linter" +"demo/create_sparse_matrix.R",32,81,"style","Lines should not be more than 80 characters.","# Let's add some new categorical features to see if it helps. Of course these feature are highly correlated to the Age feature. Usually it's not a good thing in ML, but Tree algorithms (including boosted trees) are able to select the best features, even in case of highly correlated features.","line_length_linter" +"demo/create_sparse_matrix.R",34,81,"style","Lines should not be more than 80 characters.","# For the first feature we create groups of age by rounding the real age. Note that we transform it to factor (categorical data) so the algorithm treat them as independent values.","line_length_linter" +"demo/create_sparse_matrix.R",37,81,"style","Lines should not be more than 80 characters.","# Here is an even stronger simplification of the real age with an arbitrary split at 30 years old. I choose this value based on nothing. We will see later if simplifying the information based on arbitrary values is a good strategy (I am sure you already have an idea of how well it will work!).","line_length_linter" +"demo/create_sparse_matrix.R",40,81,"style","Lines should not be more than 80 characters.","# We remove ID as there is nothing to learn from this feature (it will just add some noise as the dataset is small).","line_length_linter" +"demo/create_sparse_matrix.R",49,81,"style","Lines should not be more than 80 characters.","# The purpose is to transform each value of each categorical feature in one binary feature.","line_length_linter" +"demo/create_sparse_matrix.R",51,81,"style","Lines should not be more than 80 characters.","# Let's take, the column Treatment will be replaced by two columns, Placebo, and Treated. Each of them will be binary. For example an observation which had the value Placebo in column Treatment before the transformation will have, after the transformation, the value 1 in the new column Placebo and the value 0 in the new column Treated.","line_length_linter" +"demo/create_sparse_matrix.R",53,81,"style","Lines should not be more than 80 characters.","# Formulae Improved~.-1 used below means transform all categorical features but column Improved to binary values.","line_length_linter" +"demo/create_sparse_matrix.R",54,81,"style","Lines should not be more than 80 characters.","# Column Improved is excluded because it will be our output column, the one we want to predict.","line_length_linter" +"demo/create_sparse_matrix.R",69,81,"style","Lines should not be more than 80 characters."," eta = 1, nthread = 2, nrounds = 10, objective = ""binary:logistic"")","line_length_linter" +"demo/create_sparse_matrix.R",71,81,"style","Lines should not be more than 80 characters.","importance <- xgb.importance(feature_names = colnames(sparse_matrix), model = bst)","line_length_linter" +"demo/create_sparse_matrix.R",73,81,"style","Lines should not be more than 80 characters.","# According to the matrix below, the most important feature in this dataset to predict if the treatment will work is the Age. The second most important feature is having received a placebo or not. The sex is third. Then we see our generated features (AgeDiscret). We can see that their contribution is very low (Gain column).","line_length_linter" +"demo/create_sparse_matrix.R",85,81,"style","Lines should not be more than 80 characters.","# The perfectly random split I did between young and old at 30 years old have a low correlation of 2. It's a result we may expect as may be in my mind > 30 years is being old (I am 32 and starting feeling old, this may explain that), but for the illness we are studying, the age to be vulnerable is not the same. Don't let your ""gut"" lower the quality of your model. In ""data science"", there is science :-)","line_length_linter" +"demo/create_sparse_matrix.R",87,81,"style","Lines should not be more than 80 characters.","# As you can see, in general destroying information by simplifying it won't improve your model. Chi2 just demonstrates that. But in more complex cases, creating a new feature based on existing one which makes link with the outcome more obvious may help the algorithm and improve the model. The case studied here is not enough complex to show that. Check Kaggle forum for some challenging datasets.","line_length_linter" +"demo/create_sparse_matrix.R",89,81,"style","Lines should not be more than 80 characters.","# Moreover, you can notice that even if we have added some not useful new features highly correlated with other features, the boosting tree algorithm have been able to choose the best one, which in this case is the Age. Linear model may not be that strong in these scenario.","line_length_linter" +"demo/cross_validation.R",3,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" +"demo/cross_validation.R",4,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" +"demo/cross_validation.R",9,64,"style","Only use double-quotes.","param <- list(max_depth = 2, eta = 1, nthread = 2, objective = 'binary:logistic')","single_quotes_linter" +"demo/cross_validation.R",9,81,"style","Lines should not be more than 80 characters.","param <- list(max_depth = 2, eta = 1, nthread = 2, objective = 'binary:logistic')","line_length_linter" +"demo/cross_validation.R",11,5,"style","Only use double-quotes.","cat('running cross validation\n')","single_quotes_linter" +"demo/cross_validation.R",15,53,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","xgb.cv(param, dtrain, nrounds, nfold = 5, metrics = {'error'})","brace_linter" +"demo/cross_validation.R",15,54,"style","Only use double-quotes.","xgb.cv(param, dtrain, nrounds, nfold = 5, metrics = {'error'})","single_quotes_linter" +"demo/cross_validation.R",17,5,"style","Only use double-quotes.","cat('running cross validation, disable standard deviation display\n')","single_quotes_linter" +"demo/cross_validation.R",22,18,"style","Only use double-quotes."," metrics = 'error', showsd = FALSE)","single_quotes_linter" +"demo/cross_validation.R",28,6,"style","Remove spaces before the left parenthesis in a function call.","print ('running cross validation, with customized loss function')","function_left_parentheses_linter" +"demo/cross_validation.R",28,8,"style","Only use double-quotes.","print ('running cross validation, with customized loss function')","single_quotes_linter" +"demo/cross_validation.R",49,81,"style","Lines should not be more than 80 characters.","res <- xgb.cv(params = param, data = dtrain, nrounds = nrounds, nfold = 5, prediction = TRUE)","line_length_linter" +"demo/custom_objective.R",3,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" +"demo/custom_objective.R",4,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" +"demo/custom_objective.R",14,81,"style","Lines should not be more than 80 characters.","# user define objective function, given prediction, return gradient and second order gradient","line_length_linter" +"demo/custom_objective.R",25,81,"style","Lines should not be more than 80 characters.","# NOTE: when you do customized loss function, the default prediction value is margin","line_length_linter" +"demo/custom_objective.R",27,81,"style","Lines should not be more than 80 characters.","# for example, we are doing logistic loss, the prediction is score before logistic transformation","line_length_linter" +"demo/custom_objective.R",29,81,"style","Lines should not be more than 80 characters.","# Take this in mind when you use the customization, and maybe you need write customized evaluation function","line_length_linter" +"demo/custom_objective.R",38,6,"style","Remove spaces before the left parenthesis in a function call.","print ('start training with user customized objective')","function_left_parentheses_linter" +"demo/custom_objective.R",38,8,"style","Only use double-quotes.","print ('start training with user customized objective')","single_quotes_linter" +"demo/custom_objective.R",48,81,"style","Lines should not be more than 80 characters.","# set label attribute of dtrain to be label, we use label as an example, it can be anything","line_length_linter" +"demo/custom_objective.R",49,14,"style","Only use double-quotes.","attr(dtrain, 'label') <- getinfo(dtrain, 'label')","single_quotes_linter" +"demo/custom_objective.R",49,42,"style","Only use double-quotes.","attr(dtrain, 'label') <- getinfo(dtrain, 'label')","single_quotes_linter" +"demo/custom_objective.R",54,26,"style","Only use double-quotes."," labels <- attr(dtrain, 'label')","single_quotes_linter" +"demo/custom_objective.R",62,6,"style","Remove spaces before the left parenthesis in a function call.","print ('start training with user customized objective, with additional attributes in DMatrix')","function_left_parentheses_linter" +"demo/custom_objective.R",62,8,"style","Only use double-quotes.","print ('start training with user customized objective, with additional attributes in DMatrix')","single_quotes_linter" +"demo/custom_objective.R",62,81,"style","Lines should not be more than 80 characters.","print ('start training with user customized objective, with additional attributes in DMatrix')","line_length_linter" +"demo/early_stopping.R",3,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" +"demo/early_stopping.R",4,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" +"demo/early_stopping.R",13,81,"style","Lines should not be more than 80 characters.","# user define objective function, given prediction, return gradient and second order gradient","line_length_linter" +"demo/early_stopping.R",23,81,"style","Lines should not be more than 80 characters.","# NOTE: when you do customized loss function, the default prediction value is margin","line_length_linter" +"demo/early_stopping.R",25,81,"style","Lines should not be more than 80 characters.","# for example, we are doing logistic loss, the prediction is score before logistic transformation","line_length_linter" +"demo/early_stopping.R",27,81,"style","Lines should not be more than 80 characters.","# Take this in mind when you use the customization, and maybe you need write customized evaluation function","line_length_linter" +"demo/early_stopping.R",33,6,"style","Remove spaces before the left parenthesis in a function call.","print ('start training with early Stopping setting')","function_left_parentheses_linter" +"demo/early_stopping.R",33,8,"style","Only use double-quotes.","print ('start training with early Stopping setting')","single_quotes_linter" +"demo/early_stopping.R",36,81,"style","Lines should not be more than 80 characters."," objective = logregobj, eval_metric = evalerror, maximize = FALSE,","line_length_linter" +"demo/generalized_linear_model.R",3,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" +"demo/generalized_linear_model.R",4,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" +"demo/generalized_linear_model.R",32,26,"style","Only use double-quotes.","labels <- getinfo(dtest, 'label')","single_quotes_linter" +"demo/generalized_linear_model.R",33,5,"style","Only use double-quotes.","cat('error of preds=', mean(as.numeric(ypred > 0.5) != labels), '\n')","single_quotes_linter" +"demo/generalized_linear_model.R",33,65,"style","Only use double-quotes.","cat('error of preds=', mean(as.numeric(ypred > 0.5) != labels), '\n')","single_quotes_linter" +"demo/gpu_accelerated.R",10,9,"style","Only use double-quotes.","library('xgboost')","single_quotes_linter" +"demo/gpu_accelerated.R",12,81,"style","Lines should not be more than 80 characters.","# Simulate N x p random matrix with some binomial response dependent on pp columns","line_length_linter" +"demo/gpu_accelerated.R",14,1,"style","Variable and function name style should be snake_case or symbols.","N <- 1000000","object_name_linter" +"demo/gpu_accelerated.R",17,1,"style","Variable and function name style should be snake_case or symbols.","X <- matrix(runif(N * p), ncol = p)","object_name_linter" +"demo/gpu_accelerated.R",35,27,"style","Only use double-quotes.","param <- list(objective = 'reg:logistic', eval_metric = 'auc', subsample = 0.5, nthread = 4,","single_quotes_linter" +"demo/gpu_accelerated.R",35,57,"style","Only use double-quotes.","param <- list(objective = 'reg:logistic', eval_metric = 'auc', subsample = 0.5, nthread = 4,","single_quotes_linter" +"demo/gpu_accelerated.R",35,81,"style","Lines should not be more than 80 characters.","param <- list(objective = 'reg:logistic', eval_metric = 'auc', subsample = 0.5, nthread = 4,","line_length_linter" +"demo/gpu_accelerated.R",36,43,"style","Only use double-quotes."," max_bin = 64, tree_method = 'gpu_hist')","single_quotes_linter" +"demo/gpu_accelerated.R",42,22,"style","Only use double-quotes.","param$tree_method <- 'hist'","single_quotes_linter" +"demo/interaction_constraints.R",6,81,"style","Lines should not be more than 80 characters.","# Function to obtain a list of interactions fitted in trees, requires input of maximum depth","line_length_linter" +"demo/interaction_constraints.R",7,1,"style","Variable and function name style should be snake_case or symbols.","treeInteractions <- function(input_tree, input_max_depth) {","object_name_linter" +"demo/interaction_constraints.R",8,3,"style","Variable and function name style should be snake_case or symbols."," ID_merge <- i.id <- i.feature <- NULL # Suppress warning ""no visible binding for global variable""","object_name_linter" +"demo/interaction_constraints.R",8,15,"style","Variable and function name style should be snake_case or symbols."," ID_merge <- i.id <- i.feature <- NULL # Suppress warning ""no visible binding for global variable""","object_name_linter" +"demo/interaction_constraints.R",8,23,"style","Variable and function name style should be snake_case or symbols."," ID_merge <- i.id <- i.feature <- NULL # Suppress warning ""no visible binding for global variable""","object_name_linter" +"demo/interaction_constraints.R",8,81,"style","Lines should not be more than 80 characters."," ID_merge <- i.id <- i.feature <- NULL # Suppress warning ""no visible binding for global variable""","line_length_linter" +"demo/interaction_constraints.R",10,81,"style","Lines should not be more than 80 characters."," trees <- data.table::copy(input_tree) # copy tree input to prevent overwriting","line_length_linter" +"demo/interaction_constraints.R",16,77,"style","Only use double-quotes."," if (i == 2) trees[, ID_merge := ID] else trees[, ID_merge := get(paste0('parent_', i - 2))]","single_quotes_linter" +"demo/interaction_constraints.R",16,81,"style","Lines should not be more than 80 characters."," if (i == 2) trees[, ID_merge := ID] else trees[, ID_merge := get(paste0('parent_', i - 2))]","line_length_linter" +"demo/interaction_constraints.R",17,81,"style","Lines should not be more than 80 characters."," parents_left <- trees[!is.na(Split), list(i.id = ID, i.feature = Feature, ID_merge = Yes)]","line_length_linter" +"demo/interaction_constraints.R",18,81,"style","Lines should not be more than 80 characters."," parents_right <- trees[!is.na(Split), list(i.id = ID, i.feature = Feature, ID_merge = No)]","line_length_linter" +"demo/interaction_constraints.R",20,34,"style","Only use double-quotes."," data.table::setorderv(trees, 'ID_merge')","single_quotes_linter" +"demo/interaction_constraints.R",21,41,"style","Only use double-quotes."," data.table::setorderv(parents_left, 'ID_merge')","single_quotes_linter" +"demo/interaction_constraints.R",22,42,"style","Only use double-quotes."," data.table::setorderv(parents_right, 'ID_merge')","single_quotes_linter" +"demo/interaction_constraints.R",24,46,"style","Only use double-quotes."," trees <- merge(trees, parents_left, by = 'ID_merge', all.x = TRUE)","single_quotes_linter" +"demo/interaction_constraints.R",25,34,"style","Only use double-quotes."," trees[!is.na(i.id), c(paste0('parent_', i - 1), paste0('parent_feat_', i - 1))","single_quotes_linter" +"demo/interaction_constraints.R",25,60,"style","Only use double-quotes."," trees[!is.na(i.id), c(paste0('parent_', i - 1), paste0('parent_feat_', i - 1))","single_quotes_linter" +"demo/interaction_constraints.R",25,81,"style","Lines should not be more than 80 characters."," trees[!is.na(i.id), c(paste0('parent_', i - 1), paste0('parent_feat_', i - 1))","line_length_linter" +"demo/interaction_constraints.R",27,15,"style","Only use double-quotes."," trees[, c('i.id', 'i.feature') := NULL]","single_quotes_linter" +"demo/interaction_constraints.R",27,23,"style","Only use double-quotes."," trees[, c('i.id', 'i.feature') := NULL]","single_quotes_linter" +"demo/interaction_constraints.R",29,47,"style","Only use double-quotes."," trees <- merge(trees, parents_right, by = 'ID_merge', all.x = TRUE)","single_quotes_linter" +"demo/interaction_constraints.R",30,34,"style","Only use double-quotes."," trees[!is.na(i.id), c(paste0('parent_', i - 1), paste0('parent_feat_', i - 1))","single_quotes_linter" +"demo/interaction_constraints.R",30,60,"style","Only use double-quotes."," trees[!is.na(i.id), c(paste0('parent_', i - 1), paste0('parent_feat_', i - 1))","single_quotes_linter" +"demo/interaction_constraints.R",30,81,"style","Lines should not be more than 80 characters."," trees[!is.na(i.id), c(paste0('parent_', i - 1), paste0('parent_feat_', i - 1))","line_length_linter" +"demo/interaction_constraints.R",32,15,"style","Only use double-quotes."," trees[, c('i.id', 'i.feature') := NULL]","single_quotes_linter" +"demo/interaction_constraints.R",32,23,"style","Only use double-quotes."," trees[, c('i.id', 'i.feature') := NULL]","single_quotes_linter" +"demo/interaction_constraints.R",36,53,"warning","no visible binding for global variable β€˜parent_1’"," interaction_trees <- trees[!is.na(Split) & !is.na(parent_1),","object_usage_linter" +"demo/interaction_constraints.R",37,32,"style","Only use double-quotes."," c('Feature', paste0('parent_feat_', 1:(input_max_depth - 1))),","single_quotes_linter" +"demo/interaction_constraints.R",37,50,"style","Only use double-quotes."," c('Feature', paste0('parent_feat_', 1:(input_max_depth - 1))),","single_quotes_linter" +"demo/interaction_constraints.R",37,81,"style","Lines should not be more than 80 characters."," c('Feature', paste0('parent_feat_', 1:(input_max_depth - 1))),","line_length_linter" +"demo/interaction_constraints.R",39,81,"style","Lines should not be more than 80 characters."," interaction_trees_split <- split(interaction_trees, seq_len(nrow(interaction_trees)))","line_length_linter" +"demo/interaction_constraints.R",60,34,"style","Only use double-quotes.","y <- -1 * x[, rowSums(.SD)] + x[['V1']] * x[['V2']] + x[['V3']] * x[['V4']] * x[['V5']]","single_quotes_linter" +"demo/interaction_constraints.R",60,46,"style","Only use double-quotes.","y <- -1 * x[, rowSums(.SD)] + x[['V1']] * x[['V2']] + x[['V3']] * x[['V4']] * x[['V5']]","single_quotes_linter" +"demo/interaction_constraints.R",60,58,"style","Only use double-quotes.","y <- -1 * x[, rowSums(.SD)] + x[['V1']] * x[['V2']] + x[['V3']] * x[['V4']] * x[['V5']]","single_quotes_linter" +"demo/interaction_constraints.R",60,70,"style","Only use double-quotes.","y <- -1 * x[, rowSums(.SD)] + x[['V1']] * x[['V2']] + x[['V3']] * x[['V4']] * x[['V5']]","single_quotes_linter" +"demo/interaction_constraints.R",60,81,"style","Lines should not be more than 80 characters.","y <- -1 * x[, rowSums(.SD)] + x[['V1']] * x[['V2']] + x[['V3']] * x[['V4']] * x[['V5']]","line_length_linter" +"demo/interaction_constraints.R",60,82,"style","Only use double-quotes.","y <- -1 * x[, rowSums(.SD)] + x[['V1']] * x[['V2']] + x[['V3']] * x[['V4']] * x[['V5']]","single_quotes_linter" +"demo/interaction_constraints.R",61,40,"style","Only use double-quotes."," + rnorm(1000, 0.001) + 3 * sin(x[['V7']])","single_quotes_linter" +"demo/interaction_constraints.R",66,28,"style","Only use double-quotes.","interaction_list <- list(c('V1', 'V2'), c('V3', 'V4', 'V5'))","single_quotes_linter" +"demo/interaction_constraints.R",66,34,"style","Only use double-quotes.","interaction_list <- list(c('V1', 'V2'), c('V3', 'V4', 'V5'))","single_quotes_linter" +"demo/interaction_constraints.R",66,43,"style","Only use double-quotes.","interaction_list <- list(c('V1', 'V2'), c('V3', 'V4', 'V5'))","single_quotes_linter" +"demo/interaction_constraints.R",66,49,"style","Only use double-quotes.","interaction_list <- list(c('V1', 'V2'), c('V3', 'V4', 'V5'))","single_quotes_linter" +"demo/interaction_constraints.R",66,55,"style","Only use double-quotes.","interaction_list <- list(c('V1', 'V2'), c('V3', 'V4', 'V5'))","single_quotes_linter" +"demo/interaction_constraints.R",70,3,"style","Variable and function name style should be snake_case or symbols."," LUT <- seq_along(col_names) - 1","object_name_linter" +"demo/interaction_constraints.R",71,9,"style","Variable and function name style should be snake_case or symbols."," names(LUT) <- col_names","object_name_linter" +"demo/interaction_constraints.R",102,81,"style","Lines should not be more than 80 characters.","# Show monotonic constraints still apply by checking scores after incrementing V1","line_length_linter" +"demo/interaction_constraints.R",103,22,"style","Only use double-quotes.","x1 <- sort(unique(x[['V1']]))","single_quotes_linter" +"demo/interaction_constraints.R",105,27,"style","Only use double-quotes."," testdata <- copy(x[, - ('V1')])","single_quotes_linter" +"demo/interaction_constraints.R",106,13,"style","Only use double-quotes."," testdata[['V1']] <- x1[i]","single_quotes_linter" +"demo/interaction_constraints.R",107,33,"style","Only use double-quotes."," testdata <- testdata[, paste0('V', 1:10), with = FALSE]","single_quotes_linter" +"demo/poisson_regression.R",4,28,"style","Only use double-quotes."," objective = 'count:poisson', nrounds = 5)","single_quotes_linter" +"demo/predict_first_ntree.R",3,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" +"demo/predict_first_ntree.R",4,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" +"demo/predict_first_ntree.R",8,51,"style","Only use double-quotes.","param <- list(max_depth = 2, eta = 1, objective = 'binary:logistic')","single_quotes_linter" +"demo/predict_first_ntree.R",14,5,"style","Only use double-quotes.","cat('start testing prediction from first n trees\n')","single_quotes_linter" +"demo/predict_first_ntree.R",15,26,"style","Only use double-quotes.","labels <- getinfo(dtest, 'label')","single_quotes_linter" +"demo/predict_first_ntree.R",22,5,"style","Only use double-quotes.","cat('error of ypred1=', mean(as.numeric(ypred1 > 0.5) != labels), '\n')","single_quotes_linter" +"demo/predict_first_ntree.R",22,67,"style","Only use double-quotes.","cat('error of ypred1=', mean(as.numeric(ypred1 > 0.5) != labels), '\n')","single_quotes_linter" +"demo/predict_first_ntree.R",23,5,"style","Only use double-quotes.","cat('error of ypred2=', mean(as.numeric(ypred2 > 0.5) != labels), '\n')","single_quotes_linter" +"demo/predict_first_ntree.R",23,67,"style","Only use double-quotes.","cat('error of ypred2=', mean(as.numeric(ypred2 > 0.5) != labels), '\n')","single_quotes_linter" +"demo/predict_leaf_indices.R",8,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" +"demo/predict_leaf_indices.R",9,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" +"demo/predict_leaf_indices.R",13,51,"style","Only use double-quotes.","param <- list(max_depth = 2, eta = 1, objective = 'binary:logistic')","single_quotes_linter" +"demo/predict_leaf_indices.R",20,1,"style","Variable and function name style should be snake_case or symbols.","accuracy.before <- (sum((predict(bst, agaricus.test$data) >= 0.5) == agaricus.test$label)","object_name_linter" +"demo/predict_leaf_indices.R",20,81,"style","Lines should not be more than 80 characters.","accuracy.before <- (sum((predict(bst, agaricus.test$data) >= 0.5) == agaricus.test$label)","line_length_linter" +"demo/predict_leaf_indices.R",27,1,"style","Variable and function name style should be snake_case or symbols.","create.new.tree.features <- function(model, original.features){","object_name_linter" +"demo/predict_leaf_indices.R",27,45,"style","Variable and function name style should be snake_case or symbols.","create.new.tree.features <- function(model, original.features){","object_name_linter" +"demo/predict_leaf_indices.R",27,63,"style","There should be a space before an opening curly brace.","create.new.tree.features <- function(model, original.features){","brace_linter" +"demo/predict_leaf_indices.R",27,63,"style","There should be a space between a right parenthesis and a body expression.","create.new.tree.features <- function(model, original.features){","paren_body_linter" +"demo/predict_leaf_indices.R",31,81,"style","Lines should not be more than 80 characters."," # max is not the real max but it s not important for the purpose of adding features","line_length_linter" +"demo/predict_leaf_indices.R",32,5,"style","Variable and function name style should be snake_case or symbols."," leaf.id <- sort(unique(pred_with_leaf[, i]))","object_name_linter" +"demo/predict_leaf_indices.R",39,1,"style","Variable and function name style should be snake_case or symbols.","new.features.train <- create.new.tree.features(bst, agaricus.train$data)","object_name_linter" +"demo/predict_leaf_indices.R",40,1,"style","Variable and function name style should be snake_case or symbols.","new.features.test <- create.new.tree.features(bst, agaricus.test$data)","object_name_linter" +"demo/predict_leaf_indices.R",41,10,"style","Variable and function name style should be snake_case or symbols.","colnames(new.features.test) <- colnames(new.features.train)","object_name_linter" +"demo/predict_leaf_indices.R",44,1,"style","Variable and function name style should be snake_case or symbols.","new.dtrain <- xgb.DMatrix(data = new.features.train, label = agaricus.train$label)","object_name_linter" +"demo/predict_leaf_indices.R",44,81,"style","Lines should not be more than 80 characters.","new.dtrain <- xgb.DMatrix(data = new.features.train, label = agaricus.train$label)","line_length_linter" +"demo/predict_leaf_indices.R",45,1,"style","Variable and function name style should be snake_case or symbols.","new.dtest <- xgb.DMatrix(data = new.features.test, label = agaricus.test$label)","object_name_linter" +"demo/predict_leaf_indices.R",47,81,"style","Lines should not be more than 80 characters.","bst <- xgb.train(params = param, data = new.dtrain, nrounds = nrounds, nthread = 2)","line_length_linter" +"demo/predict_leaf_indices.R",50,1,"style","Variable and function name style should be snake_case or symbols.","accuracy.after <- (sum((predict(bst, new.dtest) >= 0.5) == agaricus.test$label)","object_name_linter" +"demo/predict_leaf_indices.R",54,81,"style","Lines should not be more than 80 characters.","cat(paste(""The accuracy was"", accuracy.before, ""before adding leaf features and it is now"",","line_length_linter" +"demo/runall.R",2,35,"style","Only use double-quotes.","demo(basic_walkthrough, package = 'xgboost')","single_quotes_linter" +"demo/runall.R",3,34,"style","Only use double-quotes.","demo(custom_objective, package = 'xgboost')","single_quotes_linter" +"demo/runall.R",4,39,"style","Only use double-quotes.","demo(boost_from_prediction, package = 'xgboost')","single_quotes_linter" +"demo/runall.R",5,37,"style","Only use double-quotes.","demo(predict_first_ntree, package = 'xgboost')","single_quotes_linter" +"demo/runall.R",6,42,"style","Only use double-quotes.","demo(generalized_linear_model, package = 'xgboost')","single_quotes_linter" +"demo/runall.R",7,34,"style","Only use double-quotes.","demo(cross_validation, package = 'xgboost')","single_quotes_linter" +"demo/runall.R",8,38,"style","Only use double-quotes.","demo(create_sparse_matrix, package = 'xgboost')","single_quotes_linter" +"demo/runall.R",9,38,"style","Only use double-quotes.","demo(predict_leaf_indices, package = 'xgboost')","single_quotes_linter" +"demo/runall.R",10,32,"style","Only use double-quotes.","demo(early_stopping, package = 'xgboost')","single_quotes_linter" +"demo/runall.R",11,36,"style","Only use double-quotes.","demo(poisson_regression, package = 'xgboost')","single_quotes_linter" +"demo/runall.R",12,31,"style","Only use double-quotes.","demo(caret_wrapper, package = 'xgboost')","single_quotes_linter" +"demo/runall.R",13,36,"style","Only use double-quotes.","demo(tweedie_regression, package = 'xgboost')","single_quotes_linter" +"demo/runall.R",14,2,"style","Commented code should be removed.","#demo(gpu_accelerated, package = 'xgboost') # can only run when built with GPU support","commented_code_linter" +"demo/runall.R",14,81,"style","Lines should not be more than 80 characters.","#demo(gpu_accelerated, package = 'xgboost') # can only run when built with GPU support","line_length_linter" +"demo/tweedie_regression.R",11,14,"style","Only use double-quotes.","exclude <- c('POLICYNO', 'PLCYDATE', 'CLM_FREQ5', 'CLM_AMT5', 'CLM_FLAG', 'IN_YY')","single_quotes_linter" +"demo/tweedie_regression.R",11,26,"style","Only use double-quotes.","exclude <- c('POLICYNO', 'PLCYDATE', 'CLM_FREQ5', 'CLM_AMT5', 'CLM_FLAG', 'IN_YY')","single_quotes_linter" +"demo/tweedie_regression.R",11,38,"style","Only use double-quotes.","exclude <- c('POLICYNO', 'PLCYDATE', 'CLM_FREQ5', 'CLM_AMT5', 'CLM_FLAG', 'IN_YY')","single_quotes_linter" +"demo/tweedie_regression.R",11,51,"style","Only use double-quotes.","exclude <- c('POLICYNO', 'PLCYDATE', 'CLM_FREQ5', 'CLM_AMT5', 'CLM_FLAG', 'IN_YY')","single_quotes_linter" +"demo/tweedie_regression.R",11,63,"style","Only use double-quotes.","exclude <- c('POLICYNO', 'PLCYDATE', 'CLM_FREQ5', 'CLM_AMT5', 'CLM_FLAG', 'IN_YY')","single_quotes_linter" +"demo/tweedie_regression.R",11,75,"style","Only use double-quotes.","exclude <- c('POLICYNO', 'PLCYDATE', 'CLM_FREQ5', 'CLM_AMT5', 'CLM_FLAG', 'IN_YY')","single_quotes_linter" +"demo/tweedie_regression.R",11,81,"style","Lines should not be more than 80 characters.","exclude <- c('POLICYNO', 'PLCYDATE', 'CLM_FREQ5', 'CLM_AMT5', 'CLM_FLAG', 'IN_YY')","line_length_linter" +"demo/tweedie_regression.R",15,21,"style","Only use double-quotes.","options(na.action = 'na.pass')","single_quotes_linter" +"demo/tweedie_regression.R",17,21,"style","Only use double-quotes.","options(na.action = 'na.omit')","single_quotes_linter" +"demo/tweedie_regression.R",32,15,"style","Only use double-quotes."," objective = 'reg:tweedie',","single_quotes_linter" +"demo/tweedie_regression.R",33,17,"style","Only use double-quotes."," eval_metric = 'rmse',","single_quotes_linter" +"demo/tweedie_regression.R",45,35,"style","Only use double-quotes.","var_imp <- xgb.importance(attr(x, 'Dimnames')[[2]], model = bst)","single_quotes_linter" +"R/callbacks.R",617,12,"style","Either both or neither branch in `if`/`else` should use curly braces."," } else if (!is.null(env$bst_folds)) { # xgb.cv:","brace_linter" +"R/xgb.Booster.R",55,1,"style","Variable and function name style should be snake_case or symbols.","is.null.handle <- function(handle) {","object_name_linter" +"R/xgb.Booster.R",632,43,"style","Trailing semicolons are not needed."," .Call(XGBoosterSaveJsonConfig_R, handle);","semicolon_linter" +"R/xgb.cv.R",121,62,"style","Put spaces around all infix operators."," prediction = FALSE, showsd = TRUE, metrics=list(),","infix_spaces_linter" +"R/xgb.cv.R",123,49,"style","Put spaces around all infix operators."," verbose = TRUE, print_every_n=1L,","infix_spaces_linter" +"R/xgb.DMatrix.R",388,15,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (verbose & !is.null(cnames)) {","vector_logic_linter" +"R/xgb.plot.multi.trees.R",97,25,"warning","1:min(...) is likely to be wrong in the empty edge case. Use seq_len() instead."," Feature[1:min(length(Feature), features_keep)],","seq_linter" +"R/xgb.plot.shap.R",276,29,"warning","1:min(...) is likely to be wrong in the empty edge case. Use seq_len() instead."," features <- imp$Feature[1:min(top_n, NROW(imp))]","seq_linter" +"tests/testthat/test_basic.R",407,40,"style","Trailing semicolons are not needed."," expect_equal(config, reloaded_config);","semicolon_linter" +"tests/testthat/test_helpers.R",95,12,"style","Variable and function name style should be snake_case or symbols."," colnames(X) <- NULL","object_name_linter" +"tests/testthat/test_helpers.R",173,11,"style","Any function spanning multiple lines should use curly braces."," pr <- function(...)","brace_linter" +"tests/testthat/test_helpers.R",191,3,"style","Variable and function name style should be snake_case or symbols."," list.ch <- list.val[order(names(list.val))]","object_name_linter" +"tests/testthat/test_helpers.R",192,3,"style","Variable and function name style should be snake_case or symbols."," list.ch <- lapply(list.ch, as.character)","object_name_linter" +"tests/testthat/test_helpers.R",194,3,"style","Variable and function name style should be snake_case or symbols."," list.default <- list(niter = as.character(nrounds - 1))","object_name_linter" +"tests/testthat/test_helpers.R",195,3,"style","Variable and function name style should be snake_case or symbols."," list.ch <- c(list.ch, list.default)","object_name_linter" +"tests/testthat/test_helpers.R",202,12,"style","Variable and function name style should be snake_case or symbols."," xgb.attr(bst.Tree, ""my_attr"") <- val","object_name_linter" +"tests/testthat/test_helpers.R",204,18,"style","Variable and function name style should be snake_case or symbols."," xgb.attributes(bst.Tree) <- list.val","object_name_linter" +"tests/testthat/test_helpers.R",235,18,"style","Variable and function name style should be snake_case or symbols."," xgb.attr(bst.Tree, ""x"") <- x","object_name_linter" +"tests/testthat/test_helpers.R",237,24,"style","Variable and function name style should be snake_case or symbols."," xgb.attributes(bst.Tree) <- list(a = ""A"", b = x)","object_name_linter" +"tests/testthat/test_helpers.R",274,3,"style","Variable and function name style should be snake_case or symbols."," bst.Tree.x$feature_names <- NULL","object_name_linter" +"tests/testthat/test_helpers.R",302,3,"style","Variable and function name style should be snake_case or symbols."," bst.Tree.x$feature_names <- NULL","object_name_linter" +"vignettes/discoverYourData.Rmd",31,14,"style","Only use double-quotes.","if (!require('vcd')) install.packages('vcd')","single_quotes_linter" +"vignettes/discoverYourData.Rmd",31,39,"style","Only use double-quotes.","if (!require('vcd')) install.packages('vcd')","single_quotes_linter" +"vignettes/discoverYourData.Rmd",103,10,"style","Commas should always have a space after.","head(df[,AgeDiscret := as.factor(round(Age/10,0))])","commas_linter" +"vignettes/discoverYourData.Rmd",103,43,"style","Put spaces around all infix operators.","head(df[,AgeDiscret := as.factor(round(Age/10,0))])","infix_spaces_linter" +"vignettes/discoverYourData.Rmd",103,47,"style","Commas should always have a space after.","head(df[,AgeDiscret := as.factor(round(Age/10,0))])","commas_linter" +"vignettes/discoverYourData.Rmd",111,10,"style","Commas should always have a space after.","head(df[,AgeCat:= as.factor(ifelse(Age > 30, ""Old"", ""Young""))])","commas_linter" +"vignettes/discoverYourData.Rmd",111,16,"style","Put spaces around all infix operators.","head(df[,AgeCat:= as.factor(ifelse(Age > 30, ""Old"", ""Young""))])","infix_spaces_linter" +"vignettes/discoverYourData.Rmd",127,5,"style","Commas should always have a space after.","df[,ID:=NULL]","commas_linter" +"vignettes/discoverYourData.Rmd",127,7,"style","Put spaces around all infix operators.","df[,ID:=NULL]","infix_spaces_linter" +"vignettes/discoverYourData.Rmd",133,12,"style","Commas should always have a space after.","levels(df[,Treatment])","commas_linter" +"vignettes/discoverYourData.Rmd",150,64,"style","Commas should always have a space after.","sparse_matrix <- sparse.model.matrix(Improved ~ ., data = df)[,-1]","commas_linter" +"vignettes/discoverYourData.Rmd",159,15,"style","Use <-, not =, for assignment.","output_vector = df[,Improved] == ""Marked""","assignment_linter" +"vignettes/discoverYourData.Rmd",159,21,"style","Commas should always have a space after.","output_vector = df[,Improved] == ""Marked""","commas_linter" +"vignettes/discoverYourData.Rmd",173,51,"style","Commas should always have a space after."," eta = 1, nthread = 2, nrounds = 10,objective = ""binary:logistic"")","commas_linter" +"vignettes/discoverYourData.Rmd",196,81,"style","Lines should not be more than 80 characters.","importance <- xgb.importance(feature_names = colnames(sparse_matrix), model = bst)","line_length_linter" +"vignettes/discoverYourData.Rmd",219,1,"style","Variable and function name style should be snake_case or symbols.","importanceRaw <- xgb.importance(feature_names = colnames(sparse_matrix), model = bst, data = sparse_matrix, label = output_vector)","object_name_linter" +"vignettes/discoverYourData.Rmd",219,81,"style","Lines should not be more than 80 characters.","importanceRaw <- xgb.importance(feature_names = colnames(sparse_matrix), model = bst, data = sparse_matrix, label = output_vector)","line_length_linter" +"vignettes/discoverYourData.Rmd",222,1,"style","Variable and function name style should be snake_case or symbols.","importanceClean <- importanceRaw[,`:=`(Cover=NULL, Frequency=NULL)]","object_name_linter" +"vignettes/discoverYourData.Rmd",222,35,"style","Commas should always have a space after.","importanceClean <- importanceRaw[,`:=`(Cover=NULL, Frequency=NULL)]","commas_linter" +"vignettes/discoverYourData.Rmd",222,45,"style","Put spaces around all infix operators.","importanceClean <- importanceRaw[,`:=`(Cover=NULL, Frequency=NULL)]","infix_spaces_linter" +"vignettes/discoverYourData.Rmd",222,61,"style","Put spaces around all infix operators.","importanceClean <- importanceRaw[,`:=`(Cover=NULL, Frequency=NULL)]","infix_spaces_linter" +"vignettes/discoverYourData.Rmd",324,29,"style","Put spaces around all infix operators.","data(agaricus.train, package='xgboost')","infix_spaces_linter" +"vignettes/discoverYourData.Rmd",324,30,"style","Only use double-quotes.","data(agaricus.train, package='xgboost')","single_quotes_linter" +"vignettes/discoverYourData.Rmd",325,28,"style","Put spaces around all infix operators.","data(agaricus.test, package='xgboost')","infix_spaces_linter" +"vignettes/discoverYourData.Rmd",325,29,"style","Only use double-quotes.","data(agaricus.test, package='xgboost')","single_quotes_linter" +"vignettes/discoverYourData.Rmd",330,81,"style","Lines should not be more than 80 characters.","bst <- xgboost(data = train$data, label = train$label, max_depth = 4, num_parallel_tree = 1000, subsample = 0.5, colsample_bytree =0.5, nrounds = 1, objective = ""binary:logistic"")","line_length_linter" +"vignettes/discoverYourData.Rmd",330,131,"style","Put spaces around all infix operators.","bst <- xgboost(data = train$data, label = train$label, max_depth = 4, num_parallel_tree = 1000, subsample = 0.5, colsample_bytree =0.5, nrounds = 1, objective = ""binary:logistic"")","infix_spaces_linter" +"vignettes/discoverYourData.Rmd",333,81,"style","Lines should not be more than 80 characters.","bst <- xgboost(data = train$data, label = train$label, max_depth = 4, nrounds = 3, objective = ""binary:logistic"")","line_length_linter" +"vignettes/xgboost.Rnw",19,13,"style","Only use double-quotes.","if (require('knitr')) opts_chunk$set(fig.width = 5, fig.height = 5, fig.align = 'center', tidy = FALSE, warning = FALSE, cache = TRUE)","single_quotes_linter" +"vignettes/xgboost.Rnw",19,81,"style","Lines should not be more than 80 characters.","if (require('knitr')) opts_chunk$set(fig.width = 5, fig.height = 5, fig.align = 'center', tidy = FALSE, warning = FALSE, cache = TRUE)","line_length_linter" +"vignettes/xgboost.Rnw",19,81,"style","Only use double-quotes.","if (require('knitr')) opts_chunk$set(fig.width = 5, fig.height = 5, fig.align = 'center', tidy = FALSE, warning = FALSE, cache = TRUE)","single_quotes_linter" +"vignettes/xgboost.Rnw",24,1,"style","Variable and function name style should be snake_case or symbols.","xgboost.version <- packageDescription(""xgboost"")$Version","object_name_linter" +"vignettes/xgboost.Rnw",84,29,"style","Put spaces around all infix operators.","data(agaricus.train, package='xgboost')","infix_spaces_linter" +"vignettes/xgboost.Rnw",84,30,"style","Only use double-quotes.","data(agaricus.train, package='xgboost')","single_quotes_linter" +"vignettes/xgboost.Rnw",85,28,"style","Put spaces around all infix operators.","data(agaricus.test, package='xgboost')","infix_spaces_linter" +"vignettes/xgboost.Rnw",85,29,"style","Only use double-quotes.","data(agaricus.test, package='xgboost')","single_quotes_linter" +"vignettes/xgboost.Rnw",90,15,"style","Only use double-quotes.","xgb.save(bst, 'model.save')","single_quotes_linter" +"vignettes/xgboost.Rnw",91,5,"style","Use <-, not =, for assignment.","bst = xgb.load('model.save')","assignment_linter" +"vignettes/xgboost.Rnw",91,16,"style","Only use double-quotes.","bst = xgb.load('model.save')","single_quotes_linter" +"vignettes/xgboost.Rnw",102,15,"style","Only use double-quotes.","xgb.dump(bst, 'model.dump')","single_quotes_linter" +"vignettes/xgboost.Rnw",132,21,"style","Commas should always have a space after.","head(getinfo(dtrain,'label'))","commas_linter" +"vignettes/xgboost.Rnw",132,21,"style","Only use double-quotes.","head(getinfo(dtrain,'label'))","single_quotes_linter" +"vignettes/xgboost.Rnw",138,26,"style","Only use double-quotes.","xgb.DMatrix.save(dtrain, 'xgb.DMatrix')","single_quotes_linter" +"vignettes/xgboost.Rnw",139,8,"style","Use <-, not =, for assignment.","dtrain = xgb.DMatrix('xgb.DMatrix')","assignment_linter" +"vignettes/xgboost.Rnw",139,22,"style","Only use double-quotes.","dtrain = xgb.DMatrix('xgb.DMatrix')","single_quotes_linter" +"vignettes/xgboost.Rnw",152,14,"style","Put spaces around all infix operators."," preds <- 1/(1 + exp(-preds))","infix_spaces_linter" +"vignettes/xgboost.Rnw",152,15,"style","Place a space before left parenthesis, except in a function call."," preds <- 1/(1 + exp(-preds))","spaces_left_parentheses_linter" +"vignettes/xgboost.Rnw",160,26,"style","Put spaces around all infix operators."," err <- sqrt(mean((preds-labels)^2))","infix_spaces_linter" +"vignettes/xgboost.Rnw",168,81,"style","Lines should not be more than 80 characters.","bst <- xgb.train(param, dtrain, nrounds = 2, watchlist, logregobj, evalerror, maximize = FALSE)","line_length_linter" +"vignettes/xgboostfromJSON.Rmd",33,15,"style","Put spaces around all infix operators.","options(digits=22)","infix_spaces_linter" +"vignettes/xgboostfromJSON.Rmd",53,41,"style","Put spaces around all infix operators.","data <- data.frame(dates = dates, labels=labels)","infix_spaces_linter" +"vignettes/xgboostfromJSON.Rmd",56,32,"style","Trailing whitespace is superfluous."," data = as.matrix(data$dates), ","trailing_whitespace_linter" +"vignettes/xgboostfromJSON.Rmd",72,58,"style","Put spaces around all infix operators.","bst_json <- xgb.dump(bst, with_stats = FALSE, dump_format='json')","infix_spaces_linter" +"vignettes/xgboostfromJSON.Rmd",72,59,"style","Only use double-quotes.","bst_json <- xgb.dump(bst, with_stats = FALSE, dump_format='json')","single_quotes_linter" +"vignettes/xgboostfromJSON.Rmd",81,34,"style","Commas should always have a space after.","bst_preds_logodds <- predict(bst,as.matrix(data$dates), outputmargin = TRUE)","commas_linter" +"vignettes/xgboostfromJSON.Rmd",84,43,"style","Put spaces around all infix operators.","bst_from_json_logodds <- ifelse(data$dates 0.5) != label))/length(label)","infix_spaces_linter" +"vignettes/xgboostPresentation.Rmd",399,51,"style","Put spaces around all infix operators.","print(paste(""sum(abs(pred2-pred))="", sum(abs(pred2-pred))))","infix_spaces_linter" +"vignettes/xgboostPresentation.Rmd",413,1,"style","Variable and function name style should be snake_case or symbols.","rawVec <- xgb.serialize(bst)","object_name_linter" +"vignettes/xgboostPresentation.Rmd",423,51,"style","Put spaces around all infix operators.","print(paste(""sum(abs(pred3-pred))="", sum(abs(pred2-pred))))","infix_spaces_linter" diff --git a/.dev/revdep_emails/xgboost/email-body b/.dev/revdep_emails/xgboost/email-body new file mode 100644 index 000000000..6e8c67969 --- /dev/null +++ b/.dev/revdep_emails/xgboost/email-body @@ -0,0 +1,29 @@ +Hello Jiaming Yuan! Thank you for using {lintr} in your package {xgboost}! + +{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview +of the upcoming improvements and bug fixes. + +We checked the results of running lint_package() on your package as found at https://github.com/dmlc/xgboost (hash: 1ced6381653eed0f259cf11df8ef599274d84174) using +the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). +We do this ourselves because of {lintr}'s position as a developer tool -- +normal CRAN revdep checking is not as helpful for detecting breakages. + +On your package, lint_package() took 72s on CRAN vs. 50s in our latest version. This +includes applying your .lintr config if one is available. + +I am also attaching the following, if they exist: + + * Hard breaking changes (.failure file): + any error generated from lint_package() using the latest version, if none existed using v2.0.1 + * Soft breaking changes (.warnings file): + any warnings generated from lint_package() using the latest version not found using v2.0.1 + * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other + +We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when +trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. +Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements +to {lintr}. + +Thanks again! +{lintr} development team + From 67a4240962bc3c2a28ebc5cda21c5da6c7469bd2 Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Sun, 5 Jun 2022 17:13:17 -0700 Subject: [PATCH 42/49] add arrow --- .dev/revdep-extra-repos | 1 + 1 file changed, 1 insertion(+) diff --git a/.dev/revdep-extra-repos b/.dev/revdep-extra-repos index 15e0b2a53..8cf358fb5 100644 --- a/.dev/revdep-extra-repos +++ b/.dev/revdep-extra-repos @@ -1,4 +1,5 @@ # This file tracks manually-supplied GitHub repos for packages # where {lintr} is not in Suggests or Imports package,repo +arrow,https://github.com/apache/arrow lightgbm,https://github.com/microsoft/LightGBM From 8535d2891e5ac7219b602a781316e242c623fe52 Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Sun, 5 Jun 2022 17:13:27 -0700 Subject: [PATCH 43/49] fine-tune output, add comment --- .dev/revdep_compare_releases.R | 4 +++- 1 file changed, 3 insertions(+), 1 deletion(-) diff --git a/.dev/revdep_compare_releases.R b/.dev/revdep_compare_releases.R index 44316af66..76044ccac 100755 --- a/.dev/revdep_compare_releases.R +++ b/.dev/revdep_compare_releases.R @@ -110,6 +110,7 @@ clone_and_lint <- function(repo_url) { load_lints <- function(version, filter_errors = TRUE) { csv_files <- list.files(result_path(version), pattern = "\\.csv$", full.names = TRUE) names(csv_files) <- gsub("\\.csv$", "", basename(csv_files)) + # fread mangles quotes: data.table#1109 lints <- data.table::rbindlist(lapply(csv_files, utils::read.csv), idcol = "repo") if (filter_errors) lints <- lints[, if (!any(type == "error")) .SD, by = .(repo, filename)] lints @@ -254,7 +255,8 @@ repo_data[, delta_pct := 100 * delta / elapsed_old] message("Comparison of time to run lint_package() on each repo (new - old; negative -> faster)") repo_data[ order(delta), - { print(.SD, nrows = Inf); quantile(delta, 0:10/10) } + { print(.SD, nrows = Inf); quantile(delta, 0:10/10) }, + .SDcols = patterns("^elapsed|package|^delta") ] # ---- Prepare e-mails for maintainers ---- From 87cc073e289a36a318552577d4ba1263132cd7c8 Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Mon, 6 Jun 2022 18:59:08 -0700 Subject: [PATCH 44/49] add shims for deleted functions --- .dev/revdep_compare_releases.R | 14 ++++++++++++++ 1 file changed, 14 insertions(+) diff --git a/.dev/revdep_compare_releases.R b/.dev/revdep_compare_releases.R index 76044ccac..8debf0560 100755 --- a/.dev/revdep_compare_releases.R +++ b/.dev/revdep_compare_releases.R @@ -29,6 +29,20 @@ lint_timings <- new.env() lint_timings$repo_timing <- vector("list", length(all_repos)) names(lint_timings$repo_timing) <- all_repos +# ---- Shims of deleted linters ---- +# these help unearth issues in packages which are using the deleted functions, +# by ensuring lint_package() at least gets past parsing .lintr (with warning) +absolute_paths_linter <- +camel_case_linter <- +multiple_dots_linter <- +snake_case_linter <- +trailing_semicolons_linter <- function(...) { + # .call=TRUE means the linter name will be displayed in the warning + warning("Using deleted linter") + Linter(function(...) list()) +} + + # ---- Helpers ---- get_hash <- function() system2("git", c("rev-parse", "HEAD"), stdout = TRUE) From c3620e181f261df68f3d777200329360243f0aba Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Fri, 10 Jun 2022 19:13:04 +0000 Subject: [PATCH 45/49] remove emails --- .../BTYDplus/attachments/BTYDplus.warnings | 2 - .../attachments/lints_in_cran_not_devel.csv | 11 - .../attachments/lints_in_devel_not_cran.csv | 227 - .dev/revdep_emails/BTYDplus/email-body | 29 - .../attachments/BiasCorrector.warnings | 1 - .../attachments/lints_in_devel_not_cran.csv | 33 - .dev/revdep_emails/BiasCorrector/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 14 - .../attachments/lints_in_devel_not_cran.csv | 20 - .dev/revdep_emails/ConNEcT/email-body | 29 - .dev/revdep_emails/DBItest/email-body | 29 - .../DIZtools/attachments/DIZtools.warnings | 1 - .../attachments/lints_in_devel_not_cran.csv | 47 - .dev/revdep_emails/DIZtools/email-body | 29 - .../DIZutils/attachments/DIZutils.warnings | 1 - .../attachments/lints_in_devel_not_cran.csv | 62 - .dev/revdep_emails/DIZutils/email-body | 29 - .../DQAgui/attachments/DQAgui.warnings | 1 - .../attachments/lints_in_devel_not_cran.csv | 82 - .dev/revdep_emails/DQAgui/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 7 - .../attachments/lints_in_devel_not_cran.csv | 107 - .dev/revdep_emails/DataFakeR/email-body | 29 - .../DepthProc/attachments/DepthProc.failure | 1 - .dev/revdep_emails/DepthProc/email-body | 29 - .../DominoDataCapture/email-body | 29 - .../attachments/FSelectorRcpp.warnings | 1 - .../attachments/lints_in_cran_not_devel.csv | 5 - .../attachments/lints_in_devel_not_cran.csv | 68 - .dev/revdep_emails/FSelectorRcpp/email-body | 29 - .../attachments/lints_in_devel_not_cran.csv | 12 - .dev/revdep_emails/INSPECTumours/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 3 - .../attachments/lints_in_devel_not_cran.csv | 41 - .dev/revdep_emails/NHSRplotthedots/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 3 - .../attachments/lints_in_devel_not_cran.csv | 82 - .dev/revdep_emails/OpenML/email-body | 29 - .../attachments/PWFSLSmoke.warnings | 2 - .../attachments/lints_in_cran_not_devel.csv | 3 - .../attachments/lints_in_devel_not_cran.csv | 219 - .dev/revdep_emails/PWFSLSmoke/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 19 - .../attachments/lints_in_devel_not_cran.csv | 22 - .dev/revdep_emails/Plasmidprofiler/email-body | 29 - .../attachments/lints_in_devel_not_cran.csv | 24 - .../PosteriorBootstrap/email-body | 29 - .../RSQL/attachments/RSQL.warnings | 2 - .../attachments/lints_in_devel_not_cran.csv | 25 - .dev/revdep_emails/RSQL/email-body | 29 - .../RestRserve/attachments/RestRserve.failure | 1 - .../attachments/RestRserve.warnings | 1 - .dev/revdep_emails/RestRserve/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 15 - .../attachments/lints_in_devel_not_cran.csv | 91 - .dev/revdep_emails/SamplerCompare/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 5 - .../attachments/lints_in_devel_not_cran.csv | 262 - .dev/revdep_emails/TDA/email-body | 29 - .../WikidataQueryServiceR.warnings | 2 - .../WikidataQueryServiceR/email-body | 29 - .../attachments/WoodburyMatrix.warnings | 1 - .dev/revdep_emails/WoodburyMatrix/email-body | 29 - .dev/revdep_emails/abbyyR/email-body | 29 - .dev/revdep_emails/adaptalint/email-body | 29 - .../admiral/attachments/admiral.warnings | 1 - .../attachments/lints_in_devel_not_cran.csv | 37 - .dev/revdep_emails/admiral/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 11 - .../attachments/lints_in_devel_not_cran.csv | 54 - .dev/revdep_emails/autoharp/email-body | 29 - .../attachments/lints_in_devel_not_cran.csv | 23 - .dev/revdep_emails/aws.alexa/email-body | 29 - .../attachments/lints_in_devel_not_cran.csv | 5 - .dev/revdep_emails/babette/email-body | 29 - .../attachments/lints_in_devel_not_cran.csv | 3 - .dev/revdep_emails/beautier/email-body | 29 - .../attachments/lints_in_devel_not_cran.csv | 3 - .dev/revdep_emails/biolink/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 8 - .../attachments/lints_in_devel_not_cran.csv | 114 - .dev/revdep_emails/caretEnsemble/email-body | 29 - .../cattonum/attachments/cattonum.warnings | 1 - .../attachments/lints_in_cran_not_devel.csv | 2 - .dev/revdep_emails/cattonum/email-body | 29 - .../cleaR/attachments/cleaR.warnings | 1 - .../attachments/lints_in_devel_not_cran.csv | 29 - .dev/revdep_emails/cleaR/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 19 - .../attachments/lints_in_devel_not_cran.csv | 25 - .dev/revdep_emails/cloudos/email-body | 29 - .../attachments/lints_in_devel_not_cran.csv | 97 - .dev/revdep_emails/cmstatr/email-body | 29 - .../attachments/lints_in_devel_not_cran.csv | 9 - .dev/revdep_emails/connectwidgets/email-body | 29 - .../crunch/attachments/crunch.warnings | 2 - .../attachments/lints_in_cran_not_devel.csv | 2 - .../attachments/lints_in_devel_not_cran.csv | 765 - .dev/revdep_emails/crunch/email-body | 29 - .../dampack/attachments/dampack.warnings | 2 - .../attachments/lints_in_devel_not_cran.csv | 331 - .dev/revdep_emails/dampack/email-body | 29 - .../attachments/dashboardthemes.warnings | 263 - .../attachments/lints_in_devel_not_cran.csv | 3 - .dev/revdep_emails/dashboardthemes/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 7 - .../attachments/lints_in_devel_not_cran.csv | 44 - .dev/revdep_emails/dat/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 104 - .../attachments/lints_in_devel_not_cran.csv | 967 - .dev/revdep_emails/datarobot/email-body | 29 - .../attachments/datastructures.failure | 1 - .dev/revdep_emails/datastructures/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 2 - .dev/revdep_emails/describer/email-body | 29 - .dev/revdep_emails/devtools/email-body | 29 - .../diffusr/attachments/diffusr.failure | 1 - .dev/revdep_emails/diffusr/email-body | 29 - .../dittodb/attachments/dittodb.warnings | 1 - .../attachments/lints_in_devel_not_cran.csv | 728 - .dev/revdep_emails/dittodb/email-body | 29 - .../dupree/attachments/dupree.warnings | 1 - .dev/revdep_emails/dupree/email-body | 29 - .../dyn.log/attachments/dyn.log.warnings | 68 - .../attachments/lints_in_cran_not_devel.csv | 2 - .../attachments/lints_in_devel_not_cran.csv | 69 - .dev/revdep_emails/dyn.log/email-body | 29 - .../edgarWebR/attachments/edgarWebR.warnings | 2 - .../attachments/lints_in_devel_not_cran.csv | 19916 ---------------- .dev/revdep_emails/edgarWebR/email-body | 29 - .../emayili/attachments/emayili.warnings | 1 - .../attachments/lints_in_devel_not_cran.csv | 7 - .dev/revdep_emails/emayili/email-body | 29 - .../attachments/epigraphdb.warnings | 1 - .dev/revdep_emails/epigraphdb/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 2 - .../attachments/lints_in_devel_not_cran.csv | 2 - .dev/revdep_emails/fakemake/email-body | 29 - .../fixtuRes/attachments/fixtuRes.warnings | 1 - .../attachments/lints_in_devel_not_cran.csv | 3 - .dev/revdep_emails/fixtuRes/email-body | 29 - .../attachments/lints_in_devel_not_cran.csv | 12 - .dev/revdep_emails/fst/email-body | 29 - .dev/revdep_emails/fstcore/email-body | 29 - .dev/revdep_emails/geofacet/email-body | 29 - .dev/revdep_emails/geogrid/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 12 - .../attachments/lints_in_devel_not_cran.csv | 357 - .dev/revdep_emails/ggRandomForests/email-body | 29 - .../ggcharts/attachments/ggcharts.warnings | 1 - .../attachments/lints_in_cran_not_devel.csv | 3 - .../attachments/lints_in_devel_not_cran.csv | 5 - .dev/revdep_emails/ggcharts/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 118 - .../attachments/lints_in_devel_not_cran.csv | 190 - .dev/revdep_emails/ggfortify/email-body | 29 - .../ggthemes/attachments/ggthemes.warnings | 2 - .../attachments/lints_in_cran_not_devel.csv | 2 - .../attachments/lints_in_devel_not_cran.csv | 48 - .dev/revdep_emails/ggthemes/email-body | 29 - .../attachments/healthcareai.warnings | 2 - .../attachments/lints_in_devel_not_cran.csv | 149 - .dev/revdep_emails/healthcareai/email-body | 29 - .../attachments/lints_in_devel_not_cran.csv | 345 - .dev/revdep_emails/i18n/email-body | 29 - .../jpmesh/attachments/jpmesh.warnings | 1 - .../attachments/lints_in_devel_not_cran.csv | 3 - .dev/revdep_emails/jpmesh/email-body | 29 - .../attachments/languageserver.warnings | 2 - .dev/revdep_emails/languageserver/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 35 - .../attachments/lints_in_devel_not_cran.csv | 331 - .dev/revdep_emails/latrend/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 5 - .../attachments/lints_in_devel_not_cran.csv | 24 - .dev/revdep_emails/lifecycle/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 14 - .../attachments/lints_in_devel_not_cran.csv | 67 - .dev/revdep_emails/lightgbm/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 3 - .../attachments/lints_in_devel_not_cran.csv | 12 - .../mlflow/attachments/mlflow.warnings | 2 - .dev/revdep_emails/mlflow/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 152 - .../attachments/lints_in_devel_not_cran.csv | 791 - .../mlr/attachments/mlr.warnings | 2 - .dev/revdep_emails/mlr/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 4 - .../attachments/lints_in_devel_not_cran.csv | 441 - .dev/revdep_emails/mlrCPO/email-body | 29 - .../attachments/lints_in_devel_not_cran.csv | 12 - .../modules/attachments/modules.warnings | 1 - .dev/revdep_emails/modules/email-body | 29 - .../attachments/lints_in_devel_not_cran.csv | 2 - .dev/revdep_emails/nLTT/email-body | 29 - .dev/revdep_emails/newsmd/email-body | 29 - .../attachments/openbankeR.warnings | 68 - .dev/revdep_emails/openbankeR/email-body | 29 - .../attachments/lints_in_devel_not_cran.csv | 8 - .../osfr/attachments/osfr.warnings | 1 - .dev/revdep_emails/osfr/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 5 - .../attachments/lints_in_devel_not_cran.csv | 29 - .../packager/attachments/packager.warnings | 1 - .dev/revdep_emails/packager/email-body | 29 - .../attachments/lints_in_devel_not_cran.csv | 58 - .../attachments/physiology.warnings | 2 - .dev/revdep_emails/physiology/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 8 - .../attachments/lints_in_devel_not_cran.csv | 17 - .dev/revdep_emails/precommit/email-body | 29 - .../attachments/lints_in_devel_not_cran.csv | 23 - .../prettyB/attachments/prettyB.warnings | 1 - .dev/revdep_emails/prettyB/email-body | 29 - .../attachments/lints_in_devel_not_cran.csv | 110 - .../attachments/rBiasCorrection.warnings | 1 - .dev/revdep_emails/rBiasCorrection/email-body | 29 - .dev/revdep_emails/rasterpdf/email-body | 29 - .dev/revdep_emails/rbokeh/email-body | 29 - .../attachments/lints_in_devel_not_cran.csv | 12 - .dev/revdep_emails/rde/email-body | 29 - .../attachments/lints_in_devel_not_cran.csv | 13 - .dev/revdep_emails/rdomains/email-body | 29 - .../attachments/lints_in_devel_not_cran.csv | 20 - .../attachments/requiRements.warnings | 1 - .dev/revdep_emails/requiRements/email-body | 29 - .../attachments/lints_in_devel_not_cran.csv | 2 - .../rhino/attachments/rhino.warnings | 1 - .dev/revdep_emails/rhino/email-body | 29 - .../attachments/lints_in_devel_not_cran.csv | 65 - .dev/revdep_emails/rnrfa/email-body | 29 - .dev/revdep_emails/roadoi/email-body | 29 - .../attachments/scriptexec.warnings | 1 - .dev/revdep_emails/scriptexec/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 17 - .../attachments/lints_in_devel_not_cran.csv | 41 - .dev/revdep_emails/secuTrialR/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 5 - .../attachments/lints_in_devel_not_cran.csv | 8 - .../semantic.dashboard/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 3 - .../attachments/lints_in_devel_not_cran.csv | 3 - .dev/revdep_emails/shiny.info/email-body | 29 - .../attachments/lints_in_devel_not_cran.csv | 6 - .dev/revdep_emails/shiny.react/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 30 - .../attachments/lints_in_devel_not_cran.csv | 24 - .dev/revdep_emails/shiny.semantic/email-body | 29 - .../attachments/lints_in_devel_not_cran.csv | 93 - .dev/revdep_emails/smerc/email-body | 29 - .../attachments/lints_in_devel_not_cran.csv | 3 - .../attachments/stencilaschema.warnings | 1 - .dev/revdep_emails/stencilaschema/email-body | 29 - .../attachments/lints_in_devel_not_cran.csv | 4 - .../supernova/attachments/supernova.warnings | 1 - .dev/revdep_emails/supernova/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 2 - .../attachments/lints_in_devel_not_cran.csv | 2 - .../tsviz/attachments/tsviz.warnings | 1 - .dev/revdep_emails/tsviz/email-body | 29 - .../tuber/attachments/tuber.failure | 1 - .../tuber/attachments/tuber.warnings | 1 - .dev/revdep_emails/tuber/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 5 - .../attachments/lints_in_devel_not_cran.csv | 8 - .dev/revdep_emails/unifir/email-body | 29 - .../attachments/lints_in_devel_not_cran.csv | 189 - .../upsetjs/attachments/upsetjs.warnings | 1 - .dev/revdep_emails/upsetjs/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 2 - .../attachments/lints_in_devel_not_cran.csv | 23 - .dev/revdep_emails/urlshorteneR/email-body | 29 - .dev/revdep_emails/virustotal/email-body | 29 - .../attachments/lints_in_devel_not_cran.csv | 4 - .dev/revdep_emails/wavefunction/email-body | 29 - .../attachments/lints_in_cran_not_devel.csv | 29 - .../attachments/lints_in_devel_not_cran.csv | 367 - .dev/revdep_emails/xgboost/email-body | 29 - 278 files changed, 32840 deletions(-) delete mode 100644 .dev/revdep_emails/BTYDplus/attachments/BTYDplus.warnings delete mode 100644 .dev/revdep_emails/BTYDplus/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/BTYDplus/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/BTYDplus/email-body delete mode 100644 .dev/revdep_emails/BiasCorrector/attachments/BiasCorrector.warnings delete mode 100644 .dev/revdep_emails/BiasCorrector/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/BiasCorrector/email-body delete mode 100644 .dev/revdep_emails/ConNEcT/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/ConNEcT/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/ConNEcT/email-body delete mode 100644 .dev/revdep_emails/DBItest/email-body delete mode 100644 .dev/revdep_emails/DIZtools/attachments/DIZtools.warnings delete mode 100644 .dev/revdep_emails/DIZtools/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/DIZtools/email-body delete mode 100644 .dev/revdep_emails/DIZutils/attachments/DIZutils.warnings delete mode 100644 .dev/revdep_emails/DIZutils/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/DIZutils/email-body delete mode 100644 .dev/revdep_emails/DQAgui/attachments/DQAgui.warnings delete mode 100644 .dev/revdep_emails/DQAgui/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/DQAgui/email-body delete mode 100644 .dev/revdep_emails/DataFakeR/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/DataFakeR/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/DataFakeR/email-body delete mode 100644 .dev/revdep_emails/DepthProc/attachments/DepthProc.failure delete mode 100644 .dev/revdep_emails/DepthProc/email-body delete mode 100644 .dev/revdep_emails/DominoDataCapture/email-body delete mode 100644 .dev/revdep_emails/FSelectorRcpp/attachments/FSelectorRcpp.warnings delete mode 100644 .dev/revdep_emails/FSelectorRcpp/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/FSelectorRcpp/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/FSelectorRcpp/email-body delete mode 100644 .dev/revdep_emails/INSPECTumours/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/INSPECTumours/email-body delete mode 100644 .dev/revdep_emails/NHSRplotthedots/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/NHSRplotthedots/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/NHSRplotthedots/email-body delete mode 100644 .dev/revdep_emails/OpenML/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/OpenML/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/OpenML/email-body delete mode 100644 .dev/revdep_emails/PWFSLSmoke/attachments/PWFSLSmoke.warnings delete mode 100644 .dev/revdep_emails/PWFSLSmoke/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/PWFSLSmoke/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/PWFSLSmoke/email-body delete mode 100644 .dev/revdep_emails/Plasmidprofiler/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/Plasmidprofiler/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/Plasmidprofiler/email-body delete mode 100644 .dev/revdep_emails/PosteriorBootstrap/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/PosteriorBootstrap/email-body delete mode 100644 .dev/revdep_emails/RSQL/attachments/RSQL.warnings delete mode 100644 .dev/revdep_emails/RSQL/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/RSQL/email-body delete mode 100644 .dev/revdep_emails/RestRserve/attachments/RestRserve.failure delete mode 100644 .dev/revdep_emails/RestRserve/attachments/RestRserve.warnings delete mode 100644 .dev/revdep_emails/RestRserve/email-body delete mode 100644 .dev/revdep_emails/SamplerCompare/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/SamplerCompare/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/SamplerCompare/email-body delete mode 100644 .dev/revdep_emails/TDA/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/TDA/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/TDA/email-body delete mode 100644 .dev/revdep_emails/WikidataQueryServiceR/attachments/WikidataQueryServiceR.warnings delete mode 100644 .dev/revdep_emails/WikidataQueryServiceR/email-body delete mode 100644 .dev/revdep_emails/WoodburyMatrix/attachments/WoodburyMatrix.warnings delete mode 100644 .dev/revdep_emails/WoodburyMatrix/email-body delete mode 100644 .dev/revdep_emails/abbyyR/email-body delete mode 100644 .dev/revdep_emails/adaptalint/email-body delete mode 100644 .dev/revdep_emails/admiral/attachments/admiral.warnings delete mode 100644 .dev/revdep_emails/admiral/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/admiral/email-body delete mode 100644 .dev/revdep_emails/autoharp/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/autoharp/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/autoharp/email-body delete mode 100644 .dev/revdep_emails/aws.alexa/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/aws.alexa/email-body delete mode 100644 .dev/revdep_emails/babette/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/babette/email-body delete mode 100644 .dev/revdep_emails/beautier/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/beautier/email-body delete mode 100644 .dev/revdep_emails/biolink/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/biolink/email-body delete mode 100644 .dev/revdep_emails/caretEnsemble/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/caretEnsemble/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/caretEnsemble/email-body delete mode 100644 .dev/revdep_emails/cattonum/attachments/cattonum.warnings delete mode 100644 .dev/revdep_emails/cattonum/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/cattonum/email-body delete mode 100644 .dev/revdep_emails/cleaR/attachments/cleaR.warnings delete mode 100644 .dev/revdep_emails/cleaR/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/cleaR/email-body delete mode 100644 .dev/revdep_emails/cloudos/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/cloudos/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/cloudos/email-body delete mode 100644 .dev/revdep_emails/cmstatr/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/cmstatr/email-body delete mode 100644 .dev/revdep_emails/connectwidgets/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/connectwidgets/email-body delete mode 100644 .dev/revdep_emails/crunch/attachments/crunch.warnings delete mode 100644 .dev/revdep_emails/crunch/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/crunch/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/crunch/email-body delete mode 100644 .dev/revdep_emails/dampack/attachments/dampack.warnings delete mode 100644 .dev/revdep_emails/dampack/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/dampack/email-body delete mode 100644 .dev/revdep_emails/dashboardthemes/attachments/dashboardthemes.warnings delete mode 100644 .dev/revdep_emails/dashboardthemes/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/dashboardthemes/email-body delete mode 100644 .dev/revdep_emails/dat/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/dat/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/dat/email-body delete mode 100644 .dev/revdep_emails/datarobot/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/datarobot/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/datarobot/email-body delete mode 100644 .dev/revdep_emails/datastructures/attachments/datastructures.failure delete mode 100644 .dev/revdep_emails/datastructures/email-body delete mode 100644 .dev/revdep_emails/describer/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/describer/email-body delete mode 100644 .dev/revdep_emails/devtools/email-body delete mode 100644 .dev/revdep_emails/diffusr/attachments/diffusr.failure delete mode 100644 .dev/revdep_emails/diffusr/email-body delete mode 100644 .dev/revdep_emails/dittodb/attachments/dittodb.warnings delete mode 100644 .dev/revdep_emails/dittodb/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/dittodb/email-body delete mode 100644 .dev/revdep_emails/dupree/attachments/dupree.warnings delete mode 100644 .dev/revdep_emails/dupree/email-body delete mode 100644 .dev/revdep_emails/dyn.log/attachments/dyn.log.warnings delete mode 100644 .dev/revdep_emails/dyn.log/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/dyn.log/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/dyn.log/email-body delete mode 100644 .dev/revdep_emails/edgarWebR/attachments/edgarWebR.warnings delete mode 100644 .dev/revdep_emails/edgarWebR/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/edgarWebR/email-body delete mode 100644 .dev/revdep_emails/emayili/attachments/emayili.warnings delete mode 100644 .dev/revdep_emails/emayili/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/emayili/email-body delete mode 100644 .dev/revdep_emails/epigraphdb/attachments/epigraphdb.warnings delete mode 100644 .dev/revdep_emails/epigraphdb/email-body delete mode 100644 .dev/revdep_emails/fakemake/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/fakemake/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/fakemake/email-body delete mode 100644 .dev/revdep_emails/fixtuRes/attachments/fixtuRes.warnings delete mode 100644 .dev/revdep_emails/fixtuRes/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/fixtuRes/email-body delete mode 100644 .dev/revdep_emails/fst/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/fst/email-body delete mode 100644 .dev/revdep_emails/fstcore/email-body delete mode 100644 .dev/revdep_emails/geofacet/email-body delete mode 100644 .dev/revdep_emails/geogrid/email-body delete mode 100644 .dev/revdep_emails/ggRandomForests/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/ggRandomForests/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/ggRandomForests/email-body delete mode 100644 .dev/revdep_emails/ggcharts/attachments/ggcharts.warnings delete mode 100644 .dev/revdep_emails/ggcharts/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/ggcharts/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/ggcharts/email-body delete mode 100644 .dev/revdep_emails/ggfortify/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/ggfortify/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/ggfortify/email-body delete mode 100644 .dev/revdep_emails/ggthemes/attachments/ggthemes.warnings delete mode 100644 .dev/revdep_emails/ggthemes/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/ggthemes/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/ggthemes/email-body delete mode 100644 .dev/revdep_emails/healthcareai/attachments/healthcareai.warnings delete mode 100644 .dev/revdep_emails/healthcareai/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/healthcareai/email-body delete mode 100644 .dev/revdep_emails/i18n/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/i18n/email-body delete mode 100644 .dev/revdep_emails/jpmesh/attachments/jpmesh.warnings delete mode 100644 .dev/revdep_emails/jpmesh/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/jpmesh/email-body delete mode 100644 .dev/revdep_emails/languageserver/attachments/languageserver.warnings delete mode 100644 .dev/revdep_emails/languageserver/email-body delete mode 100644 .dev/revdep_emails/latrend/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/latrend/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/latrend/email-body delete mode 100644 .dev/revdep_emails/lifecycle/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/lifecycle/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/lifecycle/email-body delete mode 100644 .dev/revdep_emails/lightgbm/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/lightgbm/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/lightgbm/email-body delete mode 100644 .dev/revdep_emails/mlflow/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/mlflow/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/mlflow/attachments/mlflow.warnings delete mode 100644 .dev/revdep_emails/mlflow/email-body delete mode 100644 .dev/revdep_emails/mlr/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/mlr/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/mlr/attachments/mlr.warnings delete mode 100644 .dev/revdep_emails/mlr/email-body delete mode 100644 .dev/revdep_emails/mlrCPO/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/mlrCPO/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/mlrCPO/email-body delete mode 100644 .dev/revdep_emails/modules/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/modules/attachments/modules.warnings delete mode 100644 .dev/revdep_emails/modules/email-body delete mode 100644 .dev/revdep_emails/nLTT/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/nLTT/email-body delete mode 100644 .dev/revdep_emails/newsmd/email-body delete mode 100644 .dev/revdep_emails/openbankeR/attachments/openbankeR.warnings delete mode 100644 .dev/revdep_emails/openbankeR/email-body delete mode 100644 .dev/revdep_emails/osfr/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/osfr/attachments/osfr.warnings delete mode 100644 .dev/revdep_emails/osfr/email-body delete mode 100644 .dev/revdep_emails/packager/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/packager/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/packager/attachments/packager.warnings delete mode 100644 .dev/revdep_emails/packager/email-body delete mode 100644 .dev/revdep_emails/physiology/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/physiology/attachments/physiology.warnings delete mode 100644 .dev/revdep_emails/physiology/email-body delete mode 100644 .dev/revdep_emails/precommit/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/precommit/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/precommit/email-body delete mode 100644 .dev/revdep_emails/prettyB/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/prettyB/attachments/prettyB.warnings delete mode 100644 .dev/revdep_emails/prettyB/email-body delete mode 100644 .dev/revdep_emails/rBiasCorrection/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/rBiasCorrection/attachments/rBiasCorrection.warnings delete mode 100644 .dev/revdep_emails/rBiasCorrection/email-body delete mode 100644 .dev/revdep_emails/rasterpdf/email-body delete mode 100644 .dev/revdep_emails/rbokeh/email-body delete mode 100644 .dev/revdep_emails/rde/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/rde/email-body delete mode 100644 .dev/revdep_emails/rdomains/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/rdomains/email-body delete mode 100644 .dev/revdep_emails/requiRements/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/requiRements/attachments/requiRements.warnings delete mode 100644 .dev/revdep_emails/requiRements/email-body delete mode 100644 .dev/revdep_emails/rhino/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/rhino/attachments/rhino.warnings delete mode 100644 .dev/revdep_emails/rhino/email-body delete mode 100644 .dev/revdep_emails/rnrfa/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/rnrfa/email-body delete mode 100644 .dev/revdep_emails/roadoi/email-body delete mode 100644 .dev/revdep_emails/scriptexec/attachments/scriptexec.warnings delete mode 100644 .dev/revdep_emails/scriptexec/email-body delete mode 100644 .dev/revdep_emails/secuTrialR/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/secuTrialR/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/secuTrialR/email-body delete mode 100644 .dev/revdep_emails/semantic.dashboard/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/semantic.dashboard/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/semantic.dashboard/email-body delete mode 100644 .dev/revdep_emails/shiny.info/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/shiny.info/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/shiny.info/email-body delete mode 100644 .dev/revdep_emails/shiny.react/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/shiny.react/email-body delete mode 100644 .dev/revdep_emails/shiny.semantic/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/shiny.semantic/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/shiny.semantic/email-body delete mode 100644 .dev/revdep_emails/smerc/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/smerc/email-body delete mode 100644 .dev/revdep_emails/stencilaschema/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/stencilaschema/attachments/stencilaschema.warnings delete mode 100644 .dev/revdep_emails/stencilaschema/email-body delete mode 100644 .dev/revdep_emails/supernova/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/supernova/attachments/supernova.warnings delete mode 100644 .dev/revdep_emails/supernova/email-body delete mode 100644 .dev/revdep_emails/tsviz/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/tsviz/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/tsviz/attachments/tsviz.warnings delete mode 100644 .dev/revdep_emails/tsviz/email-body delete mode 100644 .dev/revdep_emails/tuber/attachments/tuber.failure delete mode 100644 .dev/revdep_emails/tuber/attachments/tuber.warnings delete mode 100644 .dev/revdep_emails/tuber/email-body delete mode 100644 .dev/revdep_emails/unifir/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/unifir/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/unifir/email-body delete mode 100644 .dev/revdep_emails/upsetjs/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/upsetjs/attachments/upsetjs.warnings delete mode 100644 .dev/revdep_emails/upsetjs/email-body delete mode 100644 .dev/revdep_emails/urlshorteneR/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/urlshorteneR/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/urlshorteneR/email-body delete mode 100644 .dev/revdep_emails/virustotal/email-body delete mode 100644 .dev/revdep_emails/wavefunction/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/wavefunction/email-body delete mode 100644 .dev/revdep_emails/xgboost/attachments/lints_in_cran_not_devel.csv delete mode 100644 .dev/revdep_emails/xgboost/attachments/lints_in_devel_not_cran.csv delete mode 100644 .dev/revdep_emails/xgboost/email-body diff --git a/.dev/revdep_emails/BTYDplus/attachments/BTYDplus.warnings b/.dev/revdep_emails/BTYDplus/attachments/BTYDplus.warnings deleted file mode 100644 index 2043731ef..000000000 --- a/.dev/revdep_emails/BTYDplus/attachments/BTYDplus.warnings +++ /dev/null @@ -1,2 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Trying to remove β€˜multiple_dots_linter’ and β€˜camel_case_linter’, which are not in `defaults`. diff --git a/.dev/revdep_emails/BTYDplus/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/BTYDplus/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index ec2a8edb8..000000000 --- a/.dev/revdep_emails/BTYDplus/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,11 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/helpers.R",72,13,"style","Variable and function name style should be snake_case."," elog_dt[, N := .N, by = ""cust""]","object_name_linter" -"R/helpers.R",399,26,"style","Variable and function name style should be snake_case."," grid <- grid[is.na(N), N := 0L]","object_name_linter" -"tests/testthat/test-bg-cnbd-k.R",76,7,"style","Variable and function name style should be snake_case."," cbs$x.est32 <- bgcnbd.ConditionalExpectedTransactions(params, 32, cbs$x, cbs$t.x, cbs$T.cal)","object_name_linter" -"tests/testthat/test-bg-cnbd-k.R",77,7,"style","Variable and function name style should be snake_case."," cbs$x.est64 <- bgcnbd.ConditionalExpectedTransactions(params, 64, cbs$x, cbs$t.x, cbs$T.cal)","object_name_linter" -"tests/testthat/test-mbg-cnbd-k.R",28,7,"style","Variable and function name style should be snake_case."," cbs$x.est <- mbgcnbd.ConditionalExpectedTransactions(params, cbs$T.star, cbs$x, cbs$t.x, cbs$T.cal)","object_name_linter" -"tests/testthat/test-mbg-cnbd-k.R",67,9,"style","Variable and function name style should be snake_case."," cbs$x.est <- mbgcnbd.ConditionalExpectedTransactions(params, cbs$T.star, cbs$x, cbs$t.x, cbs$T.cal)","object_name_linter" -"tests/testthat/test-nbd.R",18,7,"style","Variable and function name style should be snake_case."," cbs$x.est <- nbd.ConditionalExpectedTransactions(params, cbs$T.star, cbs$x, cbs$T.cal)","object_name_linter" -"tests/testthat/test-pareto-ggg-mcmc.R",49,7,"style","Variable and function name style should be snake_case."," cbs$x.est <- apply(xstar, 2, mean)","object_name_linter" -"tests/testthat/test-pareto-nbd-abe.R",76,7,"style","Variable and function name style should be snake_case."," cbs$x.est <- apply(xstar, 2, mean)","object_name_linter" -"tests/testthat/test-pareto-nbd-mcmc.R",79,7,"style","Variable and function name style should be snake_case."," cbs$x.est <- apply(xstar, 2, mean)","object_name_linter" diff --git a/.dev/revdep_emails/BTYDplus/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/BTYDplus/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index fb5385eb6..000000000 --- a/.dev/revdep_emails/BTYDplus/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,227 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"demo/cdnow.R",3,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog <- read.csv(system.file(""data/cdnowElog.csv"", package = ""BTYD""),","object_name_linter" -"demo/cdnow.R",6,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog$date <- as.Date(as.character(cdnowElog$date), format = ""%Y%m%d"")","object_name_linter" -"demo/cdnow.R",22,2,"style","Variable and function name style should be snake_case or symbols.","(params.nbd <- nbd.EstimateParameters(cbs))","object_name_linter" -"demo/cdnow.R",38,2,"style","Variable and function name style should be snake_case or symbols.","(params.mbgcnbd <- mbgcnbd.EstimateParameters(cbs))","object_name_linter" -"demo/cdnow.R",65,1,"style","Variable and function name style should be snake_case or symbols.","params.pnbd <- BTYD::pnbd.EstimateParameters(cbs) # estimate Pareto/NBD","object_name_linter" -"demo/cdnow.R",66,1,"style","Variable and function name style should be snake_case or symbols.","params.bgcnbd <- bgcnbd.EstimateParameters(cbs) # estimate BG/CNBD-k","object_name_linter" -"demo/cdnow.R",111,33,"style","Put spaces around all infix operators."," ""BIAS"" = function(a, f) sum(f)/sum(a) - 1)","infix_spaces_linter" -"demo/cdnow.R",137,1,"style","Variable and function name style should be snake_case or symbols.","spend.params <- BTYD::spend.EstimateParameters(cbs$sales.avg, cbs$x + 1)","object_name_linter" -"demo/mbg-cnbd-k.R",14,2,"style","Variable and function name style should be snake_case or symbols.","(k.est <- estimateRegularity(groceryElog))","object_name_linter" -"demo/mbg-cnbd-k.R",24,2,"style","Variable and function name style should be snake_case or symbols.","(params.mbgcnbd <- mbgcnbd.EstimateParameters(cbs))","object_name_linter" -"demo/mbg-cnbd-k.R",51,1,"style","Variable and function name style should be snake_case or symbols.","params.nbd <- nbd.EstimateParameters(cbs) # estimate NBD","object_name_linter" -"demo/mbg-cnbd-k.R",52,1,"style","Variable and function name style should be snake_case or symbols.","params.pnbd <- BTYD::pnbd.EstimateParameters(cbs) # estimate Pareto/NBD","object_name_linter" -"demo/mbg-cnbd-k.R",53,1,"style","Variable and function name style should be snake_case or symbols.","params.bgnbd <- BTYD::bgnbd.EstimateParameters(cbs) # estimate BG/NBD","object_name_linter" -"demo/mbg-cnbd-k.R",54,1,"style","Variable and function name style should be snake_case or symbols.","params.mbgnbd <- mbgnbd.EstimateParameters(cbs) # estimate MBG/NBD","object_name_linter" -"demo/mbg-cnbd-k.R",79,33,"style","Put spaces around all infix operators."," ""BIAS"" = function(a, f) sum(f)/sum(a) - 1)","infix_spaces_linter" -"demo/mbg-cnbd-k.R",107,1,"style","Variable and function name style should be snake_case or symbols.","T.tot <- max(cbs$T.cal+cbs$T.star)","object_name_linter" -"demo/mbg-cnbd-k.R",107,23,"style","Put spaces around all infix operators.","T.tot <- max(cbs$T.cal+cbs$T.star)","infix_spaces_linter" -"demo/pareto-abe.R",3,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog <- read.csv(system.file(""data/cdnowElog.csv"", package = ""BTYD""),","object_name_linter" -"demo/pareto-abe.R",6,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog$date <- as.Date(as.character(cdnowElog$date), format = ""%Y%m%d"")","object_name_linter" -"demo/pareto-abe.R",18,1,"style","Variable and function name style should be snake_case or symbols.","draws.m1 <- abe.mcmc.DrawParameters(","object_name_linter" -"demo/pareto-abe.R",34,1,"style","Variable and function name style should be snake_case or symbols.","draws.m2 <- abe.mcmc.DrawParameters(","object_name_linter" -"demo/pareto-abe.R",52,1,"style","Variable and function name style should be snake_case or symbols.","xstar.m1.draws <- mcmc.DrawFutureTransactions(cbs, draws.m1, T.star = cbs$T.star)","object_name_linter" -"demo/pareto-abe.R",53,1,"style","Variable and function name style should be snake_case or symbols.","xstar.m2.draws <- mcmc.DrawFutureTransactions(cbs, draws.m2, T.star = cbs$T.star)","object_name_linter" -"demo/pareto-ggg.R",16,1,"style","Variable and function name style should be snake_case or symbols.","pnbd.draws <- pnbd.mcmc.DrawParameters(cal.cbs = cbs, mc.cores = 1)","object_name_linter" -"demo/pareto-ggg.R",20,1,"style","Variable and function name style should be snake_case or symbols.","pggg.draws <- pggg.mcmc.DrawParameters(cal.cbs = cbs,","object_name_linter" -"demo/pareto-ggg.R",24,25,"style","Put spaces around all infix operators.","round(rbind(`Pareto/GGG`= summary(pggg.draws$level_2)$quantiles[, ""50%""],","infix_spaces_linter" -"demo/pareto-ggg.R",41,1,"style","Variable and function name style should be snake_case or symbols.","xstar.pnbd.draws <- mcmc.DrawFutureTransactions(cbs, pnbd.draws, T.star = cbs$T.star, sample_size = 400)","object_name_linter" -"demo/pareto-ggg.R",42,1,"style","Variable and function name style should be snake_case or symbols.","xstar.pggg.draws <- mcmc.DrawFutureTransactions(cbs, pggg.draws, T.star = cbs$T.star, sample_size = 400)","object_name_linter" -"demo/pareto-ggg.R",59,20,"style","Put spaces around all infix operators.","(lift <- 1 - mae[1]/mae[2])","infix_spaces_linter" -"R/helpers.R",58,32,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!""date"" %in% names(elog) & !""t"" %in% names(elog))","vector_logic_linter" -"R/helpers.R",179,3,"style","Variable and function name style should be snake_case or symbols."," T.0 <- min(elog_dt$t)","object_name_linter" -"R/helpers.R",181,5,"style","Variable and function name style should be snake_case or symbols."," T.cal <- max(elog_dt$t)","object_name_linter" -"R/helpers.R",183,5,"style","Variable and function name style should be snake_case or symbols."," T.cal <- as.numeric(as.Date(T.cal))","object_name_linter" -"R/helpers.R",186,5,"style","Variable and function name style should be snake_case or symbols."," T.tot <- max(elog_dt$t)","object_name_linter" -"R/helpers.R",188,5,"style","Variable and function name style should be snake_case or symbols."," T.tot <- as.numeric(as.Date(T.tot))","object_name_linter" -"R/helpers.R",293,32,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (""sales"" %in% names(elog) & !is.numeric(elog$sales)) stop(""`sales` field must be numeric"")","vector_logic_linter" -"R/helpers.R",295,23,"style","Variable and function name style should be snake_case or symbols."," if (is.null(T.cal)) T.cal <- max(elog$date)","object_name_linter" -"R/helpers.R",296,23,"style","Variable and function name style should be snake_case or symbols."," if (is.null(T.tot)) T.tot <- max(elog$date)","object_name_linter" -"R/helpers.R",297,28,"style","Variable and function name style should be snake_case or symbols."," if (is.character(T.cal)) T.cal <- if (class(elog$date)[1] == ""Date"") as.Date(T.cal) else as.POSIXct(T.cal)","object_name_linter" -"R/helpers.R",298,28,"style","Variable and function name style should be snake_case or symbols."," if (is.character(T.tot)) T.tot <- if (class(elog$date)[1] == ""Date"") as.Date(T.tot) else as.POSIXct(T.tot)","object_name_linter" -"R/helpers.R",299,22,"style","Variable and function name style should be snake_case or symbols."," if (T.tot < T.cal) T.tot <- T.cal","object_name_linter" -"R/helpers.R",460,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(legend) & length(legend) == 2) {","vector_logic_linter" -"R/helpers.R",475,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(x) != length(actual) | length(x) != length(expected) |","vector_logic_linter" -"R/helpers.R",475,67,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(x) != length(actual) | length(x) != length(expected) |","vector_logic_linter" -"R/helpers.R",476,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !is.numeric(x) | !is.numeric(actual) | !is.numeric(expected) |","vector_logic_linter" -"R/helpers.R",476,44,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !is.numeric(x) | !is.numeric(actual) | !is.numeric(expected) |","vector_logic_linter" -"R/helpers.R",476,68,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !is.numeric(x) | !is.numeric(actual) | !is.numeric(expected) |","vector_logic_linter" -"R/helpers.R",477,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," any(x < 0) | any(actual < 0) | any(expected < 0))","vector_logic_linter" -"R/helpers.R",477,36,"warning","Conditional expressions require scalar logical operators (&& and ||)"," any(x < 0) | any(actual < 0) | any(expected < 0))","vector_logic_linter" -"R/helpers.R",488,3,"style","Variable and function name style should be snake_case or symbols."," col.names <- paste(rep(""freq"", length(censor + 1)), (0:censor), sep = ""."")","object_name_linter" -"R/helpers.R",489,3,"style","Variable and function name style should be snake_case or symbols."," col.names[censor + 1] <- paste0(col.names[censor + 1], ""+"")","object_name_linter" -"R/helpers.R",496,7,"style","Variable and function name style should be snake_case or symbols."," x.labels[censor + 1] <- paste0(censor, ""+"")","object_name_linter" -"R/helpers.R",518,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(t.x) != length(actual) | length(t.x) != length(expected) |","vector_logic_linter" -"R/helpers.R",518,71,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(t.x) != length(actual) | length(t.x) != length(expected) |","vector_logic_linter" -"R/helpers.R",519,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !is.numeric(t.x) | !is.numeric(actual) | !is.numeric(expected) |","vector_logic_linter" -"R/helpers.R",519,46,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !is.numeric(t.x) | !is.numeric(actual) | !is.numeric(expected) |","vector_logic_linter" -"R/helpers.R",519,70,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !is.numeric(t.x) | !is.numeric(actual) | !is.numeric(expected) |","vector_logic_linter" -"R/helpers.R",520,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," any(t.x < 0) | any(actual < 0) | any(expected < 0))","vector_logic_linter" -"R/helpers.R",520,38,"warning","Conditional expressions require scalar logical operators (&& and ||)"," any(t.x < 0) | any(actual < 0) | any(expected < 0))","vector_logic_linter" -"R/mbg-cnbd-k.R",78,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(k) & !""litt"" %in% colnames(cal.cbs))","vector_logic_linter" -"R/mbg-cnbd-k.R",96,7,"style","Variable and function name style should be snake_case or symbols."," LL[k] <- xbgcnbd.cbs.LL(params = params[[k]], cal.cbs = cal.cbs, dropout_at_zero = dropout_at_zero)","object_name_linter" -"R/mbg-cnbd-k.R",107,5,"style","Variable and function name style should be snake_case or symbols."," cal.cbs[, ""litt""] <- 0","object_name_linter" -"R/mbg-cnbd-k.R",116,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (trace > 0 & count %% trace == 0) {","vector_logic_linter" -"R/mbg-cnbd-k.R",129,3,"style","Variable and function name style should be snake_case or symbols."," estimated.params[estimated.params > max.param.value] <- max.param.value","object_name_linter" -"R/mbg-cnbd-k.R",131,9,"style","Variable and function name style should be snake_case or symbols."," names(estimated.params) <- c(""k"", ""r"", ""alpha"", ""a"", ""b"")","object_name_linter" -"R/mbg-cnbd-k.R",191,12,"style","Variable and function name style should be snake_case or symbols."," tryCatch(T.cal <- cal.cbs$T.cal,","object_name_linter" -"R/mbg-cnbd-k.R",194,13,"style","Any function spanning multiple lines should use curly braces."," error = function(e) stop(""cal.cbs must have a column for "",","brace_linter" -"R/mbg-cnbd-k.R",204,3,"style","Variable and function name style should be snake_case or symbols."," max.length <- max(length(x), length(t.x), length(T.cal))","object_name_linter" -"R/mbg-cnbd-k.R",214,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (params[1] != floor(params[1]) | params[1] < 1)","vector_logic_linter" -"R/mbg-cnbd-k.R",224,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = max.length)","object_name_linter" -"R/mbg-cnbd-k.R",293,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (params[1] != floor(params[1]) | params[1] < 1)","vector_logic_linter" -"R/mbg-cnbd-k.R",412,3,"style","Variable and function name style should be snake_case or symbols."," max.length <- max(length(x), length(t.x), length(T.cal))","object_name_linter" -"R/mbg-cnbd-k.R",420,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (params[1] != floor(params[1]) | params[1] < 1)","vector_logic_linter" -"R/mbg-cnbd-k.R",430,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = max.length)","object_name_linter" -"R/mbg-cnbd-k.R",501,3,"style","Variable and function name style should be snake_case or symbols."," max.length <- max(length(T.star), length(x), length(t.x), length(T.cal))","object_name_linter" -"R/mbg-cnbd-k.R",511,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (params[1] != floor(params[1]) | params[1] < 1)","vector_logic_linter" -"R/mbg-cnbd-k.R",523,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = max.length)","object_name_linter" -"R/mbg-cnbd-k.R",524,3,"style","Variable and function name style should be snake_case or symbols."," T.star <- rep(T.star, length.out = max.length)","object_name_linter" -"R/mbg-cnbd-k.R",565,5,"style","Variable and function name style should be snake_case or symbols."," sum.cal <- sum(xbgcnbd.Expectation(params = params, t = T.cal, dropout_at_zero = dropout_at_zero))","object_name_linter" -"R/mbg-cnbd-k.R",566,5,"style","Variable and function name style should be snake_case or symbols."," sum.tot <- sum(xbgcnbd.Expectation(params = params, t = T.cal + T.star, dropout_at_zero = dropout_at_zero))","object_name_linter" -"R/mbg-cnbd-k.R",628,12,"style","Variable and function name style should be snake_case or symbols."," tryCatch(T.cal <- cal.cbs$T.cal,","object_name_linter" -"R/mbg-cnbd-k.R",1016,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (params[1] != floor(params[1]) | params[1] < 1)","vector_logic_linter" -"R/mbg-cnbd-k.R",1027,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = n)","object_name_linter" -"R/mbg-cnbd-k.R",1028,3,"style","Variable and function name style should be snake_case or symbols."," T.zero <- T.cal.fix - T.cal","object_name_linter" -"R/mbg-cnbd-k.R",1029,3,"style","Variable and function name style should be snake_case or symbols."," date.zero <- as.POSIXct(date.zero)","object_name_linter" -"R/mbg-cnbd-k.R",1058,3,"style","Variable and function name style should be snake_case or symbols."," date.cal <- date.zero + T.cal.fix * 3600 * 24 * 7","object_name_linter" -"R/mbg-cnbd-k.R",1059,3,"style","Variable and function name style should be snake_case or symbols."," date.tot <- date.cal + T.star * 3600 * 24 * 7","object_name_linter" -"R/mcmc.R",67,5,"style","Variable and function name style should be snake_case or symbols."," T.star <- rep(T.star, nr_of_cust)","object_name_linter" -"R/mcmc.R",109,7,"style","Variable and function name style should be snake_case or symbols."," x.stars[draw, cust] <- sum(cumsum(itts) < minT)","object_name_linter" -"R/mcmc.R",114,7,"style","Variable and function name style should be snake_case or symbols."," x.stars[!alive, cust] <- 0","object_name_linter" -"R/mcmc.R",154,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (burnin < start(draws$level_2) | burnin > end(draws$level_2))","vector_logic_linter" -"R/mcmc.R",183,86,"style","Use FALSE instead of the symbol F."," plot(spls.x, spls.y, typ = ""b"", xlim = c(0, 1), ylim = c(0, 1), frame = 0, axes = F,","T_and_F_symbol_linter" -"R/mcmc.R",364,11,"style","Variable and function name style should be snake_case or symbols."," names(uEs) <- unique(t)","object_name_linter" -"R/nbd.R",30,3,"style","Variable and function name style should be snake_case or symbols."," estimated.params[estimated.params > max.param.value] <- max.param.value","object_name_linter" -"R/nbd.R",31,9,"style","Variable and function name style should be snake_case or symbols."," names(estimated.params) <- c(""r"", ""alpha"")","object_name_linter" -"R/nbd.R",53,12,"style","Variable and function name style should be snake_case or symbols."," tryCatch(T.cal <- cal.cbs$T.cal,","object_name_linter" -"R/nbd.R",70,3,"style","Variable and function name style should be snake_case or symbols."," max.length <- max(length(x), length(T.cal))","object_name_linter" -"R/nbd.R",81,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = max.length)","object_name_linter" -"R/nbd.R",116,3,"style","Variable and function name style should be snake_case or symbols."," max.length <- max(length(T.star), length(x), length(T.cal))","object_name_linter" -"R/nbd.R",130,3,"style","Variable and function name style should be snake_case or symbols."," T.star <- rep(T.star, length.out = max.length)","object_name_linter" -"R/nbd.R",132,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = max.length)","object_name_linter" -"R/nbd.R",164,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = n)","object_name_linter" -"R/nbd.R",165,3,"style","Variable and function name style should be snake_case or symbols."," T.zero <- T.cal.fix - T.cal","object_name_linter" -"R/nbd.R",166,3,"style","Variable and function name style should be snake_case or symbols."," date.zero <- as.POSIXct(date.zero)","object_name_linter" -"R/nbd.R",188,3,"style","Variable and function name style should be snake_case or symbols."," date.cal <- date.zero + T.cal.fix * 3600 * 24 * 7","object_name_linter" -"R/nbd.R",189,3,"style","Variable and function name style should be snake_case or symbols."," date.tot <- date.cal + T.star * 3600 * 24 * 7","object_name_linter" -"R/pareto-ggg-mcmc.R",300,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = n)","object_name_linter" -"R/pareto-ggg-mcmc.R",301,3,"style","Variable and function name style should be snake_case or symbols."," T.zero <- T.cal.fix - T.cal","object_name_linter" -"R/pareto-ggg-mcmc.R",302,3,"style","Variable and function name style should be snake_case or symbols."," date.zero <- as.POSIXct(date.zero)","object_name_linter" -"R/pareto-ggg-mcmc.R",348,3,"style","Variable and function name style should be snake_case or symbols."," date.cal <- date.zero + T.cal.fix * 3600 * 24 * 7","object_name_linter" -"R/pareto-ggg-mcmc.R",349,3,"style","Variable and function name style should be snake_case or symbols."," date.tot <- date.cal + T.star * 3600 * 24 * 7","object_name_linter" -"R/pareto-nbd-abe.R",228,3,"style","Variable and function name style should be snake_case or symbols."," cal.cbs[, ""intercept""] <- 1","object_name_linter" -"R/pareto-nbd-abe.R",283,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(T.cal, length.out = n)","object_name_linter" -"R/pareto-nbd-abe.R",284,3,"style","Variable and function name style should be snake_case or symbols."," T.zero <- T.cal.fix - T.cal","object_name_linter" -"R/pareto-nbd-abe.R",285,3,"style","Variable and function name style should be snake_case or symbols."," date.zero <- as.POSIXct(date.zero)","object_name_linter" -"R/pareto-nbd-abe.R",297,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(colnames(covars)) & ncol(covars) > 1)","vector_logic_linter" -"R/pareto-nbd-abe.R",340,3,"style","Variable and function name style should be snake_case or symbols."," date.cal <- date.zero + T.cal.fix * 3600 * 24 * 7","object_name_linter" -"R/pareto-nbd-abe.R",341,3,"style","Variable and function name style should be snake_case or symbols."," date.tot <- date.cal + T.star * 3600 * 24 * 7","object_name_linter" -"R/pareto-nbd-mcmc.R",74,5,"style","Variable and function name style should be snake_case or symbols."," T.cal <- data$T.cal","object_name_linter" -"tests/testthat/test-bg-cnbd-k.R",9,3,"style","Variable and function name style should be snake_case or symbols."," date.zero <- ""2010-01-01""","object_name_linter" -"tests/testthat/test-elog2cbs.R",11,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- Sys.Date() + 21","object_name_linter" -"tests/testthat/test-elog2cbs.R",12,3,"style","Variable and function name style should be snake_case or symbols."," T.tot <- Sys.Date() + 30","object_name_linter" -"tests/testthat/test-pareto-nbd-abe.R",67,52,"style","Use TRUE instead of the symbol T."," expect_equal(matrix(est[1:6], ncol = 2, byrow = T), params$beta, tolerance = 0.05)","T_and_F_symbol_linter" -"tests/testthat/test-pareto-nbd-mcmc.R",8,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- c(26, 26, 28.5, 52, 52)","object_name_linter" -"tests/testthat/test-pareto-nbd-mcmc.R",9,3,"style","Variable and function name style should be snake_case or symbols."," T.star <- 52","object_name_linter" -"tests/testthat/test-pareto-nbd-mcmc.R",10,3,"style","Variable and function name style should be snake_case or symbols."," date.zero <- ""2010-01-01""","object_name_linter" -"tests/testthat/test-pareto-nbd-mcmc.R",24,3,"style","Variable and function name style should be snake_case or symbols."," date.zero <- min(sim_elog$date)","object_name_linter" -"tests/testthat/test-pareto-nbd-mcmc.R",40,3,"style","Variable and function name style should be snake_case or symbols."," T.cal <- rep(52, n)","object_name_linter" -"tests/testthat/test-pareto-nbd-mcmc.R",43,3,"style","Variable and function name style should be snake_case or symbols."," T.cal[n] <- 52","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",76,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog <- read.csv(system.file(""data/cdnowElog.csv"", package = ""BTYD""),","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",79,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog$date <- as.Date(as.character(cdnowElog$date), format = ""%Y%m%d"")","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",132,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS <- elog2cbs(groceryElog, T.cal = ""2006-12-31"")","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",145,2,"style","Variable and function name style should be snake_case or symbols.","(k.wheat <- estimateRegularity(groceryElog, method = ""wheat"", ","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",145,62,"style","Trailing whitespace is superfluous.","(k.wheat <- estimateRegularity(groceryElog, method = ""wheat"", ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",147,2,"style","Variable and function name style should be snake_case or symbols.","(k.mle <- estimateRegularity(groceryElog, method = ""mle"", ","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",147,58,"style","Trailing whitespace is superfluous.","(k.mle <- estimateRegularity(groceryElog, method = ""mle"", ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",168,3,"style","Variable and function name style should be snake_case or symbols."," groceryCBS <- elog2cbs(groceryElog, T.cal = ""2006-12-31"")","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",171,7,"style","Variable and function name style should be snake_case or symbols.","round(params.nbd <- nbd.EstimateParameters(groceryCBS), 3)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",181,62,"style","Trailing whitespace is superfluous.","# calculate expected future transactions for customers who've ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",183,1,"style","Variable and function name style should be snake_case or symbols.","est5.nbd <- nbd.ConditionalExpectedTransactions(params.nbd, ","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",183,60,"style","Trailing whitespace is superfluous.","est5.nbd <- nbd.ConditionalExpectedTransactions(params.nbd, ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",192,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$xstar.nbd <- nbd.ConditionalExpectedTransactions(","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",193,54,"style","Trailing whitespace is superfluous."," params = params.nbd, T.star = 52, ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",196,57,"style","Trailing whitespace is superfluous.","rbind(`Actuals` = c(`Holdout` = sum(groceryCBS$x.star)), ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",212,3,"style","Variable and function name style should be snake_case or symbols."," groceryCBS <- elog2cbs(groceryElog, T.cal = ""2006-12-31"")","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",215,1,"style","Variable and function name style should be snake_case or symbols.","params.pnbd <- BTYD::pnbd.EstimateParameters(groceryCBS[, c(""x"", ""t.x"", ""T.cal"")])","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",216,7,"style","Variable and function name style should be snake_case or symbols.","names(params.pnbd) <- c(""r"", ""alpha"", ""s"", ""beta"")","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",227,62,"style","Trailing whitespace is superfluous.","# calculate expected future transactions for customers who've ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",230,1,"style","Variable and function name style should be snake_case or symbols.","est5.pnbd <- BTYD::pnbd.ConditionalExpectedTransactions(params.pnbd, ","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",230,69,"style","Trailing whitespace is superfluous.","est5.pnbd <- BTYD::pnbd.ConditionalExpectedTransactions(params.pnbd, ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",239,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$xstar.pnbd <- BTYD::pnbd.ConditionalExpectedTransactions(","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",240,56,"style","Trailing whitespace is superfluous."," params = params.pnbd, T.star = 52, ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",244,60,"style","Trailing whitespace is superfluous.","rbind(`Actuals` = c(`Holdout` = sum(groceryCBS$x.star)), ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",251,65,"style","Trailing whitespace is superfluous.","# P(alive) for customers who've had 1 to 5 transactions in first ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",253,1,"style","Variable and function name style should be snake_case or symbols.","palive.pnbd <- BTYD::pnbd.PAlive(params.pnbd, ","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",253,46,"style","Trailing whitespace is superfluous.","palive.pnbd <- BTYD::pnbd.PAlive(params.pnbd, ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",256,45,"style","Put spaces around all infix operators."," cat(""x ="", i, "":"", sprintf(""%5.2f %%"", 100*palive.pnbd[i]), ""\n"")","infix_spaces_linter" -"vignettes/BTYDplus-HowTo.Rmd",270,3,"style","Variable and function name style should be snake_case or symbols."," groceryCBS <- elog2cbs(groceryElog, T.cal = ""2006-12-31"")","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",273,1,"style","Variable and function name style should be snake_case or symbols.","params.bgnbd <- BTYD::bgnbd.EstimateParameters(groceryCBS) # BG/NBD","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",273,64,"style","Commented code should be removed.","params.bgnbd <- BTYD::bgnbd.EstimateParameters(groceryCBS) # BG/NBD","commented_code_linter" -"vignettes/BTYDplus-HowTo.Rmd",274,1,"style","Variable and function name style should be snake_case or symbols.","params.bgcnbd <- bgcnbd.EstimateParameters(groceryCBS) # BG/CNBD-k","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",274,64,"style","Commented code should be removed.","params.bgcnbd <- bgcnbd.EstimateParameters(groceryCBS) # BG/CNBD-k","commented_code_linter" -"vignettes/BTYDplus-HowTo.Rmd",275,1,"style","Variable and function name style should be snake_case or symbols.","params.mbgnbd <- mbgnbd.EstimateParameters(groceryCBS) # MBG/NBD","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",275,64,"style","Commented code should be removed.","params.mbgnbd <- mbgnbd.EstimateParameters(groceryCBS) # MBG/NBD","commented_code_linter" -"vignettes/BTYDplus-HowTo.Rmd",276,1,"style","Variable and function name style should be snake_case or symbols.","params.mbgcnbd <- mbgcnbd.EstimateParameters(groceryCBS) # MBG/CNBD-k","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",276,64,"style","Commented code should be removed.","params.mbgcnbd <- mbgcnbd.EstimateParameters(groceryCBS) # MBG/CNBD-k","commented_code_linter" -"vignettes/BTYDplus-HowTo.Rmd",277,25,"style","Variable and function name style should be snake_case or symbols.","row <- function(params, LL) { ","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",277,30,"style","Trailing whitespace is superfluous.","row <- function(params, LL) { ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",281,45,"style","Trailing whitespace is superfluous.","rbind(`BG/NBD` = row(c(1, params.bgnbd), ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",283,40,"style","Trailing whitespace is superfluous."," `BG/CNBD-k` = row(params.bgcnbd, ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",285,40,"style","Trailing whitespace is superfluous."," `MBG/NBD` = row(params.mbgnbd, ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",287,41,"style","Trailing whitespace is superfluous."," `MBG/CNBD-k` = row(params.mbgcnbd, ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",294,62,"style","Trailing whitespace is superfluous.","# calculate expected future transactions for customers who've ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",297,1,"style","Variable and function name style should be snake_case or symbols.","est5.mbgcnbd <- mbgcnbd.ConditionalExpectedTransactions(params.mbgcnbd,","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",305,65,"style","Trailing whitespace is superfluous.","# P(alive) for customers who've had 1 to 5 transactions in first ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",307,1,"style","Variable and function name style should be snake_case or symbols.","palive.mbgcnbd <- mbgcnbd.PAlive(params.mbgcnbd, ","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",307,49,"style","Trailing whitespace is superfluous.","palive.mbgcnbd <- mbgcnbd.PAlive(params.mbgcnbd, ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",310,45,"style","Put spaces around all infix operators."," cat(""x ="", i, "":"", sprintf(""%5.2f %%"", 100*palive.mbgcnbd[i]), ""\n"")","infix_spaces_linter" -"vignettes/BTYDplus-HowTo.Rmd",318,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$xstar.mbgcnbd <- mbgcnbd.ConditionalExpectedTransactions(","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",320,64,"style","Trailing whitespace is superfluous."," x = groceryCBS$x, t.x = groceryCBS$t.x, ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",342,24,"style","Put spaces around all infix operators."," stopifnot(length(act)==length(est))","infix_spaces_linter" -"vignettes/BTYDplus-HowTo.Rmd",343,14,"style","Put spaces around all infix operators."," sum(abs(act-est)) / length(act)","infix_spaces_linter" -"vignettes/BTYDplus-HowTo.Rmd",345,1,"style","Variable and function name style should be snake_case or symbols.","mae.nbd <- mae(groceryCBS$x.star, groceryCBS$xstar.nbd)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",346,1,"style","Variable and function name style should be snake_case or symbols.","mae.pnbd <- mae(groceryCBS$x.star, groceryCBS$xstar.pnbd)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",347,1,"style","Variable and function name style should be snake_case or symbols.","mae.mbgcnbd <- mae(groceryCBS$x.star, groceryCBS$xstar.mbgcnbd)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",352,60,"style","Put spaces around all infix operators.","cat(""Lift in MAE for MBG/CNBD-k vs. Pareto/NBD:"", round(100*lift, 1), ""%"")","infix_spaces_linter" -"vignettes/BTYDplus-HowTo.Rmd",372,3,"style","Variable and function name style should be snake_case or symbols."," groceryCBS <- elog2cbs(groceryElog, T.cal = ""2006-12-31"")","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",375,1,"style","Variable and function name style should be snake_case or symbols.","pnbd.draws <- pnbd.mcmc.DrawParameters(groceryCBS)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",377,1,"style","Variable and function name style should be snake_case or symbols.","pnbd.xstar.draws <- mcmc.DrawFutureTransactions(groceryCBS, pnbd.draws)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",379,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$xstar.pnbd.hb <- apply(pnbd.xstar.draws, 2, mean)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",380,3,"style","Commented code should be removed.","# P(active)","commented_code_linter" -"vignettes/BTYDplus-HowTo.Rmd",381,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$pactive.pnbd.hb <- mcmc.PActive(pnbd.xstar.draws)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",382,3,"style","Commented code should be removed.","# P(alive)","commented_code_linter" -"vignettes/BTYDplus-HowTo.Rmd",383,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$palive.pnbd.hb <- mcmc.PAlive(pnbd.draws)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",397,68,"style","Trailing whitespace is superfluous.","# convert cohort-level draws from coda::mcmc.list to a matrix, with ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",399,1,"style","Variable and function name style should be snake_case or symbols.","cohort.draws <- pnbd.draws$level_2","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",428,1,"style","Variable and function name style should be snake_case or symbols.","customer4.draws <- pnbd.draws$level_1[[customer4]]","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",463,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog <- read.csv(","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",467,1,"style","Variable and function name style should be snake_case or symbols.","cdnowElog$date <- as.Date(as.character(cdnowElog$date), ","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",467,56,"style","Trailing whitespace is superfluous.","cdnowElog$date <- as.Date(as.character(cdnowElog$date), ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",470,1,"style","Variable and function name style should be snake_case or symbols.","cdnowCbs <- elog2cbs(cdnowElog, ","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",470,32,"style","Trailing whitespace is superfluous.","cdnowCbs <- elog2cbs(cdnowElog, ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",474,1,"style","Variable and function name style should be snake_case or symbols.","draws.m1 <- abe.mcmc.DrawParameters(cdnowCbs, ","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",474,46,"style","Trailing whitespace is superfluous.","draws.m1 <- abe.mcmc.DrawParameters(cdnowCbs, ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",488,1,"style","Variable and function name style should be snake_case or symbols.","cdnowCbs <- merge(cdnowCbs, first, by = ""cust"")","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",491,1,"style","Variable and function name style should be snake_case or symbols.","draws.m2 <- abe.mcmc.DrawParameters(cdnowCbs, ","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",491,46,"style","Trailing whitespace is superfluous.","draws.m2 <- abe.mcmc.DrawParameters(cdnowCbs, ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",518,3,"style","Variable and function name style should be snake_case or symbols."," groceryCBS <- elog2cbs(groceryElog, T.cal = ""2006-12-31"")","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",521,1,"style","Variable and function name style should be snake_case or symbols.","pggg.draws <- pggg.mcmc.DrawParameters(groceryCBS) # ~2mins on 2015 MacBook Pro","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",523,1,"style","Variable and function name style should be snake_case or symbols.","pggg.xstar.draws <- mcmc.DrawFutureTransactions(groceryCBS, pggg.draws)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",525,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$xstar.pggg <- apply(pggg.xstar.draws, 2, mean)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",526,3,"style","Commented code should be removed.","# P(active)","commented_code_linter" -"vignettes/BTYDplus-HowTo.Rmd",527,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$pactive.pggg <- mcmc.PActive(pggg.xstar.draws)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",528,3,"style","Commented code should be removed.","# P(alive)","commented_code_linter" -"vignettes/BTYDplus-HowTo.Rmd",529,1,"style","Variable and function name style should be snake_case or symbols.","groceryCBS$palive.pggg <- mcmc.PAlive(pggg.draws)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",531,42,"style","Trailing whitespace is superfluous.","head(groceryCBS[, c(""x"", ""t.x"", ""x.star"", ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",543,39,"style","Trailing whitespace is superfluous.","#> t gamma r alpha s beta ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",544,39,"style","Trailing whitespace is superfluous.","#> 1.695 0.373 0.948 5.243 0.432 4.348 ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",550,36,"style","Trailing whitespace is superfluous.","#> k lambda mu tau z ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",551,37,"style","Trailing whitespace is superfluous.","#> 3.892 0.160 0.065 69.546 0.316 ","trailing_whitespace_linter" -"vignettes/BTYDplus-HowTo.Rmd",572,24,"style","Put spaces around all infix operators."," stopifnot(length(act)==length(est))","infix_spaces_linter" -"vignettes/BTYDplus-HowTo.Rmd",573,14,"style","Put spaces around all infix operators."," sum(abs(act-est)) / length(act)","infix_spaces_linter" -"vignettes/BTYDplus-HowTo.Rmd",575,1,"style","Variable and function name style should be snake_case or symbols.","mae.pggg <- mae(groceryCBS$x.star, groceryCBS$xstar.pggg)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",576,1,"style","Variable and function name style should be snake_case or symbols.","mae.mbgcnbd <- mae(groceryCBS$x.star, groceryCBS$xstar.mbgcnbd)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",577,1,"style","Variable and function name style should be snake_case or symbols.","mae.pnbd.hb <- mae(groceryCBS$x.star, groceryCBS$xstar.pnbd.hb)","object_name_linter" -"vignettes/BTYDplus-HowTo.Rmd",587,30,"style","Put spaces around all infix operators.","cat(""Lift in MAE:"", round(100*lift, 1), ""%"")","infix_spaces_linter" diff --git a/.dev/revdep_emails/BTYDplus/email-body b/.dev/revdep_emails/BTYDplus/email-body deleted file mode 100644 index a51b1f653..000000000 --- a/.dev/revdep_emails/BTYDplus/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Michael Platzer! Thank you for using {lintr} in your package {BTYDplus}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/mplatzer/BTYDplus (hash: 7e8331f7e4a3ae5377b1da97feae7931d95d1705) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 40s on CRAN vs. 29s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/BiasCorrector/attachments/BiasCorrector.warnings b/.dev/revdep_emails/BiasCorrector/attachments/BiasCorrector.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/BiasCorrector/attachments/BiasCorrector.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/BiasCorrector/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/BiasCorrector/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 85c6be2eb..000000000 --- a/.dev/revdep_emails/BiasCorrector/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,33 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"data-raw/devstuffs.R",11,81,"style","Lines should not be more than 80 characters."," person(""Lorenz A."", ""Kapsner"", email = ""lorenz.kapsner@gmail.com"", role = c(""cre"", ""aut"", ""cph""),","line_length_linter" -"data-raw/devstuffs.R",21,81,"style","Lines should not be more than 80 characters.","my_desc$set(Title = ""A GUI to Correct Measurement Bias in DNA Methylation Analyses"")","line_length_linter" -"data-raw/devstuffs.R",24,81,"style","Lines should not be more than 80 characters."," ""A GUI to correct measurement bias in DNA methylation analyses. The 'BiasCorrector' package "",","line_length_linter" -"data-raw/devstuffs.R",25,81,"style","Lines should not be more than 80 characters."," ""just wraps the functions implemented in the 'R' package 'rBiasCorrection' into a "",","line_length_linter" -"data-raw/devstuffs.R",43,2,"style","Commented code should be removed.","#usethis::use_gpl3_license(name = ""Lorenz Kapsner"")","commented_code_linter" -"data-raw/devstuffs.R",49,81,"style","Lines should not be more than 80 characters.","# https://cran.r-project.org/web/packages/data.table/vignettes/datatable-importing.html","line_length_linter" -"data-raw/devstuffs.R",63,3,"style","Commented code should be removed.","# tag <- ""development""","commented_code_linter" -"data-raw/devstuffs.R",64,3,"style","Commented code should be removed.","# devtools::install_github(repo = ""kapsner/rBiasCorrection"", ref = tag, upgrade = ""always"")","commented_code_linter" -"data-raw/devstuffs.R",64,81,"style","Lines should not be more than 80 characters.","# devtools::install_github(repo = ""kapsner/rBiasCorrection"", ref = tag, upgrade = ""always"")","line_length_linter" -"data-raw/devstuffs.R",65,3,"style","Commented code should be removed.","# # https://cran.r-project.org/web/packages/devtools/vignettes/dependencies.html","commented_code_linter" -"data-raw/devstuffs.R",66,3,"style","Commented code should be removed.","# desc::desc_set_remotes(paste0(""github::kapsner/rBiasCorrection@"", tag), file = usethis::proj_get())","commented_code_linter" -"data-raw/devstuffs.R",66,81,"style","Lines should not be more than 80 characters.","# desc::desc_set_remotes(paste0(""github::kapsner/rBiasCorrection@"", tag), file = usethis::proj_get())","line_length_linter" -"data-raw/devstuffs.R",100,3,"style","Commented code should be removed.","# BiasCorrection(experimental = ""../19_PCR-bias/data/example_data/type1/example_data_type1_experimentaldata.csv"", calibration = ""../19_PCR-bias/data/example_data/type1/example_data_type1_calibrationdata.csv"", samplelocusname = ""Test"")","commented_code_linter" -"data-raw/devstuffs.R",100,81,"style","Lines should not be more than 80 characters.","# BiasCorrection(experimental = ""../19_PCR-bias/data/example_data/type1/example_data_type1_experimentaldata.csv"", calibration = ""../19_PCR-bias/data/example_data/type1/example_data_type1_calibrationdata.csv"", samplelocusname = ""Test"")","line_length_linter" -"data-raw/devstuffs.R",101,3,"style","Commented code should be removed.","# covr::package_coverage()","commented_code_linter" -"data-raw/devstuffs.R",102,3,"style","Commented code should be removed.","# lintr::lint_package()","commented_code_linter" -"inst/application/server.R",20,20,"style","Use FALSE instead of the symbol F."," exp_filereq = F,","T_and_F_symbol_linter" -"inst/application/server.R",28,21,"style","Use TRUE instead of the symbol T."," modal_closed = T,","T_and_F_symbol_linter" -"inst/application/server.R",104,25,"style","Use TRUE instead of the symbol T."," rv$modal_closed <- T","T_and_F_symbol_linter" -"inst/application/server.R",250,30,"style","Use TRUE instead of the symbol T."," startExpanded = T,","T_and_F_symbol_linter" -"inst/application/server.R",255,27,"style","Use TRUE instead of the symbol T."," selected = T","T_and_F_symbol_linter" -"inst/application/server.R",316,30,"style","Use FALSE instead of the symbol F."," startExpanded = F,","T_and_F_symbol_linter" -"inst/application/server.R",321,27,"style","Use TRUE instead of the symbol T."," selected = T","T_and_F_symbol_linter" -"inst/application/server.R",372,30,"style","Use FALSE instead of the symbol F."," startExpanded = F,","T_and_F_symbol_linter" -"inst/application/server.R",377,27,"style","Use TRUE instead of the symbol T."," selected = T","T_and_F_symbol_linter" -"inst/application/server.R",451,30,"style","Use FALSE instead of the symbol F."," startExpanded = F,","T_and_F_symbol_linter" -"inst/application/server.R",502,30,"style","Use FALSE instead of the symbol F."," startExpanded = F,","T_and_F_symbol_linter" -"R/app_utils.R",19,23,"style","Use FALSE instead of the symbol F."," rv$modal_closed <- F","T_and_F_symbol_linter" -"R/moduleFileupload.R",71,24,"style","Use TRUE instead of the symbol T."," rv$exp_filereq <- T","T_and_F_symbol_linter" -"R/moduleFileupload.R",134,30,"style","Use TRUE instead of the symbol T."," rv$exp_filereq <- T","T_and_F_symbol_linter" -"R/moduleFileupload.R",165,30,"style","Use TRUE instead of the symbol T."," rv$exp_filereq <- T","T_and_F_symbol_linter" -"R/type2Files.R",33,47,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (rv$calibr_steps[, min(get(""step""))] < 0 |","vector_logic_linter" diff --git a/.dev/revdep_emails/BiasCorrector/email-body b/.dev/revdep_emails/BiasCorrector/email-body deleted file mode 100644 index 3f22ea8ba..000000000 --- a/.dev/revdep_emails/BiasCorrector/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Lorenz A. Kapsner! Thank you for using {lintr} in your package {BiasCorrector}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/kapsner/BiasCorrector (hash: c359f65c2d50dd03b3edaff7bff083b35dd05215) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 28s on CRAN vs. 9s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/ConNEcT/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/ConNEcT/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 01e42b5a0..000000000 --- a/.dev/revdep_emails/ConNEcT/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,14 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/barplot.conData.R",36,1,"style","Variable and function name style should be snake_case.","barplot.conData <- function(height,","object_name_linter" -"R/conProf.R",28,23,"style","There should be a space between right parenthesis and an opening curly brace."," for (lag in 1:maxlag){","paren_brace_linter" -"R/conTest.R",45,23,"style","There should be a space between right parenthesis and an opening curly brace."," for (v in 1: nVars){","paren_brace_linter" -"R/conTest.R",49,24,"style","There should be a space between right parenthesis and an opening curly brace."," for (va in 1: nVars){","paren_brace_linter" -"R/conTest.R",56,29,"style","There should be a space between right parenthesis and an opening curly brace."," for (tp in 2:nPoints){","paren_brace_linter" -"R/conTest.R",67,24,"style","There should be a space between right parenthesis and an opening curly brace."," for (va in 1: nVars){","paren_brace_linter" -"R/conTest.R",86,23,"style","There should be a space between right parenthesis and an opening curly brace."," for (var1 in 1:nVars){","paren_brace_linter" -"R/conTest.R",108,20,"style","There should be a space between right parenthesis and an opening curly brace."," for (j in 1:nVars){","paren_brace_linter" -"R/hist.conTest.R",26,22,"style","There should be a space between right parenthesis and an opening curly brace."," for (var1 in 1:nVar){","paren_brace_linter" -"R/lagthemats.R",14,20,"style","There should be a space between right parenthesis and an opening curly brace."," for (i in 1:lag){","paren_brace_linter" -"R/modelAD.R",28,25,"style","There should be a space between right parenthesis and an opening curly brace."," for (tim in 2:nTpoints){","paren_brace_linter" -"R/plot.conProf.R",27,19,"style","There should be a space between right parenthesis and an opening curly brace."," for (i in 1:nVar){","paren_brace_linter" -"R/plot.conProf.R",28,21,"style","There should be a space between right parenthesis and an opening curly brace."," for (j in 1:nVar){","paren_brace_linter" diff --git a/.dev/revdep_emails/ConNEcT/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/ConNEcT/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 9a4eecdf9..000000000 --- a/.dev/revdep_emails/ConNEcT/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,20 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/barplot.conData.R",38,34,"style","Put spaces around all infix operators."," color=NULL,","infix_spaces_linter" -"R/conMx.R",25,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/conMx.R",50,12,"style","Variable and function name style should be snake_case or symbols."," rownames(obsMax) <- colnames(data1)","object_name_linter" -"R/conMx.R",51,12,"style","Variable and function name style should be snake_case or symbols."," colnames(obsMax) <- colnames(data2)","object_name_linter" -"R/conNEcT.R",43,12,"style","Variable and function name style should be snake_case or symbols."," colnames(allLinks) <- varNames","object_name_linter" -"R/conNEcT.R",44,12,"style","Variable and function name style should be snake_case or symbols."," rownames(allLinks) <- varNames","object_name_linter" -"R/conNEcT.R",48,12,"style","Variable and function name style should be snake_case or symbols."," colnames(signLinks) <- varNames","object_name_linter" -"R/conNEcT.R",49,12,"style","Variable and function name style should be snake_case or symbols."," rownames(signLinks) <- varNames","object_name_linter" -"R/conNEcT.R",50,12,"style","Variable and function name style should be snake_case or symbols."," colnames(pValue) <- varNames","object_name_linter" -"R/conNEcT.R",51,12,"style","Variable and function name style should be snake_case or symbols."," rownames(pValue) <- varNames","object_name_linter" -"R/conProf.R",34,12,"style","Variable and function name style should be snake_case or symbols."," colnames(CM) <- varNames","object_name_linter" -"R/conProf.R",35,12,"style","Variable and function name style should be snake_case or symbols."," rownames(CM) <- varNames","object_name_linter" -"R/conTest.R",54,12,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/conTest.R",72,12,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/conTest.R",103,12,"style","Variable and function name style should be snake_case or symbols."," rownames(obsLinks) <- colnames(obsLinks) <- varNames","object_name_linter" -"R/conTest.R",103,34,"style","Variable and function name style should be snake_case or symbols."," rownames(obsLinks) <- colnames(obsLinks) <- varNames","object_name_linter" -"R/modelAD.R",31,10,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/qgraph.conNEcT.R",24,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/qgraph.conNEcT.R",41,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" diff --git a/.dev/revdep_emails/ConNEcT/email-body b/.dev/revdep_emails/ConNEcT/email-body deleted file mode 100644 index faa900646..000000000 --- a/.dev/revdep_emails/ConNEcT/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Nadja Bodner! Thank you for using {lintr} in your package {ConNEcT}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cran/ConNEcT (hash: ee8427c4e5c4d4720a58ec2eae2c33731736d021) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 14s on CRAN vs. 9s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/DBItest/email-body b/.dev/revdep_emails/DBItest/email-body deleted file mode 100644 index fb6e70a10..000000000 --- a/.dev/revdep_emails/DBItest/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Kirill MΓΌller! Thank you for using {lintr} in your package {DBItest}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/r-dbi/DBItest (hash: 08291d07504dce1b6c6907bd0b61323741720e3e) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 0s on CRAN vs. 0s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/DIZtools/attachments/DIZtools.warnings b/.dev/revdep_emails/DIZtools/attachments/DIZtools.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/DIZtools/attachments/DIZtools.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/DIZtools/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/DIZtools/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index d3e8fb766..000000000 --- a/.dev/revdep_emails/DIZtools/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,47 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"data-raw/debugging.R",11,13,"style","Use <-, not =, for assignment.","system_name = ""i2b2""","assignment_linter" -"data-raw/debugging.R",12,13,"style","Use <-, not =, for assignment.","logfile_dir = tempdir()","assignment_linter" -"data-raw/debugging.R",13,10,"style","Use <-, not =, for assignment.","headless = TRUE","assignment_linter" -"data-raw/debugging.R",14,16,"style","Use <-, not =, for assignment.","ignore_presets = FALSE","assignment_linter" -"data-raw/debugging.R",15,18,"style","Use <-, not =, for assignment.","uppercase_system = TRUE","assignment_linter" -"data-raw/debugging.R",27,17,"style","Use TRUE instead of the symbol T.","}, USE.NAMES = T, simplify = F)","T_and_F_symbol_linter" -"data-raw/debugging.R",27,31,"style","Use FALSE instead of the symbol F.","}, USE.NAMES = T, simplify = F)","T_and_F_symbol_linter" -"data-raw/debugging.R",35,14,"warning","no visible global function definition for β€˜get_display_name’"," return(get_display_name(settings[[i]], name = name))","object_usage_linter" -"data-raw/debugging.R",53,40,"style","There should be a space before an opening curly brace.","get_display_name2 <- function(settings){","brace_linter" -"data-raw/debugging.R",53,40,"style","There should be a space between a right parenthesis and a body expression.","get_display_name2 <- function(settings){","paren_body_linter" -"data-raw/debugging.R",55,57,"style","There should be a space before an opening curly brace."," lapply(names(tmp), function(system, names, settings){","brace_linter" -"data-raw/debugging.R",55,57,"style","There should be a space between a right parenthesis and a body expression."," lapply(names(tmp), function(system, names, settings){","paren_body_linter" -"data-raw/debugging.R",59,16,"warning","no visible global function definition for β€˜get_display_name’"," return(get_display_name(name = system, settings = settings_tmp))","object_usage_linter" -"data-raw/debugging.R",59,59,"warning","no visible binding for global variable β€˜settings_tmp’"," return(get_display_name(name = system, settings = settings_tmp))","object_usage_linter" -"data-raw/debugging.R",65,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" -"data-raw/devstuffs.R",66,2,"style","Commented code should be removed.","#usethis::use_gpl3_license(name = ""UniversitΓ€tsklinikum Erlangen"")","commented_code_linter" -"data-raw/devstuffs.R",70,81,"style","Lines should not be more than 80 characters.","# Listing a package in either Depends or Imports ensures that it’s installed when needed","line_length_linter" -"data-raw/devstuffs.R",72,81,"style","Lines should not be more than 80 characters.","# Loading will load code, data and any DLLs; register S3 and S4 methods; and run the .onLoad() function.","line_length_linter" -"data-raw/devstuffs.R",73,81,"style","Lines should not be more than 80 characters.","## After loading, the package is available in memory, but because it’s not in the search path,","line_length_linter" -"data-raw/devstuffs.R",75,81,"style","Lines should not be more than 80 characters.","## Confusingly, :: will also load a package automatically if it isn’t already loaded.","line_length_linter" -"data-raw/devstuffs.R",76,81,"style","Lines should not be more than 80 characters.","## It’s rare to load a package explicitly, but you can do so with requireNamespace() or loadNamespace().","line_length_linter" -"data-raw/devstuffs.R",77,81,"style","Lines should not be more than 80 characters.","# Attaching puts the package in the search path. You can’t attach a package without first loading it,","line_length_linter" -"data-raw/devstuffs.R",92,3,"style","Commented code should be removed.","# usethis::use_package(""Hmisc"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",96,3,"style","Commented code should be removed.","# usethis::use_package(""psych"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",98,3,"style","Commented code should be removed.","# usethis::use_package(""RJSONIO"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",99,3,"style","Commented code should be removed.","# usethis::use_package(""shiny"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",100,3,"style","Commented code should be removed.","# usethis::use_package(""shinyjs"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",102,3,"style","Commented code should be removed.","# usethis::use_package(""xml2"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",122,81,"style","Lines should not be more than 80 characters.","usethis::use_build_ignore(""## Please apply changes in `./data-raw/devstuffs.R`!"")","line_length_linter" -"data-raw/devstuffs.R",182,3,"style","Commented code should be removed.","# covr::package_coverage()","commented_code_linter" -"data-raw/devstuffs.R",185,3,"style","Commented code should be removed.","# lintr::lint_package()","commented_code_linter" -"data-raw/devstuffs.R",188,3,"style","Commented code should be removed.","# devtools::test()","commented_code_linter" -"data-raw/devstuffs.R",191,3,"style","Commented code should be removed.","# rcmdcheck::rcmdcheck()","commented_code_linter" -"data-raw/devstuffs.R",192,3,"style","Commented code should be removed.","# rcmdcheck::rcmdcheck(args = ""--no-vignettes"", build_args = ""--no-build-vignettes"")","commented_code_linter" -"data-raw/devstuffs.R",192,81,"style","Lines should not be more than 80 characters.","# rcmdcheck::rcmdcheck(args = ""--no-vignettes"", build_args = ""--no-build-vignettes"")","line_length_linter" -"data-raw/devstuffs.R",200,3,"style","Commented code should be removed.","# build|ci|docs|feat|fix|perf|refactor|test","commented_code_linter" -"data-raw/devstuffs.R",202,81,"style","Lines should not be more than 80 characters.","# https://github.com/gitpython-developers/GitPython/issues/1016#issuecomment-1104114129","line_length_linter" -"data-raw/devstuffs.R",219,3,"style","Commented code should be removed.","# imgurl <- path.expand(""~/development/Rpackages/bg1.jpeg"")","commented_code_linter" -"data-raw/devstuffs.R",236,5,"style","Commented code should be removed.","# #l_width = 6,","commented_code_linter" -"data-raw/devstuffs.R",237,5,"style","Commented code should be removed.","# #l_height = 6,","commented_code_linter" -"data-raw/devstuffs.R",239,5,"style","Commented code should be removed.","# asp = 1","commented_code_linter" -"R/clean_path_name.R",35,39,"style","Variable and function name style should be snake_case or symbols.","clean_path_name <- function(pathname, remove.slash = FALSE) {","object_name_linter" -"R/feedback.R",257,5,"warning","local variable β€˜catch_msg’ assigned but may not be used"," catch_msg <- paste0(""Something went wrong while trying"",","object_usage_linter" -"R/feedback.R",635,3,"warning","local variable β€˜new_defaults’ assigned but may not be used"," new_defaults <- list(","object_usage_linter" -"R/is.empty.R",74,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/setenv_file.R",50,19,"style","Use FALSE instead of the symbol F."," }, USE.NAMES = F)","T_and_F_symbol_linter" diff --git a/.dev/revdep_emails/DIZtools/email-body b/.dev/revdep_emails/DIZtools/email-body deleted file mode 100644 index 1727ef470..000000000 --- a/.dev/revdep_emails/DIZtools/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Jonathan M. Mang! Thank you for using {lintr} in your package {DIZtools}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/miracum/misc-diztools (hash: 0aa2060d445db21e559d825c039705f2dd0c27ab) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 15s on CRAN vs. 8s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/DIZutils/attachments/DIZutils.warnings b/.dev/revdep_emails/DIZutils/attachments/DIZutils.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/DIZutils/attachments/DIZutils.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/DIZutils/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/DIZutils/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 8db58ff62..000000000 --- a/.dev/revdep_emails/DIZutils/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,62 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"data-raw/debug_sql.R",5,13,"style","Use <-, not =, for assignment.","system_name = ""fhir_gw""","assignment_linter" -"data-raw/debug_sql.R",7,81,"style","Lines should not be more than 80 characters.","sql_statement <- ""SELECT r1.pid AS \""Person.PatientIn.Patienten-Identifikator.Patienten-Identifikator\"", r2.jsonbdata2 ->> 'gender' AS \""Person.Demographie.AdministrativesGeschlecht\""","line_length_linter" -"data-raw/debug_sql.R",9,81,"style","Lines should not be more than 80 characters.","( SELECT * FROM ( SELECT REPLACE(jsonb_path_query(DATA, '$.subject') ->> 'reference', 'Patient/', '') AS pid, to_timestamp(jsonb_path_query(DATA, '$.period') ->> 'start', 'YYYY-MM-DDTHH:MI:SS') AS fhir_start_date","line_length_linter" -"data-raw/debug_sql.R",11,81,"style","Lines should not be more than 80 characters.","WHERE r_intermediate.fhir_start_date >= '2021-02-28' AND r_intermediate.fhir_start_date <= '2021-03-01 23:59:59' ) r1,","line_length_linter" -"data-raw/debug_sql.R",12,81,"style","Lines should not be more than 80 characters.","LATERAL ( SELECT DATA AS jsonbdata2 FROM resources WHERE TYPE = 'Patient' AND ( (DATA ->> 'id') = r1.pid) ) r2;""","line_length_linter" -"data-raw/debug_sql.R",24,81,"style","Lines should not be more than 80 characters.","to_timestamp(jsonb_path_query(DATA, '$.period') ->> 'start', 'YYYY-MM-DDTHH:MI:SS') AS fhir_start_date,","line_length_linter" -"data-raw/debug_sql.R",28,81,"style","Lines should not be more than 80 characters.","WHERE TYPE = 'Encounter') AS r_intermediate WHERE r_intermediate.fhir_start_date = '2020-01-01') r1","line_length_linter" -"data-raw/debug_sql.R",53,81,"style","Lines should not be more than 80 characters.","to_timestamp(jsonb_path_query(DATA, '$.period') ->> 'start', 'YYYY-MM-DDTHH:MI:SS') AS fhir_start_date","line_length_linter" -"data-raw/debug_sql.R",64,2,"style","Commented code should be removed.","#dat2 <- query_database(db_con, sql_statement = very_long_query)","commented_code_linter" -"data-raw/debug_sql.R",65,81,"style","Lines should not be more than 80 characters.","# Error while executing SQL-query: Error: Failed to fetch row: SSL SYSCALL error: EOF detected","line_length_linter" -"data-raw/debug_sql.R",73,81,"style","Lines should not be more than 80 characters.","SELECT * FROM ( SELECT REPLACE(jsonb_path_query(DATA, '$.subject') ->> 'reference', 'Patient/', '') AS pid, to_timestamp(jsonb_path_query(DATA, '$.period') ->> 'start', 'YYYY-MM-DDTHH:MI:SS') AS fhir_start_date","line_length_linter" -"data-raw/debug_sql.R",75,81,"style","Lines should not be more than 80 characters.","WHERE r_intermediate.fhir_start_date >= '2021-02-28' AND r_intermediate.fhir_start_date <= '2021-03-01 23:59:59'","line_length_linter" -"data-raw/debug_sql.R",79,5,"style","Commented code should be removed.","# Sys.time() |> print()","commented_code_linter" -"data-raw/debug_sql.R",80,5,"style","Commented code should be removed.","# res <- RPostgres::dbSendQuery(conn = db_con, statement = sql_statement, statement_timeout = 0)","commented_code_linter" -"data-raw/debug_sql.R",80,81,"style","Lines should not be more than 80 characters.","# res <- RPostgres::dbSendQuery(conn = db_con, statement = sql_statement, statement_timeout = 0)","line_length_linter" -"data-raw/debug_sql.R",81,5,"style","Commented code should be removed.","# Sys.time() |> print()","commented_code_linter" -"data-raw/debug_sql.R",86,3,"style","Commented code should be removed.","# RPostgres::dbFetch(res, n = 1000)","commented_code_linter" -"data-raw/debug_sql.R",89,5,"style","Commented code should be removed.","# data.table::data.table(stringsAsFactors = FALSE)","commented_code_linter" -"data-raw/debug_sql.R",91,3,"style","Commented code should be removed.","# RPostgres::dbClearResult(res)","commented_code_linter" -"data-raw/debugging.R",11,13,"style","Use <-, not =, for assignment.","system_name = ""i2b2""","assignment_linter" -"data-raw/debugging.R",12,13,"style","Use <-, not =, for assignment.","logfile_dir = tempdir()","assignment_linter" -"data-raw/debugging.R",13,10,"style","Use <-, not =, for assignment.","headless = TRUE","assignment_linter" -"data-raw/debugging.R",14,16,"style","Use <-, not =, for assignment.","ignore_presets = FALSE","assignment_linter" -"data-raw/debugging.R",15,18,"style","Use <-, not =, for assignment.","uppercase_system = TRUE","assignment_linter" -"data-raw/debugging.R",27,17,"style","Use TRUE instead of the symbol T.","}, USE.NAMES = T, simplify = F)","T_and_F_symbol_linter" -"data-raw/debugging.R",27,31,"style","Use FALSE instead of the symbol F.","}, USE.NAMES = T, simplify = F)","T_and_F_symbol_linter" -"data-raw/debugging.R",35,14,"warning","no visible global function definition for β€˜get_display_name’"," return(get_display_name(settings[[i]], name = name))","object_usage_linter" -"data-raw/debugging.R",53,40,"style","There should be a space before an opening curly brace.","get_display_name2 <- function(settings){","brace_linter" -"data-raw/debugging.R",53,40,"style","There should be a space between a right parenthesis and a body expression.","get_display_name2 <- function(settings){","paren_body_linter" -"data-raw/debugging.R",55,57,"style","There should be a space before an opening curly brace."," lapply(names(tmp), function(system, names, settings){","brace_linter" -"data-raw/debugging.R",55,57,"style","There should be a space between a right parenthesis and a body expression."," lapply(names(tmp), function(system, names, settings){","paren_body_linter" -"data-raw/debugging.R",59,16,"warning","no visible global function definition for β€˜get_display_name’"," return(get_display_name(name = system, settings = settings_tmp))","object_usage_linter" -"data-raw/debugging.R",59,59,"warning","no visible binding for global variable β€˜settings_tmp’"," return(get_display_name(name = system, settings = settings_tmp))","object_usage_linter" -"data-raw/debugging.R",65,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" -"data-raw/devstuffs.R",70,3,"style","Commented code should be removed.","# my_desc$set(""VignetteBuilder"" = ""knitr"")","commented_code_linter" -"data-raw/devstuffs.R",83,2,"style","Commented code should be removed.","#usethis::use_gpl3_license(name = ""UniversitΓ€tsklinikum Erlangen, Germany"")","commented_code_linter" -"data-raw/devstuffs.R",87,81,"style","Lines should not be more than 80 characters.","# Listing a package in either Depends or Imports ensures that it’s installed when needed","line_length_linter" -"data-raw/devstuffs.R",89,81,"style","Lines should not be more than 80 characters.","# Loading will load code, data and any DLLs; register S3 and S4 methods; and run the .onLoad() function.","line_length_linter" -"data-raw/devstuffs.R",90,81,"style","Lines should not be more than 80 characters.","## After loading, the package is available in memory, but because it’s not in the search path,","line_length_linter" -"data-raw/devstuffs.R",92,81,"style","Lines should not be more than 80 characters.","## Confusingly, :: will also load a package automatically if it isn’t already loaded.","line_length_linter" -"data-raw/devstuffs.R",93,81,"style","Lines should not be more than 80 characters.","## It’s rare to load a package explicitly, but you can do so with requireNamespace() or loadNamespace().","line_length_linter" -"data-raw/devstuffs.R",94,81,"style","Lines should not be more than 80 characters.","# Attaching puts the package in the search path. You can’t attach a package without first loading it,","line_length_linter" -"data-raw/devstuffs.R",127,7,"style","There should be a space before an opening curly brace.","} else{","brace_linter" -"data-raw/devstuffs.R",135,81,"style","Lines should not be more than 80 characters."," ""url::https://gitlab.miracum.org/miracum/misc/diztools/-/archive/"", tools_tag, ""/diztools-"", tools_tag, "".zip""","line_length_linter" -"data-raw/devstuffs.R",157,3,"style","Commented code should be removed.","# usethis::use_build_ignore(""NEWS.md"")","commented_code_linter" -"data-raw/devstuffs.R",188,3,"style","Commented code should be removed.","# covr::package_coverage()","commented_code_linter" -"data-raw/devstuffs.R",191,3,"style","Commented code should be removed.","# lintr::lint_package()","commented_code_linter" -"data-raw/devstuffs.R",194,3,"style","Commented code should be removed.","# devtools::test()","commented_code_linter" -"data-raw/devstuffs.R",197,3,"style","Commented code should be removed.","# rcmdcheck::rcmdcheck()","commented_code_linter" -"data-raw/devstuffs.R",198,3,"style","Commented code should be removed.","# rcmdcheck::rcmdcheck(args = ""--no-vignettes"", build_args = ""--no-build-vignettes"")","commented_code_linter" -"data-raw/devstuffs.R",198,81,"style","Lines should not be more than 80 characters.","# rcmdcheck::rcmdcheck(args = ""--no-vignettes"", build_args = ""--no-build-vignettes"")","line_length_linter" -"data-raw/devstuffs.R",205,3,"style","Commented code should be removed.","# build|ci|docs|feat|fix|perf|refactor|test","commented_code_linter" -"data-raw/devstuffs.R",207,81,"style","Lines should not be more than 80 characters.","# https://github.com/gitpython-developers/GitPython/issues/1016#issuecomment-1104114129","line_length_linter" -"data-raw/devstuffs.R",223,3,"style","Commented code should be removed.","# imgurl <- path.expand(""~/development/Rpackages/bg2.jpeg"")","commented_code_linter" -"data-raw/devstuffs.R",236,5,"style","Commented code should be removed.","# #p_color = ""#5c87ff"", # ""#b4f2e9"",","commented_code_linter" -"data-raw/devstuffs.R",238,5,"style","Commented code should be removed.","# #h_fill = ""#b4e7f2"",","commented_code_linter" -"data-raw/devstuffs.R",241,5,"style","Commented code should be removed.","# #l_width = 6,","commented_code_linter" -"data-raw/devstuffs.R",242,5,"style","Commented code should be removed.","# #l_height = 6,","commented_code_linter" -"data-raw/devstuffs.R",244,5,"style","Commented code should be removed.","# asp = 1","commented_code_linter" -"R/combine_stats.R",95,57,"style","Use TRUE instead of the symbol T."," min(x = summaries[[""Min""]], na.rm = T)),","T_and_F_symbol_linter" -"R/combine_stats.R",140,45,"style","Use TRUE instead of the symbol T."," no = max(summaries[[""Max""]], na.rm = T)","T_and_F_symbol_linter" diff --git a/.dev/revdep_emails/DIZutils/email-body b/.dev/revdep_emails/DIZutils/email-body deleted file mode 100644 index 03a72208f..000000000 --- a/.dev/revdep_emails/DIZutils/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Jonathan M. Mang! Thank you for using {lintr} in your package {DIZutils}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/miracum/misc-dizutils (hash: cfad461ba87fc78d7d60d36d42c1ef096ca457c1) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 6s on CRAN vs. 4s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/DQAgui/attachments/DQAgui.warnings b/.dev/revdep_emails/DQAgui/attachments/DQAgui.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/DQAgui/attachments/DQAgui.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/DQAgui/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/DQAgui/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index f5e9f3be2..000000000 --- a/.dev/revdep_emails/DQAgui/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,82 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"data-raw/debugging_info.R",1,3,"style","Commented code should be removed.","# install.packages(""DIZtools"")","commented_code_linter" -"data-raw/debugging_info.R",2,3,"style","Commented code should be removed.","# install.packages(""DIZutils"")","commented_code_linter" -"data-raw/debugging_info.R",3,3,"style","Commented code should be removed.","# install.packages(""DQAstats"")","commented_code_linter" -"data-raw/debugging_info.R",4,3,"style","Commented code should be removed.","# install.packages(""DQAgui"")","commented_code_linter" -"data-raw/debugging_info.R",9,6,"style","Use <-, not =, for assignment.","port = 3838","assignment_linter" -"data-raw/debugging_info.R",10,12,"style","Use <-, not =, for assignment.","output_dir = ""output/""","assignment_linter" -"data-raw/debugging_info.R",16,3,"style","Commented code should be removed.","# mdr_filename = ""mdr.csv""","commented_code_linter" -"data-raw/debugging_info.R",17,3,"style","Commented code should be removed.","# logfile_dir = ""~/share/logfiles/""","commented_code_linter" -"data-raw/debugging_info.R",23,12,"style","Use <-, not =, for assignment.","utils_path = DIZtools::clean_path_name(system.file(""application/_utilities"",","assignment_linter" -"data-raw/debugging_info.R",25,14,"style","Use <-, not =, for assignment.","mdr_filename = ""mdr.csv""","assignment_linter" -"data-raw/debugging_info.R",34,3,"style","Commented code should be removed.","# mdr_filename = ""mdr_example_data.csv""","commented_code_linter" -"data-raw/debugging_info.R",35,3,"style","Commented code should be removed.","# logfile_dir <- tempdir()","commented_code_linter" -"data-raw/debugging_info.R",40,13,"style","Use <-, not =, for assignment.","logfile_dir = tempdir()","assignment_linter" -"data-raw/debugging_info.R",41,10,"style","Use <-, not =, for assignment.","parallel = TRUE","assignment_linter" -"data-raw/debugging_info.R",42,8,"style","Use <-, not =, for assignment.","ncores = 8","assignment_linter" -"data-raw/debugging_info.R",44,3,"style","Commented code should be removed.","# utils_path = ""/home/user/development/Rpackages/dqa/miracumdqa/inst/application/_utilities/""","commented_code_linter" -"data-raw/debugging_info.R",44,81,"style","Lines should not be more than 80 characters.","# utils_path = ""/home/user/development/Rpackages/dqa/miracumdqa/inst/application/_utilities/""","line_length_linter" -"data-raw/debugging_info.R",50,3,"style","Commented code should be removed.","# utils_path = ""~/git-local/miracum/ume_dqatool/inst/application/_utilities/""","commented_code_linter" -"data-raw/debugging_info.R",52,3,"style","Commented code should be removed.","# mdr_filename = ""mdr_combined.csv""","commented_code_linter" -"data-raw/debugging_info.R",58,6,"style","Commented code should be removed."," #list.files(path = ""../"", pattern = ""dev.env"")","commented_code_linter" -"data-raw/debugging_info.R",61,3,"style","Commented code should be removed.","# shiny::shinyAppDir(""inst/application/"")","commented_code_linter" -"data-raw/debugging_info.R",75,5,"style","Commented code should be removed.","# OMOP_PASSWORD = ""admin1""","commented_code_linter" -"data-raw/debugging_info.R",81,5,"style","Commented code should be removed.","# mdr_filename = mdr_filename","commented_code_linter" -"data-raw/debugging_testdata.R",1,3,"style","Commented code should be removed.","# remotes::install_git(url = ""https://gitlab.miracum.org/miracum/misc/diztools"", ref = ""dev"")","commented_code_linter" -"data-raw/debugging_testdata.R",1,81,"style","Lines should not be more than 80 characters.","# remotes::install_git(url = ""https://gitlab.miracum.org/miracum/misc/diztools"", ref = ""dev"")","line_length_linter" -"data-raw/debugging_testdata.R",2,3,"style","Commented code should be removed.","# remotes::install_git(url = ""https://gitlab.miracum.org/miracum/misc/dizutils"", ref = ""development"")","commented_code_linter" -"data-raw/debugging_testdata.R",2,81,"style","Lines should not be more than 80 characters.","# remotes::install_git(url = ""https://gitlab.miracum.org/miracum/misc/dizutils"", ref = ""development"")","line_length_linter" -"data-raw/debugging_testdata.R",3,3,"style","Commented code should be removed.","# remotes::install_git(url = ""https://gitlab.miracum.org/miracum/dqa/dqastats"", ref = ""development"")","commented_code_linter" -"data-raw/debugging_testdata.R",3,81,"style","Lines should not be more than 80 characters.","# remotes::install_git(url = ""https://gitlab.miracum.org/miracum/dqa/dqastats"", ref = ""development"")","line_length_linter" -"data-raw/debugging_testdata.R",4,3,"style","Commented code should be removed.","# remotes::install_git(url = ""https://gitlab.miracum.org/miracum/dqa/dqagui"", ref = ""development"")","commented_code_linter" -"data-raw/debugging_testdata.R",4,81,"style","Lines should not be more than 80 characters.","# remotes::install_git(url = ""https://gitlab.miracum.org/miracum/dqa/dqagui"", ref = ""development"")","line_length_linter" -"data-raw/debugging_testdata.R",6,3,"style","Commented code should be removed.","# install.packages(""DIZtools"")","commented_code_linter" -"data-raw/debugging_testdata.R",7,3,"style","Commented code should be removed.","# install.packages(""DIZutils"")","commented_code_linter" -"data-raw/debugging_testdata.R",8,3,"style","Commented code should be removed.","# install.packages(""DQAstats"")","commented_code_linter" -"data-raw/debugging_testdata.R",9,3,"style","Commented code should be removed.","# install.packages(""DQAgui"")","commented_code_linter" -"data-raw/debugging_testdata.R",11,6,"style","Use <-, not =, for assignment.","port = 3838","assignment_linter" -"data-raw/debugging_testdata.R",14,81,"style","Lines should not be more than 80 characters.","Sys.setenv(""CSV_SOURCE_BASEPATH"" = system.file(""demo_data"", package = ""DQAstats""))","line_length_linter" -"data-raw/debugging_testdata.R",15,81,"style","Lines should not be more than 80 characters.","Sys.setenv(""CSV_TARGET_BASEPATH"" = system.file(""demo_data"", package = ""DQAstats""))","line_length_linter" -"data-raw/debugging_testdata.R",19,2,"style","Commented code should be removed.","#Sys.setenv(""CSV_SOURCE_BASEPATH"" = ""~/development/Rpackages"")","commented_code_linter" -"data-raw/debugging_testdata.R",20,2,"style","Commented code should be removed.","#Sys.setenv(""CSV_TARGET_BASEPATH"" = ""~/development/Rpackages"")","commented_code_linter" -"data-raw/debugging_testdata.R",24,12,"style","Use <-, not =, for assignment.","utils_path = system.file(""demo_data/utilities"",","assignment_linter" -"data-raw/debugging_testdata.R",26,14,"style","Use <-, not =, for assignment.","mdr_filename = ""mdr_example_data.csv""","assignment_linter" -"data-raw/debugging_testdata.R",31,13,"style","Use <-, not =, for assignment.","logfile_dir = tempdir()","assignment_linter" -"data-raw/debugging_testdata.R",32,10,"style","Use <-, not =, for assignment.","parallel = FALSE","assignment_linter" -"data-raw/debugging_testdata.R",33,8,"style","Use <-, not =, for assignment.","ncores = 4","assignment_linter" -"data-raw/devstuffs.R",24,81,"style","Lines should not be more than 80 characters."," person(""MIRACUM - Medical Informatics in Research and Care in University Medicine"", role = ""fnd""),","line_length_linter" -"data-raw/devstuffs.R",35,81,"style","Lines should not be more than 80 characters.","my_desc$set(Description = ""A graphical user interface (GUI) to the functions implemented in the R package 'DQAstats'."")","line_length_linter" -"data-raw/devstuffs.R",48,2,"style","Commented code should be removed.","#usethis::use_gpl3_license(name=""UniversitΓ€tsklinikum Erlangen"")","commented_code_linter" -"data-raw/devstuffs.R",52,81,"style","Lines should not be more than 80 characters.","# Listing a package in either Depends or Imports ensures that it’s installed when needed","line_length_linter" -"data-raw/devstuffs.R",54,81,"style","Lines should not be more than 80 characters.","# Loading will load code, data and any DLLs; register S3 and S4 methods; and run the .onLoad() function.","line_length_linter" -"data-raw/devstuffs.R",55,81,"style","Lines should not be more than 80 characters.","## After loading, the package is available in memory, but because it’s not in the search path,","line_length_linter" -"data-raw/devstuffs.R",57,81,"style","Lines should not be more than 80 characters.","## Confusingly, :: will also load a package automatically if it isn’t already loaded.","line_length_linter" -"data-raw/devstuffs.R",58,81,"style","Lines should not be more than 80 characters.","## It’s rare to load a package explicitly, but you can do so with requireNamespace() or loadNamespace().","line_length_linter" -"data-raw/devstuffs.R",59,81,"style","Lines should not be more than 80 characters.","# Attaching puts the package in the search path. You can’t attach a package without first loading it,","line_length_linter" -"data-raw/devstuffs.R",100,7,"style","There should be a space before an opening curly brace.","} else{","brace_linter" -"data-raw/devstuffs.R",108,81,"style","Lines should not be more than 80 characters."," ""url::https://gitlab.miracum.org/miracum/misc/diztools/-/archive/"", tools_tag, ""/diztools-"", tools_tag, "".zip""","line_length_linter" -"data-raw/devstuffs.R",119,7,"style","There should be a space before an opening curly brace.","} else{","brace_linter" -"data-raw/devstuffs.R",127,81,"style","Lines should not be more than 80 characters."," ""url::https://gitlab.miracum.org/miracum/misc/dizutils/-/archive/"", utils_tag, ""/dizutils-"", utils_tag, "".zip""","line_length_linter" -"data-raw/devstuffs.R",139,7,"style","There should be a space before an opening curly brace.","} else{","brace_linter" -"data-raw/devstuffs.R",147,81,"style","Lines should not be more than 80 characters."," ""url::https://gitlab.miracum.org/miracum/dqa/dqastats/-/archive/"", stats_tag, ""/dqastats-"", stats_tag, "".zip""","line_length_linter" -"data-raw/devstuffs.R",220,2,"style","Commented code should be removed.","#usethis::use_git_ignore(""/inst/demo_data/utilities/MDR/.~lock.mdr_example_data.csv#"")","commented_code_linter" -"data-raw/devstuffs.R",220,81,"style","Lines should not be more than 80 characters.","#usethis::use_git_ignore(""/inst/demo_data/utilities/MDR/.~lock.mdr_example_data.csv#"")","line_length_linter" -"data-raw/devstuffs.R",236,3,"style","Commented code should be removed.","# build|ci|docs|feat|fix|perf|refactor|test","commented_code_linter" -"data-raw/devstuffs.R",238,81,"style","Lines should not be more than 80 characters.","# https://github.com/gitpython-developers/GitPython/issues/1016#issuecomment-1104114129","line_length_linter" -"data-raw/devstuffs.R",252,3,"style","Commented code should be removed.","# imgurl <- path.expand(""~/development/Rpackages/bg4.jpeg"")","commented_code_linter" -"data-raw/devstuffs.R",269,5,"style","Commented code should be removed.","# #l_width = 6,","commented_code_linter" -"data-raw/devstuffs.R",270,5,"style","Commented code should be removed.","# #l_height = 6,","commented_code_linter" -"data-raw/devstuffs.R",272,5,"style","Commented code should be removed.","# asp = 1","commented_code_linter" -"inst/application/server.R",221,52,"style","Use TRUE instead of the symbol T."," rv$end_time <- format(Sys.time(), usetz = T, tz = ""CET"")","T_and_F_symbol_linter" -"R/app_utils.R",149,19,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/app_utils.R",213,19,"style","Use TRUE instead of the symbol T."," ui = T,","T_and_F_symbol_linter" -"R/app_utils.R",226,13,"style","Use TRUE instead of the symbol T."," ui = T,","T_and_F_symbol_linter" -"R/app_utils.R",463,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/moduleAtempPlausibility.R",205,36,"style","Use FALSE instead of the symbol F."," ""distinct""), with = F]","T_and_F_symbol_linter" -"R/moduleConfig.R",391,17,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/moduleConfig.R",446,17,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/moduleConfig.R",585,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/moduleConfig.R",658,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/moduleConfig.R",733,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/moduleConfig.R",806,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/moduleLog.R",65,27,"style","Use TRUE instead of the symbol T."," decreasing = T","T_and_F_symbol_linter" diff --git a/.dev/revdep_emails/DQAgui/email-body b/.dev/revdep_emails/DQAgui/email-body deleted file mode 100644 index 22c05ab58..000000000 --- a/.dev/revdep_emails/DQAgui/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Lorenz A. Kapsner! Thank you for using {lintr} in your package {DQAgui}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/miracum/dqa-dqagui (hash: 6c88c5bfce7caa2cfd51fee7001ac17eb29e7bc0) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 31s on CRAN vs. 10s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/DataFakeR/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/DataFakeR/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 2280153bd..000000000 --- a/.dev/revdep_emails/DataFakeR/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,7 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/schema_deps.R",52,3,"warning","local variable β€˜plur’ assigned but may not be used"," plur <- """"","object_usage_linter" -"R/schema_deps.R",53,3,"warning","local variable β€˜plur_do’ assigned but may not be used"," plur_do <- ""doesn't""","object_usage_linter" -"R/schema_deps.R",54,3,"warning","local variable β€˜plur_them’ assigned but may not be used"," plur_them <- ""it""","object_usage_linter" -"R/schema_utils.R",44,5,"warning","local variable β€˜indent’ assigned but may not be used"," indent <- paste0(c(rep("" "", ind), rep(""="", 5 - ind)), collapse = """")","object_usage_linter" -"R/simulate_num_col.R",51,18,"style","Place a space before left parenthesis, except in a function call."," round(10^(precision - scale) * stats::runif(n), scale),","spaces_left_parentheses_linter" -"R/simulate_num_col.R",64,16,"style","Place a space before left parenthesis, except in a function call."," round(10^(precision - scale) * stats::runif(n), scale),","spaces_left_parentheses_linter" diff --git a/.dev/revdep_emails/DataFakeR/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/DataFakeR/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 0988b16a7..000000000 --- a/.dev/revdep_emails/DataFakeR/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,107 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/doc/datafaker_workflow.Rmd",16,15,"style","Trailing whitespace is superfluous."," eval = TRUE, ","trailing_whitespace_linter" -"inst/doc/datafaker_workflow.Rmd",25,44,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set() # Figure alignment ","trailing_whitespace_linter" -"inst/doc/datafaker_workflow.Rmd",26,9,"style","Variable and function name style should be snake_case or symbols.","library(DataFakeR)","object_name_linter" -"inst/doc/datafaker_workflow.Rmd",41,12,"error","unexpected '<'"," source = , ",NA -"inst/doc/datafaker_workflow.Rmd",41,35,"style","Trailing whitespace is superfluous."," source = , ","trailing_whitespace_linter" -"inst/doc/datafaker_workflow.Rmd",51,35,"style","Trailing whitespace is superfluous."," source = , ","trailing_whitespace_linter" -"inst/doc/datafaker_workflow.Rmd",131,10,"style","Trailing whitespace is superfluous."," schema, ","trailing_whitespace_linter" -"inst/doc/datafaker_workflow.Rmd",132,36,"style","Trailing whitespace is superfluous."," file = , ","trailing_whitespace_linter" -"inst/doc/extra_parameters.Rmd",16,15,"style","Trailing whitespace is superfluous."," eval = TRUE, ","trailing_whitespace_linter" -"inst/doc/extra_parameters.Rmd",25,44,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set() # Figure alignment ","trailing_whitespace_linter" -"inst/doc/extra_parameters.Rmd",68,81,"style","Lines should not be more than 80 characters.","sch <- schema_source(system.file(""extdata"", ""schema-patient.yml"", package = ""DataFakeR""))","line_length_linter" -"inst/doc/extra_parameters.Rmd",109,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, file = system.file(""extdata"", ""schema-patient_2.yml"", package = ""DataFakeR""))","line_length_linter" -"inst/doc/extra_parameters.Rmd",154,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, file = system.file(""extdata"", ""schema-patient_3.yml"", package = ""DataFakeR""))","line_length_linter" -"inst/doc/extra_parameters.Rmd",220,9,"style","Use <-, not =, for assignment.","my_opts = set_faker_opts(","assignment_linter" -"inst/doc/extra_parameters.Rmd",231,7,"style","Trailing whitespace is superfluous."," sch, ","trailing_whitespace_linter" -"inst/doc/extra_parameters.Rmd",298,9,"style","Use <-, not =, for assignment.","my_opts = set_faker_opts(","assignment_linter" -"inst/doc/extra_parameters.Rmd",309,7,"style","Trailing whitespace is superfluous."," sch, ","trailing_whitespace_linter" -"inst/doc/extra_parameters.Rmd",310,80,"style","Trailing whitespace is superfluous."," file = system.file(""extdata"", ""schema-patient_5.yml"", package = ""DataFakeR""), ","trailing_whitespace_linter" -"inst/doc/extra_parameters.Rmd",315,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" -"inst/doc/main.Rmd",17,15,"style","Trailing whitespace is superfluous."," eval = TRUE, ","trailing_whitespace_linter" -"inst/doc/main.Rmd",26,44,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set() # Figure alignment ","trailing_whitespace_linter" -"inst/doc/schema_structure.Rmd",14,15,"style","Trailing whitespace is superfluous."," eval = TRUE, ","trailing_whitespace_linter" -"inst/doc/schema_structure.Rmd",23,44,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set() # Figure alignment ","trailing_whitespace_linter" -"inst/doc/simulation_methods.Rmd",16,15,"style","Trailing whitespace is superfluous."," eval = TRUE, ","trailing_whitespace_linter" -"inst/doc/simulation_methods.Rmd",25,44,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set() # Figure alignment ","trailing_whitespace_linter" -"inst/doc/simulation_methods.Rmd",79,81,"style","Lines should not be more than 80 characters.","sch <- schema_source(system.file(""extdata"", ""schema-books.yml"", package = ""DataFakeR""))","line_length_linter" -"inst/doc/simulation_methods.Rmd",124,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, file = system.file(""extdata"", ""schema-books_2.yml"", package = ""DataFakeR""))","line_length_linter" -"inst/doc/simulation_methods.Rmd",178,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, file = system.file(""extdata"", ""schema-books_3.yml"", package = ""DataFakeR""))","line_length_linter" -"inst/doc/simulation_methods.Rmd",241,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, file = system.file(""extdata"", ""schema-books_4.yml"", package = ""DataFakeR""))","line_length_linter" -"inst/doc/simulation_methods.Rmd",278,81,"style","Lines should not be more than 80 characters."," paste(sample(first, n), sample(second, n), sample(third, n), sample(fourth, n))","line_length_linter" -"inst/doc/simulation_methods.Rmd",302,50,"style","Trailing whitespace is superfluous."," sample(first, n, replace = TRUE), second_res, ","trailing_whitespace_linter" -"inst/doc/simulation_methods.Rmd",319,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"inst/doc/simulation_methods.Rmd",321,33,"style","Trailing whitespace is superfluous."," do.call(books, spec_params), ","trailing_whitespace_linter" -"inst/doc/simulation_methods.Rmd",349,42,"style","Trailing whitespace is superfluous."," sim_expr = do.call(books, spec_params), ","trailing_whitespace_linter" -"inst/doc/simulation_methods.Rmd",391,81,"style","Lines should not be more than 80 characters."," opt_simul_spec_character = opt_simul_spec_character(book = simul_spec_character_book)","line_length_linter" -"inst/doc/simulation_methods.Rmd",394,71,"style","Trailing whitespace is superfluous."," system.file(""extdata"", ""schema-books_5.yml"", package = ""DataFakeR""), ","trailing_whitespace_linter" -"inst/doc/simulation_methods.Rmd",460,31,"style","Put spaces around all infix operators."," opt_simul_restricted_ = opt_simul_restricted_(my_method = method, ...)","infix_spaces_linter" -"inst/doc/simulation_methods.Rmd",460,36,"error","unexpected '>'"," opt_simul_restricted_ = opt_simul_restricted_(my_method = method, ...)",NA -"inst/doc/simulation_methods.Rmd",460,81,"style","Lines should not be more than 80 characters."," opt_simul_restricted_ = opt_simul_restricted_(my_method = method, ...)","line_length_linter" -"inst/doc/simulation_methods.Rmd",503,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, system.file(""extdata"", ""schema-books_6.yml"", package = ""DataFakeR""))","line_length_linter" -"inst/doc/simulation_methods.Rmd",554,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, system.file(""extdata"", ""schema-books_7.yml"", package = ""DataFakeR""))","line_length_linter" -"inst/doc/simulation_methods.Rmd",597,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, system.file(""extdata"", ""schema-books_8.yml"", package = ""DataFakeR""))","line_length_linter" -"inst/doc/simulation_methods.Rmd",664,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, system.file(""extdata"", ""schema-books_9.yml"", package = ""DataFakeR""))","line_length_linter" -"inst/doc/simulation_options.Rmd",16,15,"style","Trailing whitespace is superfluous."," eval = TRUE, ","trailing_whitespace_linter" -"inst/doc/simulation_options.Rmd",25,44,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set() # Figure alignment ","trailing_whitespace_linter" -"inst/doc/simulation_options.Rmd",133,81,"style","Lines should not be more than 80 characters.","set_faker_opts(opt_default_table = opt_default_table(nrows = nrows_simul_constant(10)))","line_length_linter" -"inst/doc/simulation_options.Rmd",164,25,"style","Put spaces around all infix operators."," opt_simul_spec_ = opt_simul_spec_(","infix_spaces_linter" -"inst/doc/simulation_options.Rmd",164,30,"error","unexpected '>'"," opt_simul_spec_ = opt_simul_spec_(",NA -"inst/doc/structure_from_db.Rmd",16,15,"style","Trailing whitespace is superfluous."," eval = TRUE, ","trailing_whitespace_linter" -"inst/doc/structure_from_db.Rmd",25,44,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set() # Figure alignment ","trailing_whitespace_linter" -"inst/doc/structure_from_db.Rmd",60,30,"error","unexpected '>'","set_faker_opts(opt_pull_ = opt_pull_(...))",NA -"R/schema_source.R",51,24,"style","Variable and function name style should be snake_case or symbols."," attr(self$def, ""schema-graph"") <- value","object_name_linter" -"R/schema_source.R",125,16,"style","Variable and function name style should be snake_case or symbols."," attr(schema, ""schema-graph"") <- schema_graph","object_name_linter" -"tests/testthat/test-simulate_cols.R",14,16,"style","Variable and function name style should be snake_case or symbols."," attr(schema, ""schema-graph"") <- attr(schema, ""schema-graph"") %>%","object_name_linter" -"tests/testthat/test-simulate_cols.R",32,16,"style","Variable and function name style should be snake_case or symbols."," attr(schema, ""schema-graph"") <- attr(schema, ""schema-graph"") %>%","object_name_linter" -"vignettes/datafaker_workflow.Rmd",16,15,"style","Trailing whitespace is superfluous."," eval = TRUE, ","trailing_whitespace_linter" -"vignettes/datafaker_workflow.Rmd",25,44,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set() # Figure alignment ","trailing_whitespace_linter" -"vignettes/datafaker_workflow.Rmd",26,9,"style","Variable and function name style should be snake_case or symbols.","library(DataFakeR)","object_name_linter" -"vignettes/datafaker_workflow.Rmd",41,12,"error","unexpected '<'"," source = , ",NA -"vignettes/datafaker_workflow.Rmd",41,35,"style","Trailing whitespace is superfluous."," source = , ","trailing_whitespace_linter" -"vignettes/datafaker_workflow.Rmd",51,35,"style","Trailing whitespace is superfluous."," source = , ","trailing_whitespace_linter" -"vignettes/datafaker_workflow.Rmd",131,10,"style","Trailing whitespace is superfluous."," schema, ","trailing_whitespace_linter" -"vignettes/datafaker_workflow.Rmd",132,36,"style","Trailing whitespace is superfluous."," file = , ","trailing_whitespace_linter" -"vignettes/extra_parameters.Rmd",16,15,"style","Trailing whitespace is superfluous."," eval = TRUE, ","trailing_whitespace_linter" -"vignettes/extra_parameters.Rmd",25,44,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set() # Figure alignment ","trailing_whitespace_linter" -"vignettes/extra_parameters.Rmd",68,81,"style","Lines should not be more than 80 characters.","sch <- schema_source(system.file(""extdata"", ""schema-patient.yml"", package = ""DataFakeR""))","line_length_linter" -"vignettes/extra_parameters.Rmd",109,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, file = system.file(""extdata"", ""schema-patient_2.yml"", package = ""DataFakeR""))","line_length_linter" -"vignettes/extra_parameters.Rmd",154,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, file = system.file(""extdata"", ""schema-patient_3.yml"", package = ""DataFakeR""))","line_length_linter" -"vignettes/extra_parameters.Rmd",220,9,"style","Use <-, not =, for assignment.","my_opts = set_faker_opts(","assignment_linter" -"vignettes/extra_parameters.Rmd",231,7,"style","Trailing whitespace is superfluous."," sch, ","trailing_whitespace_linter" -"vignettes/extra_parameters.Rmd",298,9,"style","Use <-, not =, for assignment.","my_opts = set_faker_opts(","assignment_linter" -"vignettes/extra_parameters.Rmd",309,7,"style","Trailing whitespace is superfluous."," sch, ","trailing_whitespace_linter" -"vignettes/extra_parameters.Rmd",310,80,"style","Trailing whitespace is superfluous."," file = system.file(""extdata"", ""schema-patient_5.yml"", package = ""DataFakeR""), ","trailing_whitespace_linter" -"vignettes/extra_parameters.Rmd",315,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" -"vignettes/main.Rmd",17,15,"style","Trailing whitespace is superfluous."," eval = TRUE, ","trailing_whitespace_linter" -"vignettes/main.Rmd",26,44,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set() # Figure alignment ","trailing_whitespace_linter" -"vignettes/schema_structure.Rmd",14,15,"style","Trailing whitespace is superfluous."," eval = TRUE, ","trailing_whitespace_linter" -"vignettes/schema_structure.Rmd",23,44,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set() # Figure alignment ","trailing_whitespace_linter" -"vignettes/simulation_methods.Rmd",16,15,"style","Trailing whitespace is superfluous."," eval = TRUE, ","trailing_whitespace_linter" -"vignettes/simulation_methods.Rmd",25,44,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set() # Figure alignment ","trailing_whitespace_linter" -"vignettes/simulation_methods.Rmd",79,81,"style","Lines should not be more than 80 characters.","sch <- schema_source(system.file(""extdata"", ""schema-books.yml"", package = ""DataFakeR""))","line_length_linter" -"vignettes/simulation_methods.Rmd",124,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, file = system.file(""extdata"", ""schema-books_2.yml"", package = ""DataFakeR""))","line_length_linter" -"vignettes/simulation_methods.Rmd",178,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, file = system.file(""extdata"", ""schema-books_3.yml"", package = ""DataFakeR""))","line_length_linter" -"vignettes/simulation_methods.Rmd",241,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, file = system.file(""extdata"", ""schema-books_4.yml"", package = ""DataFakeR""))","line_length_linter" -"vignettes/simulation_methods.Rmd",278,81,"style","Lines should not be more than 80 characters."," paste(sample(first, n), sample(second, n), sample(third, n), sample(fourth, n))","line_length_linter" -"vignettes/simulation_methods.Rmd",302,50,"style","Trailing whitespace is superfluous."," sample(first, n, replace = TRUE), second_res, ","trailing_whitespace_linter" -"vignettes/simulation_methods.Rmd",319,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/simulation_methods.Rmd",321,33,"style","Trailing whitespace is superfluous."," do.call(books, spec_params), ","trailing_whitespace_linter" -"vignettes/simulation_methods.Rmd",349,42,"style","Trailing whitespace is superfluous."," sim_expr = do.call(books, spec_params), ","trailing_whitespace_linter" -"vignettes/simulation_methods.Rmd",391,81,"style","Lines should not be more than 80 characters."," opt_simul_spec_character = opt_simul_spec_character(book = simul_spec_character_book)","line_length_linter" -"vignettes/simulation_methods.Rmd",394,71,"style","Trailing whitespace is superfluous."," system.file(""extdata"", ""schema-books_5.yml"", package = ""DataFakeR""), ","trailing_whitespace_linter" -"vignettes/simulation_methods.Rmd",460,31,"style","Put spaces around all infix operators."," opt_simul_restricted_ = opt_simul_restricted_(my_method = method, ...)","infix_spaces_linter" -"vignettes/simulation_methods.Rmd",460,36,"error","unexpected '>'"," opt_simul_restricted_ = opt_simul_restricted_(my_method = method, ...)",NA -"vignettes/simulation_methods.Rmd",460,81,"style","Lines should not be more than 80 characters."," opt_simul_restricted_ = opt_simul_restricted_(my_method = method, ...)","line_length_linter" -"vignettes/simulation_methods.Rmd",503,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, system.file(""extdata"", ""schema-books_6.yml"", package = ""DataFakeR""))","line_length_linter" -"vignettes/simulation_methods.Rmd",554,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, system.file(""extdata"", ""schema-books_7.yml"", package = ""DataFakeR""))","line_length_linter" -"vignettes/simulation_methods.Rmd",597,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, system.file(""extdata"", ""schema-books_8.yml"", package = ""DataFakeR""))","line_length_linter" -"vignettes/simulation_methods.Rmd",664,81,"style","Lines should not be more than 80 characters.","sch <- schema_update_source(sch, system.file(""extdata"", ""schema-books_9.yml"", package = ""DataFakeR""))","line_length_linter" -"vignettes/simulation_options.Rmd",16,15,"style","Trailing whitespace is superfluous."," eval = TRUE, ","trailing_whitespace_linter" -"vignettes/simulation_options.Rmd",25,44,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set() # Figure alignment ","trailing_whitespace_linter" -"vignettes/simulation_options.Rmd",133,81,"style","Lines should not be more than 80 characters.","set_faker_opts(opt_default_table = opt_default_table(nrows = nrows_simul_constant(10)))","line_length_linter" -"vignettes/simulation_options.Rmd",164,25,"style","Put spaces around all infix operators."," opt_simul_spec_ = opt_simul_spec_(","infix_spaces_linter" -"vignettes/simulation_options.Rmd",164,30,"error","unexpected '>'"," opt_simul_spec_ = opt_simul_spec_(",NA -"vignettes/structure_from_db.Rmd",16,15,"style","Trailing whitespace is superfluous."," eval = TRUE, ","trailing_whitespace_linter" -"vignettes/structure_from_db.Rmd",25,44,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set() # Figure alignment ","trailing_whitespace_linter" -"vignettes/structure_from_db.Rmd",60,30,"error","unexpected '>'","set_faker_opts(opt_pull_ = opt_pull_(...))",NA diff --git a/.dev/revdep_emails/DataFakeR/email-body b/.dev/revdep_emails/DataFakeR/email-body deleted file mode 100644 index d5448b999..000000000 --- a/.dev/revdep_emails/DataFakeR/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Krystian Igras! Thank you for using {lintr} in your package {DataFakeR}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cran/DataFakeR (hash: ff174573fda51498f41b5fa6e22b807e32c70aa4) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 29s on CRAN vs. 19s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/DepthProc/attachments/DepthProc.failure b/.dev/revdep_emails/DepthProc/attachments/DepthProc.failure deleted file mode 100644 index c3d4a1db0..000000000 --- a/.dev/revdep_emails/DepthProc/attachments/DepthProc.failure +++ /dev/null @@ -1 +0,0 @@ -object 'absolute_paths_linter' not found diff --git a/.dev/revdep_emails/DepthProc/email-body b/.dev/revdep_emails/DepthProc/email-body deleted file mode 100644 index 417bad26d..000000000 --- a/.dev/revdep_emails/DepthProc/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Zygmunt Zawadzki! Thank you for using {lintr} in your package {DepthProc}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/zzawadz/DepthProc (hash: 63b5120c9d9cf3a603516d8f04880b48bceda2bc) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 13s on CRAN vs. 0s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/DominoDataCapture/email-body b/.dev/revdep_emails/DominoDataCapture/email-body deleted file mode 100644 index 04091d02f..000000000 --- a/.dev/revdep_emails/DominoDataCapture/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Vivekananda Tadala! Thank you for using {lintr} in your package {DominoDataCapture}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cran/DominoDataCapture (hash: c66c6dd748d0e0b1a2fcb74f7354ec8ef0bbd325) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 4s on CRAN vs. 2s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/FSelectorRcpp/attachments/FSelectorRcpp.warnings b/.dev/revdep_emails/FSelectorRcpp/attachments/FSelectorRcpp.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/FSelectorRcpp/attachments/FSelectorRcpp.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/FSelectorRcpp/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/FSelectorRcpp/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 4269c64e0..000000000 --- a/.dev/revdep_emails/FSelectorRcpp/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,5 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/discretize_transform.R",47,1,"style","Variable and function names should not be longer than 30 characters.","discretize_transform.FsDiscretizeTransformer <-","object_length_linter" -"R/discretize.R",183,1,"style","Variable and function name style should be snake_case.","discretize.data.frame <- function(x, y,","object_name_linter" -"R/relief.R",82,13,"style","Place a space before left parenthesis, except in a function call."," next()","spaces_left_parentheses_linter" -"R/relief.R",85,13,"style","Place a space before left parenthesis, except in a function call."," next()","spaces_left_parentheses_linter" diff --git a/.dev/revdep_emails/FSelectorRcpp/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/FSelectorRcpp/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 1c3604445..000000000 --- a/.dev/revdep_emails/FSelectorRcpp/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,68 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/benchmarks/bench-cutOff.R",18,10,"style","Variable and function name style should be snake_case or symbols.","rownames(testDataFrame) <- paste0(""row_"", 1:100000)","object_name_linter" -"inst/benchmarks/bench-discretise.R",16,25,"style","Put spaces around all infix operators.","system.time(Discretize(y~x))","infix_spaces_linter" -"inst/benchmarks/bench-discretise.R",19,55,"style","Put spaces around all infix operators.","all(fs_discretize(x, y) + 1 == as.numeric(Discretize(y~x)[, 1]))","infix_spaces_linter" -"inst/benchmarks/bench-discretise.R",21,44,"style","Put spaces around all infix operators.","microbenchmark::microbenchmark(Discretize(y~x), fs_discretize(x, y))","infix_spaces_linter" -"R/discretize_transform.R",71,14,"style","Variable and function name style should be snake_case or symbols."," attr(data, ""fsSplitPointsList"") <- splitPoints","object_name_linter" -"R/discretize_transform.R",99,7,"style","Any function spanning multiple lines should use curly braces."," function(x, y)","brace_linter" -"R/discretize.R",136,17,"style","Variable and function name style should be snake_case or symbols."," attr(res, ""SplitValues"") <- control$breaks","object_name_linter" -"R/discretize.R",155,7,"style","Variable and function name style should be snake_case or symbols."," splitPointsList[[col]] <- splitVals","object_name_linter" -"R/discretize.R",164,7,"style","Variable and function name style should be snake_case or symbols."," splitPointsList[[col]] <- NA","object_name_linter" -"R/discretize.R",174,14,"style","Variable and function name style should be snake_case or symbols."," attr(data, ""fsSplitPointsList"") <- c(","object_name_linter" -"R/utils.R",154,5,"style","Variable and function name style should be snake_case or symbols."," toSub[withBrackets] <- gsub(pattern = ""]]"", replacement = """",","object_name_linter" -"R/utils.R",156,5,"style","Variable and function name style should be snake_case or symbols."," toSub[withBrackets] <- strsplit(x = toSub[withBrackets], split = ""[["",","object_name_linter" -"R/utils.R",158,5,"style","Variable and function name style should be snake_case or symbols."," toSub[withBrackets] <- lapply(toSub[withBrackets], get_colname)","object_name_linter" -"R/utils.R",159,5,"style","Variable and function name style should be snake_case or symbols."," toSub[-withBrackets] <- gsub(pattern = "".*\\$"", replacement = """",","object_name_linter" -"tests/testthat/test-cutoff.R",9,14,"style","Variable and function name style should be snake_case or symbols."," rownames(testDataFrame) <- testDataFrame[[1]]","object_name_linter" -"tests/testthat/test-discretize.R",264,28,"style","Put spaces around all infix operators."," expect_error(discretize(y~., dt, discIntegers = FALSE))","infix_spaces_linter" -"tests/testthat/test-na.R",11,5,"style","Variable and function name style should be snake_case or symbols."," dtIris[1, 1] <- NA","object_name_linter" -"tests/testthat/test-na.R",12,5,"style","Variable and function name style should be snake_case or symbols."," dtIris[2, 2] <- NA","object_name_linter" -"tests/testthat/test-na.R",13,5,"style","Variable and function name style should be snake_case or symbols."," dtIris[3, 5] <- NA","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",18,1,"style","Variable and function name style should be snake_case or symbols.","is.pkg <- all(c(""RTCGA.rnaseq"", ""microbenchmark"", ""RWeka"", ""pkgdown"") %in% rownames(installed.packages()))","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",19,3,"style","Place a space before left parenthesis, except in a function call.","if(!is.pkg) {","spaces_left_parentheses_linter" -"vignettes/benchmarks_discretize.Rmd",23,3,"style","Place a space before left parenthesis, except in a function call.","if(is.pkg && !pkgdown::in_pkgdown()) {","spaces_left_parentheses_linter" -"vignettes/benchmarks_discretize.Rmd",24,3,"style","Variable and function name style should be snake_case or symbols."," is.pkg <- FALSE","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",28,20,"style","Trailing whitespace is superfluous."," paste(sep = """", ","trailing_whitespace_linter" -"vignettes/benchmarks_discretize.Rmd",39,1,"style","Variable and function name style should be snake_case or symbols.","fig.path <- if(pkgdown::in_pkgdown()) {","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",39,15,"style","Place a space before left parenthesis, except in a function call.","fig.path <- if(pkgdown::in_pkgdown()) {","spaces_left_parentheses_linter" -"vignettes/benchmarks_discretize.Rmd",47,19,"style","Trailing whitespace is superfluous."," fig.width = 8, ","trailing_whitespace_linter" -"vignettes/benchmarks_discretize.Rmd",102,1,"style","Variable and function name style should be snake_case or symbols.","BRCA.rnaseq <- RTCGA.rnaseq::BRCA.rnaseq","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",103,1,"style","Variable and function name style should be snake_case or symbols.","BRCA.rnaseq$bcr_patient_barcode <- ","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",103,35,"style","Trailing whitespace is superfluous.","BRCA.rnaseq$bcr_patient_barcode <- ","trailing_whitespace_linter" -"vignettes/benchmarks_discretize.Rmd",105,7,"style","Variable and function name style should be snake_case or symbols.","names(BRCA.rnaseq) <- gsub(pattern = ""?"", replacement = ""q"",","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",107,7,"style","Variable and function name style should be snake_case or symbols.","names(BRCA.rnaseq) <- gsub(pattern = ""[[:punct:]]"", replacement = ""_"",","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",122,22,"style","Variable and function name style should be snake_case or symbols.","names_by <- function(nameBy, vecBy) {","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",122,30,"style","Variable and function name style should be snake_case or symbols.","names_by <- function(nameBy, vecBy) {","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",127,22,"style","Trailing whitespace is superfluous."," }), ","trailing_whitespace_linter" -"vignettes/benchmarks_discretize.Rmd",131,28,"style","Variable and function name style should be snake_case or symbols.","get_times <- function(fun, vecRows, vecCols, nTimes) {","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",131,37,"style","Variable and function name style should be snake_case or symbols.","get_times <- function(fun, vecRows, vecCols, nTimes) {","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",131,46,"style","Variable and function name style should be snake_case or symbols.","get_times <- function(fun, vecRows, vecCols, nTimes) {","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",132,3,"style","Variable and function name style should be snake_case or symbols."," forRows <- pblapply(vecRows, function(nRows) {","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",132,41,"style","Variable and function name style should be snake_case or symbols."," forRows <- pblapply(vecRows, function(nRows) {","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",133,5,"style","Variable and function name style should be snake_case or symbols."," forCols <- pblapply(vecCols + 1, function(nCols) {","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",133,47,"style","Variable and function name style should be snake_case or symbols."," forCols <- pblapply(vecCols + 1, function(nCols) {","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",138,5,"style","Variable and function name style should be snake_case or symbols."," colsNames <- names_by(nameBy = ""columns_"", vecBy = vecCols)","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",141,3,"style","Variable and function name style should be snake_case or symbols."," rowsNames <- names_by(nameBy = ""rows_"", vecBy = vecRows)","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",167,18,"style","Variable and function name style should be snake_case or symbols."," function(setOfCols) {","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",195,3,"style","Variable and function name style should be snake_case or symbols."," yUnit <- gsub(pattern = ""time"",","object_name_linter" -"vignettes/benchmarks_discretize.Rmd",198,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/get_started.Rmd",38,18,"style","Only use double-quotes.","install.packages('FSelectorRcpp') # stable release version on CRAN","single_quotes_linter" -"vignettes/get_started.Rmd",39,26,"style","Only use double-quotes.","devtools::install_github('mi2-warsaw/FSelectorRcpp') # dev version","single_quotes_linter" -"vignettes/get_started.Rmd",70,8,"style","Trailing whitespace is superfluous."," ) %>% ","trailing_whitespace_linter" -"vignettes/get_started.Rmd",73,8,"style","Trailing whitespace is superfluous."," ) %>% ","trailing_whitespace_linter" -"vignettes/get_started.Rmd",74,67,"style","Trailing whitespace is superfluous."," to_formula( # Create a new formula object with ","trailing_whitespace_linter" -"vignettes/get_started.Rmd",76,22,"style","Trailing whitespace is superfluous."," class = ""Species"" ","trailing_whitespace_linter" -"vignettes/get_started.Rmd",80,17,"style","Trailing whitespace is superfluous."," data = iris, ","trailing_whitespace_linter" -"vignettes/get_started.Rmd",81,24,"style","Trailing whitespace is superfluous."," family = ""binomial"" ","trailing_whitespace_linter" -"vignettes/get_started.Rmd",83,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/get_started.Rmd",89,1,"style","Variable and function name style should be snake_case or symbols.","evaluator_R2_lm <- # Create a scorer function.","object_name_linter" -"vignettes/get_started.Rmd",93,16,"style","Trailing whitespace is superfluous."," dependent = ","trailing_whitespace_linter" -"vignettes/get_started.Rmd",98,78,"style","Trailing whitespace is superfluous."," to_formula( # This is the score to use to choose between considered ","trailing_whitespace_linter" -"vignettes/get_started.Rmd",107,15,"style","Trailing whitespace is superfluous."," attributes = ","trailing_whitespace_linter" -"vignettes/get_started.Rmd",109,87,"style","Trailing whitespace is superfluous."," fun = evaluator_R2_lm, # And it calculates the score of a subset that depends on the ","trailing_whitespace_linter" -"vignettes/get_started.Rmd",111,68,"style","Trailing whitespace is superfluous."," mode = ""exhaustive"", # exhaustive - means to check all possible ","trailing_whitespace_linter" -"vignettes/get_started.Rmd",112,59,"style","Trailing whitespace is superfluous."," sizes = # attributes' subset combinations ","trailing_whitespace_linter" -"vignettes/get_started.Rmd",113,5,"warning","1:length(...) is likely to be wrong in the empty edge case. Use seq_along() instead."," 1:length(attributes) # of sizes passed in sizes.","seq_linter" -"vignettes/integer-variables.Rmd",63,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/integer-variables.Rmd",70,35,"style","Commas should always have a space after.","can_discretize(as.integer(c(rep(1,10), rep(2, 10))))","commas_linter" -"vignettes/integer-variables.Rmd",78,26,"style","Commas should always have a space after."," z = as.integer(c(rep(1,10), rep(2, 10)))","commas_linter" diff --git a/.dev/revdep_emails/FSelectorRcpp/email-body b/.dev/revdep_emails/FSelectorRcpp/email-body deleted file mode 100644 index ed95598ad..000000000 --- a/.dev/revdep_emails/FSelectorRcpp/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Zygmunt Zawadzki! Thank you for using {lintr} in your package {FSelectorRcpp}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/mi2-warsaw/FSelectorRcpp (hash: 1326a5075b976b2a946b6e0fa41dfd6ae0773ebc) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 22s on CRAN vs. 13s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/INSPECTumours/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/INSPECTumours/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 9c57528ab..000000000 --- a/.dev/revdep_emails/INSPECTumours/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,12 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/report.rmd",12,1,"style","Use spaces to indent, not tabs."," echo = FALSE, ","no_tab_linter" -"inst/report.rmd",12,16,"style","Trailing whitespace is superfluous."," echo = FALSE, ","trailing_whitespace_linter" -"inst/report.rmd",13,1,"style","Use spaces to indent, not tabs."," message = FALSE,","no_tab_linter" -"inst/report.rmd",14,1,"style","Use spaces to indent, not tabs."," warning = FALSE,","no_tab_linter" -"inst/report.rmd",15,1,"style","Use spaces to indent, not tabs."," results = ""asis""","no_tab_linter" -"inst/report.rmd",52,81,"style","Lines should not be more than 80 characters."," df_grouped <- dplyr::group_by(params$r$excluded_data, study, treatment, animal_id, reason)","line_length_linter" -"inst/report.rmd",53,81,"style","Lines should not be more than 80 characters."," df_sum <- dplyr::summarise(df_grouped, days = paste(unique(day), collapse = "", "")) ","line_length_linter" -"inst/report.rmd",53,84,"style","Trailing whitespace is superfluous."," df_sum <- dplyr::summarise(df_grouped, days = paste(unique(day), collapse = "", "")) ","trailing_whitespace_linter" -"inst/report.rmd",160,81,"style","Lines should not be more than 80 characters.","cat(""Asterisks indicate that the drug was considered significantly effective by comparing to the control."")","line_length_linter" -"R/fct-exclude.R",16,3,"style","`else` should come on the same line as the previous `}`."," else if (day_ex == ""All"") {","brace_linter" -"R/mod-load-file.R",109,46,"style","Any function spanning multiple lines should use curly braces."," lapply(seq_len(length(guesses)), function(i)","brace_linter" diff --git a/.dev/revdep_emails/INSPECTumours/email-body b/.dev/revdep_emails/INSPECTumours/email-body deleted file mode 100644 index a7491dd29..000000000 --- a/.dev/revdep_emails/INSPECTumours/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Bairu Zhang! Thank you for using {lintr} in your package {INSPECTumours}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cran/INSPECTumours (hash: eed636aa77e2fd29b8ca75c8b20424223cfa2f93) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 19s on CRAN vs. 11s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/NHSRplotthedots/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/NHSRplotthedots/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 000d628cf..000000000 --- a/.dev/revdep_emails/NHSRplotthedots/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,3 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/ptd_calculate_point_type.R",60,26,"style","Place a space before left parenthesis, except in a function call."," vapply(seq_along(y)[-(1:6)], function(i) { # Exclude Linting","spaces_left_parentheses_linter" -"R/ZZZ.R",18,1,"style","Variable and function name style should be snake_case.","`%||%` <- function(a, b) {","object_name_linter" diff --git a/.dev/revdep_emails/NHSRplotthedots/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/NHSRplotthedots/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index c273ca659..000000000 --- a/.dev/revdep_emails/NHSRplotthedots/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,41 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/doc/deviations.Rmd",12,12,"style","Put spaces around all infix operators."," fig.width=7, fig.height=5,","infix_spaces_linter" -"inst/doc/deviations.Rmd",12,26,"style","Put spaces around all infix operators."," fig.width=7, fig.height=5,","infix_spaces_linter" -"inst/doc/deviations.Rmd",67,11,"style","Trailing whitespace is superfluous."," plot() + ","trailing_whitespace_linter" -"inst/doc/deviations.Rmd",81,81,"style","Lines should not be more than 80 characters.","spc_data <- ptd_spc(df, value_field = data, date_field = date, screen_outliers = FALSE)","line_length_linter" -"inst/doc/deviations.Rmd",83,11,"style","Trailing whitespace is superfluous."," plot() + ","trailing_whitespace_linter" -"inst/doc/intro.Rmd",12,12,"style","Put spaces around all infix operators."," fig.width=7, fig.height=5,","infix_spaces_linter" -"inst/doc/intro.Rmd",12,26,"style","Put spaces around all infix operators."," fig.width=7, fig.height=5,","infix_spaces_linter" -"inst/doc/intro.Rmd",39,19,"style","Trailing whitespace is superfluous.","ae_attendances %>% ","trailing_whitespace_linter" -"inst/doc/intro.Rmd",40,43,"style","Trailing whitespace is superfluous."," filter(org_code == ""RRK"", type == 1) %>% ","trailing_whitespace_linter" -"inst/doc/intro.Rmd",57,33,"style","Trailing whitespace is superfluous.","stable_set <- ae_attendances %>% ","trailing_whitespace_linter" -"inst/doc/intro.Rmd",59,15,"style","Put spaces around all infix operators."," type ==1,","infix_spaces_linter" -"inst/doc/intro.Rmd",62,81,"style","Lines should not be more than 80 characters.","ptd_spc(stable_set, value_field = breaches, date_field = period, improvement_direction = ""decrease"")","line_length_linter" -"inst/doc/intro.Rmd",73,33,"style","Trailing whitespace is superfluous.","change_set <- ae_attendances %>% ","trailing_whitespace_linter" -"inst/doc/intro.Rmd",93,13,"style","Trailing whitespace is superfluous.","facet_set <- ","trailing_whitespace_linter" -"inst/doc/intro.Rmd",94,21,"style","Trailing whitespace is superfluous."," ae_attendances %>% ","trailing_whitespace_linter" -"inst/doc/intro.Rmd",110,32,"style","Trailing whitespace is superfluous.","facet_set <- ae_attendances %>% ","trailing_whitespace_linter" -"inst/doc/intro.Rmd",118,32,"style","Trailing whitespace is superfluous."," facet_field = org_code, ","trailing_whitespace_linter" -"inst/doc/intro.Rmd",129,32,"style","Trailing whitespace is superfluous.","facet_set <- ae_attendances %>% ","trailing_whitespace_linter" -"inst/doc/intro.Rmd",144,42,"style","Put spaces around all infix operators.","a + theme(axis.text.x = element_text(size=6, angle=45))","infix_spaces_linter" -"inst/doc/intro.Rmd",144,51,"style","Put spaces around all infix operators.","a + theme(axis.text.x = element_text(size=6, angle=45))","infix_spaces_linter" -"vignettes/deviations.Rmd",12,12,"style","Put spaces around all infix operators."," fig.width=7, fig.height=5,","infix_spaces_linter" -"vignettes/deviations.Rmd",12,26,"style","Put spaces around all infix operators."," fig.width=7, fig.height=5,","infix_spaces_linter" -"vignettes/deviations.Rmd",67,11,"style","Trailing whitespace is superfluous."," plot() + ","trailing_whitespace_linter" -"vignettes/deviations.Rmd",81,81,"style","Lines should not be more than 80 characters.","spc_data <- ptd_spc(df, value_field = data, date_field = date, screen_outliers = FALSE)","line_length_linter" -"vignettes/deviations.Rmd",83,11,"style","Trailing whitespace is superfluous."," plot() + ","trailing_whitespace_linter" -"vignettes/intro.Rmd",12,12,"style","Put spaces around all infix operators."," fig.width=7, fig.height=5,","infix_spaces_linter" -"vignettes/intro.Rmd",12,26,"style","Put spaces around all infix operators."," fig.width=7, fig.height=5,","infix_spaces_linter" -"vignettes/intro.Rmd",39,19,"style","Trailing whitespace is superfluous.","ae_attendances %>% ","trailing_whitespace_linter" -"vignettes/intro.Rmd",40,43,"style","Trailing whitespace is superfluous."," filter(org_code == ""RRK"", type == 1) %>% ","trailing_whitespace_linter" -"vignettes/intro.Rmd",57,33,"style","Trailing whitespace is superfluous.","stable_set <- ae_attendances %>% ","trailing_whitespace_linter" -"vignettes/intro.Rmd",59,15,"style","Put spaces around all infix operators."," type ==1,","infix_spaces_linter" -"vignettes/intro.Rmd",62,81,"style","Lines should not be more than 80 characters.","ptd_spc(stable_set, value_field = breaches, date_field = period, improvement_direction = ""decrease"")","line_length_linter" -"vignettes/intro.Rmd",73,33,"style","Trailing whitespace is superfluous.","change_set <- ae_attendances %>% ","trailing_whitespace_linter" -"vignettes/intro.Rmd",93,13,"style","Trailing whitespace is superfluous.","facet_set <- ","trailing_whitespace_linter" -"vignettes/intro.Rmd",94,21,"style","Trailing whitespace is superfluous."," ae_attendances %>% ","trailing_whitespace_linter" -"vignettes/intro.Rmd",110,32,"style","Trailing whitespace is superfluous.","facet_set <- ae_attendances %>% ","trailing_whitespace_linter" -"vignettes/intro.Rmd",118,32,"style","Trailing whitespace is superfluous."," facet_field = org_code, ","trailing_whitespace_linter" -"vignettes/intro.Rmd",129,32,"style","Trailing whitespace is superfluous.","facet_set <- ae_attendances %>% ","trailing_whitespace_linter" -"vignettes/intro.Rmd",144,42,"style","Put spaces around all infix operators.","a + theme(axis.text.x = element_text(size=6, angle=45))","infix_spaces_linter" -"vignettes/intro.Rmd",144,51,"style","Put spaces around all infix operators.","a + theme(axis.text.x = element_text(size=6, angle=45))","infix_spaces_linter" diff --git a/.dev/revdep_emails/NHSRplotthedots/email-body b/.dev/revdep_emails/NHSRplotthedots/email-body deleted file mode 100644 index 6eab782cc..000000000 --- a/.dev/revdep_emails/NHSRplotthedots/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Christopher Reading! Thank you for using {lintr} in your package {NHSRplotthedots}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cran/NHSRplotthedots (hash: 1d1fe989dcd6aa3de89a71bf29a466db70c2c29d) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 24s on CRAN vs. 13s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/OpenML/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/OpenML/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 848f53f4a..000000000 --- a/.dev/revdep_emails/OpenML/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,3 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/uploadOMLFlow.R",79,52,"style","There should be a space between right parenthesis and an opening curly brace.","# if (!(is.null(sourcefile) || is.na(sourcefile))){","paren_brace_linter" -"R/uploadOMLFlow.R",110,39,"style","There should be a space between right parenthesis and an opening curly brace.","# createLearnerSourcefile = function(x){","paren_brace_linter" diff --git a/.dev/revdep_emails/OpenML/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/OpenML/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index f9a790b5d..000000000 --- a/.dev/revdep_emails/OpenML/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,82 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/chunkOMLlist.R",21,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(args$limit) | !is.null(args$offset))","vector_logic_linter" -"R/config_helpers.R",45,32,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nchar(conf$apikey) != 32 & conf$apikey %nin% c("""", ""PLEASE CHANGE ME""))","vector_logic_linter" -"R/convertOMLDataSetToMlr.R",44,3,"style","Variable and function name style should be snake_case or symbols."," drop.levels = TRUE,","object_name_linter" -"R/convertOMLDataSetToMlr.R",62,42,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (any(!is.na(desc$ignore.attribute)) & ignore.flagged.attributes) {","vector_logic_linter" -"R/convertOMLDataSetToMlr.R",114,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.factor(target) | is.logical(target))","vector_logic_linter" -"R/convertOMLRunToBMR.R",62,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (all(!conf.cols.intergish) & pred.class == ""PredictionClassif"") {","vector_logic_linter" -"R/convertOMLTaskToMlr.R",32,3,"style","Variable and function name style should be snake_case or symbols."," drop.levels = TRUE,","object_name_linter" -"R/downloadOMLObject.R",40,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (f[[xml.ind]]$found & !overwrite) {","vector_logic_linter" -"R/downloadOMLObject.R",72,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(source.url) & !is.null(binary.url)) {","vector_logic_linter" -"R/downloadOMLObject.R",102,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(url) & length(url) != 0) {","vector_logic_linter" -"R/downloadOMLObject.R",103,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (f[[file.ind]]$found & !overwrite) {","vector_logic_linter" -"R/getCachedOMLDataSetStatus.R",31,51,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (any(cached.ds$status == ""deactivated"") > 0L & show.warnings) {","vector_logic_linter" -"R/OMLFlow_Class.R",99,3,"style","Variable and function name style should be snake_case or symbols."," source.url = NA_character_,","object_name_linter" -"R/OMLFlow_Class.R",101,3,"style","Variable and function name style should be snake_case or symbols."," source.format = NA_character_,","object_name_linter" -"R/OMLFlow_Class.R",103,3,"style","Variable and function name style should be snake_case or symbols."," source.md5 = NA_character_,","object_name_linter" -"R/OMLFlow_Class.R",105,3,"style","Variable and function name style should be snake_case or symbols."," source.path = NA_character_,","object_name_linter" -"R/OMLStudy_Class.R",41,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(flow.id) | !is.null(run.id))","vector_logic_linter" -"R/tagOMLObject.R",18,15,"style","Any function spanning multiple lines should use curly braces."," lapply(ids, function(id)","brace_linter" -"R/tagOMLObject.R",26,15,"style","Any function spanning multiple lines should use curly braces."," lapply(ids, function(id)","brace_linter" -"R/uploadOMLFlow.R",61,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(x$object) & !testFile(binaryfile)) {","vector_logic_linter" -"R/uploadOMLFlow.R",66,3,"style","Either both or neither branch in `if`/`else` should use curly braces."," if (testFile(binaryfile)) {","brace_linter" -"R/uploadOMLRun.R",60,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(flow$object) & !is.null(bmr)) {","vector_logic_linter" -"tests/testthat/helper_testthat.R",17,18,"warning","no visible global function definition for β€˜getBMRMeasures’"," expect_equal(getBMRMeasures(bmr)[[j]], bmr$measures[[j]])","object_usage_linter" -"tests/testthat/helper_testthat.R",18,18,"warning","no visible global function definition for β€˜getBMRMeasureIds’"," expect_equal(getBMRMeasureIds(bmr)[[j]], bmr$measures[[j]]$id)","object_usage_linter" -"tests/testthat/helper_with.r",11,3,"warning","no visible global function definition for β€˜with_reset_config’"," with_reset_config({","object_usage_linter" -"tests/testthat/helper_with.r",19,3,"warning","no visible global function definition for β€˜with_reset_config’"," with_reset_config({","object_usage_linter" -"tests/testthat/helper_with.r",29,3,"warning","no visible global function definition for β€˜with_reset_config’"," with_reset_config({","object_usage_linter" -"tests/testthat/helper_with.r",36,3,"warning","no visible global function definition for β€˜with_reset_config’"," with_reset_config({","object_usage_linter" -"vignettes/OpenML.Rmd",16,3,"style","Commented code should be removed.","# library(""knitr"")","commented_code_linter" -"vignettes/OpenML.Rmd",17,3,"style","Commented code should be removed.","# opts_chunk$set(cache = TRUE)","commented_code_linter" -"vignettes/OpenML.Rmd",19,58,"style","Trailing whitespace is superfluous.","setOMLConfig(apikey = ""c1994bdb7ecb3c6f3c8f3b35f4b47f1f"", ","trailing_whitespace_linter" -"vignettes/OpenML.Rmd",82,6,"style","Use <-, not =, for assignment.","task = getOMLTask(task.id = 1L)","assignment_linter" -"vignettes/OpenML.Rmd",99,5,"style","Use <-, not =, for assignment.","lrn = makeLearner(""classif.randomForest"")","assignment_linter" -"vignettes/OpenML.Rmd",103,1,"style","Variable and function name style should be snake_case or symbols.","flow.id = uploadOMLFlow(lrn)","object_name_linter" -"vignettes/OpenML.Rmd",103,9,"style","Use <-, not =, for assignment.","flow.id = uploadOMLFlow(lrn)","assignment_linter" -"vignettes/OpenML.Rmd",105,1,"style","Variable and function name style should be snake_case or symbols.","run.mlr = runTaskMlr(task, lrn)","object_name_linter" -"vignettes/OpenML.Rmd",105,9,"style","Use <-, not =, for assignment.","run.mlr = runTaskMlr(task, lrn)","assignment_linter" -"vignettes/OpenML.Rmd",106,1,"style","Variable and function name style should be snake_case or symbols.","run.id = uploadOMLRun(run.mlr)","object_name_linter" -"vignettes/OpenML.Rmd",106,8,"style","Use <-, not =, for assignment.","run.id = uploadOMLRun(run.mlr)","assignment_linter" -"vignettes/OpenML.Rmd",136,7,"style","Use <-, not =, for assignment.","apikey=c1994bdb7ecb3c6f3c8f3b35f4b47f1f","assignment_linter" -"vignettes/OpenML.Rmd",136,7,"style","Put spaces around all infix operators.","apikey=c1994bdb7ecb3c6f3c8f3b35f4b47f1f","infix_spaces_linter" -"vignettes/OpenML.Rmd",188,10,"style","Use <-, not =, for assignment.","datasets = listOMLDataSets() # returns active data sets","assignment_linter" -"vignettes/OpenML.Rmd",226,7,"style","Use <-, not =, for assignment.","tasks = listOMLTasks()","assignment_linter" -"vignettes/OpenML.Rmd",246,81,"style","Lines should not be more than 80 characters.","head(subset(tasks, task.type == ""Supervised Classification"" & data.id == 61L)[, 1:5])","line_length_linter" -"vignettes/OpenML.Rmd",252,7,"style","Use <-, not =, for assignment.","flows = listOMLFlows()","assignment_linter" -"vignettes/OpenML.Rmd",263,6,"style","Use <-, not =, for assignment.","runs = listOMLRuns(task.id = 59L) # must be specified with the task, setup and/or implementation ID","assignment_linter" -"vignettes/OpenML.Rmd",263,81,"style","Lines should not be more than 80 characters.","runs = listOMLRuns(task.id = 59L) # must be specified with the task, setup and/or implementation ID","line_length_linter" -"vignettes/OpenML.Rmd",266,1,"style","Variable and function name style should be snake_case or symbols.","run.results = listOMLRunEvaluations(task.id = 59L)","object_name_linter" -"vignettes/OpenML.Rmd",266,13,"style","Use <-, not =, for assignment.","run.results = listOMLRunEvaluations(task.id = 59L)","assignment_linter" -"vignettes/OpenML.Rmd",287,1,"style","Variable and function name style should be snake_case or symbols.","iris.data = getOMLDataSet(data.id = 61L) # the iris data set has the data set ID 61","object_name_linter" -"vignettes/OpenML.Rmd",287,11,"style","Use <-, not =, for assignment.","iris.data = getOMLDataSet(data.id = 61L) # the iris data set has the data set ID 61","assignment_linter" -"vignettes/OpenML.Rmd",287,81,"style","Lines should not be more than 80 characters.","iris.data = getOMLDataSet(data.id = 61L) # the iris data set has the data set ID 61","line_length_linter" -"vignettes/OpenML.Rmd",293,6,"style","Use <-, not =, for assignment.","task = getOMLTask(task.id = 59L)","assignment_linter" -"vignettes/OpenML.Rmd",309,1,"style","Variable and function name style should be snake_case or symbols.","iris.data = task$input$data.set$data","object_name_linter" -"vignettes/OpenML.Rmd",309,11,"style","Use <-, not =, for assignment.","iris.data = task$input$data.set$data","assignment_linter" -"vignettes/OpenML.Rmd",316,6,"style","Use <-, not =, for assignment.","flow = getOMLFlow(flow.id = 2700L)","assignment_linter" -"vignettes/OpenML.Rmd",325,1,"style","Variable and function name style should be snake_case or symbols.","task.list = listOMLRuns(task.id = 59L)","object_name_linter" -"vignettes/OpenML.Rmd",325,11,"style","Use <-, not =, for assignment.","task.list = listOMLRuns(task.id = 59L)","assignment_linter" -"vignettes/OpenML.Rmd",327,5,"style","Use <-, not =, for assignment.","run = getOMLRun(run.id = 524027L)","assignment_linter" -"vignettes/OpenML.Rmd",355,6,"style","Use <-, not =, for assignment.","task = getOMLTask(task.id = 59L)","assignment_linter" -"vignettes/OpenML.Rmd",357,5,"style","Use <-, not =, for assignment.","lrn = makeLearner(""classif.rpart"")","assignment_linter" -"vignettes/OpenML.Rmd",358,1,"style","Variable and function name style should be snake_case or symbols.","run.mlr = runTaskMlr(task, lrn)","object_name_linter" -"vignettes/OpenML.Rmd",358,9,"style","Use <-, not =, for assignment.","run.mlr = runTaskMlr(task, lrn)","assignment_linter" -"vignettes/OpenML.Rmd",380,5,"style","Use <-, not =, for assignment.","dsc = ""Daily air quality measurements in New York, May to September 1973.","assignment_linter" -"vignettes/OpenML.Rmd",382,5,"style","Use <-, not =, for assignment.","cit = ""Chambers, J. M., Cleveland, W. S., Kleiner, B. and Tukey, P. A. (1983)","assignment_linter" -"vignettes/OpenML.Rmd",385,6,"style","Use <-, not =, for assignment.","desc = makeOMLDataSetDescription(name = ""airquality"",","assignment_linter" -"vignettes/OpenML.Rmd",387,81,"style","Lines should not be more than 80 characters."," creator = ""New York State Department of Conservation (ozone data) and the National","line_length_linter" -"vignettes/OpenML.Rmd",392,81,"style","Lines should not be more than 80 characters."," url = ""https://stat.ethz.ch/R-manual/R-devel/library/datasets/html/00Index.html"",","line_length_linter" -"vignettes/OpenML.Rmd",397,1,"style","Variable and function name style should be snake_case or symbols.","air.data = makeOMLDataSet(desc = desc,","object_name_linter" -"vignettes/OpenML.Rmd",397,10,"style","Use <-, not =, for assignment.","air.data = makeOMLDataSet(desc = desc,","assignment_linter" -"vignettes/OpenML.Rmd",406,2,"style","Commented code should be removed.","#dataset.id = uploadOMLDataSet(air.data)","commented_code_linter" -"vignettes/OpenML.Rmd",420,5,"style","Use <-, not =, for assignment.","lrn = makeLearner(""classif.randomForest"")","assignment_linter" -"vignettes/OpenML.Rmd",421,1,"style","Variable and function name style should be snake_case or symbols.","flow.id = uploadOMLFlow(lrn)","object_name_linter" -"vignettes/OpenML.Rmd",421,9,"style","Use <-, not =, for assignment.","flow.id = uploadOMLFlow(lrn)","assignment_linter" -"vignettes/OpenML.Rmd",432,10,"style","Use <-, not =, for assignment.","learners = list(","assignment_linter" -"vignettes/OpenML.Rmd",437,1,"style","Variable and function name style should be snake_case or symbols.","task.ids = c(57, 59, 2382)","object_name_linter" -"vignettes/OpenML.Rmd",437,10,"style","Use <-, not =, for assignment.","task.ids = c(57, 59, 2382)","assignment_linter" -"vignettes/OpenML.Rmd",440,10,"style","Use <-, not =, for assignment."," task = getOMLTask(id)","assignment_linter" -"vignettes/OpenML.Rmd",441,9,"style","Use <-, not =, for assignment."," res = runTaskMlr(task, lrn)$run","assignment_linter" -"vignettes/OpenML.Rmd",442,5,"style","Variable and function name style should be snake_case or symbols."," run.id = uploadOMLRun(res) # upload results","object_name_linter" -"vignettes/OpenML.Rmd",442,12,"style","Use <-, not =, for assignment."," run.id = uploadOMLRun(res) # upload results","assignment_linter" diff --git a/.dev/revdep_emails/OpenML/email-body b/.dev/revdep_emails/OpenML/email-body deleted file mode 100644 index e38efa444..000000000 --- a/.dev/revdep_emails/OpenML/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Giuseppe Casalicchio! Thank you for using {lintr} in your package {OpenML}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/openml/openml-r (hash: a50c40474739c9d6e43e39f42a26c78fb7fb979a) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 74s on CRAN vs. 45s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/PWFSLSmoke/attachments/PWFSLSmoke.warnings b/.dev/revdep_emails/PWFSLSmoke/attachments/PWFSLSmoke.warnings deleted file mode 100644 index be09e01a7..000000000 --- a/.dev/revdep_emails/PWFSLSmoke/attachments/PWFSLSmoke.warnings +++ /dev/null @@ -1,2 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Trying to remove β€˜todo_comment_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/PWFSLSmoke/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/PWFSLSmoke/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 13c26c4df..000000000 --- a/.dev/revdep_emails/PWFSLSmoke/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,3 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/addMarker.R",91,24,"style","Place a space before left parenthesis, except in a function call."," top <- newXY$newY[-(seq_along(latitude))]","spaces_left_parentheses_linter" -"R/addMarker.R",93,26,"style","Place a space before left parenthesis, except in a function call."," right <- newXY$newX[-(seq_along(longitude))]","spaces_left_parentheses_linter" diff --git a/.dev/revdep_emails/PWFSLSmoke/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/PWFSLSmoke/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 7ee01cd92..000000000 --- a/.dev/revdep_emails/PWFSLSmoke/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,219 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/addShadedBackground.R",21,39,"style","Put spaces around all infix operators."," breaks=stats::quantile(param, na.rm = TRUE),","infix_spaces_linter" -"R/airsis_load.R",10,29,"style","Put spaces around all infix operators.","airsis_load <- function(year=2017,","infix_spaces_linter" -"R/createEmptyMetaDataframe.R",26,42,"style","Put spaces around all infix operators.","createEmptyMetaDataframe <- function(rows=0) {","infix_spaces_linter" -"R/epa_load.R",12,7,"style","Put spaces around all infix operators."," year=strftime(lubridate::now(tzone = ""UTC""), ""%Y"", tz = ""UTC""),","infix_spaces_linter" -"R/monitor_aqi.R",81,46,"style","Put spaces around all infix operators.",".assignBreakpointsTable <- function(parameter=""pm25"") {","infix_spaces_linter" -"R/monitor_asDataframe.R",54,42,"style","Put spaces around all infix operators."," monitorID=NULL,","infix_spaces_linter" -"R/monitor_asDataframe.R",55,45,"style","Put spaces around all infix operators."," extraColumns=NULL,","infix_spaces_linter" -"R/monitor_asDataframe.R",56,44,"style","Put spaces around all infix operators."," metaColumns=NULL,","infix_spaces_linter" -"R/monitor_asDataframe.R",57,37,"style","Put spaces around all infix operators."," tlim=NULL) {","infix_spaces_linter" -"R/monitor_collapse.R",111,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ( !is.null(longitude) & !is.null(latitude) ) {","vector_logic_linter" -"R/monitor_dailyStatistic.R",98,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (hoursAfter > 0 & hoursAfter <= 1) dayNum <- dayNum + 1","vector_logic_linter" -"R/monitor_dailyStatistic.R",103,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (hoursAfter > 0 & hoursAfter <= 1) dayNum <- dayNum + 1","vector_logic_linter" -"R/monitor_dailyThreshold.R",68,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (hoursAfter > 0 & hoursAfter <= 1) dayNum <- dayNum + 1","vector_logic_linter" -"R/monitor_dailyThreshold.R",71,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (hoursAfter > 0 & hoursAfter <= 1) dayNum <- dayNum + 1","vector_logic_linter" -"R/monitor_getCurrentStatus.R",367,3,"warning","local variable β€˜get_nAvg’ assigned but may not be used"," get_nAvg <- function(monitorDataColumn, timeIndex, n) {","object_usage_linter" -"R/monitor_getCurrentStatus.R",437,3,"warning","local variable β€˜get_previousDayAvg’ assigned but may not be used"," get_previousDayAvg <- function(ws_data, timezone, endTimeUTC) {","object_usage_linter" -"R/monitor_loadAnnual.R",128,7,"warning","local variable β€˜result’ assigned but may not be used"," result <- try({","object_usage_linter" -"R/monitor_performance.R",58,9,"style","Put spaces around all infix operators."," metric=NULL,","infix_spaces_linter" -"R/monitor_performanceMap.R",190,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ( showLegend & !is.null(colorBy) ) {","vector_logic_linter" -"R/monitor_print.R",111,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/monitor_writeCurrentStatusGeoJSON.R",106,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(propertyNames) & length(propertyNames) == length(properties))","vector_logic_linter" -"R/PWFSLSmoke-deprecated.R",96,12,"style","Put spaces around all infix operators."," monitorID=NULL,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",97,7,"style","Put spaces around all infix operators."," tlim=NULL,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",98,7,"style","Put spaces around all infix operators."," ylim=NULL,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",99,11,"style","Put spaces around all infix operators."," aqiLines=TRUE,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",100,14,"style","Put spaces around all infix operators."," shadedNight=TRUE,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",101,8,"style","Put spaces around all infix operators."," title=NULL,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",233,12,"style","Put spaces around all infix operators."," monitorID=NULL,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",234,7,"style","Put spaces around all infix operators."," tlim=NULL,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",235,11,"style","Put spaces around all infix operators."," minHours=18,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",238,10,"style","Put spaces around all infix operators."," gridLwd=0.5,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",240,17,"style","Put spaces around all infix operators."," labels_x_nudge=0,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",241,17,"style","Put spaces around all infix operators."," labels_y_nudge=0,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",286,53,"style","Put spaces around all infix operators.","monitorPlot_noData <- function(ws_monitor, monitorID=NULL, cex=2.5) {","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",286,63,"style","Put spaces around all infix operators.","monitorPlot_noData <- function(ws_monitor, monitorID=NULL, cex=2.5) {","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",294,12,"style","Put spaces around all infix operators."," monitorID=NULL,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",295,8,"style","Put spaces around all infix operators."," width=3,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",296,8,"style","Put spaces around all infix operators."," align=""center"",","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",297,14,"style","Put spaces around all infix operators."," data.thresh=75,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",298,7,"style","Put spaces around all infix operators."," tlim=NULL,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",299,7,"style","Put spaces around all infix operators."," ylim=NULL,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",300,12,"style","Put spaces around all infix operators."," localTime=TRUE,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",301,14,"style","Put spaces around all infix operators."," shadedNight=FALSE,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",302,11,"style","Put spaces around all infix operators."," aqiLines=TRUE,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",303,17,"style","Put spaces around all infix operators."," gridHorizontal=FALSE,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",304,11,"style","Put spaces around all infix operators."," grid24hr=FALSE,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",305,10,"style","Put spaces around all infix operators."," grid3hr=FALSE,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",306,13,"style","Put spaces around all infix operators."," showLegend=TRUE","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",318,12,"style","Put spaces around all infix operators."," monitorID=NULL,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",319,7,"style","Put spaces around all infix operators."," tlim=NULL,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",320,12,"style","Put spaces around all infix operators."," localTime=TRUE,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",321,8,"style","Put spaces around all infix operators."," style=NULL,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",322,14,"style","Put spaces around all infix operators."," shadedNight=FALSE,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",323,6,"style","Put spaces around all infix operators."," add=FALSE,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",326,10,"style","Put spaces around all infix operators."," gridLwd=1,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",328,9,"style","Put spaces around all infix operators."," dayLwd=0,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",329,10,"style","Put spaces around all infix operators."," hourLwd=0,","infix_spaces_linter" -"R/PWFSLSmoke-deprecated.R",330,15,"style","Put spaces around all infix operators."," hourInterval=6,","infix_spaces_linter" -"R/skill_confusionMatrix.R",69,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ( !is.logical(predicted) | !is.logical(observed) ) {","vector_logic_linter" -"R/wrcc_load.R",10,27,"style","Put spaces around all infix operators.","wrcc_load <- function(year=2017,","infix_spaces_linter" -"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",56,80,"style","Trailing whitespace is superfluous.","monitorIDs <- c(""080310002_01"", ""080131001_01"", ""080130003_01"", ""081230006_01"", ","trailing_whitespace_linter" -"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",63,15,"style","Trailing whitespace is superfluous.","my_monitors <- ","trailing_whitespace_linter" -"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",81,15,"style","Trailing whitespace is superfluous."," my_monitors, ","trailing_whitespace_linter" -"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",82,50,"style","Trailing whitespace is superfluous."," title = ""Front Range AQIs - Feb 15 - 18, 2021"", ","trailing_whitespace_linter" -"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",102,44,"style","Only use double-quotes.","monitor_timeseriesPlot(my_monitors, type = 'l')","single_quotes_linter" -"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",103,45,"style","Only use double-quotes.","monitor_timeseriesPlot(my_monitors, style = 'aqidots', pch=16, cex = 1, add = TRUE)","single_quotes_linter" -"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",103,59,"style","Put spaces around all infix operators.","monitor_timeseriesPlot(my_monitors, style = 'aqidots', pch=16, cex = 1, add = TRUE)","infix_spaces_linter" -"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",125,75,"style","Trailing whitespace is superfluous.","# After looking at my_monitors$meta$siteName, help ggplot out by assigning ","trailing_whitespace_linter" -"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",135,6,"style","Trailing whitespace is superfluous.","gg <- ","trailing_whitespace_linter" -"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",143,32,"style","Trailing whitespace is superfluous."," stat_AQCategory(color = NA) + ","trailing_whitespace_linter" -"vignettes/articles/Example_Denver_Air_Quality_Forecast.Rmd",144,37,"style","Trailing whitespace is superfluous."," facet_grid(rows = vars(shortName)) ","trailing_whitespace_linter" -"vignettes/articles/Example_Save_Data_as_CSV.Rmd",40,13,"style","Trailing whitespace is superfluous.","airsis_ca <- ","trailing_whitespace_linter" -"vignettes/articles/Example_Save_Data_as_CSV.Rmd",69,12,"style","Trailing whitespace is superfluous.","Mariposa <- ","trailing_whitespace_linter" -"vignettes/articles/Example_Save_Data_as_CSV.Rmd",82,12,"style","Trailing whitespace is superfluous."," Mariposa, ","trailing_whitespace_linter" -"vignettes/articles/Example_Save_Data_as_CSV.Rmd",98,13,"style","Trailing whitespace is superfluous."," airsis_ca, ","trailing_whitespace_linter" -"vignettes/articles/Example_Save_Data_as_CSV.Rmd",107,13,"style","Trailing whitespace is superfluous."," airsis_ca, ","trailing_whitespace_linter" -"vignettes/articles/Example_Save_Data_as_CSV.Rmd",136,47,"style","Trailing whitespace is superfluous."," monitor_nowcast(includeShortTerm = TRUE) %>% ","trailing_whitespace_linter" -"vignettes/articles/Loading_Monitoring_Data.Rmd",144,101,"style","Lines should not be more than 100 characters.","AirNow_hourly <- get(load(url(""https://haze.airfire.org/monitoring/latest/RData/airnow_PM2.5_latest10.RData"")))","line_length_linter" -"vignettes/articles/Loading_Monitoring_Data.Rmd",158,13,"style","Only use double-quotes.","parameter = 'PM2.5',","single_quotes_linter" -"vignettes/articles/Loading_Monitoring_Data.Rmd",160,16,"style","Trailing whitespace is superfluous.","dataDir = NULL) ","trailing_whitespace_linter" -"vignettes/articles/Loading_Monitoring_Data.Rmd",167,13,"style","Only use double-quotes.","parameter = 'PM2.5',","single_quotes_linter" -"vignettes/articles/Loading_Monitoring_Data.Rmd",169,16,"style","Trailing whitespace is superfluous.","dataDir = NULL) ","trailing_whitespace_linter" -"vignettes/articles/Loading_Monitoring_Data.Rmd",177,13,"style","Only use double-quotes.","parameter = 'PM2.5',","single_quotes_linter" -"vignettes/articles/Loading_Monitoring_Data.Rmd",179,16,"style","Trailing whitespace is superfluous.","dataDir = NULL) ","trailing_whitespace_linter" -"vignettes/articles/Loading_Monitoring_Data.Rmd",239,28,"style","Put spaces around all infix operators."," monitor_subset(stateCodes= 'WA')","infix_spaces_linter" -"vignettes/articles/Loading_Monitoring_Data.Rmd",239,30,"style","Only use double-quotes."," monitor_subset(stateCodes= 'WA')","single_quotes_linter" -"vignettes/articles/Loading_Monitoring_Data.Rmd",242,43,"style","Only use double-quotes.","monitor_timeseriesPlot(airnow_wa, style = 'gnats')","single_quotes_linter" -"vignettes/articles/Loading_Monitoring_Data.Rmd",273,37,"style","Only use double-quotes.","monitor_timeseriesPlot(pnw, style = 'gnats')","single_quotes_linter" -"vignettes/Data_Model.Rmd",90,67,"style","Trailing whitespace is superfluous.","# NOTE: 'tlim' is interpreted as UTC unless we specify 'timezone' ","trailing_whitespace_linter" -"vignettes/Data_Model.Rmd",94,40,"style","Only use double-quotes.","WA <- monitor_subset(N_M, stateCodes = 'WA')","single_quotes_linter" -"vignettes/Data_Model.Rmd",109,44,"style","Commas should always have a space after.","all(rownames(WA$meta) == colnames(WA$data[,-1]))","commas_linter" -"vignettes/Data_Model.Rmd",140,12,"style","Only use double-quotes.","TwispID <- '530470009_01'","single_quotes_linter" -"vignettes/Data_Model.Rmd",141,15,"style","Only use double-quotes.","WinthropID <- '530470010_01'","single_quotes_linter" -"vignettes/Data_Model.Rmd",142,27,"style","Trailing whitespace is superfluous.","Methow_Valley_JulyMeans <- ","trailing_whitespace_linter" -"vignettes/Data_Model.Rmd",144,41,"style","Commas should always have a space after."," monitor_subset(monitorIDs = c(TwispID,WinthropID)) %>%","commas_linter" -"vignettes/Data_Model.Rmd",145,32,"style","Only use double-quotes."," monitor_collapse(monitorID = 'MethowValley') %>%","single_quotes_linter" -"vignettes/Data_Model.Rmd",146,22,"style","Put spaces around all infix operators."," monitor_subset(tlim=c(20150701, 20150731), timezone = 'America/Los_Angeles') %>%","infix_spaces_linter" -"vignettes/Data_Model.Rmd",146,57,"style","Only use double-quotes."," monitor_subset(tlim=c(20150701, 20150731), timezone = 'America/Los_Angeles') %>%","single_quotes_linter" -"vignettes/Data_Model.Rmd",149,34,"style","Commas should always have a space after.","Methow_Valley_JulyMeans$data[1:7,]","commas_linter" -"vignettes/Data_Model.Rmd",164,27,"style","Commas should always have a space after.","Spokane_3hr_squared$data[,-1] <- (Spokane_3hr$data[,-1])^2 # exclude the 'datetime' column","commas_linter" -"vignettes/Data_Model.Rmd",164,53,"style","Commas should always have a space after.","Spokane_3hr_squared$data[,-1] <- (Spokane_3hr$data[,-1])^2 # exclude the 'datetime' column","commas_linter" -"vignettes/Data_Model.Rmd",172,33,"style","Commas should always have a space after.","data <- Spokane_daily_3hr$data[,-1] # exclude the 'datetime' column","commas_linter" -"vignettes/Data_Model.Rmd",173,17,"style","Only use double-quotes.","cor(data, use = 'complete.obs')","single_quotes_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",54,2,"style","Commented code should be removed.","#monitor_leaflet(PacNW_24, slice = max)","commented_code_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",67,42,"style","Only use double-quotes.","monitor_timeseriesPlot(NezPerce, style = 'gnats')","single_quotes_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",90,23,"style","Commas should always have a space after.","opar <- par(mar = c(1,1,1,1))","commas_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",90,25,"style","Commas should always have a space after.","opar <- par(mar = c(1,1,1,1))","commas_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",90,27,"style","Commas should always have a space after.","opar <- par(mar = c(1,1,1,1))","commas_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",93,40,"style","Only use double-quotes."," siteName <- NezPerce$meta[monitorID, 'siteName']","single_quotes_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",95,14,"style","Trailing whitespace is superfluous."," NezPerce, ","trailing_whitespace_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",96,27,"style","Trailing whitespace is superfluous."," monitorID = monitorID, ","trailing_whitespace_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",97,21,"style","Trailing whitespace is superfluous."," main = siteName, ","trailing_whitespace_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",99,4,"style","Trailing whitespace is superfluous."," ) ","trailing_whitespace_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",110,21,"style","Commas should always have a space after.","data <- PacNW$data[,-1] # omit 'datetime' column","commas_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",112,101,"style","Lines should not be more than 100 characters.","worstAcute <- names(sort(maxPM25, decreasing = TRUE))[1:6] # monitorIDs for the six worst sites in PacNW","line_length_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",114,26,"style","Commas should always have a space after.","PacNW$meta[worstAcute[1],c('siteName','countyName','stateCode')]","commas_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",114,28,"style","Only use double-quotes.","PacNW$meta[worstAcute[1],c('siteName','countyName','stateCode')]","single_quotes_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",114,39,"style","Commas should always have a space after.","PacNW$meta[worstAcute[1],c('siteName','countyName','stateCode')]","commas_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",114,39,"style","Only use double-quotes.","PacNW$meta[worstAcute[1],c('siteName','countyName','stateCode')]","single_quotes_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",114,52,"style","Commas should always have a space after.","PacNW$meta[worstAcute[1],c('siteName','countyName','stateCode')]","commas_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",114,52,"style","Only use double-quotes.","PacNW$meta[worstAcute[1],c('siteName','countyName','stateCode')]","single_quotes_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",127,30,"style","Commas should always have a space after.","data <- PacNW_dailyAvg$data[,-1]","commas_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",128,45,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","unhealthyDays <- apply(data, 2, function(x) { sum(x >= AQI$breaks_24[4], na.rm = TRUE) })","brace_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",131,28,"style","Commas should always have a space after.","PacNW$meta[worstChronic[1],c('siteName','countyName','stateCode')]","commas_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",131,30,"style","Only use double-quotes.","PacNW$meta[worstChronic[1],c('siteName','countyName','stateCode')]","single_quotes_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",131,41,"style","Commas should always have a space after.","PacNW$meta[worstChronic[1],c('siteName','countyName','stateCode')]","commas_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",131,41,"style","Only use double-quotes.","PacNW$meta[worstChronic[1],c('siteName','countyName','stateCode')]","single_quotes_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",131,54,"style","Commas should always have a space after.","PacNW$meta[worstChronic[1],c('siteName','countyName','stateCode')]","commas_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",131,54,"style","Only use double-quotes.","PacNW$meta[worstChronic[1],c('siteName','countyName','stateCode')]","single_quotes_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",156,18,"style","Trailing whitespace is superfluous."," PacNW_dailyAvg, ","trailing_whitespace_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",158,13,"style","Only use double-quotes."," maptype = 'terrain',","single_quotes_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",159,20,"style","Trailing whitespace is superfluous."," centerLon = -118, ","trailing_whitespace_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",160,18,"style","Trailing whitespace is superfluous."," centerLat = 47, ","trailing_whitespace_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",161,11,"style","Trailing whitespace is superfluous."," zoom = 7 ","trailing_whitespace_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",163,9,"style","Only use double-quotes.","addIcon('redFlame', fireLons, fireLats, expansion = .002)","single_quotes_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",182,8,"style","Trailing whitespace is superfluous."," Omak, ","trailing_whitespace_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",184,24,"style","Trailing whitespace is superfluous."," labels_x_nudge = 0.8, ","trailing_whitespace_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",188,10,"style","Trailing whitespace is superfluous."," Kamiah, ","trailing_whitespace_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",189,7,"style","Put spaces around all infix operators."," main=""August Daily AQI -- Kamiah, ID"",","infix_spaces_linter" -"vignettes/Maps_and_Timeseries_Plots.Rmd",190,24,"style","Trailing whitespace is superfluous."," labels_x_nudge = 0.8, ","trailing_whitespace_linter" -"vignettes/NowCast.Rmd",306,48,"style","Put spaces around all infix operators.","N_M <- monitor_subset(Northwest_Megafires, tlim=c(20150801,20150831),","infix_spaces_linter" -"vignettes/NowCast.Rmd",306,60,"style","Commas should always have a space after.","N_M <- monitor_subset(Northwest_Megafires, tlim=c(20150801,20150831),","commas_linter" -"vignettes/NowCast.Rmd",307,31,"style","Put spaces around all infix operators."," timezone=""America/Los_Angeles"")","infix_spaces_linter" -"vignettes/NowCast.Rmd",308,39,"style","Put spaces around all infix operators.","Omak <- monitor_subset(N_M, monitorIDs='530470013_01')","infix_spaces_linter" -"vignettes/NowCast.Rmd",308,40,"style","Only use double-quotes.","Omak <- monitor_subset(N_M, monitorIDs='530470013_01')","single_quotes_linter" -"vignettes/NowCast.Rmd",313,34,"style","Put spaces around all infix operators.","monitor_timeseriesPlot(Omak, type='l', lwd=2)","infix_spaces_linter" -"vignettes/NowCast.Rmd",313,35,"style","Only use double-quotes.","monitor_timeseriesPlot(Omak, type='l', lwd=2)","single_quotes_linter" -"vignettes/NowCast.Rmd",313,43,"style","Put spaces around all infix operators.","monitor_timeseriesPlot(Omak, type='l', lwd=2)","infix_spaces_linter" -"vignettes/NowCast.Rmd",314,41,"style","Put spaces around all infix operators.","monitor_timeseriesPlot(Omak_nowcast, add=TRUE, type='l', col='purple', lwd=2)","infix_spaces_linter" -"vignettes/NowCast.Rmd",314,52,"style","Put spaces around all infix operators.","monitor_timeseriesPlot(Omak_nowcast, add=TRUE, type='l', col='purple', lwd=2)","infix_spaces_linter" -"vignettes/NowCast.Rmd",314,53,"style","Only use double-quotes.","monitor_timeseriesPlot(Omak_nowcast, add=TRUE, type='l', col='purple', lwd=2)","single_quotes_linter" -"vignettes/NowCast.Rmd",314,61,"style","Put spaces around all infix operators.","monitor_timeseriesPlot(Omak_nowcast, add=TRUE, type='l', col='purple', lwd=2)","infix_spaces_linter" -"vignettes/NowCast.Rmd",314,62,"style","Only use double-quotes.","monitor_timeseriesPlot(Omak_nowcast, add=TRUE, type='l', col='purple', lwd=2)","single_quotes_linter" -"vignettes/NowCast.Rmd",314,75,"style","Put spaces around all infix operators.","monitor_timeseriesPlot(Omak_nowcast, add=TRUE, type='l', col='purple', lwd=2)","infix_spaces_linter" -"vignettes/NowCast.Rmd",316,17,"style","Put spaces around all infix operators.","addAQILegend(lwd=1, pch=NULL, 'topleft')","infix_spaces_linter" -"vignettes/NowCast.Rmd",316,24,"style","Put spaces around all infix operators.","addAQILegend(lwd=1, pch=NULL, 'topleft')","infix_spaces_linter" -"vignettes/NowCast.Rmd",316,31,"style","Only use double-quotes.","addAQILegend(lwd=1, pch=NULL, 'topleft')","single_quotes_linter" -"vignettes/NowCast.Rmd",317,23,"style","Put spaces around all infix operators.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","infix_spaces_linter" -"vignettes/NowCast.Rmd",317,30,"style","Put spaces around all infix operators.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","infix_spaces_linter" -"vignettes/NowCast.Rmd",317,33,"style","Only use double-quotes.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","single_quotes_linter" -"vignettes/NowCast.Rmd",317,41,"style","Commas should always have a space after.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","commas_linter" -"vignettes/NowCast.Rmd",317,41,"style","Only use double-quotes.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","single_quotes_linter" -"vignettes/NowCast.Rmd",317,58,"style","Put spaces around all infix operators.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","infix_spaces_linter" -"vignettes/NowCast.Rmd",317,61,"style","Only use double-quotes.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","single_quotes_linter" -"vignettes/NowCast.Rmd",317,70,"style","Commas should always have a space after.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","commas_linter" -"vignettes/NowCast.Rmd",317,70,"style","Only use double-quotes.","legend(""topright"", lwd=2, col=c('black','purple'), legend=c('hourly','nowcast'))","single_quotes_linter" -"vignettes/NowCast.Rmd",332,45,"style","Put spaces around all infix operators.","Omak_2015_08_21 <- monitor_subset(Omak, tlim=c(2015082100, 2015082111))","infix_spaces_linter" -"vignettes/NowCast.Rmd",346,32,"style","Put spaces around all infix operators.","(w_star <- min(example1_values)/max(example1_values))","infix_spaces_linter" -"vignettes/NowCast.Rmd",353,12,"style","Put spaces around all infix operators.","(w <- max(1/2, w_star))","infix_spaces_linter" -"vignettes/NowCast.Rmd",370,23,"style","Put spaces around all infix operators.","(numer <- sum(w^(0:11)*example1_values))","infix_spaces_linter" -"vignettes/NowCast.Rmd",392,6,"style","Put spaces around all infix operators.","numer/denom","infix_spaces_linter" -"vignettes/NowCast.Rmd",401,34,"style","Put spaces around all infix operators.","monitor_subset(Omak_nowcast, tlim=rep(2015082111, 2))$data","infix_spaces_linter" -"vignettes/NowCast.Rmd",413,45,"style","Put spaces around all infix operators.","Omak_2015_08_24 <- monitor_subset(Omak, tlim=c(2015082412, 2015082423))","infix_spaces_linter" -"vignettes/NowCast.Rmd",436,37,"style","Put spaces around all infix operators.","w_star <- min(example2_values, na.rm=TRUE)/max(example2_values, na.rm=TRUE)","infix_spaces_linter" -"vignettes/NowCast.Rmd",436,43,"style","Put spaces around all infix operators.","w_star <- min(example2_values, na.rm=TRUE)/max(example2_values, na.rm=TRUE)","infix_spaces_linter" -"vignettes/NowCast.Rmd",436,70,"style","Put spaces around all infix operators.","w_star <- min(example2_values, na.rm=TRUE)/max(example2_values, na.rm=TRUE)","infix_spaces_linter" -"vignettes/NowCast.Rmd",437,12,"style","Put spaces around all infix operators.","(w <- max(1/2, w_star))","infix_spaces_linter" -"vignettes/NowCast.Rmd",445,29,"style","Put spaces around all infix operators.","numer <- sum(w^(validIndexes-1)*example2_values[validIndexes])","infix_spaces_linter" -"vignettes/NowCast.Rmd",445,32,"style","Put spaces around all infix operators.","numer <- sum(w^(validIndexes-1)*example2_values[validIndexes])","infix_spaces_linter" -"vignettes/NowCast.Rmd",446,29,"style","Put spaces around all infix operators.","denom <- sum(w^(validIndexes-1))","infix_spaces_linter" -"vignettes/NowCast.Rmd",447,6,"style","Put spaces around all infix operators.","numer/denom","infix_spaces_linter" -"vignettes/NowCast.Rmd",456,34,"style","Put spaces around all infix operators.","monitor_subset(Omak_nowcast, tlim=rep(2015082423, 2))$data","infix_spaces_linter" -"vignettes/NowCast.Rmd",468,57,"style","Put spaces around all infix operators.","example2_df$nowcast <- monitor_subset(Omak_nowcast, tlim=c(2015082412, 2015082423))$data$`530470013_01`","infix_spaces_linter" -"vignettes/NowCast.Rmd",468,101,"style","Lines should not be more than 100 characters.","example2_df$nowcast <- monitor_subset(Omak_nowcast, tlim=c(2015082412, 2015082423))$data$`530470013_01`","line_length_linter" -"vignettes/NowCast.Rmd",478,45,"style","Put spaces around all infix operators.","Omak_2015_08_23 <- monitor_subset(Omak, tlim=c(2015082312, 2015082323))","infix_spaces_linter" -"vignettes/NowCast.Rmd",501,37,"style","Put spaces around all infix operators.","w_star <- min(example3_values, na.rm=TRUE)/max(example3_values, na.rm=TRUE)","infix_spaces_linter" -"vignettes/NowCast.Rmd",501,43,"style","Put spaces around all infix operators.","w_star <- min(example3_values, na.rm=TRUE)/max(example3_values, na.rm=TRUE)","infix_spaces_linter" -"vignettes/NowCast.Rmd",501,70,"style","Put spaces around all infix operators.","w_star <- min(example3_values, na.rm=TRUE)/max(example3_values, na.rm=TRUE)","infix_spaces_linter" -"vignettes/NowCast.Rmd",502,12,"style","Put spaces around all infix operators.","(w <- max(1/2, w_star))","infix_spaces_linter" -"vignettes/NowCast.Rmd",510,29,"style","Put spaces around all infix operators.","numer <- sum(w^(validIndexes-1)*example3_values[validIndexes])","infix_spaces_linter" -"vignettes/NowCast.Rmd",510,32,"style","Put spaces around all infix operators.","numer <- sum(w^(validIndexes-1)*example3_values[validIndexes])","infix_spaces_linter" -"vignettes/NowCast.Rmd",511,29,"style","Put spaces around all infix operators.","denom <- sum(w^(validIndexes-1))","infix_spaces_linter" -"vignettes/NowCast.Rmd",512,6,"style","Put spaces around all infix operators.","numer/denom","infix_spaces_linter" -"vignettes/NowCast.Rmd",521,34,"style","Put spaces around all infix operators.","monitor_subset(Omak_nowcast, tlim=rep(2015082323, 2))$data","infix_spaces_linter" -"vignettes/NowCast.Rmd",532,57,"style","Put spaces around all infix operators.","example3_df$nowcast <- monitor_subset(Omak_nowcast, tlim=c(2015082312, 2015082323))$data$`530470013_01`","infix_spaces_linter" -"vignettes/NowCast.Rmd",532,101,"style","Lines should not be more than 100 characters.","example3_df$nowcast <- monitor_subset(Omak_nowcast, tlim=c(2015082312, 2015082323))$data$`530470013_01`","line_length_linter" -"vignettes/NowCast.Rmd",618,22,"style","Commas should always have a space after.","tlim <- c(2015082500,2015082523)","commas_linter" -"vignettes/NowCast.Rmd",619,50,"style","Put spaces around all infix operators.","Omak2 <- monitor_subset(Northwest_Megafires, tlim=tlim, monitorIDs = '530470013_01')","infix_spaces_linter" -"vignettes/NowCast.Rmd",619,70,"style","Only use double-quotes.","Omak2 <- monitor_subset(Northwest_Megafires, tlim=tlim, monitorIDs = '530470013_01')","single_quotes_linter" -"vignettes/NowCast.Rmd",644,49,"style","Put spaces around all infix operators.","example4_df <- monitor_subset(Omak_nowcast, tlim=tlim)$data","infix_spaces_linter" -"vignettes/NowCast.Rmd",668,37,"style","Put spaces around all infix operators.","example5_df <- data.frame(""datetime""=Omak$data$datetime,","infix_spaces_linter" -"vignettes/NowCast.Rmd",669,38,"style","Put spaces around all infix operators."," ""monitored""=Omak$data$`530470013_01`,","infix_spaces_linter" -"vignettes/NowCast.Rmd",670,32,"style","Put spaces around all infix operators."," ""aqi""=aqi$data$`530470013_01`)","infix_spaces_linter" -"vignettes/NowCast.Rmd",671,36,"style","Commas should always have a space after.","example5_df <- example5_df[500:650,]","commas_linter" -"vignettes/NowCast.Rmd",672,55,"style","Put spaces around all infix operators.","plot(example5_df$datetime, example5_df$monitored, xlab='Date', ylab='')","infix_spaces_linter" -"vignettes/NowCast.Rmd",672,56,"style","Only use double-quotes.","plot(example5_df$datetime, example5_df$monitored, xlab='Date', ylab='')","single_quotes_linter" -"vignettes/NowCast.Rmd",672,68,"style","Put spaces around all infix operators.","plot(example5_df$datetime, example5_df$monitored, xlab='Date', ylab='')","infix_spaces_linter" -"vignettes/NowCast.Rmd",672,69,"style","Only use double-quotes.","plot(example5_df$datetime, example5_df$monitored, xlab='Date', ylab='')","single_quotes_linter" -"vignettes/NowCast.Rmd",673,49,"style","Put spaces around all infix operators.","lines(example5_df$datetime, example5_df$aqi, col=""blue"")","infix_spaces_linter" -"vignettes/PWFSLSmoke.Rmd",139,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/PWFSLSmoke.Rmd",172,31,"style","Only use double-quotes."," monitor_subset(monitorIDs = '060670010_01')","single_quotes_linter" -"vignettes/PWFSLSmoke.Rmd",176,8,"style","Put spaces around all infix operators."," style='aqidots',","infix_spaces_linter" -"vignettes/PWFSLSmoke.Rmd",176,9,"style","Only use double-quotes."," style='aqidots',","single_quotes_linter" -"vignettes/PWFSLSmoke.Rmd",177,6,"style","Put spaces around all infix operators."," pch=16,","infix_spaces_linter" -"vignettes/PWFSLSmoke.Rmd",178,7,"style","Put spaces around all infix operators."," xlab=""2018""","infix_spaces_linter" -"vignettes/PWFSLSmoke.Rmd",182,17,"style","Put spaces around all infix operators.","addAQILegend(cex=0.8)","infix_spaces_linter" -"vignettes/PWFSLSmoke.Rmd",204,40,"style","Trailing whitespace is superfluous.","monitor_timeseriesPlot(Sacramento_area, ","trailing_whitespace_linter" -"vignettes/PWFSLSmoke.Rmd",205,32,"style","Only use double-quotes."," style = 'gnats',","single_quotes_linter" diff --git a/.dev/revdep_emails/PWFSLSmoke/email-body b/.dev/revdep_emails/PWFSLSmoke/email-body deleted file mode 100644 index c68a0c326..000000000 --- a/.dev/revdep_emails/PWFSLSmoke/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Jonathan Callahan! Thank you for using {lintr} in your package {PWFSLSmoke}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/MazamaScience/PWFSLSmoke (hash: 1fa59b51b7424c0a5539451de109b672d1ca0657) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 156s on CRAN vs. 94s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/Plasmidprofiler/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/Plasmidprofiler/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 153a8621f..000000000 --- a/.dev/revdep_emails/Plasmidprofiler/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,19 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/graphics_related.R",106,10,"style","Variable and function name style should be snake_case."," report$Colours2 <- colours.amr[match(report$AMR_gene,","object_name_linter" -"R/graphics_related.R",233,10,"style","Variable and function name style should be snake_case."," report$Colours2 <- colours.amr[match(report$AMR_gene,","object_name_linter" -"R/graphics_related.R",260,30,"style","There should be a space between right parenthesis and an opening curly brace."," # if (!is.na(len.highlight)){","paren_brace_linter" -"R/main_aux.R",218,28,"style","There should be a space between right parenthesis and an opening curly brace."," #if (!exists(""filecache"")){","paren_brace_linter" -"R/parse_related.R",184,54,"style","There should be a space between right parenthesis and an opening curly brace."," # if (length(grep(""AMR"", blast.results$qseqid)) > 0){","paren_brace_linter" -"R/parse_related.R",185,50,"style","There should be a space between right parenthesis and an opening curly brace."," # for (i in grep(""AMR"", blast.results$qseqid)){","paren_brace_linter" -"R/parse_related.R",186,39,"style","There should be a space between right parenthesis and an opening curly brace."," # if (blast.results[i, 3] == 100){","paren_brace_linter" -"R/parse_related.R",247,10,"style","Variable and function name style should be snake_case."," report$Plasmid <- as.character(br$qseqid[match(report$gene, br$sseqid)])","object_name_linter" -"R/parse_related.R",251,10,"style","Variable and function name style should be snake_case."," report$Plasmid <- str_split_fixed(report$Plasmid, ""_"", 3)[, 1]","object_name_linter" -"R/report_related.R",67,10,"style","Variable and function name style should be snake_case."," report$AMR_gene <- as.character(pos.samples$Gene[match(report$Plasmid,","object_name_linter" -"R/report_related.R",122,12,"style","Variable and function name style should be snake_case."," report$Inc_group <- str_split_fixed(report$Inc_group, ""\\("", 2)[, 1]","object_name_linter" -"R/report_related.R",220,12,"style","Variable and function name style should be snake_case."," report$Sample <- ordered(report$Sample,","object_name_linter" -"R/report_related.R",233,10,"style","Variable and function name style should be snake_case."," report$Plasmid <- ordered(report$Plasmid,","object_name_linter" -"R/report_related.R",237,10,"style","Variable and function name style should be snake_case."," report$Inc_group <- as.factor(report$Inc_group)","object_name_linter" -"R/report_related.R",238,10,"style","Variable and function name style should be snake_case."," report$AMR_gene <- as.factor(report$AMR_gene)","object_name_linter" -"R/report_related.R",241,12,"style","Variable and function name style should be snake_case."," report$Sample <- mapvalues(report$Sample,","object_name_linter" -"R/report_related.R",245,12,"style","Variable and function name style should be snake_case."," report$Plasmid <- mapvalues(report$Plasmid,","object_name_linter" -"R/zzz.R",5,1,"style","Variable and function name style should be snake_case.",".onAttach <- function(libname, pkgname) {","object_name_linter" diff --git a/.dev/revdep_emails/Plasmidprofiler/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/Plasmidprofiler/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index d34605c1e..000000000 --- a/.dev/revdep_emails/Plasmidprofiler/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,22 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/graphics_related.R",45,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/graphics_related.R",125,42,"style","Use FALSE instead of the symbol F."," inherit.aes = F,","T_and_F_symbol_linter" -"R/graphics_related.R",158,3,"style","Variable and function name style should be snake_case or symbols."," max.height <- unit.pmax(pp.gt$heights[4:5], tree.gt$heights[4:5])","object_name_linter" -"R/graphics_related.R",161,3,"style","Variable and function name style should be snake_case or symbols."," pp.gt$heights[4:5] <- as.list(max.height)","object_name_linter" -"R/graphics_related.R",162,3,"style","Variable and function name style should be snake_case or symbols."," tree.gt$heights[4:5] <- as.list(max.height)","object_name_linter" -"R/graphics_related.R",227,31,"style","Put spaces around all infix operators."," post=NA,","infix_spaces_linter" -"R/graphics_related.R",228,32,"style","Put spaces around all infix operators."," title=""Plasmid Profiles"",","infix_spaces_linter" -"R/graphics_related.R",288,36,"style","Use FALSE instead of the symbol F."," inherit.aes = F,","T_and_F_symbol_linter" -"R/graphics_related.R",334,32,"style","Use FALSE instead of the symbol F."," plotly::layout(autosize = F,","T_and_F_symbol_linter" -"R/main_aux.R",71,27,"style","Put spaces around all infix operators."," anonymize=NA,","infix_spaces_linter" -"R/main_aux.R",158,10,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/main_aux.R",179,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/parse_related.R",68,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/parse_related.R",89,14,"style","Variable and function name style should be snake_case or symbols."," colnames(blast.results) <- c(""qseqid"",","object_name_linter" -"R/parse_related.R",121,7,"style","Variable and function name style should be snake_case or symbols."," adj.br$ratio[i] <- adj.br$length[i] / adj.br$qlen[i]","object_name_linter" -"R/parse_related.R",122,10,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/parse_related.R",123,7,"style","Variable and function name style should be snake_case or symbols."," adj.br$ratio[i] <- adj.br$qlen[i] / adj.br$length[i]","object_name_linter" -"R/parse_related.R",130,3,"style","Variable and function name style should be snake_case or symbols."," adj.br$ratio <- format(adj.br$ratio, digits = 3)","object_name_linter" -"R/parse_related.R",134,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/parse_related.R",165,3,"style","Variable and function name style should be snake_case or symbols."," blast.results$qseqid <- as.character(blast.results$qseqid)","object_name_linter" -"R/report_related.R",170,3,"style","Variable and function name style should be snake_case or symbols."," reportable.wide[is.na(reportable.wide)] <- 0","object_name_linter" diff --git a/.dev/revdep_emails/Plasmidprofiler/email-body b/.dev/revdep_emails/Plasmidprofiler/email-body deleted file mode 100644 index 2ac8cb9a3..000000000 --- a/.dev/revdep_emails/Plasmidprofiler/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Adrian Zetner! Thank you for using {lintr} in your package {Plasmidprofiler}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cran/Plasmidprofiler (hash: 5d7647899468cfdc46a286634d87c68b6e2eec7f) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 12s on CRAN vs. 7s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/PosteriorBootstrap/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/PosteriorBootstrap/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 70bcbaaa1..000000000 --- a/.dev/revdep_emails/PosteriorBootstrap/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,24 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/PosteriorBootstrap.R",145,39,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(all(is.numeric(gamma_mean)) & all(is.numeric(gamma_vcov)))) {","vector_logic_linter" -"vignettes/PosteriorBootstrap.Rmd",16,12,"style","Put spaces around all infix operators."," fig.width=7,","infix_spaces_linter" -"vignettes/PosteriorBootstrap.Rmd",17,13,"style","Put spaces around all infix operators."," fig.height=3","infix_spaces_linter" -"vignettes/PosteriorBootstrap.Rmd",153,81,"style","Lines should not be more than 80 characters."," train_dat <- list(n = length(german$y), p = ncol(german$x), x = german$x, y = german$y, beta_sd = prior_sd)","line_length_linter" -"vignettes/PosteriorBootstrap.Rmd",186,81,"style","Lines should not be more than 80 characters."," anpl_sample <- PosteriorBootstrap::draw_logit_samples(x = german$x, y = german$y,","line_length_linter" -"vignettes/PosteriorBootstrap.Rmd",187,81,"style","Lines should not be more than 80 characters."," concentration = concentration,","line_length_linter" -"vignettes/PosteriorBootstrap.Rmd",188,81,"style","Lines should not be more than 80 characters."," n_bootstrap = n_bootstrap,","line_length_linter" -"vignettes/PosteriorBootstrap.Rmd",189,81,"style","Lines should not be more than 80 characters."," posterior_sample = stan_vb_sample,","line_length_linter" -"vignettes/PosteriorBootstrap.Rmd",191,81,"style","Lines should not be more than 80 characters."," show_progress = TRUE)","line_length_linter" -"vignettes/PosteriorBootstrap.Rmd",214,81,"style","Lines should not be more than 80 characters."," plot_df <- append_to_plot(plot_df, sample = anpl_samples[[toString(concentration)]],","line_length_linter" -"vignettes/PosteriorBootstrap.Rmd",239,81,"style","Lines should not be more than 80 characters."," data = dplyr::filter(plot_df, plot_df$Method != ""Bayes-Stan"")) +","line_length_linter" -"vignettes/PosteriorBootstrap.Rmd",246,62,"style","Put spaces around all infix operators."," labeller = ggplot2::label_bquote(c ~"" = ""~","infix_spaces_linter" -"vignettes/PosteriorBootstrap.Rmd",246,68,"style","Put spaces around all infix operators."," labeller = ggplot2::label_bquote(c ~"" = ""~","infix_spaces_linter" -"vignettes/PosteriorBootstrap.Rmd",301,39,"style","Do not place spaces before parentheses.","if (""Windows"" != Sys.info()[""sysname""] ) {","spaces_inside_linter" -"vignettes/PosteriorBootstrap.Rmd",311,81,"style","Lines should not be more than 80 characters."," anpl_samples <- PosteriorBootstrap::draw_logit_samples(x = german$x, y = german$y,","line_length_linter" -"vignettes/PosteriorBootstrap.Rmd",313,81,"style","Lines should not be more than 80 characters."," n_bootstrap = n_bootstrap,","line_length_linter" -"vignettes/PosteriorBootstrap.Rmd",314,81,"style","Lines should not be more than 80 characters."," gamma_mean = rep(0, ncol(german$x)),","line_length_linter" -"vignettes/PosteriorBootstrap.Rmd",315,81,"style","Lines should not be more than 80 characters."," gamma_vcov = diag(1, ncol(german$x)),","line_length_linter" -"vignettes/PosteriorBootstrap.Rmd",317,81,"style","Lines should not be more than 80 characters."," num_cores = num_cores)","line_length_linter" -"vignettes/PosteriorBootstrap.Rmd",322,81,"style","Lines should not be more than 80 characters."," speedups <- rbind(speedups, c(num_cores, n_bootstrap, one_core_duration / lap))","line_length_linter" -"vignettes/PosteriorBootstrap.Rmd",348,39,"style","Do not place spaces before parentheses.","if (""Windows"" != Sys.info()[""sysname""] ) {","spaces_inside_linter" -"vignettes/PosteriorBootstrap.Rmd",353,81,"style","Lines should not be more than 80 characters."," speedups$proportion <- (1 / speedups$speedup - 1) / (1 / speedups$Num_cores - 1)","line_length_linter" -"vignettes/PosteriorBootstrap.Rmd",355,81,"style","Lines should not be more than 80 characters."," ggplot2::qplot(proportion, data = speedups, fill = N_bootstrap, binwidth = 0.005) +","line_length_linter" diff --git a/.dev/revdep_emails/PosteriorBootstrap/email-body b/.dev/revdep_emails/PosteriorBootstrap/email-body deleted file mode 100644 index d4fa32cbf..000000000 --- a/.dev/revdep_emails/PosteriorBootstrap/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello James Robinson! Thank you for using {lintr} in your package {PosteriorBootstrap}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/alan-turing-institute/PosteriorBootstrap (hash: d2962ece8b50d13ed275fc4c7c2f5dac20fbb3e1) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 5s on CRAN vs. 4s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/RSQL/attachments/RSQL.warnings b/.dev/revdep_emails/RSQL/attachments/RSQL.warnings deleted file mode 100644 index 328bcbcc8..000000000 --- a/.dev/revdep_emails/RSQL/attachments/RSQL.warnings +++ /dev/null @@ -1,2 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Trying to remove β€˜paren_brace_linter’ and β€˜function_left_parentheses’, which are not in `defaults`. diff --git a/.dev/revdep_emails/RSQL/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/RSQL/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index ce8c349d9..000000000 --- a/.dev/revdep_emails/RSQL/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,25 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/sql-lib.R",129,5,"style","`else` should come on the same line as the previous `}`."," else{","brace_linter" -"R/sql-lib.R",129,9,"style","There should be a space before an opening curly brace."," else{","brace_linter" -"R/sql-lib.R",138,42,"style","There should be a space before an opening curly brace."," setupResultClassFromDriver = function(){","brace_linter" -"R/sql-lib.R",138,42,"style","There should be a space between a right parenthesis and a body expression."," setupResultClassFromDriver = function(){","paren_body_linter" -"R/sql-lib.R",141,47,"style","There should be a space before an opening curly brace."," if (inherits(self$driver, ""SQLiteDriver"")){","brace_linter" -"R/sql-lib.R",141,47,"style","There should be a space between a right parenthesis and a body expression."," if (inherits(self$driver, ""SQLiteDriver"")){","paren_body_linter" -"R/sql-lib.R",145,43,"style","There should be a space before an opening curly brace."," if (inherits(self$driver, ""PqDriver"")){","brace_linter" -"R/sql-lib.R",145,43,"style","There should be a space between a right parenthesis and a body expression."," if (inherits(self$driver, ""PqDriver"")){","paren_body_linter" -"R/sql-lib.R",148,37,"style","There should be a space before an opening curly brace."," if (is.null(self$results.class)){","brace_linter" -"R/sql-lib.R",148,37,"style","There should be a space between a right parenthesis and a body expression."," if (is.null(self$results.class)){","paren_body_linter" -"R/sql-lib.R",412,31,"style","There should be a space before an opening curly brace."," clearLastResult = function(){","brace_linter" -"R/sql-lib.R",412,31,"style","There should be a space between a right parenthesis and a body expression."," clearLastResult = function(){","paren_body_linter" -"R/sql-lib.R",413,63,"style","There should be a space before an opening curly brace."," if (!is.null(self$results.class) & !is.null(self$last.rs)){","brace_linter" -"R/sql-lib.R",413,63,"style","There should be a space between a right parenthesis and a body expression."," if (!is.null(self$results.class) & !is.null(self$last.rs)){","paren_body_linter" -"R/sql-lib.R",414,54,"style","There should be a space before an opening curly brace."," if (inherits(self$last.rs, self$results.class)){","brace_linter" -"R/sql-lib.R",414,54,"style","There should be a space between a right parenthesis and a body expression."," if (inherits(self$last.rs, self$results.class)){","paren_body_linter" -"R/sql-lib.R",425,26,"style","There should be a space before an opening curly brace."," getSummary = function(){","brace_linter" -"R/sql-lib.R",425,26,"style","There should be a space between a right parenthesis and a body expression."," getSummary = function(){","paren_body_linter" -"R/sql-lib.R",575,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," while (!ret & i <= length(quotes_symbols)) {","vector_logic_linter" -"R/sql-lib.R",683,38,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (quotes == substr(text, 1, 1) & quotes == substr(text, nchar(text), nchar(text))) {","vector_logic_linter" -"R/sql-lib.R",906,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(where_fields) > 0 & !(length(where_fields) == 1 & nchar(where_fields[1]) ==","vector_logic_linter" -"R/sql-lib.R",906,64,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(where_fields) > 0 & !(length(where_fields) == 1 & nchar(where_fields[1]) ==","vector_logic_linter" -"R/sql-lib.R",1022,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(values_df) > 1 & !inherits(values_df, ""data.frame"")) {","vector_logic_linter" -"R/sql-lib.R",1258,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nrow(values) > 0 & nrow(values) != nrow(values_uk)) {","vector_logic_linter" diff --git a/.dev/revdep_emails/RSQL/email-body b/.dev/revdep_emails/RSQL/email-body deleted file mode 100644 index dde9f9d13..000000000 --- a/.dev/revdep_emails/RSQL/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Alejandro Baranek! Thank you for using {lintr} in your package {RSQL}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/rOpenStats/RSQL (hash: a651f6071e7edb04d72785265238403ba5bcd2f0) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 6s on CRAN vs. 3s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/RestRserve/attachments/RestRserve.failure b/.dev/revdep_emails/RestRserve/attachments/RestRserve.failure deleted file mode 100644 index 08edf6748..000000000 --- a/.dev/revdep_emails/RestRserve/attachments/RestRserve.failure +++ /dev/null @@ -1 +0,0 @@ -`defaults` must be a named list. diff --git a/.dev/revdep_emails/RestRserve/attachments/RestRserve.warnings b/.dev/revdep_emails/RestRserve/attachments/RestRserve.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/RestRserve/attachments/RestRserve.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/RestRserve/email-body b/.dev/revdep_emails/RestRserve/email-body deleted file mode 100644 index f7bac2d6e..000000000 --- a/.dev/revdep_emails/RestRserve/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Dmitry Selivanov! Thank you for using {lintr} in your package {RestRserve}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/rexyai/RestRserve (hash: 852785a6bfa1c6691de520bd14d1246619436419) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 25s on CRAN vs. 0s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/SamplerCompare/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/SamplerCompare/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index fa1462dc6..000000000 --- a/.dev/revdep_emails/SamplerCompare/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,15 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/00dist-util.R",13,48,"style","Variable and function name style should be snake_case."," mean = NULL, cov = NULL, mean.log.dens = NULL) {","object_name_linter" -"R/00dist-util.R",44,8,"style","Variable and function name style should be snake_case."," ds$grad.log.density <-","object_name_linter" -"R/00dist-util.R",115,6,"style","Variable and function name style should be snake_case."," ds$grad.log.density <- function(x) {","object_name_linter" -"R/00dist-util.R",121,6,"style","Variable and function name style should be snake_case."," ds$c.log.density.and.grad <- c.log.density","object_name_linter" -"R/compare-samplers.R",121,8,"style","Variable and function name style should be snake_case."," rv$dist.expr <- sprintf(""plain('%s')"", rv$dist)","object_name_linter" -"R/compare-samplers.R",125,8,"style","Variable and function name style should be snake_case."," rv$sampler.expr <- sprintf(""plain('%s')"", sampler.name)","object_name_linter" -"R/compare-samplers.R",131,6,"style","Variable and function name style should be snake_case."," rv$act.025 <- acts$act.025","object_name_linter" -"R/compare-samplers.R",132,6,"style","Variable and function name style should be snake_case."," rv$act.975 <- acts$act.975","object_name_linter" -"R/compare-samplers.R",142,8,"style","Variable and function name style should be snake_case."," rv$act.y <- acts.y$act","object_name_linter" -"R/compare-samplers.R",143,8,"style","Variable and function name style should be snake_case."," rv$act.y.025 <- acts.y$act.025","object_name_linter" -"R/compare-samplers.R",144,8,"style","Variable and function name style should be snake_case."," rv$act.y.975 <- acts.y$act.975","object_name_linter" -"R/distributions.R",53,3,"style","Variable and function name style should be snake_case."," mean.log.dens <- log.density(mean) - 0.5 * ndim","object_name_linter" -"R/distributions.R",168,3,"style","Variable and function name style should be snake_case."," mean.log.dens <- -16.5","object_name_linter" -"R/distributions.R",259,6,"style","Variable and function name style should be snake_case."," ds$lower.bound <- rep(0, length(shape))","object_name_linter" diff --git a/.dev/revdep_emails/SamplerCompare/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/SamplerCompare/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index e41a292ea..000000000 --- a/.dev/revdep_emails/SamplerCompare/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,91 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/doc/sc-intro.Rnw",53,12,"style","Only use double-quotes.","dir.create('Figures', showWarnings=FALSE)","single_quotes_linter" -"inst/doc/sc-intro.Rnw",53,35,"style","Put spaces around all infix operators.","dir.create('Figures', showWarnings=FALSE)","infix_spaces_linter" -"inst/doc/sc-intro.Rnw",54,23,"style","Only use double-quotes.","capture.output(source('Code/ex-compare-samplers.Rfrag'),","single_quotes_linter" -"inst/doc/sc-intro.Rnw",55,7,"style","Put spaces around all infix operators."," file='Figures/ex-compare-samplers.txt')","infix_spaces_linter" -"inst/doc/sc-intro.Rnw",55,8,"style","Only use double-quotes."," file='Figures/ex-compare-samplers.txt')","single_quotes_linter" -"inst/doc/sc-intro.Rnw",56,23,"style","Only use double-quotes.","capture.output(source('Code/ex-compare-results.Rfrag'),","single_quotes_linter" -"inst/doc/sc-intro.Rnw",57,7,"style","Put spaces around all infix operators."," file='Figures/ex-compare-results.txt')","infix_spaces_linter" -"inst/doc/sc-intro.Rnw",57,8,"style","Only use double-quotes."," file='Figures/ex-compare-results.txt')","single_quotes_linter" -"inst/doc/sc-intro.Rnw",59,5,"style","Only use double-quotes.","pdf('Figures/ex-comparison-plot.pdf', height=4, width=4)","single_quotes_linter" -"inst/doc/sc-intro.Rnw",59,45,"style","Put spaces around all infix operators.","pdf('Figures/ex-comparison-plot.pdf', height=4, width=4)","infix_spaces_linter" -"inst/doc/sc-intro.Rnw",59,54,"style","Put spaces around all infix operators.","pdf('Figures/ex-comparison-plot.pdf', height=4, width=4)","infix_spaces_linter" -"inst/doc/sc-intro.Rnw",60,52,"style","Put spaces around all infix operators.","print(comparison.plot(sampler.comparison, base_size=8))","infix_spaces_linter" -"inst/doc/sc-intro.Rnw",63,8,"style","Only use double-quotes.","source('Code/ex-metropolis.Rfrag')","single_quotes_linter" -"inst/doc/sc-intro.Rnw",64,8,"style","Only use double-quotes.","source('Code/ex-beta.Rfrag')","single_quotes_linter" -"inst/doc/sc-intro.Rnw",65,8,"style","Only use double-quotes.","source('Code/ex-final.Rfrag')","single_quotes_linter" -"inst/doc/sc-intro.Rnw",66,23,"style","Only use double-quotes.","capture.output(source('Code/ex-final-compare.Rfrag'),","single_quotes_linter" -"inst/doc/sc-intro.Rnw",67,7,"style","Put spaces around all infix operators."," file='Figures/ex-final-compare.txt')","infix_spaces_linter" -"inst/doc/sc-intro.Rnw",67,8,"style","Only use double-quotes."," file='Figures/ex-final-compare.txt')","single_quotes_linter" -"R/00dist-util.R",200,7,"style","Variable and function name style should be snake_case or symbols."," X[obs, ] <- step$x","object_name_linter" -"R/00dist-util.R",214,19,"style","Variable and function name style should be snake_case or symbols."," attr(sampler, ""name.expr"") <- name.expr","object_name_linter" -"R/act.R",33,3,"style","Variable and function name style should be snake_case or symbols."," order.max <- NULL","object_name_linter" -"R/act.R",40,5,"style","Variable and function name style should be snake_case or symbols."," pi.var <- A$asy.var.coef","object_name_linter" -"R/act.R",45,5,"style","Variable and function name style should be snake_case or symbols."," order.max <- floor(A$order * 0.7)","object_name_linter" -"R/act.R",65,5,"style","Variable and function name style should be snake_case or symbols."," pi.sim <- AX[i, ]","object_name_linter" -"R/act.R",68,7,"style","Variable and function name style should be snake_case or symbols."," act.sim[i] <- Inf","object_name_linter" -"R/act.R",70,7,"style","Variable and function name style should be snake_case or symbols."," act.sim[i] <- (1 - sum(pi.sim * acf.sim)) / (1 - sum(pi.sim)) ^ 2","object_name_linter" -"R/act.R",75,3,"style","Variable and function name style should be snake_case or symbols."," act.sim[is.na(act.sim)] <- Inf","object_name_linter" -"R/act.R",104,3,"style","Variable and function name style should be snake_case or symbols."," max.i <- which.max(unlist(acts[""act"", ]))","object_name_linter" -"R/basic-slice.R",13,3,"style","Variable and function name style should be snake_case or symbols."," X[1, ] <- x0","object_name_linter" -"R/basic-slice.R",75,5,"style","Variable and function name style should be snake_case or symbols."," X[obs, ] <- x1","object_name_linter" -"R/basic-slice.R",85,6,"style","Variable and function name style should be snake_case or symbols.","attr(hyperrectangle.sample, ""name"") <- ""Hyperrectangle""","object_name_linter" -"R/basic-slice.R",95,6,"style","Variable and function name style should be snake_case or symbols.","attr(nograd.hyperrectangle.sample, ""name"") <- ""Hyperrectangle (no grad)""","object_name_linter" -"R/basic-slice.R",105,3,"style","Variable and function name style should be snake_case or symbols."," X[1, ] <- x0","object_name_linter" -"R/basic-slice.R",157,5,"style","Variable and function name style should be snake_case or symbols."," X[obs, ] <- x1","object_name_linter" -"R/basic-slice.R",167,6,"style","Variable and function name style should be snake_case or symbols.","attr(stepout.slice.sample, ""name"") <- ""Step-out Slice""","object_name_linter" -"R/basic-slice.R",176,6,"style","Variable and function name style should be snake_case or symbols.","attr(interval.slice.sample, ""name"") <- ""Interval Slice""","object_name_linter" -"R/c-samplers.R",41,19,"style","Variable and function name style should be snake_case or symbols."," attr(sampler, ""name.expression"") <- name.expression","object_name_linter" -"R/c-samplers.R",49,1,"style","Variable and function name style should be snake_case or symbols.","raw.symbol <- function(symbol) {","object_name_linter" -"R/c-samplers.R",64,35,"style","Variable and function name style should be snake_case or symbols."," min.dimension = 1) {","object_name_linter" -"R/c-samplers.R",72,6,"style","Variable and function name style should be snake_case or symbols.","attr(shrinking.rank.sample, ""name"") <- ""Shrinking Rank""","object_name_linter" -"R/c-samplers.R",85,6,"style","Variable and function name style should be snake_case or symbols.","attr(nonadaptive.crumb.sample, ""name"") <- ""Nonadaptive Crumb""","object_name_linter" -"R/comparison-plot.R",48,5,"style","Variable and function name style should be snake_case or symbols."," RSinf$lim <- max(RSfinite$evals * RSfinite$act)","object_name_linter" -"R/comparison-plot.R",60,1,"style","Variable and function name style should be snake_case or symbols.","log.breaks <- function(data, base) {","object_name_linter" -"R/comparison-plot.R",61,3,"warning","local variable β€˜breaks’ assigned but may not be used"," breaks <- base ^ seq(floor(min(log(data, base = base))),","object_usage_linter" -"R/cov-match.R",125,6,"style","Variable and function name style should be snake_case or symbols.","attr(cov.match.sample, ""name"") <- ""Cov. Matching""","object_name_linter" -"R/distributions.R",31,3,"style","Variable and function name style should be snake_case or symbols."," log.det <- sum(log(eigen(sigma, only.values = TRUE)$values))","object_name_linter" -"R/distributions.R",36,3,"style","Variable and function name style should be snake_case or symbols."," log.density <- function(x) {","object_name_linter" -"R/distributions.R",67,3,"warning","local variable β€˜ds’ assigned but may not be used"," ds <- make.dist(ndim, name, name.expression, log.density,","object_usage_linter" -"R/distributions.R",115,3,"style","Variable and function name style should be snake_case or symbols."," log.density <- function(x) {","object_name_linter" -"R/distributions.R",246,21,"style","Any function spanning multiple lines should use curly braces."," log.density = function(x)","brace_linter" -"R/distributions.R",248,26,"style","Any function spanning multiple lines should use curly braces."," grad.log.density = function(x)","brace_linter" -"R/metropolis.R",31,7,"style","Variable and function name style should be snake_case or symbols."," X[obs / target.dist$ndim, ] <- x0","object_name_linter" -"R/metropolis.R",38,6,"style","Variable and function name style should be snake_case or symbols.","attr(multivariate.metropolis.sample, ""name"") <- ""Multivariate Metropolis""","object_name_linter" -"R/metropolis.R",47,3,"style","Variable and function name style should be snake_case or symbols."," X[1, ] <- x0","object_name_linter" -"R/metropolis.R",68,5,"style","Variable and function name style should be snake_case or symbols."," X[obs, ] <- x0 # coordinates updated, save state","object_name_linter" -"R/metropolis.R",75,6,"style","Variable and function name style should be snake_case or symbols.","attr(univar.metropolis.sample, ""name"") <- ""Univariate Metropolis""","object_name_linter" -"R/metropolis.R",97,3,"style","Variable and function name style should be snake_case or symbols."," sample.cov <- NULL","object_name_linter" -"R/metropolis.R",129,7,"style","Variable and function name style should be snake_case or symbols."," X[obs / ndim, ] <- x0","object_name_linter" -"R/metropolis.R",136,7,"style","Variable and function name style should be snake_case or symbols."," sample.cov <- obs.scatter / obs - tcrossprod(obs.sum / obs)","object_name_linter" -"R/metropolis.R",148,6,"style","Variable and function name style should be snake_case or symbols.","attr(adaptive.metropolis.sample, ""name"") <- ""Adaptive Metropolis""","object_name_linter" -"R/oblique-hyperrect.R",13,3,"style","Variable and function name style should be snake_case or symbols."," X[1, ] <- x0","object_name_linter" -"R/oblique-hyperrect.R",79,7,"style","Variable and function name style should be snake_case or symbols."," L[wt < 0] <- wt[wt < 0]","object_name_linter" -"R/oblique-hyperrect.R",80,7,"style","Variable and function name style should be snake_case or symbols."," U[wt > 0] <- wt[wt > 0]","object_name_linter" -"R/oblique-hyperrect.R",84,5,"style","Variable and function name style should be snake_case or symbols."," X[obs, ] <- x1","object_name_linter" -"R/oblique-hyperrect.R",90,6,"style","Variable and function name style should be snake_case or symbols.","attr(oblique.hyperrect.sample, ""name"") <- ""Oblique Hyperrect""","object_name_linter" -"R/oblique-hyperrect.R",97,6,"style","Variable and function name style should be snake_case or symbols.","attr(cheat.oblique.hyperrect.sample, ""name"") <- ""Cheat Oblique Hyperrect""","object_name_linter" -"R/univar-eigen.R",9,3,"style","Variable and function name style should be snake_case or symbols."," X[1, ] <- x0","object_name_linter" -"R/univar-eigen.R",52,7,"style","Variable and function name style should be snake_case or symbols."," which.eig <- floor(1 + ndim * runif(1))","object_name_linter" -"R/univar-eigen.R",108,7,"style","Variable and function name style should be snake_case or symbols."," X[obs / nthin, ] <- x1","object_name_linter" -"R/univar-eigen.R",118,6,"style","Variable and function name style should be snake_case or symbols.","attr(univar.eigen.sample, ""name"") <- ""Univar Eigen""","object_name_linter" -"R/univar-eigen.R",128,6,"style","Variable and function name style should be snake_case or symbols.","attr(cheat.univar.eigen.sample, ""name"") <- ""Cheat Univar Eigen""","object_name_linter" -"tests/test-samplers.R",11,1,"style","Variable and function name style should be snake_case or symbols.","all.samplers <- list(","object_name_linter" -"vignettes/sc-intro.Rnw",53,12,"style","Only use double-quotes.","dir.create('Figures', showWarnings=FALSE)","single_quotes_linter" -"vignettes/sc-intro.Rnw",53,35,"style","Put spaces around all infix operators.","dir.create('Figures', showWarnings=FALSE)","infix_spaces_linter" -"vignettes/sc-intro.Rnw",54,23,"style","Only use double-quotes.","capture.output(source('Code/ex-compare-samplers.Rfrag'),","single_quotes_linter" -"vignettes/sc-intro.Rnw",55,7,"style","Put spaces around all infix operators."," file='Figures/ex-compare-samplers.txt')","infix_spaces_linter" -"vignettes/sc-intro.Rnw",55,8,"style","Only use double-quotes."," file='Figures/ex-compare-samplers.txt')","single_quotes_linter" -"vignettes/sc-intro.Rnw",56,23,"style","Only use double-quotes.","capture.output(source('Code/ex-compare-results.Rfrag'),","single_quotes_linter" -"vignettes/sc-intro.Rnw",57,7,"style","Put spaces around all infix operators."," file='Figures/ex-compare-results.txt')","infix_spaces_linter" -"vignettes/sc-intro.Rnw",57,8,"style","Only use double-quotes."," file='Figures/ex-compare-results.txt')","single_quotes_linter" -"vignettes/sc-intro.Rnw",59,5,"style","Only use double-quotes.","pdf('Figures/ex-comparison-plot.pdf', height=4, width=4)","single_quotes_linter" -"vignettes/sc-intro.Rnw",59,45,"style","Put spaces around all infix operators.","pdf('Figures/ex-comparison-plot.pdf', height=4, width=4)","infix_spaces_linter" -"vignettes/sc-intro.Rnw",59,54,"style","Put spaces around all infix operators.","pdf('Figures/ex-comparison-plot.pdf', height=4, width=4)","infix_spaces_linter" -"vignettes/sc-intro.Rnw",60,52,"style","Put spaces around all infix operators.","print(comparison.plot(sampler.comparison, base_size=8))","infix_spaces_linter" -"vignettes/sc-intro.Rnw",63,8,"style","Only use double-quotes.","source('Code/ex-metropolis.Rfrag')","single_quotes_linter" -"vignettes/sc-intro.Rnw",64,8,"style","Only use double-quotes.","source('Code/ex-beta.Rfrag')","single_quotes_linter" -"vignettes/sc-intro.Rnw",65,8,"style","Only use double-quotes.","source('Code/ex-final.Rfrag')","single_quotes_linter" -"vignettes/sc-intro.Rnw",66,23,"style","Only use double-quotes.","capture.output(source('Code/ex-final-compare.Rfrag'),","single_quotes_linter" -"vignettes/sc-intro.Rnw",67,7,"style","Put spaces around all infix operators."," file='Figures/ex-final-compare.txt')","infix_spaces_linter" -"vignettes/sc-intro.Rnw",67,8,"style","Only use double-quotes."," file='Figures/ex-final-compare.txt')","single_quotes_linter" diff --git a/.dev/revdep_emails/SamplerCompare/email-body b/.dev/revdep_emails/SamplerCompare/email-body deleted file mode 100644 index ede9e695d..000000000 --- a/.dev/revdep_emails/SamplerCompare/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Madeleine Thompson! Thank you for using {lintr} in your package {SamplerCompare}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cran/SamplerCompare (hash: e3b86a53bfcade5a049f6796dd260fdf0cfec7a7) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 14s on CRAN vs. 8s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/TDA/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/TDA/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 2c16702e2..000000000 --- a/.dev/revdep_emails/TDA/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,5 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/maxPersistence.R",94,36,"style","There should be a space between right parenthesis and an opening curly brace."," for (i in seq(along = parameters)){","paren_brace_linter" -"R/plot.maxPersistence.R",40,32,"style","There should be a space between right parenthesis and an opening curly brace."," for (j in seq(along = symb)){","paren_brace_linter" -"R/print.summary.diagram.R",1,1,"style","Variable and function name style should be snake_case.","print.summary.diagram <-","object_name_linter" -"R/print.summary.maxPersistence.R",1,1,"style","Variable and function name style should be snake_case.","print.summary.maxPersistence <-","object_name_linter" diff --git a/.dev/revdep_emails/TDA/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/TDA/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index fb1299041..000000000 --- a/.dev/revdep_emails/TDA/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,262 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/doc/article.R",478,3,"style","Variable and function name style should be snake_case or symbols."," Diags[[i]] <- ripsDiag(subX, maxdimension = 1, maxscale = 5)","object_name_linter" -"inst/doc/article.R",479,3,"style","Variable and function name style should be snake_case or symbols."," Lands[i, ] <- landscape(Diags[[i]][[""diagram""]], dimension = 1,","object_name_linter" -"inst/doc/article.Rnw",222,1,"style","Variable and function name style should be snake_case or symbols.","X <- circleUnif(400)","object_name_linter" -"inst/doc/article.Rnw",224,1,"style","Variable and function name style should be snake_case or symbols.","Xlim <- c(-1.6, 1.6); Ylim <- c(-1.7, 1.7); by <- 0.065","object_name_linter" -"inst/doc/article.Rnw",224,21,"style","Compound semicolons are discouraged. Replace them by a newline.","Xlim <- c(-1.6, 1.6); Ylim <- c(-1.7, 1.7); by <- 0.065","semicolon_linter" -"inst/doc/article.Rnw",224,24,"style","Variable and function name style should be snake_case or symbols.","Xlim <- c(-1.6, 1.6); Ylim <- c(-1.7, 1.7); by <- 0.065","object_name_linter" -"inst/doc/article.Rnw",224,44,"style","Compound semicolons are discouraged. Replace them by a newline.","Xlim <- c(-1.6, 1.6); Ylim <- c(-1.7, 1.7); by <- 0.065","semicolon_linter" -"inst/doc/article.Rnw",226,1,"style","Variable and function name style should be snake_case or symbols.","Xseq <- seq(Xlim[1], Xlim[2], by = by)","object_name_linter" -"inst/doc/article.Rnw",227,1,"style","Variable and function name style should be snake_case or symbols.","Yseq <- seq(Ylim[1], Ylim[2], by = by)","object_name_linter" -"inst/doc/article.Rnw",228,1,"style","Variable and function name style should be snake_case or symbols.","Grid <- expand.grid(Xseq, Yseq)","object_name_linter" -"inst/doc/article.Rnw",265,1,"style","Variable and function name style should be snake_case or symbols.","DTM <- dtm(X = X, Grid = Grid, m0 = m0)","object_name_linter" -"inst/doc/article.Rnw",276,1,"style","Variable and function name style should be snake_case or symbols.","kNN <- knnDE(X = X, Grid = Grid, k = k)","object_name_linter" -"inst/doc/article.Rnw",287,1,"style","Variable and function name style should be snake_case or symbols.","KDE <- kde(X = X, Grid = Grid, h = h)","object_name_linter" -"inst/doc/article.Rnw",298,1,"style","Variable and function name style should be snake_case or symbols.","Kdist <- kernelDist(X = X, Grid = Grid, h = h)","object_name_linter" -"inst/doc/article.Rnw",394,1,"style","Variable and function name style should be snake_case or symbols.","posYgrid <- which(Grid[, 2] > 0)","object_name_linter" -"inst/doc/article.Rnw",395,1,"style","Variable and function name style should be snake_case or symbols.","posYseq <- which(Yseq > 0)","object_name_linter" -"inst/doc/article.Rnw",465,1,"style","Variable and function name style should be snake_case or symbols.","DiagGrid <- gridDiag(","object_name_linter" -"inst/doc/article.Rnw",501,81,"style","Lines should not be more than 80 characters."," lines(DiagGrid[[""cycleLocation""]][[one[i]]][j, , ], pch = 19, cex = 1, col = i)","line_length_linter" -"inst/doc/article.Rnw",556,1,"style","Variable and function name style should be snake_case or symbols.","Circle1 <- circleUnif(60)","object_name_linter" -"inst/doc/article.Rnw",557,1,"style","Variable and function name style should be snake_case or symbols.","Circle2 <- circleUnif(60, r = 2) + 3","object_name_linter" -"inst/doc/article.Rnw",558,1,"style","Variable and function name style should be snake_case or symbols.","Circles <- rbind(Circle1, Circle2)","object_name_linter" -"inst/doc/article.Rnw",571,1,"style","Variable and function name style should be snake_case or symbols.","DiagRips <- ripsDiag(X = Circles, maxdimension, maxscale,","object_name_linter" -"inst/doc/article.Rnw",584,25,"style","Put spaces around all infix operators.","par(mfrow = c(1, 3), mai=c(0.8, 0.8, 0.3, 0.3))","infix_spaces_linter" -"inst/doc/article.Rnw",585,35,"style","Commas should always have a space after.","plot(Circles, pch = 16, xlab = """",ylab = """", main = ""Two Circles"")","commas_linter" -"inst/doc/article.Rnw",592,81,"style","Lines should not be more than 80 characters."," lines(DiagRips[[""cycleLocation""]][[one[i]]][j, , ], pch = 19, cex = 1, col = i)","line_length_linter" -"inst/doc/article.Rnw",617,1,"style","Variable and function name style should be snake_case or symbols.","X <- circleUnif(n = 30)","object_name_linter" -"inst/doc/article.Rnw",624,1,"style","Variable and function name style should be snake_case or symbols.","DiagAlphaCmplx <- alphaComplexDiag(","object_name_linter" -"inst/doc/article.Rnw",646,1,"style","Use spaces to indent, not tabs."," cex = 1, col = i + 1)","no_tab_linter" -"inst/doc/article.Rnw",668,1,"style","Variable and function name style should be snake_case or symbols.","X <- cbind(circleUnif(n = n), runif(n = n, min = -0.1, max = 0.1))","object_name_linter" -"inst/doc/article.Rnw",674,1,"style","Variable and function name style should be snake_case or symbols.","DiagAlphaShape <- alphaShapeDiag(","object_name_linter" -"inst/doc/article.Rnw",716,1,"style","Variable and function name style should be snake_case or symbols.","X <- circleUnif(n = 100)","object_name_linter" -"inst/doc/article.Rnw",724,1,"style","Variable and function name style should be snake_case or symbols.","FltRips <- ripsFiltration(X = X, maxdimension = maxdimension,","object_name_linter" -"inst/doc/article.Rnw",726,1,"style","Use spaces to indent, not tabs."," printProgress = TRUE)","no_tab_linter" -"inst/doc/article.Rnw",735,1,"style","Variable and function name style should be snake_case or symbols.","dtmValues <- dtm(X = X, Grid = X, m0 = m0)","object_name_linter" -"inst/doc/article.Rnw",736,1,"style","Variable and function name style should be snake_case or symbols.","FltFun <- funFiltration(FUNvalues = dtmValues, cmplx = FltRips[[""cmplx""]])","object_name_linter" -"inst/doc/article.Rnw",742,1,"style","Variable and function name style should be snake_case or symbols.","DiagFltFun <- filtrationDiag(filtration = FltFun, maxdimension = maxdimension,","object_name_linter" -"inst/doc/article.Rnw",752,25,"style","Put spaces around all infix operators.","par(mfrow = c(1, 2), mai=c(0.8, 0.8, 0.3, 0.3))","infix_spaces_linter" -"inst/doc/article.Rnw",753,29,"style","Commas should always have a space after.","plot(X, pch = 16, xlab = """",ylab = """")","commas_linter" -"inst/doc/article.Rnw",775,1,"style","Variable and function name style should be snake_case or symbols.","Diag1 <- ripsDiag(Circle1, maxdimension = 1, maxscale = 5)","object_name_linter" -"inst/doc/article.Rnw",776,1,"style","Variable and function name style should be snake_case or symbols.","Diag2 <- ripsDiag(Circle2, maxdimension = 1, maxscale = 5)","object_name_linter" -"inst/doc/article.Rnw",854,1,"style","Variable and function name style should be snake_case or symbols.","PlotTriangles <- function(left, right) {","object_name_linter" -"inst/doc/article.Rnw",856,3,"style","Variable and function name style should be snake_case or symbols."," X <- (left + right) / 2","object_name_linter" -"inst/doc/article.Rnw",857,3,"style","Variable and function name style should be snake_case or symbols."," Y <- (right - left) / 2","object_name_linter" -"inst/doc/article.Rnw",865,1,"style","Use spaces to indent, not tabs."," mtext(""(Birth + Death) / 2"", side = 1, line = 2.5, cex = 1)","no_tab_linter" -"inst/doc/article.Rnw",866,1,"style","Use spaces to indent, not tabs."," mtext(""(Death - Birth) / 2"", side = 2, line = 2.5, cex = 1)","no_tab_linter" -"inst/doc/article.Rnw",867,1,"style","Use spaces to indent, not tabs."," #polygon(c(0, 0, ylimit[2]), c(0, ylimit[2], ylimit[2]),","no_tab_linter" -"inst/doc/article.Rnw",874,3,"style","Variable and function name style should be snake_case or symbols."," B <- max(X + Y)","object_name_linter" -"inst/doc/article.Rnw",876,3,"warning","local variable β€˜maxfun’ assigned but may not be used"," maxfun <- rep(0, length(grid))","object_usage_linter" -"inst/doc/article.Rnw",878,6,"style","Place a space before left parenthesis, except in a function call."," for(i in seq_len(n)) {","spaces_left_parentheses_linter" -"inst/doc/article.Rnw",881,3,"warning","local variable β€˜land’ assigned but may not be used"," land <- apply(tmp, 2, max)","object_usage_linter" -"inst/doc/article.Rnw",882,4,"style","Commented code should be removed."," #lines(grid, land, lwd = 2, col = 4)","commented_code_linter" -"inst/doc/article.Rnw",883,1,"style","Use spaces to indent, not tabs."," points(X, Y, type = ""p"", cex = 1, pch = 19, col = ""pink"")","no_tab_linter" -"inst/doc/article.Rnw",892,27,"style","Trailing whitespace is superfluous.","PlotTriangles(left, right) ","trailing_whitespace_linter" -"inst/doc/article.Rnw",894,1,"style","Variable and function name style should be snake_case or symbols.","Diag1 <- cbind(rep(0, length(left)), left, right)","object_name_linter" -"inst/doc/article.Rnw",896,1,"style","Variable and function name style should be snake_case or symbols.","Land1 <- landscape(Diag1, dimension = 0, KK = 1, tseq)","object_name_linter" -"inst/doc/article.Rnw",897,1,"style","Variable and function name style should be snake_case or symbols.","Sil1 <- silhouette(Diag1, p = 1, dimension = 0, tseq)","object_name_linter" -"inst/doc/article.Rnw",899,1,"style","Variable and function name style should be snake_case or symbols.","X <- (left + right) / 2","object_name_linter" -"inst/doc/article.Rnw",900,1,"style","Variable and function name style should be snake_case or symbols.","Y <- (right - left) / 2","object_name_linter" -"inst/doc/article.Rnw",939,1,"style","Variable and function name style should be snake_case or symbols.","Land <- landscape(DiagRips[[""diagram""]], dimension = 1, KK = 1, tseq)","object_name_linter" -"inst/doc/article.Rnw",940,1,"style","Variable and function name style should be snake_case or symbols.","Sil <- silhouette(DiagRips[[""diagram""]], p = 1, dimension = 1, tseq)","object_name_linter" -"inst/doc/article.Rnw",975,1,"style","Variable and function name style should be snake_case or symbols.","N <- 4000","object_name_linter" -"inst/doc/article.Rnw",976,1,"style","Variable and function name style should be snake_case or symbols.","XX1 <- circleUnif(N / 2)","object_name_linter" -"inst/doc/article.Rnw",977,1,"style","Variable and function name style should be snake_case or symbols.","XX2 <- circleUnif(N / 2, r = 2) + 3","object_name_linter" -"inst/doc/article.Rnw",978,1,"style","Variable and function name style should be snake_case or symbols.","X <- rbind(XX1, XX2)","object_name_linter" -"inst/doc/article.Rnw",990,1,"style","Variable and function name style should be snake_case or symbols.","Diags <- list()","object_name_linter" -"inst/doc/article.Rnw",992,1,"style","Variable and function name style should be snake_case or symbols.","Lands <- matrix(0, nrow = n, ncol = length(tseq))","object_name_linter" -"inst/doc/article.Rnw",1000,3,"style","Variable and function name style should be snake_case or symbols."," subX <- X[sample(seq_len(N), m), ]","object_name_linter" -"inst/doc/article.Rnw",1001,3,"style","Variable and function name style should be snake_case or symbols."," Diags[[i]] <- ripsDiag(subX, maxdimension = 1, maxscale = 5)","object_name_linter" -"inst/doc/article.Rnw",1002,3,"style","Variable and function name style should be snake_case or symbols."," Lands[i, ] <- landscape(Diags[[i]][[""diagram""]], dimension = 1,","object_name_linter" -"inst/doc/article.Rnw",1010,1,"style","Variable and function name style should be snake_case or symbols.","bootLand <- multipBootstrap(Lands, B = 100, alpha = 0.05,","object_name_linter" -"inst/doc/article.Rnw",1080,1,"style","Variable and function name style should be snake_case or symbols.","XX1 <- circleUnif(600)","object_name_linter" -"inst/doc/article.Rnw",1081,1,"style","Variable and function name style should be snake_case or symbols.","XX2 <- circleUnif(1000, r = 1.5) + 2.5","object_name_linter" -"inst/doc/article.Rnw",1083,1,"style","Variable and function name style should be snake_case or symbols.","X <- rbind(XX1, XX2, noise)","object_name_linter" -"inst/doc/article.Rnw",1086,1,"style","Variable and function name style should be snake_case or symbols.","Xlim <- c(-2, 5)","object_name_linter" -"inst/doc/article.Rnw",1087,1,"style","Variable and function name style should be snake_case or symbols.","Ylim <- c(-2, 5)","object_name_linter" -"inst/doc/article.Rnw",1094,1,"style","Variable and function name style should be snake_case or symbols.","parametersKDE <- seq(0.1, 0.6, by = 0.05)","object_name_linter" -"inst/doc/article.Rnw",1096,1,"style","Variable and function name style should be snake_case or symbols.","B <- 50 # number of bootstrap iterations. Should be large.","object_name_linter" -"inst/doc/article.Rnw",1103,1,"style","Variable and function name style should be snake_case or symbols.","maxKDE <- maxPersistence(kde, parametersKDE, X,","object_name_linter" -"inst/doc/article.Rnw",1149,1,"style","Variable and function name style should be snake_case or symbols.","X1 <- cbind(rnorm(300, 1, .8), rnorm(300, 5, 0.8))","object_name_linter" -"inst/doc/article.Rnw",1150,1,"style","Variable and function name style should be snake_case or symbols.","X2 <- cbind(rnorm(300, 3.5, .8), rnorm(300, 5, 0.8))","object_name_linter" -"inst/doc/article.Rnw",1151,1,"style","Variable and function name style should be snake_case or symbols.","X3 <- cbind(rnorm(300, 6, 1), rnorm(300, 1, 1))","object_name_linter" -"inst/doc/article.Rnw",1152,1,"style","Variable and function name style should be snake_case or symbols.","XX <- rbind(X1, X2, X3)","object_name_linter" -"inst/doc/article.Rnw",1158,1,"style","Variable and function name style should be snake_case or symbols.","Tree <- clusterTree(XX, k = 100, density = ""knn"",","object_name_linter" -"inst/doc/article.Rnw",1160,1,"style","Variable and function name style should be snake_case or symbols.","TreeKDE <- clusterTree(XX, k = 100, h = 0.3, density = ""kde"",","object_name_linter" -"inst/doc/article.Rnw",1183,17,"style","Commas should always have a space after.","par(mfrow = c(2,3))","commas_linter" -"inst/doc/article.Rnw",1184,18,"style","Commas should always have a space after.","par(mai = c(0.25,0.35,0.3,0.3))","commas_linter" -"inst/doc/article.Rnw",1184,23,"style","Commas should always have a space after.","par(mai = c(0.25,0.35,0.3,0.3))","commas_linter" -"inst/doc/article.Rnw",1184,27,"style","Commas should always have a space after.","par(mai = c(0.25,0.35,0.3,0.3))","commas_linter" -"inst/doc/article.Rnw",1195,1,"style","Use spaces to indent, not tabs."," points(matrix(XX[Tree[[""DataPoints""]][[i]], ], ncol = 2), col = i,","no_tab_linter" -"R/alphaComplexDiag.R",66,12,"style","Variable and function name style should be snake_case or symbols."," colnames(Diag) <- c(""dimension"", ""Birth"", ""Death"")","object_name_linter" -"R/alphaComplexDiag.R",67,9,"style","Variable and function name style should be snake_case or symbols."," class(Diag) <- ""diagram""","object_name_linter" -"R/alphaComplexDiag.R",68,14,"style","Variable and function name style should be snake_case or symbols."," attributes(Diag)[[""maxdimension""]] <- max(Diag[, 1])","object_name_linter" -"R/alphaComplexDiag.R",70,14,"style","Variable and function name style should be snake_case or symbols."," attributes(Diag)[[""scale""]] <-","object_name_linter" -"R/alphaComplexDiag.R",72,14,"style","Variable and function name style should be snake_case or symbols."," attributes(Diag)[[""call""]] <- match.call()","object_name_linter" -"R/alphaShapeDiag.R",58,12,"style","Variable and function name style should be snake_case or symbols."," colnames(Diag) <- c(""dimension"", ""Birth"", ""Death"")","object_name_linter" -"R/alphaShapeDiag.R",59,9,"style","Variable and function name style should be snake_case or symbols."," class(Diag) <- ""diagram""","object_name_linter" -"R/alphaShapeDiag.R",60,14,"style","Variable and function name style should be snake_case or symbols."," attributes(Diag)[[""maxdimension""]] <- max(Diag[, 1])","object_name_linter" -"R/alphaShapeDiag.R",62,14,"style","Variable and function name style should be snake_case or symbols."," attributes(Diag)[[""scale""]] <-","object_name_linter" -"R/alphaShapeDiag.R",64,14,"style","Variable and function name style should be snake_case or symbols."," attributes(Diag)[[""call""]] <- match.call()","object_name_linter" -"R/bootstrapBand.R",79,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" -"R/bootstrapDiagram.R",159,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" -"R/bottleneck.R",39,5,"style","Variable and function name style should be snake_case or symbols."," bottleDistance[dimIdx] <- Bottleneck(Diag1Dim, Diag2Dim)","object_name_linter" -"R/clusterTree.R",52,7,"style","Variable and function name style should be snake_case or symbols."," adjMat[i, knnInfo[[""nn.index""]][i, ]] <- 1","object_name_linter" -"R/clusterTree.R",68,7,"style","Variable and function name style should be snake_case or symbols."," adjMat[i, knnInfo[[""nn.index""]][i, ]] <- 1","object_name_linter" -"R/clusterTree.R",104,5,"style","Variable and function name style should be snake_case or symbols."," G[NewExcluded, present] <- FALSE # remove edges of the new excluded point","object_name_linter" -"R/clusterTree.R",106,5,"style","Variable and function name style should be snake_case or symbols."," CLUSTERS[[j]] <- list(""no"" = clust[[""no""]], ""mem"" = clust[[""membership""]],","object_name_linter" -"R/clusterTree.R",166,5,"style","Variable and function name style should be snake_case or symbols."," compBranch[[bb]] <- seq_len(n)","object_name_linter" -"R/clusterTree.R",216,9,"style","Variable and function name style should be snake_case or symbols."," compBranch[[bb]] <- components[[i]]","object_name_linter" -"R/clusterTree.R",245,5,"style","Variable and function name style should be snake_case or symbols."," alphaBottom[i] <- sum(hat.f > bottom[i]) / n","object_name_linter" -"R/clusterTree.R",246,5,"style","Variable and function name style should be snake_case or symbols."," alphaTop[i] <- sum(hat.f > top[i]) / n","object_name_linter" -"R/clusterTree.R",262,9,"style","Variable and function name style should be snake_case or symbols."," rBottom[i] <- max(r.k)","object_name_linter" -"R/clusterTree.R",265,9,"style","Variable and function name style should be snake_case or symbols."," rTop[i] <- max(r.k)","object_name_linter" -"R/dtm.R",52,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" -"R/filtrationDiag.R",50,14,"style","Variable and function name style should be snake_case or symbols."," colnames(Diag) <- c(""dimension"", ""Death"", ""Birth"")","object_name_linter" -"R/filtrationDiag.R",51,5,"style","Variable and function name style should be snake_case or symbols."," Diag[, 2:3] <- -Diag[, 3:2]","object_name_linter" -"R/filtrationDiag.R",53,14,"style","Variable and function name style should be snake_case or symbols."," colnames(Diag) <- c(""dimension"", ""Birth"", ""Death"")","object_name_linter" -"R/filtrationDiag.R",56,9,"style","Variable and function name style should be snake_case or symbols."," class(Diag) <- ""diagram""","object_name_linter" -"R/filtrationDiag.R",57,14,"style","Variable and function name style should be snake_case or symbols."," attributes(Diag)[[""maxdimension""]] <- max(Diag[, 1])","object_name_linter" -"R/filtrationDiag.R",59,14,"style","Variable and function name style should be snake_case or symbols."," attributes(Diag)[[""scale""]] <-","object_name_linter" -"R/filtrationDiag.R",61,14,"style","Variable and function name style should be snake_case or symbols."," attributes(Diag)[[""call""]] <- match.call()","object_name_linter" -"R/filtrationDiag.R",74,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" -"R/findKtree.R",9,7,"style","Variable and function name style should be snake_case or symbols."," kappaBottom[i] <- NA","object_name_linter" -"R/findKtree.R",10,7,"style","Variable and function name style should be snake_case or symbols."," kappaTop[i] <- NA","object_name_linter" -"R/findKtree.R",18,11,"style","Variable and function name style should be snake_case or symbols."," kappaTop[i] <-","object_name_linter" -"R/findKtree.R",21,13,"style","Variable and function name style should be snake_case or symbols."," kappaTop[i] <- length(compBranch[[i]]) / n","object_name_linter" -"R/findKtree.R",24,11,"style","Variable and function name style should be snake_case or symbols."," kappaTop[i] <- length(compBranch[[i]]) / n","object_name_linter" -"R/findKtree.R",27,9,"style","Variable and function name style should be snake_case or symbols."," kappaBottom[i] <- kappaTop[parent[i]]","object_name_linter" -"R/findKtree.R",34,13,"style","Variable and function name style should be snake_case or symbols."," kappaTop[i] <- kappaBottom[i] + (length(compBranch[[i]]) -","object_name_linter" -"R/findKtree.R",37,13,"style","Variable and function name style should be snake_case or symbols."," kappaTop[i] <- kappaBottom[i] + length(compBranch[[i]]) / n","object_name_linter" -"R/findKtree.R",40,11,"style","Variable and function name style should be snake_case or symbols."," kappaTop[i] <- kappaBottom[i] + length(compBranch[[i]]) / n","object_name_linter" -"R/funFiltration.R",34,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" -"R/gridBy.R",16,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" -"R/gridDiag.R",130,14,"style","Variable and function name style should be snake_case or symbols."," colnames(Diag) <- c(""dimension"", ""Death"", ""Birth"")","object_name_linter" -"R/gridDiag.R",131,5,"style","Variable and function name style should be snake_case or symbols."," Diag[, 2:3] <- -Diag[, 3:2]","object_name_linter" -"R/gridDiag.R",133,14,"style","Variable and function name style should be snake_case or symbols."," colnames(Diag) <- c(""dimension"", ""Birth"", ""Death"")","object_name_linter" -"R/gridDiag.R",136,9,"style","Variable and function name style should be snake_case or symbols."," class(Diag) <- ""diagram""","object_name_linter" -"R/gridDiag.R",137,14,"style","Variable and function name style should be snake_case or symbols."," attributes(Diag)[[""maxdimension""]] <- max(Diag[, 1])","object_name_linter" -"R/gridDiag.R",139,14,"style","Variable and function name style should be snake_case or symbols."," attributes(Diag)[[""scale""]] <-","object_name_linter" -"R/gridDiag.R",141,14,"style","Variable and function name style should be snake_case or symbols."," attributes(Diag)[[""call""]] <- match.call()","object_name_linter" -"R/gridFiltration.R",94,5,"style","Variable and function name style should be snake_case or symbols."," gridOut[[2]] <- -gridOut[[2]]","object_name_linter" -"R/gridFiltration.R",108,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" -"R/hausdInterval.R",53,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" -"R/knnDE.R",20,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" -"R/landscape.R",53,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" -"R/maxPersistence.R",109,14,"style","Variable and function name style should be snake_case or symbols."," colnames(Pers[[i]]) <- c(""dimension"", ""Persistence"")","object_name_linter" -"R/maxPersistence.R",121,7,"style","Variable and function name style should be snake_case or symbols."," numberSignificant[i] <- sum(Pers[[i]][selctDim, 2] > (2 * eps[i]))","object_name_linter" -"R/maxPersistence.R",122,7,"style","Variable and function name style should be snake_case or symbols."," significantPers[i] <- sum(pmax(0, Pers[[i]][selctDim, 2] - (2 * eps[i])))","object_name_linter" -"R/maxPersistence.R",128,7,"style","Variable and function name style should be snake_case or symbols."," numberSignificant[i] <- sum(Pers[[i]][, 2] > (2 * eps[i]))","object_name_linter" -"R/maxPersistence.R",129,7,"style","Variable and function name style should be snake_case or symbols."," significantPers[i] <- sum(pmax(0, Pers[[i]][, 2] - (2 * eps[i])))","object_name_linter" -"R/multipBootstrap.R",55,3,"style","Variable and function name style should be snake_case or symbols."," LOWband1[which(LOWband1 < 0)] <- 0 #set negative values of lower band =0","object_name_linter" -"R/plot.diagram.R",121,11,"style","Variable and function name style should be snake_case or symbols."," sortedDiag[(oldlD + 1):(lD), ] <- x[posD, ]","object_name_linter" -"R/plot.diagram.R",122,11,"style","Variable and function name style should be snake_case or symbols."," sortedCol[(oldlD + 1):(lD)] <- col[posD]","object_name_linter" -"R/plot.diagram.R",157,9,"style","There should be a space before an opening curly brace."," } else{ ### diagram plot","brace_linter" -"R/plot.diagram.R",173,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plotRule.R",12,9,"style","Variable and function name style should be snake_case or symbols."," Tops[j] <- max(Tree[[""density""]][Tree[[""DataPoints""]][[j]]])","object_name_linter" -"R/plotRule.R",41,13,"style","Variable and function name style should be snake_case or symbols."," NewTree[[""parent""]][which(Tree[[""parent""]] == bros[j])] <- newID[j]","object_name_linter" -"R/plotRule.R",48,15,"style","Variable and function name style should be snake_case or symbols."," NewTree[[""children""]][[newID[j]]] <- NA","object_name_linter" -"R/plotRule.R",62,13,"style","Variable and function name style should be snake_case or symbols."," NewTree[[""Xbase""]][s] <- sum(NewTree[[""silo""]][[s]]) / 2","object_name_linter" -"R/plotRule.R",66,13,"style","Variable and function name style should be snake_case or symbols."," NewTree[[""silo""]][[s]] <- siloF(NewTree[[""silo""]]","object_name_linter" -"R/print.clusterTree.R",5,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" -"R/print.diagram.R",5,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" -"R/print.maxPersistence.R",4,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" -"R/print.summary.diagram.R",11,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" -"R/print.summary.maxPersistence.R",9,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" -"R/ripsDiag.R",102,12,"style","Variable and function name style should be snake_case or symbols."," colnames(Diag) <- c(""dimension"", ""Birth"", ""Death"")","object_name_linter" -"R/ripsDiag.R",103,9,"style","Variable and function name style should be snake_case or symbols."," class(Diag) <- ""diagram""","object_name_linter" -"R/ripsDiag.R",104,14,"style","Variable and function name style should be snake_case or symbols."," attributes(Diag)[[""maxdimension""]] <- max(Diag[, 1])","object_name_linter" -"R/ripsDiag.R",105,14,"style","Variable and function name style should be snake_case or symbols."," attributes(Diag)[[""scale""]] <- c(0, maxscale)","object_name_linter" -"R/ripsDiag.R",106,14,"style","Variable and function name style should be snake_case or symbols."," attributes(Diag)[[""call""]] <- match.call()","object_name_linter" -"R/rMultinom.R",5,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" -"R/sphereUnif.R",18,7,"style","Variable and function name style should be snake_case or symbols."," X[i, ] <- stats::rnorm(d + 1)","object_name_linter" -"R/summary.diagram.R",10,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" -"R/summary.maxPersistence.R",14,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" -"R/wasserstein.R",40,5,"style","Variable and function name style should be snake_case or symbols."," wassersteinDistance[dimIdx] <- Wasserstein(Diag1Dim, Diag2Dim, p)","object_name_linter" -"vignettes/article.Rnw",222,1,"style","Variable and function name style should be snake_case or symbols.","X <- circleUnif(400)","object_name_linter" -"vignettes/article.Rnw",224,1,"style","Variable and function name style should be snake_case or symbols.","Xlim <- c(-1.6, 1.6); Ylim <- c(-1.7, 1.7); by <- 0.065","object_name_linter" -"vignettes/article.Rnw",224,21,"style","Compound semicolons are discouraged. Replace them by a newline.","Xlim <- c(-1.6, 1.6); Ylim <- c(-1.7, 1.7); by <- 0.065","semicolon_linter" -"vignettes/article.Rnw",224,24,"style","Variable and function name style should be snake_case or symbols.","Xlim <- c(-1.6, 1.6); Ylim <- c(-1.7, 1.7); by <- 0.065","object_name_linter" -"vignettes/article.Rnw",224,44,"style","Compound semicolons are discouraged. Replace them by a newline.","Xlim <- c(-1.6, 1.6); Ylim <- c(-1.7, 1.7); by <- 0.065","semicolon_linter" -"vignettes/article.Rnw",226,1,"style","Variable and function name style should be snake_case or symbols.","Xseq <- seq(Xlim[1], Xlim[2], by = by)","object_name_linter" -"vignettes/article.Rnw",227,1,"style","Variable and function name style should be snake_case or symbols.","Yseq <- seq(Ylim[1], Ylim[2], by = by)","object_name_linter" -"vignettes/article.Rnw",228,1,"style","Variable and function name style should be snake_case or symbols.","Grid <- expand.grid(Xseq, Yseq)","object_name_linter" -"vignettes/article.Rnw",265,1,"style","Variable and function name style should be snake_case or symbols.","DTM <- dtm(X = X, Grid = Grid, m0 = m0)","object_name_linter" -"vignettes/article.Rnw",276,1,"style","Variable and function name style should be snake_case or symbols.","kNN <- knnDE(X = X, Grid = Grid, k = k)","object_name_linter" -"vignettes/article.Rnw",287,1,"style","Variable and function name style should be snake_case or symbols.","KDE <- kde(X = X, Grid = Grid, h = h)","object_name_linter" -"vignettes/article.Rnw",298,1,"style","Variable and function name style should be snake_case or symbols.","Kdist <- kernelDist(X = X, Grid = Grid, h = h)","object_name_linter" -"vignettes/article.Rnw",394,1,"style","Variable and function name style should be snake_case or symbols.","posYgrid <- which(Grid[, 2] > 0)","object_name_linter" -"vignettes/article.Rnw",395,1,"style","Variable and function name style should be snake_case or symbols.","posYseq <- which(Yseq > 0)","object_name_linter" -"vignettes/article.Rnw",465,1,"style","Variable and function name style should be snake_case or symbols.","DiagGrid <- gridDiag(","object_name_linter" -"vignettes/article.Rnw",501,81,"style","Lines should not be more than 80 characters."," lines(DiagGrid[[""cycleLocation""]][[one[i]]][j, , ], pch = 19, cex = 1, col = i)","line_length_linter" -"vignettes/article.Rnw",556,1,"style","Variable and function name style should be snake_case or symbols.","Circle1 <- circleUnif(60)","object_name_linter" -"vignettes/article.Rnw",557,1,"style","Variable and function name style should be snake_case or symbols.","Circle2 <- circleUnif(60, r = 2) + 3","object_name_linter" -"vignettes/article.Rnw",558,1,"style","Variable and function name style should be snake_case or symbols.","Circles <- rbind(Circle1, Circle2)","object_name_linter" -"vignettes/article.Rnw",571,1,"style","Variable and function name style should be snake_case or symbols.","DiagRips <- ripsDiag(X = Circles, maxdimension, maxscale,","object_name_linter" -"vignettes/article.Rnw",584,25,"style","Put spaces around all infix operators.","par(mfrow = c(1, 3), mai=c(0.8, 0.8, 0.3, 0.3))","infix_spaces_linter" -"vignettes/article.Rnw",585,35,"style","Commas should always have a space after.","plot(Circles, pch = 16, xlab = """",ylab = """", main = ""Two Circles"")","commas_linter" -"vignettes/article.Rnw",592,81,"style","Lines should not be more than 80 characters."," lines(DiagRips[[""cycleLocation""]][[one[i]]][j, , ], pch = 19, cex = 1, col = i)","line_length_linter" -"vignettes/article.Rnw",617,1,"style","Variable and function name style should be snake_case or symbols.","X <- circleUnif(n = 30)","object_name_linter" -"vignettes/article.Rnw",624,1,"style","Variable and function name style should be snake_case or symbols.","DiagAlphaCmplx <- alphaComplexDiag(","object_name_linter" -"vignettes/article.Rnw",646,1,"style","Use spaces to indent, not tabs."," cex = 1, col = i + 1)","no_tab_linter" -"vignettes/article.Rnw",668,1,"style","Variable and function name style should be snake_case or symbols.","X <- cbind(circleUnif(n = n), runif(n = n, min = -0.1, max = 0.1))","object_name_linter" -"vignettes/article.Rnw",674,1,"style","Variable and function name style should be snake_case or symbols.","DiagAlphaShape <- alphaShapeDiag(","object_name_linter" -"vignettes/article.Rnw",716,1,"style","Variable and function name style should be snake_case or symbols.","X <- circleUnif(n = 100)","object_name_linter" -"vignettes/article.Rnw",724,1,"style","Variable and function name style should be snake_case or symbols.","FltRips <- ripsFiltration(X = X, maxdimension = maxdimension,","object_name_linter" -"vignettes/article.Rnw",726,1,"style","Use spaces to indent, not tabs."," printProgress = TRUE)","no_tab_linter" -"vignettes/article.Rnw",735,1,"style","Variable and function name style should be snake_case or symbols.","dtmValues <- dtm(X = X, Grid = X, m0 = m0)","object_name_linter" -"vignettes/article.Rnw",736,1,"style","Variable and function name style should be snake_case or symbols.","FltFun <- funFiltration(FUNvalues = dtmValues, cmplx = FltRips[[""cmplx""]])","object_name_linter" -"vignettes/article.Rnw",742,1,"style","Variable and function name style should be snake_case or symbols.","DiagFltFun <- filtrationDiag(filtration = FltFun, maxdimension = maxdimension,","object_name_linter" -"vignettes/article.Rnw",752,25,"style","Put spaces around all infix operators.","par(mfrow = c(1, 2), mai=c(0.8, 0.8, 0.3, 0.3))","infix_spaces_linter" -"vignettes/article.Rnw",753,29,"style","Commas should always have a space after.","plot(X, pch = 16, xlab = """",ylab = """")","commas_linter" -"vignettes/article.Rnw",775,1,"style","Variable and function name style should be snake_case or symbols.","Diag1 <- ripsDiag(Circle1, maxdimension = 1, maxscale = 5)","object_name_linter" -"vignettes/article.Rnw",776,1,"style","Variable and function name style should be snake_case or symbols.","Diag2 <- ripsDiag(Circle2, maxdimension = 1, maxscale = 5)","object_name_linter" -"vignettes/article.Rnw",854,1,"style","Variable and function name style should be snake_case or symbols.","PlotTriangles <- function(left, right) {","object_name_linter" -"vignettes/article.Rnw",856,3,"style","Variable and function name style should be snake_case or symbols."," X <- (left + right) / 2","object_name_linter" -"vignettes/article.Rnw",857,3,"style","Variable and function name style should be snake_case or symbols."," Y <- (right - left) / 2","object_name_linter" -"vignettes/article.Rnw",865,1,"style","Use spaces to indent, not tabs."," mtext(""(Birth + Death) / 2"", side = 1, line = 2.5, cex = 1)","no_tab_linter" -"vignettes/article.Rnw",866,1,"style","Use spaces to indent, not tabs."," mtext(""(Death - Birth) / 2"", side = 2, line = 2.5, cex = 1)","no_tab_linter" -"vignettes/article.Rnw",867,1,"style","Use spaces to indent, not tabs."," #polygon(c(0, 0, ylimit[2]), c(0, ylimit[2], ylimit[2]),","no_tab_linter" -"vignettes/article.Rnw",874,3,"style","Variable and function name style should be snake_case or symbols."," B <- max(X + Y)","object_name_linter" -"vignettes/article.Rnw",876,3,"warning","local variable β€˜maxfun’ assigned but may not be used"," maxfun <- rep(0, length(grid))","object_usage_linter" -"vignettes/article.Rnw",878,6,"style","Place a space before left parenthesis, except in a function call."," for(i in seq_len(n)) {","spaces_left_parentheses_linter" -"vignettes/article.Rnw",881,3,"warning","local variable β€˜land’ assigned but may not be used"," land <- apply(tmp, 2, max)","object_usage_linter" -"vignettes/article.Rnw",882,4,"style","Commented code should be removed."," #lines(grid, land, lwd = 2, col = 4)","commented_code_linter" -"vignettes/article.Rnw",883,1,"style","Use spaces to indent, not tabs."," points(X, Y, type = ""p"", cex = 1, pch = 19, col = ""pink"")","no_tab_linter" -"vignettes/article.Rnw",892,27,"style","Trailing whitespace is superfluous.","PlotTriangles(left, right) ","trailing_whitespace_linter" -"vignettes/article.Rnw",894,1,"style","Variable and function name style should be snake_case or symbols.","Diag1 <- cbind(rep(0, length(left)), left, right)","object_name_linter" -"vignettes/article.Rnw",896,1,"style","Variable and function name style should be snake_case or symbols.","Land1 <- landscape(Diag1, dimension = 0, KK = 1, tseq)","object_name_linter" -"vignettes/article.Rnw",897,1,"style","Variable and function name style should be snake_case or symbols.","Sil1 <- silhouette(Diag1, p = 1, dimension = 0, tseq)","object_name_linter" -"vignettes/article.Rnw",899,1,"style","Variable and function name style should be snake_case or symbols.","X <- (left + right) / 2","object_name_linter" -"vignettes/article.Rnw",900,1,"style","Variable and function name style should be snake_case or symbols.","Y <- (right - left) / 2","object_name_linter" -"vignettes/article.Rnw",939,1,"style","Variable and function name style should be snake_case or symbols.","Land <- landscape(DiagRips[[""diagram""]], dimension = 1, KK = 1, tseq)","object_name_linter" -"vignettes/article.Rnw",940,1,"style","Variable and function name style should be snake_case or symbols.","Sil <- silhouette(DiagRips[[""diagram""]], p = 1, dimension = 1, tseq)","object_name_linter" -"vignettes/article.Rnw",975,1,"style","Variable and function name style should be snake_case or symbols.","N <- 4000","object_name_linter" -"vignettes/article.Rnw",976,1,"style","Variable and function name style should be snake_case or symbols.","XX1 <- circleUnif(N / 2)","object_name_linter" -"vignettes/article.Rnw",977,1,"style","Variable and function name style should be snake_case or symbols.","XX2 <- circleUnif(N / 2, r = 2) + 3","object_name_linter" -"vignettes/article.Rnw",978,1,"style","Variable and function name style should be snake_case or symbols.","X <- rbind(XX1, XX2)","object_name_linter" -"vignettes/article.Rnw",990,1,"style","Variable and function name style should be snake_case or symbols.","Diags <- list()","object_name_linter" -"vignettes/article.Rnw",992,1,"style","Variable and function name style should be snake_case or symbols.","Lands <- matrix(0, nrow = n, ncol = length(tseq))","object_name_linter" -"vignettes/article.Rnw",1000,3,"style","Variable and function name style should be snake_case or symbols."," subX <- X[sample(seq_len(N), m), ]","object_name_linter" -"vignettes/article.Rnw",1001,3,"style","Variable and function name style should be snake_case or symbols."," Diags[[i]] <- ripsDiag(subX, maxdimension = 1, maxscale = 5)","object_name_linter" -"vignettes/article.Rnw",1002,3,"style","Variable and function name style should be snake_case or symbols."," Lands[i, ] <- landscape(Diags[[i]][[""diagram""]], dimension = 1,","object_name_linter" -"vignettes/article.Rnw",1010,1,"style","Variable and function name style should be snake_case or symbols.","bootLand <- multipBootstrap(Lands, B = 100, alpha = 0.05,","object_name_linter" -"vignettes/article.Rnw",1080,1,"style","Variable and function name style should be snake_case or symbols.","XX1 <- circleUnif(600)","object_name_linter" -"vignettes/article.Rnw",1081,1,"style","Variable and function name style should be snake_case or symbols.","XX2 <- circleUnif(1000, r = 1.5) + 2.5","object_name_linter" -"vignettes/article.Rnw",1083,1,"style","Variable and function name style should be snake_case or symbols.","X <- rbind(XX1, XX2, noise)","object_name_linter" -"vignettes/article.Rnw",1086,1,"style","Variable and function name style should be snake_case or symbols.","Xlim <- c(-2, 5)","object_name_linter" -"vignettes/article.Rnw",1087,1,"style","Variable and function name style should be snake_case or symbols.","Ylim <- c(-2, 5)","object_name_linter" -"vignettes/article.Rnw",1094,1,"style","Variable and function name style should be snake_case or symbols.","parametersKDE <- seq(0.1, 0.6, by = 0.05)","object_name_linter" -"vignettes/article.Rnw",1096,1,"style","Variable and function name style should be snake_case or symbols.","B <- 50 # number of bootstrap iterations. Should be large.","object_name_linter" -"vignettes/article.Rnw",1103,1,"style","Variable and function name style should be snake_case or symbols.","maxKDE <- maxPersistence(kde, parametersKDE, X,","object_name_linter" -"vignettes/article.Rnw",1149,1,"style","Variable and function name style should be snake_case or symbols.","X1 <- cbind(rnorm(300, 1, .8), rnorm(300, 5, 0.8))","object_name_linter" -"vignettes/article.Rnw",1150,1,"style","Variable and function name style should be snake_case or symbols.","X2 <- cbind(rnorm(300, 3.5, .8), rnorm(300, 5, 0.8))","object_name_linter" -"vignettes/article.Rnw",1151,1,"style","Variable and function name style should be snake_case or symbols.","X3 <- cbind(rnorm(300, 6, 1), rnorm(300, 1, 1))","object_name_linter" -"vignettes/article.Rnw",1152,1,"style","Variable and function name style should be snake_case or symbols.","XX <- rbind(X1, X2, X3)","object_name_linter" -"vignettes/article.Rnw",1158,1,"style","Variable and function name style should be snake_case or symbols.","Tree <- clusterTree(XX, k = 100, density = ""knn"",","object_name_linter" -"vignettes/article.Rnw",1160,1,"style","Variable and function name style should be snake_case or symbols.","TreeKDE <- clusterTree(XX, k = 100, h = 0.3, density = ""kde"",","object_name_linter" -"vignettes/article.Rnw",1183,17,"style","Commas should always have a space after.","par(mfrow = c(2,3))","commas_linter" -"vignettes/article.Rnw",1184,18,"style","Commas should always have a space after.","par(mai = c(0.25,0.35,0.3,0.3))","commas_linter" -"vignettes/article.Rnw",1184,23,"style","Commas should always have a space after.","par(mai = c(0.25,0.35,0.3,0.3))","commas_linter" -"vignettes/article.Rnw",1184,27,"style","Commas should always have a space after.","par(mai = c(0.25,0.35,0.3,0.3))","commas_linter" -"vignettes/article.Rnw",1195,1,"style","Use spaces to indent, not tabs."," points(matrix(XX[Tree[[""DataPoints""]][[i]], ], ncol = 2), col = i,","no_tab_linter" diff --git a/.dev/revdep_emails/TDA/email-body b/.dev/revdep_emails/TDA/email-body deleted file mode 100644 index 4f8d2f067..000000000 --- a/.dev/revdep_emails/TDA/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Jisu Kim! Thank you for using {lintr} in your package {TDA}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cran/TDA (hash: 0fe703f3def3e7a7d09678e9897ed4ed40a9df42) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 28s on CRAN vs. 20s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/WikidataQueryServiceR/attachments/WikidataQueryServiceR.warnings b/.dev/revdep_emails/WikidataQueryServiceR/attachments/WikidataQueryServiceR.warnings deleted file mode 100644 index 2bb977138..000000000 --- a/.dev/revdep_emails/WikidataQueryServiceR/attachments/WikidataQueryServiceR.warnings +++ /dev/null @@ -1,2 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Trying to remove β€˜closed_curly_linter’, β€˜open_curly_linter’ and β€˜camel_case_linter’, which are not in `defaults`. diff --git a/.dev/revdep_emails/WikidataQueryServiceR/email-body b/.dev/revdep_emails/WikidataQueryServiceR/email-body deleted file mode 100644 index 61aa33d57..000000000 --- a/.dev/revdep_emails/WikidataQueryServiceR/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Mikhail Popov! Thank you for using {lintr} in your package {WikidataQueryServiceR}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/bearloga/WikidataQueryServiceR (hash: accff89a06ad4ac4af1bef369f589175c92837b6) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 2s on CRAN vs. 1s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/WoodburyMatrix/attachments/WoodburyMatrix.warnings b/.dev/revdep_emails/WoodburyMatrix/attachments/WoodburyMatrix.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/WoodburyMatrix/attachments/WoodburyMatrix.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/WoodburyMatrix/email-body b/.dev/revdep_emails/WoodburyMatrix/email-body deleted file mode 100644 index a9465b7f5..000000000 --- a/.dev/revdep_emails/WoodburyMatrix/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Michael Bertolacci! Thank you for using {lintr} in your package {WoodburyMatrix}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/mbertolacci/WoodburyMatrix (hash: 5861c0e95a645ec90848bcc2f1f651ea96cbecb8) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 5s on CRAN vs. 3s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/abbyyR/email-body b/.dev/revdep_emails/abbyyR/email-body deleted file mode 100644 index 3520096fb..000000000 --- a/.dev/revdep_emails/abbyyR/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Gaurav Sood! Thank you for using {lintr} in your package {abbyyR}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at http://github.com/soodoku/abbyyR (hash: 98442a0ba1aee5146ac1a47722cf8559ffd18043) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 0s on CRAN vs. 0s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/adaptalint/email-body b/.dev/revdep_emails/adaptalint/email-body deleted file mode 100644 index 060933463..000000000 --- a/.dev/revdep_emails/adaptalint/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Max Conway! Thank you for using {lintr} in your package {adaptalint}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cran/adaptalint (hash: b8c854f8722d3f5ad1f7b3e57d628e428b688c01) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 4s on CRAN vs. 2s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/admiral/attachments/admiral.warnings b/.dev/revdep_emails/admiral/attachments/admiral.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/admiral/attachments/admiral.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/admiral/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/admiral/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 4cf6085f8..000000000 --- a/.dev/revdep_emails/admiral/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,37 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/templates/ad_adpp.R",69,6,"style","Use TRUE instead of the symbol T."," T ~ NA_real_","T_and_F_symbol_linter" -"R/assertions.R",404,17,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!provided & !optional) {","vector_logic_linter" -"R/assertions.R",409,16,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (provided & !(quo_is_call(arg) | is_logical(quo_get_expr(arg)))) {","vector_logic_linter" -"R/assertions.R",409,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (provided & !(quo_is_call(arg) | is_logical(quo_get_expr(arg)))) {","vector_logic_linter" -"R/assertions.R",1088,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!accept_var & (!is_quosures(arg) || !is_named(arg))) {","vector_logic_linter" -"R/assertions.R",1102,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (accept_var & (!contains_vars(arg))) {","vector_logic_linter" -"R/create_query_data.R",853,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!""TERM_NAME"" %in% vars & !""TERM_ID"" %in% vars) {","vector_logic_linter" -"R/create_single_dose_dataset.R",367,17,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (time_flag &","vector_logic_linter" -"R/create_single_dose_dataset.R",368,46,"warning","Conditional expressions require scalar logical operators (&& and ||)"," (is.Date(eval_tidy(start_date, dataset)) | is.Date(eval_tidy(end_date, dataset)))) {","vector_logic_linter" -"R/dataset_vignette.R",81,21,"style","Use TRUE instead of the symbol T."," scroller = T,","T_and_F_symbol_linter" -"R/derive_date_vars.R",204,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (date_imputation == ""MID"" & preserve) {","vector_logic_linter" -"R/derive_date_vars.R",210,41,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (date_imputation == ""MID"" & !preserve) {","vector_logic_linter" -"R/derive_date_vars.R",216,41,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (date_imputation != ""MID"" & preserve) {","vector_logic_linter" -"R/derive_date_vars.R",224,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (date_imputation == ""LAST"" & !preserve) {","vector_logic_linter" -"R/derive_date_vars.R",234,42,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (date_imputation == ""LAST"" & preserve) {","vector_logic_linter" -"R/derive_date_vars.R",248,36,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (date_imputation == ""FIRST"" & preserve) {","vector_logic_linter" -"R/derive_date_vars.R",301,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(min_dates) | !is.null(max_dates)) {","vector_logic_linter" -"R/derive_param_tte.R",273,39,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(set_values_to$PARAMCD) & !is.null(dataset)) {","vector_logic_linter" -"R/derive_param_tte.R",319,62,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (start_date_imputation_flag %in% colnames(dataset_adsl) &","vector_logic_linter" -"R/derive_param_tte.R",328,62,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (start_time_imputation_flag %in% colnames(dataset_adsl) &","vector_logic_linter" -"R/derive_var_obs_number.R",91,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(by_vars) | !is.null(order)) {","vector_logic_linter" -"R/derive_vars_disposition_reason.R",186,64,"style","Use TRUE instead of the symbol T."," new_var_spe <- assert_symbol(enquo(new_var_spe), optional = T)","T_and_F_symbol_linter" -"R/derive_vars_disposition_reason.R",187,70,"style","Use TRUE instead of the symbol T."," reason_var_spe <- assert_symbol(enquo(reason_var_spe), optional = T)","T_and_F_symbol_linter" -"R/derive_vars_query.R",251,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (any(queries$QUERY_NAME == """") | any(is.na(queries$QUERY_NAME))) {","vector_logic_linter" -"R/derive_vars_query.R",291,62,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (any(is.na(queries$TERM_NAME) & is.na(queries$TERM_ID)) |","vector_logic_linter" -"vignettes/adsl.Rmd",245,27,"style","Variable and function name style should be snake_case or symbols.","format_eosstt <- function(DSDECOD) {","object_name_linter" -"vignettes/adsl.Rmd",318,101,"style","Lines should not be more than 100 characters."," if_else(dsdecod %notin% c(""COMPLETED"", ""SCREEN FAILURE"") & !is.na(dsdecod), dsdecod, NA_character_)","line_length_linter" -"vignettes/bds_exposure.Rmd",69,101,"style","Lines should not be more than 100 characters.","ex <- filter(ex, USUBJID %in% c(""01-701-1015"", ""01-701-1023"", ""01-703-1086"", ""01-703-1096"", ""01-707-1037"", ""01-716-1024""))","line_length_linter" -"vignettes/bds_finding.Rmd",74,101,"style","Lines should not be more than 100 characters.","vs <- filter(vs, USUBJID %in% c(""01-701-1015"", ""01-701-1023"", ""01-703-1086"", ""01-703-1096"", ""01-707-1037"", ""01-716-1024""))","line_length_linter" -"vignettes/bds_tte.Rmd",480,101,"style","Lines should not be more than 100 characters."," dataset_vignette(display_vars = vars(USUBJID, PARAMCD, STARTDT, ADT, CNSR, EVNTDESC, SRCDOM, SRCVAR))","line_length_linter" -"vignettes/occds.Rmd",438,101,"style","Lines should not be more than 100 characters."," ~VAR_PREFIX, ~QUERY_NAME, ~SDG_ID, ~QUERY_SCOPE, ~QUERY_SCOPE_NUM, ~TERM_LEVEL, ~TERM_NAME, ~TERM_ID,","line_length_linter" -"vignettes/occds.Rmd",439,101,"style","Lines should not be more than 100 characters."," ""SDG01"", ""Diuretics"", 11, ""BROAD"", 1, ""CMDECOD"", ""Diuretic 1"", NA,","line_length_linter" -"vignettes/occds.Rmd",440,101,"style","Lines should not be more than 100 characters."," ""SDG01"", ""Diuretics"", 11, ""BROAD"", 2, ""CMDECOD"", ""Diuretic 2"", NA,","line_length_linter" -"vignettes/occds.Rmd",441,101,"style","Lines should not be more than 100 characters."," ""SDG02"", ""Costicosteroids"", 12, ""BROAD"", 1, ""CMDECOD"", ""Costicosteroid 1"", NA,","line_length_linter" -"vignettes/occds.Rmd",442,101,"style","Lines should not be more than 100 characters."," ""SDG02"", ""Costicosteroids"", 12, ""BROAD"", 2, ""CMDECOD"", ""Costicosteroid 2"", NA,","line_length_linter" -"vignettes/occds.Rmd",443,101,"style","Lines should not be more than 100 characters."," ""SDG02"", ""Costicosteroids"", 12, ""BROAD"", 2, ""CMDECOD"", ""Costicosteroid 3"", NA,","line_length_linter" diff --git a/.dev/revdep_emails/admiral/email-body b/.dev/revdep_emails/admiral/email-body deleted file mode 100644 index 928055860..000000000 --- a/.dev/revdep_emails/admiral/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Thomas Neitmann! Thank you for using {lintr} in your package {admiral}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/pharmaverse/admiral (hash: 5e87df448a0b55d2dc73c43b487885a82f3911c6) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 223s on CRAN vs. 129s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/autoharp/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/autoharp/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 9ceb51895..000000000 --- a/.dev/revdep_emails/autoharp/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,11 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/check_correctness.R",78,28,"style","There should be a space between right parenthesis and an opening curly brace.","# if(length(test_list) > 0){","paren_brace_linter" -"R/check_correctness.R",115,33,"style","There should be a space between right parenthesis and an opening curly brace.","# } else if(!is.null(tt_parsed)){","paren_brace_linter" -"R/count_lints.R",44,5,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" -"R/lang_2_tree.R",99,29,"style","There should be a space between right parenthesis and an opening curly brace."," # if(is.null(call_name1)){","paren_brace_linter" -"R/populate_soln_env.R",141,47,"style","There should be a space between right parenthesis and an opening curly brace."," # if("".scalars_to_keep"" %in% names(e_soln)){","paren_brace_linter" -"R/utils.R",201,37,"style","There should be a space between right parenthesis and an opening curly brace."," #else if (length(kept_chunks) == 1){","paren_brace_linter" -"R/zzz.R",3,1,"style","Variable and function name style should be snake_case.",".onLoad <- function(libname, pkgname) {","object_name_linter" -"R/zzz.R",9,1,"style","Variable and function name style should be snake_case.",".onUnload <- function(libpath) {","object_name_linter" -"R/zzz.R",15,1,"style","Variable and function name style should be snake_case.",".onDetach <- function(libpath) {","object_name_linter" -"tests/testthat/test-02-th_constructors.R",22,43,"style","Place a space before left parenthesis, except in a function call.","slot_dollar_mix <- quote(y <- l$ll$mmm@the(x = 3))","spaces_left_parentheses_linter" diff --git a/.dev/revdep_emails/autoharp/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/autoharp/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index d12bb09b8..000000000 --- a/.dev/revdep_emails/autoharp/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,54 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/examples/question_sheets/sample_questions_01.Rmd",19,3,"style","Variable and function name style should be snake_case or symbols."," U <- runif(n)","object_name_linter" -"inst/examples/question_sheets/sample_questions_01.Rmd",20,3,"style","Variable and function name style should be snake_case or symbols."," X <- U^(1/4)","object_name_linter" -"inst/examples/question_sheets/sample_questions_01.Rmd",20,12,"style","Put spaces around all infix operators."," X <- U^(1/4)","infix_spaces_linter" -"inst/examples/soln_templates/soln_template_01.Rmd",12,3,"style","Variable and function name style should be snake_case or symbols."," U <- runif(n)","object_name_linter" -"inst/examples/soln_templates/soln_template_01.Rmd",13,3,"style","Variable and function name style should be snake_case or symbols."," X <- U^(1/4)","object_name_linter" -"inst/examples/soln_templates/soln_template_01.Rmd",13,12,"style","Put spaces around all infix operators."," X <- U^(1/4)","infix_spaces_linter" -"inst/examples/soln_templates/soln_template_01.Rmd",16,1,"style","Variable and function name style should be snake_case or symbols.","X <- rf(1e4)","object_name_linter" -"inst/examples/soln_templates/soln_template_01.Rmd",20,1,"style","Variable and function name style should be snake_case or symbols.","lenX <- (length(X) == length(.X))","object_name_linter" -"inst/examples/soln_templates/soln_template_01.Rmd",26,1,"style","Variable and function name style should be snake_case or symbols.","sd.X <- sd(X)","object_name_linter" -"inst/examples/soln_templates/soln_template_01.Rmd",31,69,"style","Put spaces around all infix operators.","for_loop <- fapply(f1, detect_for_in_fn_def, fn_name = ""rf"", combine=TRUE, ","infix_spaces_linter" -"inst/examples/soln_templates/soln_template_01.Rmd",31,75,"style","Trailing whitespace is superfluous.","for_loop <- fapply(f1, detect_for_in_fn_def, fn_name = ""rf"", combine=TRUE, ","trailing_whitespace_linter" -"inst/examples/soln_templates/soln_template_02.Rmd",11,1,"style","Variable and function name style should be snake_case or symbols.","X <- c(1L, 3L, 5L, 7L, 9L, 11L)","object_name_linter" -"inst/examples/soln_templates/soln_template_02.Rmd",12,1,"style","Variable and function name style should be snake_case or symbols.","mean_X <- mean(X)","object_name_linter" -"inst/examples/soln_templates/soln_template_02.Rmd",16,1,"style","Variable and function name style should be snake_case or symbols.","last.X <- X[length(X)]","object_name_linter" -"R/check_correctness.R",15,31,"style","Any function spanning multiple lines should use curly braces."," function(x) paste0(as.character(x$srcref),","brace_linter" -"R/check_correctness.R",71,3,"warning","local variable β€˜copy_out’ assigned but may not be used"," copy_out <- sapply(obj_to_copy,","object_usage_linter" -"R/check_runtime.R",20,64,"style","Put spaces around all infix operators.","check_runtime <- function(stud_fname, knit_root_dir, return_env=FALSE) {","infix_spaces_linter" -"R/examplify_to_r.R",21,56,"style","Put spaces around all infix operators.","examplify_to_r <- function(in_fname, out_fname, verbose=FALSE) {","infix_spaces_linter" -"R/forestharp_helpers.R",236,37,"style","Put spaces around all infix operators.","detect_growing <- function(th, count=FALSE, within_for=FALSE) {","infix_spaces_linter" -"R/forestharp_helpers.R",236,55,"style","Put spaces around all infix operators.","detect_growing <- function(th, count=FALSE, within_for=FALSE) {","infix_spaces_linter" -"R/forestharp.R",53,32,"style","Any function spanning multiple lines should use curly braces."," all_trees <- lapply(all_exp, function(x)","brace_linter" -"R/forestharp.R",64,24,"style","Any function spanning multiple lines should use curly braces."," lint_out <- Filter(function(x)","brace_linter" -"R/forestharp.R",67,24,"style","Any function spanning multiple lines should use curly braces."," lint_out <- Filter(function(x)","brace_linter" -"R/generate_thumbnails.R",24,42,"style","Put spaces around all infix operators."," anonymise=FALSE) {","infix_spaces_linter" -"R/lang_2_tree_helpers.R",107,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" -"R/lum_local_match.R",25,3,"style","Either both or neither branch in `if`/`else` should use curly braces."," else{","brace_linter" -"R/lum_local_match.R",25,7,"style","There should be a space before an opening curly brace."," else{","brace_linter" -"R/nlp_related.R",15,54,"style","Put spaces around all infix operators.","rmd_to_token_count <- function(fname, include_actuals=TRUE) {","infix_spaces_linter" -"R/populate_soln_env.R",104,42,"style","Put spaces around all infix operators."," render_only=FALSE, output=NULL) {","infix_spaces_linter" -"R/populate_soln_env.R",104,56,"style","Put spaces around all infix operators."," render_only=FALSE, output=NULL) {","infix_spaces_linter" -"R/render_one.R",31,69,"style","Put spaces around all infix operators."," max_time_per_run = 120, permission_to_install=FALSE) {","infix_spaces_linter" -"R/render_one.R",135,7,"style","`else` should come on the same line as the previous `}`."," else","brace_linter" -"R/reset_path.R",39,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" -"R/to_BFS.R",30,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/tree_kernel.R",20,34,"style","Put spaces around all infix operators.","tree_sim <- function(t1, t2, norm=FALSE, ...) {","infix_spaces_linter" -"R/tree_kernel.R",396,48,"style","Put spaces around all infix operators.","jaccard_treeharp <- function(th1, th2, weighted=FALSE) {","infix_spaces_linter" -"R/tree_routines.R",77,51,"style","Put spaces around all infix operators.","subtree_at <- function(obj, at_node, preserve_call=FALSE) {","infix_spaces_linter" -"R/tree_routines.R",99,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/tree_routines.R",211,40,"style","Put spaces around all infix operators.","is_connected <- function(adj_list, root=1) {","infix_spaces_linter" -"R/tree_routines.R",255,53,"style","Put spaces around all infix operators.","is_cyclic_r <- function(adj_mat, node_v, parent_node=-1, visited_env) {","infix_spaces_linter" -"R/tree_routines.R",265,10,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/tree_routines.R",470,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/utils.R",64,40,"style","Put spaces around all infix operators.","clean_dir <- function(dir_name, verbose=FALSE) {","infix_spaces_linter" -"R/utils.R",199,3,"style","Either both or neither branch in `if`/`else` should use curly braces."," else {","brace_linter" -"R/write_html.R",2,46,"style","Only use double-quotes."," as.character(shiny::tags$style(shiny::HTML('","single_quotes_linter" -"tests/testthat/example_01.R",2,11,"style","Missing terminal newline.","y <- 11:20","trailing_blank_lines_linter" -"tests/testthat/example_04.R",2,11,"style","Missing terminal newline.","y <- 11:19","trailing_blank_lines_linter" -"tests/testthat/soln_template_02.Rmd",7,1,"style","Variable and function name style should be snake_case or symbols.","X <- 1:10","object_name_linter" -"tests/testthat/soln_template_02.Rmd",8,1,"style","Variable and function name style should be snake_case or symbols.","Y <- LETTERS[1:5]","object_name_linter" -"tests/testthat/soln_template_02.Rmd",9,1,"style","Variable and function name style should be snake_case or symbols.","Z <- 10:15","object_name_linter" -"tests/testthat/soln_template_02.Rmd",14,1,"style","Variable and function name style should be snake_case or symbols.","Xmean <- mean(X)","object_name_linter" -"tests/testthat/soln_template_02.Rmd",15,1,"style","Variable and function name style should be snake_case or symbols.","Zmean <- mean(Z)","object_name_linter" -"tests/testthat/soln_template_02.Rmd",19,1,"style","Variable and function name style should be snake_case or symbols.","Y1 <- Y[3] # Note that it is character here.","object_name_linter" diff --git a/.dev/revdep_emails/autoharp/email-body b/.dev/revdep_emails/autoharp/email-body deleted file mode 100644 index 7783cf87e..000000000 --- a/.dev/revdep_emails/autoharp/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Vik Gopal! Thank you for using {lintr} in your package {autoharp}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cran/autoharp (hash: d2efbb0a76285ba95ed6950a61e05f1398b5e656) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 47s on CRAN vs. 29s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/aws.alexa/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/aws.alexa/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 8c9905db0..000000000 --- a/.dev/revdep_emails/aws.alexa/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,23 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/doc/overview.Rmd",22,3,"style","Commented code should be removed.","# install.packages(""devtools"")","commented_code_linter" -"inst/doc/overview.Rmd",31,19,"style","Put spaces around all infix operators.","set_secret_key(key=""key"", secret=""secret"")","infix_spaces_linter" -"inst/doc/overview.Rmd",31,33,"style","Put spaces around all infix operators.","set_secret_key(key=""key"", secret=""secret"")","infix_spaces_linter" -"inst/doc/overview.Rmd",39,23,"warning","1:nrow(...) is likely to be wrong in the empty edge case. Use seq_len() instead.","dimnames(res) <- list(1:nrow(res), c(""url"", ""attribute"", ""title"", ""description"", ""online_since""))","seq_linter" -"inst/doc/overview.Rmd",39,81,"style","Lines should not be more than 80 characters.","dimnames(res) <- list(1:nrow(res), c(""url"", ""attribute"", ""title"", ""description"", ""online_since""))","line_length_linter" -"inst/doc/overview.Rmd",71,23,"style","Put spaces around all infix operators.","browse_categories(path=""Top/Arts"")","infix_spaces_linter" -"inst/doc/overview.Rmd",77,34,"style","Put spaces around all infix operators.","cat_list <- category_listing(path=""Top/Arts"")","infix_spaces_linter" -"inst/doc/overview.Rmd",102,26,"style","Put spaces around all infix operators.","res_links <- in_links(url=""google.com"")","infix_spaces_linter" -"R/aws.alexa.package.R",50,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (identical(key, """") | identical(secret, """")) {","vector_logic_linter" -"R/category_listing.R",53,13,"style","Any function spanning multiple lines should use curly braces."," function(x)","brace_linter" -"R/set_secret_key.R",26,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(key) & !is.null(secret)) {","vector_logic_linter" -"R/traffic_history.R",24,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.numeric(range) | (range < 1 | range > 31)) {","vector_logic_linter" -"R/traffic_history.R",24,41,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.numeric(range) | (range < 1 | range > 31)) {","vector_logic_linter" -"R/traffic_history.R",40,17,"style","Any function spanning multiple lines should use curly braces."," function(x)","brace_linter" -"vignettes/overview.Rmd",22,3,"style","Commented code should be removed.","# install.packages(""devtools"")","commented_code_linter" -"vignettes/overview.Rmd",31,19,"style","Put spaces around all infix operators.","set_secret_key(key=""key"", secret=""secret"")","infix_spaces_linter" -"vignettes/overview.Rmd",31,33,"style","Put spaces around all infix operators.","set_secret_key(key=""key"", secret=""secret"")","infix_spaces_linter" -"vignettes/overview.Rmd",39,23,"warning","1:nrow(...) is likely to be wrong in the empty edge case. Use seq_len() instead.","dimnames(res) <- list(1:nrow(res), c(""url"", ""attribute"", ""title"", ""description"", ""online_since""))","seq_linter" -"vignettes/overview.Rmd",39,81,"style","Lines should not be more than 80 characters.","dimnames(res) <- list(1:nrow(res), c(""url"", ""attribute"", ""title"", ""description"", ""online_since""))","line_length_linter" -"vignettes/overview.Rmd",71,23,"style","Put spaces around all infix operators.","browse_categories(path=""Top/Arts"")","infix_spaces_linter" -"vignettes/overview.Rmd",77,34,"style","Put spaces around all infix operators.","cat_list <- category_listing(path=""Top/Arts"")","infix_spaces_linter" -"vignettes/overview.Rmd",102,26,"style","Put spaces around all infix operators.","res_links <- in_links(url=""google.com"")","infix_spaces_linter" diff --git a/.dev/revdep_emails/aws.alexa/email-body b/.dev/revdep_emails/aws.alexa/email-body deleted file mode 100644 index fa8936b2a..000000000 --- a/.dev/revdep_emails/aws.alexa/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Gaurav Sood! Thank you for using {lintr} in your package {aws.alexa}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cran/aws.alexa (hash: 44f796039e5a1737697c95a900fda9d9f916e0bb) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 5s on CRAN vs. 3s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/babette/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/babette/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 1e3a63aa0..000000000 --- a/.dev/revdep_emails/babette/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,5 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"vignettes/nested_sampling.Rmd",122,4,"style","Trailing whitespace is superfluous."," ) ","trailing_whitespace_linter" -"vignettes/step_by_step.Rmd",51,45,"style","Trailing whitespace is superfluous."," pattern = ""treelog_"", fileext = "".trees"" ","trailing_whitespace_linter" -"vignettes/step_by_step.Rmd",145,81,"style","Lines should not be more than 80 characters."," knitr::kable(head(parse_beast_tracelog_file(inference_model$mcmc$tracelog$filename)))","line_length_linter" -"vignettes/step_by_step.Rmd",161,81,"style","Lines should not be more than 80 characters."," knitr::kable(head(parse_beast_state_operators(beast2_options$output_state_filename)))","line_length_linter" diff --git a/.dev/revdep_emails/babette/email-body b/.dev/revdep_emails/babette/email-body deleted file mode 100644 index e5ed14bda..000000000 --- a/.dev/revdep_emails/babette/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello RichΓ¨l J.C. Bilderbeek! Thank you for using {lintr} in your package {babette}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/ropensci/babette (hash: 0b37951b00675982d1d7b2101e400b3c7fef3068) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 23s on CRAN vs. 15s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/beautier/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/beautier/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index f632afb05..000000000 --- a/.dev/revdep_emails/beautier/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,3 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/create_branch_rate_model_xml.R",106,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/remove_empty_lines.R",13,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" diff --git a/.dev/revdep_emails/beautier/email-body b/.dev/revdep_emails/beautier/email-body deleted file mode 100644 index b8438b9db..000000000 --- a/.dev/revdep_emails/beautier/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello RichΓ¨l J.C. Bilderbeek! Thank you for using {lintr} in your package {beautier}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/ropensci/beautier (hash: 7f4ee9a8f3692afafd3ba5f7d01e9605f33603a6) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 280s on CRAN vs. 156s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/biolink/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/biolink/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 6fced2c44..000000000 --- a/.dev/revdep_emails/biolink/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,3 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"tests/testthat/test-tags-go.r",13,1,"style","Trailing semicolons are not needed.",";})","semicolon_linter" -"tests/testthat/test-tags-go.r",27,1,"style","Trailing semicolons are not needed.",";})","semicolon_linter" diff --git a/.dev/revdep_emails/biolink/email-body b/.dev/revdep_emails/biolink/email-body deleted file mode 100644 index 5bf0325e7..000000000 --- a/.dev/revdep_emails/biolink/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Aaron Wolen! Thank you for using {lintr} in your package {biolink}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cran/biolink (hash: 579383b93d11368dbdb5dddb043f7d04f8c6f242) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 10s on CRAN vs. 6s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/caretEnsemble/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/caretEnsemble/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index b96c5293a..000000000 --- a/.dev/revdep_emails/caretEnsemble/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,8 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/caretEnsemble.R",235,12,"style","Variable and function name style should be snake_case."," object$modelType <- extractModelTypes(object$models)[1]","object_name_linter" -"R/caretEnsemble.R",355,7,"style","Variable and function name style should be snake_case."," dat$metricSD <- dat[[paste0(metricLab, ""SD"")]]","object_name_linter" -"R/caretList.R",95,7,"style","Variable and function name style should be snake_case."," x$savePredictions <- ""final""","object_name_linter" -"R/caretList.R",100,7,"style","Variable and function name style should be snake_case."," x$savePredictions <- ""final""","object_name_linter" -"tests/testthat/test-caretList.R",143,15,"style","Variable and function name style should be snake_case."," models[[1]]$modelType <- ""Bogus""","object_name_linter" -"tests/testthat/test-caretList.R",202,3,"style","There should be a space between right parenthesis and an opening curly brace."," ){","paren_brace_linter" -"tests/testthat/test-caretList.R",252,3,"style","There should be a space between right parenthesis and an opening curly brace."," ){","paren_brace_linter" diff --git a/.dev/revdep_emails/caretEnsemble/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/caretEnsemble/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index aa0425e79..000000000 --- a/.dev/revdep_emails/caretEnsemble/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,114 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/caretEnsemble.R",93,9,"style","Variable and function name style should be snake_case or symbols."," names(modRes)[2:3] <- c(metric, paste0(metric, ""SD""))","object_name_linter" -"R/caretEnsemble.R",307,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/caretEnsemble.R",325,5,"style","Variable and function name style should be snake_case or symbols."," datList[[i]] <- model$models[[i]]$trainingData","object_name_linter" -"R/caretEnsemble.R",408,3,"style","Variable and function name style should be snake_case or symbols."," wghtFrame$method <- row.names(wghtFrame)","object_name_linter" -"R/caretEnsemble.R",409,9,"style","Variable and function name style should be snake_case or symbols."," names(wghtFrame) <- c(""weights"", ""method"")","object_name_linter" -"R/caretList.R",233,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/caretList.R",238,9,"style","Variable and function name style should be snake_case or symbols."," names(modelList) <- names(tuneList)","object_name_linter" -"R/caretList.R",245,9,"style","Variable and function name style should be snake_case or symbols."," class(modelList) <- c(""caretList"")","object_name_linter" -"R/caretList.R",344,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/caretList.R",349,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/caretStack.R",67,18,"style","Put spaces around all infix operators."," object, newdata=NULL,","infix_spaces_linter" -"R/caretStack.R",68,5,"style","Put spaces around all infix operators."," se=FALSE, level=0.95,","infix_spaces_linter" -"R/caretStack.R",68,18,"style","Put spaces around all infix operators."," se=FALSE, level=0.95,","infix_spaces_linter" -"R/caretStack.R",69,17,"style","Put spaces around all infix operators."," return_weights=FALSE,","infix_spaces_linter" -"R/caretStack.R",84,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/caretStack.R",87,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/caretStack.R",110,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/helper_functions.R",61,27,"style","Compound semicolons are discouraged. Replace them by a newline."," w <- w[i <- !is.na(x)]; x <- x[i]","semicolon_linter" -"tests/testthat/test-caretList.R",49,9,"style","Variable and function name style should be snake_case or symbols."," names(tuneList) <- all_models","object_name_linter" -"tests/testthat/test-caretList.R",50,9,"style","Variable and function name style should be snake_case or symbols."," names(tuneList)[c(1, 5, 10)] <- """"","object_name_linter" -"tests/testthat/test-caretList.R",155,9,"style","Variable and function name style should be snake_case or symbols."," class(modelList) <- ""list""","object_name_linter" -"tests/testthat/test-classSelection.R",109,15,"style","Any function spanning multiple lines should use curly braces."," refactor <- function(d) factor(","brace_linter" -"tests/testthat/test-ensemble.R",141,9,"style","Variable and function name style should be snake_case or symbols."," class(nestedList) <- ""caretList""","object_name_linter" -"tests/testthat/test-ensemble.R",149,3,"style","Variable and function name style should be snake_case or symbols."," X_reg_new[2, 3] <- NA","object_name_linter" -"tests/testthat/test-ensemble.R",150,3,"style","Variable and function name style should be snake_case or symbols."," X_reg_new[25, 3] <- NA","object_name_linter" -"tests/testthat/test-ensemble.R",197,3,"style","Variable and function name style should be snake_case or symbols."," custom.rf$method <- ""custom.rf""","object_name_linter" -"tests/testthat/test-ensemble.R",200,3,"style","Variable and function name style should be snake_case or symbols."," custom.rpart$method <- ""custom.rpart""","object_name_linter" -"tests/testthat/test-ensembleMethods.R",20,9,"style","Variable and function name style should be snake_case or symbols."," class(models.subset) <- ""caretList""","object_name_linter" -"tests/testthat/test-ensembleMethods.R",36,9,"style","Variable and function name style should be snake_case or symbols."," class(models.subset) <- ""caretList""","object_name_linter" -"tests/testthat/test-ensembleMethods.R",58,9,"style","Variable and function name style should be snake_case or symbols."," class(models.subset) <- ""caretList""","object_name_linter" -"tests/testthat/test-ensembleMethods.R",93,9,"style","Variable and function name style should be snake_case or symbols."," class(models.subset) <- ""caretList""","object_name_linter" -"tests/testthat/test-ensembleMethods.R",138,9,"style","Variable and function name style should be snake_case or symbols."," class(models.subset) <- ""caretList""","object_name_linter" -"tests/testthat/test-ensembleMethods.R",181,9,"style","Variable and function name style should be snake_case or symbols."," class(models.subset) <- ""caretList""","object_name_linter" -"tests/testthat/test-ensembleMethods.R",203,14,"style","Variable and function name style should be snake_case or symbols."," attributes(mr2.tmp1) <- NULL","object_name_linter" -"tests/testthat/test-ensembleMethods.R",242,9,"style","Variable and function name style should be snake_case or symbols."," class(models.subset) <- ""caretList""","object_name_linter" -"tests/testthat/test-ensembleMethods.R",257,9,"style","Variable and function name style should be snake_case or symbols."," class(models.class2) <- ""caretList""","object_name_linter" -"tests/testthat/test-ensembleMethods.R",260,3,"style","Variable and function name style should be snake_case or symbols."," newDat[2, 2] <- NA","object_name_linter" -"tests/testthat/test-ensembleMethods.R",261,3,"style","Variable and function name style should be snake_case or symbols."," newDat[3, 3] <- NA","object_name_linter" -"tests/testthat/test-ensembleMethods.R",262,3,"style","Variable and function name style should be snake_case or symbols."," newDat[4, 4] <- NA","object_name_linter" -"tests/testthat/test-ensembleMethods.R",289,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"tests/testthat/test-ensembleMethods.R",296,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"tests/testthat/test-ensembleMethods.R",318,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"tests/testthat/test-ensembleMethods.R",325,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"vignettes/caretEnsemble-intro.Rmd",33,1,"style","Variable and function name style should be snake_case or symbols.","inTrain <- createDataPartition(y = Sonar$Class, p = .75, list = FALSE)","object_name_linter" -"vignettes/caretEnsemble-intro.Rmd",34,19,"style","Do not place spaces after square brackets.","training <- Sonar[ inTrain,]","spaces_inside_linter" -"vignettes/caretEnsemble-intro.Rmd",34,28,"style","Commas should always have a space after.","training <- Sonar[ inTrain,]","commas_linter" -"vignettes/caretEnsemble-intro.Rmd",35,27,"style","Commas should always have a space after.","testing <- Sonar[-inTrain,]","commas_linter" -"vignettes/caretEnsemble-intro.Rmd",37,9,"style","Put spaces around all infix operators."," method=""boot"",","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",38,9,"style","Put spaces around all infix operators."," number=25,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",39,18,"style","Put spaces around all infix operators."," savePredictions=""final"",","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",40,13,"style","Put spaces around all infix operators."," classProbs=TRUE,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",41,8,"style","Put spaces around all infix operators."," index=createResample(training$Class, 25),","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",42,18,"style","Put spaces around all infix operators."," summaryFunction=twoClassSummary","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",52,8,"style","Put spaces around all infix operators."," Class~., data=training,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",52,16,"style","Put spaces around all infix operators."," Class~., data=training,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",53,12,"style","Put spaces around all infix operators."," trControl=my_control,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",54,13,"style","Put spaces around all infix operators."," methodList=c(""glm"", ""rpart"")","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",60,47,"style","Put spaces around all infix operators.","p <- as.data.frame(predict(model_list, newdata=head(testing)))","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",78,8,"style","Put spaces around all infix operators."," Class~., data=training,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",78,16,"style","Put spaces around all infix operators."," Class~., data=training,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",79,12,"style","Put spaces around all infix operators."," trControl=my_control,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",80,9,"style","Put spaces around all infix operators."," metric=""ROC"",","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",81,13,"style","Put spaces around all infix operators."," methodList=c(""glm"", ""rpart""),","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",82,11,"style","Put spaces around all infix operators."," tuneList=list(","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",83,8,"style","Put spaces around all infix operators."," rf1=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=2)),","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",83,30,"style","Put spaces around all infix operators."," rf1=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=2)),","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",83,45,"style","Put spaces around all infix operators."," rf1=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=2)),","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",83,62,"style","Put spaces around all infix operators."," rf1=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=2)),","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",84,8,"style","Put spaces around all infix operators."," rf2=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=10), preProcess=""pca""),","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",84,30,"style","Put spaces around all infix operators."," rf2=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=10), preProcess=""pca""),","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",84,45,"style","Put spaces around all infix operators."," rf2=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=10), preProcess=""pca""),","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",84,62,"style","Put spaces around all infix operators."," rf2=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=10), preProcess=""pca""),","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",84,78,"style","Put spaces around all infix operators."," rf2=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=10), preProcess=""pca""),","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",84,81,"style","Lines should not be more than 80 characters."," rf2=caretModelSpec(method=""rf"", tuneGrid=data.frame(.mtry=10), preProcess=""pca""),","line_length_linter" -"vignettes/caretEnsemble-intro.Rmd",85,7,"style","Put spaces around all infix operators."," nn=caretModelSpec(method=""nnet"", tuneLength=2, trace=FALSE)","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",85,29,"style","Put spaces around all infix operators."," nn=caretModelSpec(method=""nnet"", tuneLength=2, trace=FALSE)","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",85,48,"style","Put spaces around all infix operators."," nn=caretModelSpec(method=""nnet"", tuneLength=2, trace=FALSE)","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",85,57,"style","Put spaces around all infix operators."," nn=caretModelSpec(method=""nnet"", tuneLength=2, trace=FALSE)","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",108,14,"style","Trailing whitespace is superfluous."," model_list, ","trailing_whitespace_linter" -"vignettes/caretEnsemble-intro.Rmd",109,9,"style","Put spaces around all infix operators."," metric=""ROC"",","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",110,12,"style","Put spaces around all infix operators."," trControl=trainControl(","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",111,11,"style","Put spaces around all infix operators."," number=2,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",112,20,"style","Put spaces around all infix operators."," summaryFunction=twoClassSummary,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",113,15,"style","Put spaces around all infix operators."," classProbs=TRUE","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",121,51,"style","Put spaces around all infix operators.","model_preds <- lapply(model_list, predict, newdata=testing, type=""prob"")","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",121,65,"style","Put spaces around all infix operators.","model_preds <- lapply(model_list, predict, newdata=testing, type=""prob"")","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",122,51,"style","Commas should always have a space after.","model_preds <- lapply(model_preds, function(x) x[,""M""])","commas_linter" -"vignettes/caretEnsemble-intro.Rmd",124,46,"style","Put spaces around all infix operators.","ens_preds <- predict(greedy_ensemble, newdata=testing, type=""prob"")","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",124,60,"style","Put spaces around all infix operators.","ens_preds <- predict(greedy_ensemble, newdata=testing, type=""prob"")","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",147,9,"style","Put spaces around all infix operators."," method=""glm"",","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",148,9,"style","Put spaces around all infix operators."," metric=""ROC"",","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",149,12,"style","Put spaces around all infix operators."," trControl=trainControl(","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",150,11,"style","Put spaces around all infix operators."," method=""boot"",","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",151,11,"style","Put spaces around all infix operators."," number=10,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",152,20,"style","Put spaces around all infix operators."," savePredictions=""final"",","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",153,15,"style","Put spaces around all infix operators."," classProbs=TRUE,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",154,20,"style","Put spaces around all infix operators."," summaryFunction=twoClassSummary","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",158,55,"style","Put spaces around all infix operators.","model_preds2$ensemble <- predict(glm_ensemble, newdata=testing, type=""prob"")","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",158,69,"style","Put spaces around all infix operators.","model_preds2$ensemble <- predict(glm_ensemble, newdata=testing, type=""prob"")","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",159,1,"style","Variable and function name style should be snake_case or symbols.","CF <- coef(glm_ensemble$ens_model$finalModel)[-1]","object_name_linter" -"vignettes/caretEnsemble-intro.Rmd",161,3,"style","Put spaces around all infix operators.","CF/sum(CF)","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",175,9,"style","Put spaces around all infix operators."," method=""gbm"",","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",176,10,"style","Put spaces around all infix operators."," verbose=FALSE,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",177,13,"style","Put spaces around all infix operators."," tuneLength=10,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",178,9,"style","Put spaces around all infix operators."," metric=""ROC"",","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",179,12,"style","Put spaces around all infix operators."," trControl=trainControl(","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",180,11,"style","Put spaces around all infix operators."," method=""boot"",","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",181,11,"style","Put spaces around all infix operators."," number=10,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",182,20,"style","Put spaces around all infix operators."," savePredictions=""final"",","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",183,15,"style","Put spaces around all infix operators."," classProbs=TRUE,","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",184,20,"style","Put spaces around all infix operators."," summaryFunction=twoClassSummary","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",188,55,"style","Put spaces around all infix operators.","model_preds3$ensemble <- predict(gbm_ensemble, newdata=testing, type=""prob"")","infix_spaces_linter" -"vignettes/caretEnsemble-intro.Rmd",188,69,"style","Put spaces around all infix operators.","model_preds3$ensemble <- predict(gbm_ensemble, newdata=testing, type=""prob"")","infix_spaces_linter" diff --git a/.dev/revdep_emails/caretEnsemble/email-body b/.dev/revdep_emails/caretEnsemble/email-body deleted file mode 100644 index 9ae1f9850..000000000 --- a/.dev/revdep_emails/caretEnsemble/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Zachary A. Deane-Mayer! Thank you for using {lintr} in your package {caretEnsemble}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/zachmayer/caretEnsemble (hash: 87ad142a8cc0b106fdd0d0ca61cbc3e8a200ab3b) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 28s on CRAN vs. 15s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/cattonum/attachments/cattonum.warnings b/.dev/revdep_emails/cattonum/attachments/cattonum.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/cattonum/attachments/cattonum.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/cattonum/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/cattonum/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 2625ea5b8..000000000 --- a/.dev/revdep_emails/cattonum/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,2 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/cattonum.R",18,1,"style","Variable and function name style should be snake_case.",".onAttach <- function(libname, pkgname) {","object_name_linter" diff --git a/.dev/revdep_emails/cattonum/email-body b/.dev/revdep_emails/cattonum/email-body deleted file mode 100644 index 296f007c5..000000000 --- a/.dev/revdep_emails/cattonum/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Bernie Gray! Thank you for using {lintr} in your package {cattonum}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/bfgray3/cattonum (hash: d78393e245012aa0dc1187f1c8af6c04361f7505) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 12s on CRAN vs. 7s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/cleaR/attachments/cleaR.warnings b/.dev/revdep_emails/cleaR/attachments/cleaR.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/cleaR/attachments/cleaR.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/cleaR/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/cleaR/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 6d25f7316..000000000 --- a/.dev/revdep_emails/cleaR/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,29 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"data-raw/devstuffs.R",57,2,"style","Commented code should be removed.","#usethis::use_gpl3_license(name = ""UniversitΓ€tsklinikum Erlangen"")","commented_code_linter" -"data-raw/devstuffs.R",61,81,"style","Lines should not be more than 80 characters.","# Listing a package in either Depends or Imports ensures that it’s installed when needed","line_length_linter" -"data-raw/devstuffs.R",63,81,"style","Lines should not be more than 80 characters.","# Loading will load code, data and any DLLs; register S3 and S4 methods; and run the .onLoad() function.","line_length_linter" -"data-raw/devstuffs.R",64,81,"style","Lines should not be more than 80 characters.","## After loading, the package is available in memory, but because it’s not in the search path,","line_length_linter" -"data-raw/devstuffs.R",66,81,"style","Lines should not be more than 80 characters.","## Confusingly, :: will also load a package automatically if it isn’t already loaded.","line_length_linter" -"data-raw/devstuffs.R",67,81,"style","Lines should not be more than 80 characters.","## It’s rare to load a package explicitly, but you can do so with requireNamespace() or loadNamespace().","line_length_linter" -"data-raw/devstuffs.R",68,81,"style","Lines should not be more than 80 characters.","# Attaching puts the package in the search path. You can’t attach a package without first loading it,","line_length_linter" -"data-raw/devstuffs.R",78,3,"style","Commented code should be removed.","# usethis::use_package(""config"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",79,3,"style","Commented code should be removed.","# usethis::use_package(""magrittr"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",80,3,"style","Commented code should be removed.","# usethis::use_package(""data.table"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",82,3,"style","Commented code should be removed.","# usethis::use_package(""Hmisc"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",84,3,"style","Commented code should be removed.","# usethis::use_package(""parsedate"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",86,3,"style","Commented code should be removed.","# usethis::use_package(""psych"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",88,3,"style","Commented code should be removed.","# usethis::use_package(""RJSONIO"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",89,3,"style","Commented code should be removed.","# usethis::use_package(""shiny"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",90,3,"style","Commented code should be removed.","# usethis::use_package(""shinyjs"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",92,3,"style","Commented code should be removed.","# usethis::use_package(""xml2"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",94,3,"style","Commented code should be removed.","# usethis::use_package(""logger"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",100,3,"style","Commented code should be removed.","# usethis::use_package(""shiny"", type = ""Suggests"")","commented_code_linter" -"data-raw/devstuffs.R",101,3,"style","Commented code should be removed.","# usethis::use_package(""shinyjs"", type = ""Suggests"")","commented_code_linter" -"data-raw/devstuffs.R",112,81,"style","Lines should not be more than 80 characters.","usethis::use_build_ignore(""## Please apply changes in `./data-raw/devstuffs.R`!"")","line_length_linter" -"data-raw/devstuffs.R",170,3,"style","Commented code should be removed.","# covr::package_coverage()","commented_code_linter" -"data-raw/devstuffs.R",173,3,"style","Commented code should be removed.","# lintr::lint_package()","commented_code_linter" -"data-raw/devstuffs.R",176,3,"style","Commented code should be removed.","# devtools::test()","commented_code_linter" -"data-raw/devstuffs.R",179,3,"style","Commented code should be removed.","# rcmdcheck::rcmdcheck()","commented_code_linter" -"data-raw/devstuffs.R",180,3,"style","Commented code should be removed.","# rcmdcheck::rcmdcheck(args = ""--no-vignettes"", build_args = ""--no-build-vignettes"")","commented_code_linter" -"data-raw/devstuffs.R",180,81,"style","Lines should not be more than 80 characters.","# rcmdcheck::rcmdcheck(args = ""--no-vignettes"", build_args = ""--no-build-vignettes"")","line_length_linter" -"data-raw/devstuffs.R",188,3,"style","Commented code should be removed.","# build|ci|docs|feat|fix|perf|refactor|test","commented_code_linter" diff --git a/.dev/revdep_emails/cleaR/email-body b/.dev/revdep_emails/cleaR/email-body deleted file mode 100644 index f0cee85c8..000000000 --- a/.dev/revdep_emails/cleaR/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Jonathan M. Mang! Thank you for using {lintr} in your package {cleaR}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/joundso/cleaR (hash: ead74bff86cde29573ee30958bebb26fc4ad373b) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 1s on CRAN vs. 1s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/cloudos/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/cloudos/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 69f2dd16c..000000000 --- a/.dev/revdep_emails/cloudos/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,19 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/cb_cohort_extract.R",124,36,"style","Variable and function name style should be snake_case."," req_body$criteria$pagination$pageNumber <- i","object_name_linter" -"R/cb_cohort_extract.R",125,36,"style","Variable and function name style should be snake_case."," req_body$criteria$pagination$pageSize <- page_size","object_name_linter" -"R/cb_cohort_extract.R",224,33,"style","There should be a space between right parenthesis and an opening curly brace."," for (col in res$header$columns){","paren_brace_linter" -"R/cb_cohort_extract.R",301,25,"style","There should be a space between right parenthesis and an opening curly brace."," for (col in res$header){","paren_brace_linter" -"R/cb_cohort_extract.R",349,35,"style","There should be a space between right parenthesis and an opening curly brace."," for (colname in colnames(res_df)){","paren_brace_linter" -"R/cb_cohort_extract.R",426,25,"style","There should be a space between right parenthesis and an opening curly brace."," for (col in res$header){","paren_brace_linter" -"R/cb_cohort_extract.R",474,27,"style","There should be a space between right parenthesis and an opening curly brace."," for (group in datagroups){","paren_brace_linter" -"R/cb_cohort_extract.R",476,33,"style","There should be a space between right parenthesis and an opening curly brace."," for (colname in colnames(df)){","paren_brace_linter" -"R/cb_cohort_extract.R",485,37,"style","There should be a space between right parenthesis and an opening curly brace."," for (colname in colnames(final_df)){","paren_brace_linter" -"R/cb_cohorts_list.R",85,11,"style","Variable and function name style should be snake_case."," cohorts$numberOfFilters <- sapply(cohorts$phenotypeFilters, nrow)","object_name_linter" -"R/cb_filter_apply.R",10,26,"style","There should be a space between right parenthesis and an opening curly brace."," for (filter in unnested){","paren_brace_linter" -"R/cb_filter_explore.R",117,25,"style","Variable and function name style should be snake_case."," req_body$criteria$pageNumber <- i","object_name_linter" -"R/cb_filter_explore.R",118,25,"style","Variable and function name style should be snake_case."," req_body$criteria$pageSize <- page_size","object_name_linter" -"R/cb_filter_explore.R",195,1,"style","Variable and function names should not be longer than 30 characters.",".cb_get_phenotype_statistics_v1 <- function(cohort, pheno_id) {","object_length_linter" -"R/cb_filter_explore.R",199,45,"style","There should be a space between right parenthesis and an opening curly brace."," for (filter in .unnest_query(cohort@query)){","paren_brace_linter" -"R/cb_json.R",42,26,"style","There should be a space between right parenthesis and an opening curly brace."," for (filter in unnested){","paren_brace_linter" -"R/zzz.R",1,1,"style","Variable and function name style should be snake_case.",".onLoad <- function(libname, pkgname, ...) {","object_name_linter" -"R/zzz.R",5,1,"style","Variable and function name style should be snake_case.",".onAttach <- function(libname, pkgname, ...) {","object_name_linter" diff --git a/.dev/revdep_emails/cloudos/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/cloudos/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 83b188f3a..000000000 --- a/.dev/revdep_emails/cloudos/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,25 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/cb_class.R",84,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/cb_cohort_extract.R",109,67,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(req_body, auto_unbox = T),","T_and_F_symbol_linter" -"R/cb_cohort_extract.R",129,71,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(req_body, auto_unbox = T),","T_and_F_symbol_linter" -"R/cb_cohort_extract.R",197,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/cb_cohort_extract.R",213,35,"style","Use TRUE instead of the symbol T."," auto_unbox = T),","T_and_F_symbol_linter" -"R/cb_cohorts_list.R",39,48,"style","Use TRUE instead of the symbol T."," res <- httr::content(r, simplifyDataFrame = T)","T_and_F_symbol_linter" -"R/cb_filter_apply.R",59,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," starting_depth > 1 &","vector_logic_linter" -"R/cb_filter_apply.R",77,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (keep_query & !identical(cohort@query, list())) {","vector_logic_linter" -"R/cb_filter_apply.R",81,3,"style","`else` should come on the same line as the previous `}`."," else if (keep_query) {","brace_linter" -"R/cb_filter_apply.R",96,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !is.null(x$operator) &","vector_logic_linter" -"R/cb_filter_apply.R",171,64,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(r_body, auto_unbox = T),","T_and_F_symbol_linter" -"R/cb_filter_apply.R",192,80,"style","Use FALSE instead of the symbol F."," no_participants <- cb_participant_count(cohort, query = query, keep_query = F)","T_and_F_symbol_linter" -"R/cb_filter_apply.R",212,64,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(r_body, auto_unbox = T),","T_and_F_symbol_linter" -"R/cb_filter_explore.R",95,67,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(req_body, auto_unbox = T),","T_and_F_symbol_linter" -"R/cb_filter_explore.R",114,16,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (iter_all & paged) {","vector_logic_linter" -"R/cb_filter_explore.R",122,71,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(req_body, auto_unbox = T),","T_and_F_symbol_linter" -"R/cb_filter_explore.R",149,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(item$children) > 0 & depth < max_depth) {","vector_logic_linter" -"R/cb_filter_explore.R",224,65,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(r_body, auto_unbox = T),","T_and_F_symbol_linter" -"R/cb_filter_explore.R",328,65,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(r_body, auto_unbox = T),","T_and_F_symbol_linter" -"R/cb_filter_explore.R",346,67,"style","Use TRUE instead of the symbol T."," r_body <- jsonlite::toJSON(list(query = query), auto_unbox = T)","T_and_F_symbol_linter" -"R/cb_plots.R",118,12,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/cb_set_columns.R",77,64,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(r_body, auto_unbox = T),","T_and_F_symbol_linter" -"R/cb_set_columns.R",112,64,"style","Use TRUE instead of the symbol T."," body = jsonlite::toJSON(r_body, auto_unbox = T),","T_and_F_symbol_linter" -"tests/testthat/helper.R",6,5,"style","Missing terminal newline.","# })","trailing_blank_lines_linter" diff --git a/.dev/revdep_emails/cloudos/email-body b/.dev/revdep_emails/cloudos/email-body deleted file mode 100644 index 0314708f1..000000000 --- a/.dev/revdep_emails/cloudos/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Sangram Keshari Sahu! Thank you for using {lintr} in your package {cloudos}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/lifebit-ai/cloudos (hash: 01e4e5debc79b13ee3c31a8149e11abc3d41b253) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 18s on CRAN vs. 11s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/cmstatr/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/cmstatr/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 1e382d0ab..000000000 --- a/.dev/revdep_emails/cmstatr/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,97 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/adk.R",179,15,"warning","no visible binding for global variable β€˜alpha’"," alpha = alpha,","object_usage_linter" -"R/adk.R",180,11,"warning","no visible binding for global variable β€˜n’"," n = n,","object_usage_linter" -"R/adk.R",181,11,"warning","no visible binding for global variable β€˜k’"," k = k,","object_usage_linter" -"R/adk.R",183,12,"warning","no visible binding for global variable β€˜ad’"," ad = ad,","object_usage_linter" -"R/adk.R",184,11,"warning","no visible binding for global variable β€˜p’"," p = p,","object_usage_linter" -"R/adk.R",185,26,"warning","no visible binding for global variable β€˜reject_same_dist’"," reject_same_dist = reject_same_dist","object_usage_linter" -"R/adtest.R",198,11,"warning","no visible binding for global variable β€˜n’"," n = n,","object_usage_linter" -"R/adtest.R",200,13,"warning","no visible binding for global variable β€˜osl’"," osl = osl,","object_usage_linter" -"R/adtest.R",201,15,"warning","no visible binding for global variable β€˜alpha’"," alpha = alpha,","object_usage_linter" -"R/adtest.R",202,29,"warning","no visible binding for global variable β€˜reject_distribution’"," reject_distribution = reject_distribution","object_usage_linter" -"R/basis.R",489,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(groups) & !all(is.na(groups))) {","vector_logic_linter" -"R/basis.R",595,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(vec) & length(vec) > 0) {","vector_logic_linter" -"R/basis.R",614,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(x$r) & !all(is.na(x$r))) {","vector_logic_linter" -"R/basis.R",632,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (x$conf == 0.95 & x$p == 0.9) {","vector_logic_linter" -"R/basis.R",635,3,"style","`else` should come on the same line as the previous `}`."," else if (x$conf == 0.95 & x$p == 0.99) {","brace_linter" -"R/basis.R",635,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," else if (x$conf == 0.95 & x$p == 0.99) {","vector_logic_linter" -"R/basis.R",638,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/basis.R",1267,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (p == 0.90 & conf == 0.95) {","vector_logic_linter" -"R/basis.R",1272,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (p == 0.99 & conf == 0.95) {","vector_logic_linter" -"R/basis.R",1283,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (p == 0.90 & conf == 0.95) {","vector_logic_linter" -"R/basis.R",1288,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (p == 0.99 & conf == 0.95) {","vector_logic_linter" -"R/basis.R",1481,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (p == 0.90 & conf == 0.95) {","vector_logic_linter" -"R/basis.R",1486,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (p == 0.99 & conf == 0.95) {","vector_logic_linter" -"R/equiv.R",693,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (alpha <= 0 | alpha >= 1) {","vector_logic_linter" -"R/equiv.R",890,15,"warning","no visible binding for global variable β€˜alpha’"," alpha = alpha,","object_usage_linter" -"R/equiv.R",891,18,"warning","no visible binding for global variable β€˜n_sample’"," n_sample = n_sample,","object_usage_linter" -"R/equiv.R",892,21,"warning","no visible binding for global variable β€˜mean_sample’"," mean_sample = mean_sample,","object_usage_linter" -"R/equiv.R",893,19,"warning","no visible binding for global variable β€˜sd_sample’"," sd_sample = sd_sample,","object_usage_linter" -"R/equiv.R",894,16,"warning","no visible binding for global variable β€˜n_qual’"," n_qual = n_qual,","object_usage_linter" -"R/equiv.R",895,19,"warning","no visible binding for global variable β€˜mean_qual’"," mean_qual = mean_qual,","object_usage_linter" -"R/equiv.R",896,17,"warning","no visible binding for global variable β€˜sd_qual’"," sd_qual = sd_qual,","object_usage_linter" -"R/equiv.R",897,15,"warning","no visible binding for global variable β€˜modcv’"," modcv = modcv,","object_usage_linter" -"R/equiv.R",898,12,"warning","no visible binding for global variable β€˜sp’"," sp = sp,","object_usage_linter" -"R/equiv.R",899,12,"warning","no visible binding for global variable β€˜t0’"," t0 = t0,","object_usage_linter" -"R/equiv.R",900,15,"warning","no visible binding for global variable β€˜t_req’"," t_req = t_req,","object_usage_linter" -"R/equiv.R",901,23,"warning","no visible binding for global variable β€˜threshold’"," threshold_min = threshold[1],","object_usage_linter" -"R/equiv.R",901,23,"warning","no visible binding for global variable β€˜threshold’"," threshold_min = threshold[1],","object_usage_linter" -"R/equiv.R",903,16,"warning","no visible binding for global variable β€˜result’"," result = result","object_usage_linter" -"R/levene.R",192,15,"warning","no visible binding for global variable β€˜alpha’"," alpha = alpha,","object_usage_linter" -"R/levene.R",193,15,"warning","no visible binding for global variable β€˜modcv’"," modcv = modcv,","object_usage_linter" -"R/levene.R",194,11,"warning","no visible binding for global variable β€˜n’"," n = n,","object_usage_linter" -"R/levene.R",195,11,"warning","no visible binding for global variable β€˜k’"," k = k,","object_usage_linter" -"R/levene.R",196,11,"warning","no visible binding for global variable β€˜f’"," f = f,","object_usage_linter" -"R/levene.R",197,11,"warning","no visible binding for global variable β€˜p’"," p = p,","object_usage_linter" -"R/levene.R",198,31,"warning","no visible binding for global variable β€˜reject_equal_variance’"," reject_equal_variance = reject_equal_variance","object_usage_linter" -"R/mnr.R",197,13,"warning","no visible binding for global variable β€˜mnr’"," mnr = mnr,","object_usage_linter" -"R/mnr.R",198,15,"warning","no visible binding for global variable β€˜alpha’"," alpha = alpha,","object_usage_linter" -"R/mnr.R",199,14,"warning","no visible binding for global variable β€˜crit’"," crit = crit,","object_usage_linter" -"R/mnr.R",200,20,"warning","no visible binding for global variable β€˜n_outliers’"," n_outliers = n_outliers","object_usage_linter" -"R/plot-nested.R",92,5,"warning","local variable β€˜y_obj’ assigned but may not be used"," y_obj <-","object_usage_linter" -"R/plot-nested.R",247,55,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(levels(as.factor(extras[[name]]))) > 1 & must_be_equal) {","vector_logic_linter" -"vignettes/cmstatr_Graphing.Rmd",23,42,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," requireNamespace(pkg, quietly = TRUE)}","brace_linter" -"vignettes/cmstatr_Tutorial.Rmd",22,42,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," requireNamespace(pkg, quietly = TRUE)}","brace_linter" -"vignettes/cmstatr_Tutorial.Rmd",171,30,"style","Trailing whitespace is superfluous."," basis_normal(strength.norm, ","trailing_whitespace_linter" -"vignettes/cmstatr_Validation.Rmd",512,81,"style","Lines should not be more than 80 characters."," 1, 79.04517, ""CTD"", 1, 103.2006, ""RTD"", 1, 63.22764, ""ETW"", 1, 54.09806, ""ETW2"",","line_length_linter" -"vignettes/cmstatr_Validation.Rmd",513,81,"style","Lines should not be more than 80 characters."," 1, 102.6014, ""CTD"", 1, 105.1034, ""RTD"", 1, 70.84454, ""ETW"", 1, 58.87615, ""ETW2"",","line_length_linter" -"vignettes/cmstatr_Validation.Rmd",514,81,"style","Lines should not be more than 80 characters."," 1, 97.79372, ""CTD"", 1, 105.1893, ""RTD"", 1, 66.43223, ""ETW"", 1, 61.60167, ""ETW2"",","line_length_linter" -"vignettes/cmstatr_Validation.Rmd",515,81,"style","Lines should not be more than 80 characters."," 1, 92.86423, ""CTD"", 1, 100.4189, ""RTD"", 1, 75.37771, ""ETW"", 1, 60.23973, ""ETW2"",","line_length_linter" -"vignettes/cmstatr_Validation.Rmd",516,81,"style","Lines should not be more than 80 characters."," 1, 117.218, ""CTD"", 2, 85.32319, ""RTD"", 1, 72.43773, ""ETW"", 1, 61.4808, ""ETW2"",","line_length_linter" -"vignettes/cmstatr_Validation.Rmd",517,81,"style","Lines should not be more than 80 characters."," 1, 108.7168, ""CTD"", 2, 92.69923, ""RTD"", 1, 68.43073, ""ETW"", 1, 64.55832, ""ETW2"",","line_length_linter" -"vignettes/cmstatr_Validation.Rmd",518,81,"style","Lines should not be more than 80 characters."," 1, 112.2773, ""CTD"", 2, 98.45242, ""RTD"", 1, 69.72524, ""ETW"", 2, 57.76131, ""ETW2"",","line_length_linter" -"vignettes/cmstatr_Validation.Rmd",519,81,"style","Lines should not be more than 80 characters."," 1, 114.0129, ""CTD"", 2, 104.1014, ""RTD"", 2, 66.20343, ""ETW"", 2, 49.91463, ""ETW2"",","line_length_linter" -"vignettes/cmstatr_Validation.Rmd",520,81,"style","Lines should not be more than 80 characters."," 2, 106.8452, ""CTD"", 2, 91.51841, ""RTD"", 2, 60.51251, ""ETW"", 2, 61.49271, ""ETW2"",","line_length_linter" -"vignettes/cmstatr_Validation.Rmd",521,81,"style","Lines should not be more than 80 characters."," 2, 112.3911, ""CTD"", 2, 101.3746, ""RTD"", 2, 65.69334, ""ETW"", 2, 57.7281, ""ETW2"",","line_length_linter" -"vignettes/cmstatr_Validation.Rmd",522,81,"style","Lines should not be more than 80 characters."," 2, 115.5658, ""CTD"", 2, 101.5828, ""RTD"", 2, 62.73595, ""ETW"", 2, 62.11653, ""ETW2"",","line_length_linter" -"vignettes/cmstatr_Validation.Rmd",523,81,"style","Lines should not be more than 80 characters."," 2, 87.40657, ""CTD"", 2, 99.57384, ""RTD"", 2, 59.00798, ""ETW"", 2, 62.69353, ""ETW2"",","line_length_linter" -"vignettes/cmstatr_Validation.Rmd",524,81,"style","Lines should not be more than 80 characters."," 2, 102.2785, ""CTD"", 2, 88.84826, ""RTD"", 2, 62.37761, ""ETW"", 3, 61.38523, ""ETW2"",","line_length_linter" -"vignettes/cmstatr_Validation.Rmd",525,81,"style","Lines should not be more than 80 characters."," 2, 110.6073, ""CTD"", 3, 92.18703, ""RTD"", 3, 64.3947, ""ETW"", 3, 60.39053, ""ETW2"",","line_length_linter" -"vignettes/cmstatr_Validation.Rmd",526,81,"style","Lines should not be more than 80 characters."," 3, 105.2762, ""CTD"", 3, 101.8234, ""RTD"", 3, 72.8491, ""ETW"", 3, 59.17616, ""ETW2"",","line_length_linter" -"vignettes/cmstatr_Validation.Rmd",527,81,"style","Lines should not be more than 80 characters."," 3, 110.8924, ""CTD"", 3, 97.68909, ""RTD"", 3, 66.56226, ""ETW"", 3, 60.17616, ""ETW2"",","line_length_linter" -"vignettes/cmstatr_Validation.Rmd",528,81,"style","Lines should not be more than 80 characters."," 3, 108.7638, ""CTD"", 3, 101.5172, ""RTD"", 3, 66.56779, ""ETW"", 3, 46.47396, ""ETW2"",","line_length_linter" -"vignettes/cmstatr_Validation.Rmd",529,81,"style","Lines should not be more than 80 characters."," 3, 110.9833, ""CTD"", 3, 100.0481, ""RTD"", 3, 66.00123, ""ETW"", 3, 51.16616, ""ETW2"",","line_length_linter" -"vignettes/cmstatr_Validation.Rmd",1195,65,"style","Trailing whitespace is superfluous."," mutate(diff = expect_equal(z, z_calc, tolerance = 0.0001)) %>% ","trailing_whitespace_linter" -"vignettes/cmstatr_Validation.Rmd",1243,56,"style","Trailing whitespace is superfluous."," mutate(diff = expect_lt(abs(k - z_calc), 0.0001)) %>% ","trailing_whitespace_linter" -"vignettes/cmstatr_Validation.Rmd",1287,6,"style","Trailing whitespace is superfluous.",") %>% ","trailing_whitespace_linter" -"vignettes/cmstatr_Validation.Rmd",1372,55,"style","Trailing whitespace is superfluous."," filter(n >= 5 & (alpha == 0.01 | alpha == 0.05)) %>% ","trailing_whitespace_linter" -"vignettes/cmstatr_Validation.Rmd",1378,24,"style","Trailing whitespace is superfluous."," select(-c(equiv)) %>% ","trailing_whitespace_linter" -"vignettes/cmstatr_Validation.Rmd",1379,47,"style","Trailing whitespace is superfluous."," unnest(cols = c(data, k1_calc, k2_calc)) %>% ","trailing_whitespace_linter" -"vignettes/cmstatr_Validation.Rmd",1381,24,"style","Trailing whitespace is superfluous."," select(-c(check)) %>% ","trailing_whitespace_linter" -"vignettes/hk_ext.R",1,81,"style","Lines should not be more than 80 characters.","## ----setup, include = FALSE-------------------------------------------------------------------------------------------","line_length_linter" -"vignettes/hk_ext.R",9,81,"style","Lines should not be more than 80 characters.","## ----message=FALSE, warning=FALSE-------------------------------------------------------------------------------------","line_length_linter" -"vignettes/hk_ext.R",16,81,"style","Lines should not be more than 80 characters.","## ---------------------------------------------------------------------------------------------------------------------","line_length_linter" -"vignettes/hk_ext.R",49,81,"style","Lines should not be more than 80 characters.","## ----include=FALSE----------------------------------------------------------------------------------------------------","line_length_linter" -"vignettes/hk_ext.R",56,81,"style","Lines should not be more than 80 characters.","## ----include=FALSE----------------------------------------------------------------------------------------------------","line_length_linter" -"vignettes/hk_ext.R",65,81,"style","Lines should not be more than 80 characters.","## ---------------------------------------------------------------------------------------------------------------------","line_length_linter" -"vignettes/hk_ext.R",70,81,"style","Lines should not be more than 80 characters.","## ---------------------------------------------------------------------------------------------------------------------","line_length_linter" -"vignettes/hk_ext.R",76,81,"style","Lines should not be more than 80 characters.","## ---------------------------------------------------------------------------------------------------------------------","line_length_linter" -"vignettes/hk_ext.R",104,81,"style","Lines should not be more than 80 characters.","## ----distribution-normal, fig.width=7, fig.height=5-------------------------------------------------------------------","line_length_linter" -"vignettes/hk_ext.R",114,81,"style","Lines should not be more than 80 characters.","## ---------------------------------------------------------------------------------------------------------------------","line_length_linter" -"vignettes/hk_ext.R",119,81,"style","Lines should not be more than 80 characters.","## ---------------------------------------------------------------------------------------------------------------------","line_length_linter" -"vignettes/hk_ext.R",132,81,"style","Lines should not be more than 80 characters.","## ---------------------------------------------------------------------------------------------------------------------","line_length_linter" -"vignettes/hk_ext.R",156,81,"style","Lines should not be more than 80 characters.","## ----distribution-Weibull, fig.width=7, fig.height=5------------------------------------------------------------------","line_length_linter" -"vignettes/hk_ext.R",166,81,"style","Lines should not be more than 80 characters.","## ---------------------------------------------------------------------------------------------------------------------","line_length_linter" -"vignettes/hk_ext.R",171,81,"style","Lines should not be more than 80 characters.","## ---------------------------------------------------------------------------------------------------------------------","line_length_linter" -"vignettes/hk_ext.R",184,81,"style","Lines should not be more than 80 characters.","## ---------------------------------------------------------------------------------------------------------------------","line_length_linter" -"vignettes/hk_ext.R",186,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" diff --git a/.dev/revdep_emails/cmstatr/email-body b/.dev/revdep_emails/cmstatr/email-body deleted file mode 100644 index 1550aa19d..000000000 --- a/.dev/revdep_emails/cmstatr/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Stefan Kloppenborg! Thank you for using {lintr} in your package {cmstatr}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cmstatr/cmstatr (hash: 682bdd0f0843876e43f8d6fe9ae9f94fee43aac8) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 67s on CRAN vs. 43s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/connectwidgets/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/connectwidgets/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index f739c78e0..000000000 --- a/.dev/revdep_emails/connectwidgets/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,9 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/rmarkdown/templates/connectwidgets/skeleton/skeleton.Rmd",14,5,"style","Commented code should be removed."," # api_key = Sys.getenv(""CONNECT_API_KEY"")","commented_code_linter" -"R/connect.R",46,56,"style","Use TRUE instead of the symbol T."," jsonlite::fromJSON(results, simplifyDataFrame = T)","T_and_F_symbol_linter" -"R/theme.R",274,47,"style","Trailing semicolons are not needed."," page_btns_style[""background""] <- ""#5A5B5A"";","semicolon_linter" -"tests/testthat/setup.R",11,3,"warning","no visible global function definition for β€˜stub_request’"," stub_request(""get"", ""https://example.com/__api__/server_settings"") %>%","object_usage_linter" -"tests/testthat/setup.R",12,5,"warning","no visible global function definition for β€˜to_return’"," to_return(","object_usage_linter" -"tests/testthat/setup.R",31,3,"warning","no visible global function definition for β€˜stub_request’"," stub_request(","object_usage_linter" -"tests/testthat/setup.R",34,9,"warning","no visible global function definition for β€˜to_return’"," ) %>% to_return(","object_usage_linter" -"vignettes/using-crosstalk.Rmd",80,81,"style","Lines should not be more than 80 characters."," rsc_grid(crosstalk::SharedData$new(..2, key = ~ guid, group = ""xfilter""))","line_length_linter" diff --git a/.dev/revdep_emails/connectwidgets/email-body b/.dev/revdep_emails/connectwidgets/email-body deleted file mode 100644 index 73269c99a..000000000 --- a/.dev/revdep_emails/connectwidgets/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Brian Smith! Thank you for using {lintr} in your package {connectwidgets}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/rstudio/connectwidgets (hash: c3e51a9fac7ef355237eba2daabbe3cecaec4dda) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 17s on CRAN vs. 8s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/crunch/attachments/crunch.warnings b/.dev/revdep_emails/crunch/attachments/crunch.warnings deleted file mode 100644 index 7c377045e..000000000 --- a/.dev/revdep_emails/crunch/attachments/crunch.warnings +++ /dev/null @@ -1,2 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Trying to remove β€˜closed_curly_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/crunch/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/crunch/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 6b5a8ff9a..000000000 --- a/.dev/revdep_emails/crunch/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,2 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"tests/testthat/test-misc.R",203,9,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" diff --git a/.dev/revdep_emails/crunch/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/crunch/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index fbb66262f..000000000 --- a/.dev/revdep_emails/crunch/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,765 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"data-raw/SO-survey.R",1,101,"style","Lines should not be more than 100 characters.","stack_df <- read.csv(""data-raw/survey_results_public.csv"") ## This file is big and not checked into git","line_length_linter" -"R/case-variables.R",98,29,"style","Any function spanning multiple lines should use curly braces."," cases <- mapply(function(e, n) list(","brace_linter" -"R/case-variables.R",248,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(case$id) & !is.whole(case$id)) {","vector_logic_linter" -"R/case-variables.R",264,38,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(case$numeric_value) & !is.numeric(case$numeric_value)) {","vector_logic_linter" -"R/case-variables.R",267,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.logical(case$missing) | is.na(case$missing)) {","vector_logic_linter" -"R/categories.R",157,5,"warning","local variable β€˜out’ assigned but may not be used"," out <- handleMissingCategoryLookup(ix, value, strict = TRUE)","object_usage_linter" -"R/categories.R",321,9,"warning","local variable β€˜ent’ assigned but may not be used"," ent <- setEntitySlot(entity(x), ""categories"", value)","object_usage_linter" -"R/categories.R",331,9,"warning","local variable β€˜ent’ assigned but may not be used"," ent <- setEntitySlot(entity(x), ""categories"", value)","object_usage_linter" -"R/change-category-id.R",32,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(is.numeric(from) & length(from) == 1)) {","vector_logic_linter" -"R/change-category-id.R",36,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(is.numeric(to) & length(to) == 1)) {","vector_logic_linter" -"R/combine-categories.R",52,41,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (is.Categorical(variable) | is.CategoricalArray(variable)) {","vector_logic_linter" -"R/combine-categories.R",66,36,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(is.Categorical(variable) | is.CategoricalArray(variable) | is.Expr(variable))) {","vector_logic_linter" -"R/combine-categories.R",66,68,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(is.Categorical(variable) | is.CategoricalArray(variable) | is.Expr(variable))) {","vector_logic_linter" -"R/combine-categories.R",102,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(is.MR(variable) | is.Expr(variable))) {","vector_logic_linter" -"R/conditional-transform.R",99,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (type != ""categorical"" & !is.null(categories)) {","vector_logic_linter" -"R/crunch-data-frame.R",101,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(out) == 1 & drop) {","vector_logic_linter" -"R/crunch-data-frame.R",160,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (is.numeric(j) | is.logical(j)) {","vector_logic_linter" -"R/crunch-data-frame.R",248,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(value) & missing(row_inds)) {","vector_logic_linter" -"R/crunch-data-frame.R",257,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(value) == 1 & length(row_inds) > 1) {","vector_logic_linter" -"R/cube-residuals.R",142,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((dim == ""cols"" & startsWith(dim_types[2], ""mr_"")) |","vector_logic_linter" -"R/cube-residuals.R",142,59,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((dim == ""cols"" & startsWith(dim_types[2], ""mr_"")) |","vector_logic_linter" -"R/cube-residuals.R",143,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," (dim == ""rows"" & startsWith(dim_types[1], ""mr_""))) {","vector_logic_linter" -"R/cube-residuals.R",292,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(dim(values)) & identical(dim(values), as.integer(c(nrow, ncol)))) {","vector_logic_linter" -"R/expressions.R",674,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(category_order) | is.numeric(category_order)) {","vector_logic_linter" -"R/fill-variable.R",36,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(dots) == 0 & missing(fills)) {","vector_logic_linter" -"R/fill-variable.R",39,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(dots) > 0 & !missing(fills)) {","vector_logic_linter" -"R/filters.R",45,13,"warning","local variable β€˜f’ assigned but may not be used"," f <- .newFilter(i, value, catalog_url = self(x))","object_usage_linter" -"R/folders.R",57,5,"warning","local variable β€˜fns’ assigned but may not be used"," fns <- list(","object_usage_linter" -"R/folders.R",323,5,"warning","local variable β€˜out’ assigned but may not be used"," out <- lapply(seq_along(folder), function(i) {","object_usage_linter" -"R/folders.R",379,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.dataset(source) | !is.dataset(target)) {","vector_logic_linter" -"R/formula.R",247,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (is.CA(x) | is.NumericArray(x)) {","vector_logic_linter" -"R/geo.R",61,9,"warning","local variable β€˜ent’ assigned but may not be used"," ent <- setEntitySlot(entity(x), ""view"", geodata)","object_usage_linter" -"R/geo.R",135,61,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(unique(match_scores$geodatum_name)) == 1 &","vector_logic_linter" -"R/hide-variables.R",140,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" -"R/insertions.R",110,50,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.character(anchor) && (anchor == ""top"" | anchor == ""bottom"")) {","vector_logic_linter" -"R/make-array.R",221,35,"style","Any function spanning multiple lines should use curly braces."," subvarderivs <- lapply(items, function(x) createSubvarDeriv(","brace_linter" -"R/make-array.R",339,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.list(x) & !is.VarDef(x)) {","vector_logic_linter" -"R/merge-crunch-data-frame.R",120,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.data.frame(data) & all(!class(data) %in% ""CrunchDataFrame"")) {","vector_logic_linter" -"R/multitables.R",38,13,"warning","local variable β€˜f’ assigned but may not be used"," f <- newMultitable(","object_usage_linter" -"R/ordering.R",131,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.dataset(source) | !is.dataset(target)) {","vector_logic_linter" -"R/ordering.R",179,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(group) == 1 & is.character(group)) {","vector_logic_linter" -"R/project-folder.R",49,13,"warning","local variable β€˜proj’ assigned but may not be used"," proj <- do.call(","object_usage_linter" -"R/shoji-order.R",54,13,"style","Any function spanning multiple lines should use curly braces."," function(a) do.call(","brace_linter" -"R/show.R",70,19,"style","Any function spanning multiple lines should use curly braces.","showInsertions <- function(x) do.call(","brace_linter" -"R/show.R",702,9,"warning","local variable β€˜along’ assigned but may not be used"," along <- ifelse(num_unique_dims == 3, 2, num_unique_dims)","object_usage_linter" -"R/subtotals-and-headings.R",268,5,"warning","local variable β€˜ent’ assigned but may not be used"," ent <- setEntitySlot(entity(x), ""view"", bd)","object_usage_linter" -"R/subtotals-and-headings.R",284,9,"warning","local variable β€˜ent’ assigned but may not be used"," ent <- setEntitySlot(entity(x), ""view"", bd)","object_usage_linter" -"R/subtotals-and-headings.R",453,36,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (is.na(func(insert)) & !is.na(anchor(insert))) {","vector_logic_linter" -"R/subtotals-and-headings.R",730,5,"warning","local variable β€˜ent’ assigned but may not be used"," ent <- setEntitySlot(entity(x), ""view"", bd)","object_usage_linter" -"R/subtotals-and-headings.R",746,9,"warning","local variable β€˜ent’ assigned but may not be used"," ent <- setEntitySlot(entity(x), ""view"", bd)","object_usage_linter" -"R/subtotals-and-headings.R",915,36,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (is.na(func(insert)) & !is.na(anchor(insert))) {","vector_logic_linter" -"R/subvariables.R",44,36,"warning","no visible binding for global variable β€˜subvariables_catalog’"," catalog_url <- absoluteURL(tup$subvariables_catalog, base = tup@index_url)","object_usage_linter" -"R/subvariables.R",45,22,"warning","no visible binding for global variable β€˜subreferences’"," if (!is.null(tup$subreferences)) {","object_usage_linter" -"R/subvariables.R",66,34,"warning","no visible binding for global variable β€˜subvariables_catalog’"," catalog_url <- absoluteURL(x$subvariables_catalog, base = x@index_url) %||% """"","object_usage_linter" -"R/subvariables.R",67,18,"warning","no visible binding for global variable β€˜subreferences’"," subvars <- x$subreferences","object_usage_linter" -"R/summary-insertions.R",141,9,"warning","local variable β€˜args’ assigned but may not be used"," args <- ids(var_items)","object_usage_linter" -"R/summary-insertions.R",283,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(opts$after) & is.null(opts$position)) opts$position <- ""bottom""","vector_logic_linter" -"R/teams.R",40,13,"warning","local variable β€˜u’ assigned but may not be used"," u <- crPOST(self(x), body = toJSON(list(name = i)))","object_usage_linter" -"R/variable-update.R",254,13,"warning","local variable β€˜out’ assigned but may not be used"," out <- .updateVariable(x, value, filter = .dispatchFilter(i))","object_usage_linter" -"R/versions.R",60,5,"warning","local variable β€˜out’ assigned but may not be used"," out <- crPOST(u,","object_usage_linter" -"R/weight.R",157,54,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.variable(vars) || (length(vars) == 1) & !is.character(vars)) {","vector_logic_linter" -"tests/testthat/setup.R",24,2,"style","Missing terminal newline.",")","trailing_blank_lines_linter" -"tests/testthat/test-cube-subset.R",23,80,"style","Use TRUE instead of the symbol T."," replaceCharWithNumeric(dimnames, c(""cats"", ""llamas""), visible = c(T, F, T)),","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",23,83,"style","Use FALSE instead of the symbol F."," replaceCharWithNumeric(dimnames, c(""cats"", ""llamas""), visible = c(T, F, T)),","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",23,86,"style","Use TRUE instead of the symbol T."," replaceCharWithNumeric(dimnames, c(""cats"", ""llamas""), visible = c(T, F, T)),","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",50,26,"style","Use TRUE instead of the symbol T."," not_hidden <- c(T, T, F, F)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",50,29,"style","Use TRUE instead of the symbol T."," not_hidden <- c(T, T, F, F)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",50,32,"style","Use FALSE instead of the symbol F."," not_hidden <- c(T, T, F, F)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",50,35,"style","Use FALSE instead of the symbol F."," not_hidden <- c(T, T, F, F)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",56,26,"style","Use FALSE instead of the symbol F."," not_hidden <- c(F, T, F, F, T, T)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",56,29,"style","Use TRUE instead of the symbol T."," not_hidden <- c(F, T, F, F, T, T)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",56,32,"style","Use FALSE instead of the symbol F."," not_hidden <- c(F, T, F, F, T, T)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",56,35,"style","Use FALSE instead of the symbol F."," not_hidden <- c(F, T, F, F, T, T)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",56,38,"style","Use TRUE instead of the symbol T."," not_hidden <- c(F, T, F, F, T, T)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",56,41,"style","Use TRUE instead of the symbol T."," not_hidden <- c(F, T, F, F, T, T)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",62,26,"style","Use FALSE instead of the symbol F."," not_hidden <- c(F, T, T)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",62,29,"style","Use TRUE instead of the symbol T."," not_hidden <- c(F, T, T)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",62,32,"style","Use TRUE instead of the symbol T."," not_hidden <- c(F, T, T)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",69,26,"style","Use FALSE instead of the symbol F."," not_hidden <- c(F, T, T, F)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",69,29,"style","Use TRUE instead of the symbol T."," not_hidden <- c(F, T, T, F)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",69,32,"style","Use TRUE instead of the symbol T."," not_hidden <- c(F, T, T, F)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",69,35,"style","Use FALSE instead of the symbol F."," not_hidden <- c(F, T, T, F)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",72,23,"style","Use TRUE instead of the symbol T."," visible <- c(T, T, T, F)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",72,26,"style","Use TRUE instead of the symbol T."," visible <- c(T, T, T, F)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",72,29,"style","Use TRUE instead of the symbol T."," visible <- c(T, T, T, F)","T_and_F_symbol_linter" -"tests/testthat/test-cube-subset.R",72,32,"style","Use FALSE instead of the symbol F."," visible <- c(T, T, T, F)","T_and_F_symbol_linter" -"tests/testthat/test-formula.R",57,44,"style","Put spaces around all infix operators."," formulaToQuery(mean(ds$birthyr)~1),","infix_spaces_linter" -"vignettes/abstract-categories.Rmd",51,34,"style","Put spaces around all infix operators.","income <- AbstractCategories(data=income_list)","infix_spaces_linter" -"vignettes/abstract-categories.Rmd",120,65,"style","Trailing whitespace is superfluous."," Subtotal(name = ""Generally Happy"", after = ""Somewhat Happy"", ","trailing_whitespace_linter" -"vignettes/abstract-categories.Rmd",122,52,"style","Trailing whitespace is superfluous."," Subtotal(name = ""Generally Unhappy"", after = 5, ","trailing_whitespace_linter" -"vignettes/abstract-categories.Rmd",142,101,"style","Lines should not be more than 100 characters.","feeling_insertions <- Insertions(data = lapply(feeling_subtotals, makeInsertion, var_items = feeling_cats))","line_length_linter" -"vignettes/analyze.Rmd",16,14,"style","Put spaces around all infix operators.","options(width=120)","infix_spaces_linter" -"vignettes/analyze.Rmd",31,28,"style","Put spaces around all infix operators.","tab1 <- crtabs(~ educ, data=ds)","infix_spaces_linter" -"vignettes/analyze.Rmd",41,37,"style","Put spaces around all infix operators.","tab2 <- crtabs(~ educ + gender, data=ds)","infix_spaces_linter" -"vignettes/analyze.Rmd",67,29,"style","Put spaces around all infix operators.","crtabs(~ educ + gender, data=ds)","infix_spaces_linter" -"vignettes/analyze.Rmd",76,29,"style","Put spaces around all infix operators.","crtabs(~ educ + gender, data=ds, weight=NULL)","infix_spaces_linter" -"vignettes/analyze.Rmd",76,40,"style","Put spaces around all infix operators.","crtabs(~ educ + gender, data=ds, weight=NULL)","infix_spaces_linter" -"vignettes/analyze.Rmd",98,10,"style","Put spaces around all infix operators.","round(100*prop.table(tab2, 2))","infix_spaces_linter" -"vignettes/analyze.Rmd",105,38,"style","Put spaces around all infix operators.","tab3 <- crtabs(~ imiss + gender, data=ds)","infix_spaces_linter" -"vignettes/analyze.Rmd",123,40,"style","Put spaces around all infix operators.","tab3mr <- crtabs(~ imiss + gender, data=ds)","infix_spaces_linter" -"vignettes/analyze.Rmd",139,10,"style","Put spaces around all infix operators.","round(100*prop.table(tab3mr, 2))","infix_spaces_linter" -"vignettes/analyze.Rmd",145,38,"style","Put spaces around all infix operators.","crtabs(~ imiss$imiss_f + gender, data=ds)","infix_spaces_linter" -"vignettes/analyze.Rmd",156,43,"style","Put spaces around all infix operators.","round(crtabs(~ imiss + educ + gender, data=ds))","infix_spaces_linter" -"vignettes/analyze.Rmd",172,39,"style","Put spaces around all infix operators.","crtabs(mean(age) ~ educ + gender, data=ds)","infix_spaces_linter" -"vignettes/analyze.Rmd",181,38,"style","Put spaces around all infix operators.","crtabs(min(age) ~ educ + gender, data=ds)","infix_spaces_linter" -"vignettes/analyze.Rmd",190,26,"style","Put spaces around all infix operators.","crtabs(min(age) ~ 1, data=ds)","infix_spaces_linter" -"vignettes/analyze.Rmd",208,47,"style","Put spaces around all infix operators.","round(crtabs(mean(track) ~ educ + gender, data=ds), 2)","infix_spaces_linter" -"vignettes/analyze.Rmd",221,47,"style","Put spaces around all infix operators.","round(crtabs(mean(track) ~ educ + gender, data=ds[ds$pid3 == ""Democrat"",]), 2)","infix_spaces_linter" -"vignettes/analyze.Rmd",242,28,"style","Put spaces around all infix operators.","cat(snowdenleakapp.var, sep=""\n"")","infix_spaces_linter" -"vignettes/analyze.Rmd",249,9,"style","Put spaces around all infix operators."," data=ds)","infix_spaces_linter" -"vignettes/analyze.Rmd",262,11,"style","Put spaces around all infix operators."," family=binomial(link=""logit""), data=ds)","infix_spaces_linter" -"vignettes/analyze.Rmd",262,25,"style","Put spaces around all infix operators."," family=binomial(link=""logit""), data=ds)","infix_spaces_linter" -"vignettes/analyze.Rmd",262,40,"style","Put spaces around all infix operators."," family=binomial(link=""logit""), data=ds)","infix_spaces_linter" -"vignettes/array-variables.Rmd",30,33,"style","Put spaces around all infix operators.","grep(""^imiss_"", names(ds), value=TRUE)","infix_spaces_linter" -"vignettes/array-variables.Rmd",33,47,"style","Put spaces around all infix operators.","grep(""^imiss_"", names(start_make_array), value=TRUE)","infix_spaces_linter" -"vignettes/array-variables.Rmd",42,22,"style","Put spaces around all infix operators.","cat(show_imiss_b, sep=""\n"")","infix_spaces_linter" -"vignettes/array-variables.Rmd",48,59,"style","Put spaces around all infix operators.","ds$imiss <- makeArray(ds[grep(""^imiss_"", names(ds))], name=""Issue importance"")","infix_spaces_linter" -"vignettes/array-variables.Rmd",52,20,"style","Put spaces around all infix operators.","cat(show_imiss, sep=""\n"")","infix_spaces_linter" -"vignettes/array-variables.Rmd",63,28,"style","Put spaces around all infix operators.","cat(show_imiss_subvars, sep=""\n"")","infix_spaces_linter" -"vignettes/array-variables.Rmd",72,22,"style","Put spaces around all infix operators.","cat(show_imiss_b, sep=""\n"")","infix_spaces_linter" -"vignettes/array-variables.Rmd",98,29,"style","Put spaces around all infix operators.","cat(show_imiss_subvars2, sep=""\n"")","infix_spaces_linter" -"vignettes/array-variables.Rmd",109,29,"style","Put spaces around all infix operators.","cat(show_imiss_subvars3, sep=""\n"")","infix_spaces_linter" -"vignettes/array-variables.Rmd",122,21,"style","Put spaces around all infix operators.","cat(show_boap_4, sep=""\n"")","infix_spaces_linter" -"vignettes/array-variables.Rmd",131,9,"style","Put spaces around all infix operators."," name=""Approval of Obama on issues"",","infix_spaces_linter" -"vignettes/array-variables.Rmd",132,15,"style","Put spaces around all infix operators."," selections=c(""Strongly approve"", ""Somewhat approve""))","infix_spaces_linter" -"vignettes/array-variables.Rmd",136,19,"style","Put spaces around all infix operators.","cat(show_boap, sep=""\n"")","infix_spaces_linter" -"vignettes/array-variables.Rmd",150,20,"style","Put spaces around all infix operators.","cat(show_boap2, sep=""\n"")","infix_spaces_linter" -"vignettes/array-variables.Rmd",160,20,"style","Put spaces around all infix operators.","cat(show_boap3, sep=""\n"")","infix_spaces_linter" -"vignettes/array-variables.Rmd",168,30,"style","Put spaces around all infix operators.","grep(""boap"", names(ds), value=TRUE)","infix_spaces_linter" -"vignettes/array-variables.Rmd",186,30,"style","Put spaces around all infix operators.","grep(""boap"", names(ds), value=TRUE)","infix_spaces_linter" -"vignettes/crunch.Rmd",36,76,"style","Trailing whitespace is superfluous.","# like ""update all packages from CRAN"" if it asks which packages to update, ","trailing_whitespace_linter" -"vignettes/crunch.Rmd",89,33,"style","Put spaces around all infix operators.","ds <- newDataset(SO_survey, name=""Stack Overflow Developer Survey 2017"")","infix_spaces_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Mon, 04 May 2020 21:39:23 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",3,66,"style","Trailing whitespace is superfluous."," `content-length` = ""176"", location = ""/api/datasets/c25696/"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",5,64,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",7,63,"style","Trailing whitespace is superfluous.",")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",8,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:23 GMT"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",9,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""176"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",10,62,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/c25696/"", server = ""nginx"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",11,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",12,68,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",13,61,"style","Trailing whitespace is superfluous."," `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",14,64,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = "".crunch.io"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",15,101,"style","Lines should not be more than 100 characters."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164363, class = c(""POSIXct"", ","line_length_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",15,101,"style","Trailing whitespace is superfluous."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164363, class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",16,71,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = ""token"", value = ""REDACTED""), row.names = c(NA, ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",17,101,"style","Lines should not be more than 100 characters.","-1L), class = ""data.frame""), content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",17,144,"style","Trailing whitespace is superfluous.","-1L), class = ""data.frame""), content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",19,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 3.1e-05, ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets-03e1cd-POST.R",20,73,"style","Trailing whitespace is superfluous."," connect = 3.2e-05, pretransfer = 0.000134, starttransfer = 0.000139, ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/c25696/batches/"", status_code = 202L, ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:26 GMT"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""178"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",4,101,"style","Lines should not be more than 100 characters."," location = ""/api/datasets/c25696/batches/import_batch%3Ac25696%245f5c3f13-f95f-4cbe-b60a-1a30e139cf18/"", ","line_length_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",4,113,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/c25696/batches/import_batch%3Ac25696%245f5c3f13-f95f-4cbe-b60a-1a30e139cf18/"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",5,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",7,61,"style","Trailing whitespace is superfluous."," `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",8,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",9,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:26 GMT"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",10,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",11,101,"style","Lines should not be more than 100 characters."," `content-length` = ""178"", location = ""/api/datasets/c25696/batches/import_batch%3Ac25696%245f5c3f13-f95f-4cbe-b60a-1a30e139cf18/"", ","line_length_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",11,143,"style","Trailing whitespace is superfluous."," `content-length` = ""178"", location = ""/api/datasets/c25696/batches/import_batch%3Ac25696%245f5c3f13-f95f-4cbe-b60a-1a30e139cf18/"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",12,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",13,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",14,65,"style","Trailing whitespace is superfluous."," `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",15,68,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = "".crunch.io"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",16,101,"style","Lines should not be more than 100 characters."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164366, class = c(""POSIXct"", ","line_length_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",16,105,"style","Trailing whitespace is superfluous."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164366, class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",17,75,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = ""token"", value = ""REDACTED""), row.names = c(NA, ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",18,101,"style","Lines should not be more than 100 characters."," -1L), class = ""data.frame""), content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/c25696/batches/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",18,163,"style","Trailing whitespace is superfluous."," -1L), class = ""data.frame""), content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/c25696/batches/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",20,67,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2e-05, ","trailing_whitespace_linter" -"vignettes/crunch/0/api/datasets/c25696/batches-c6d76c-POST.R",21,71,"style","Trailing whitespace is superfluous."," connect = 2.2e-05, pretransfer = 8.9e-05, starttransfer = 9.3e-05, ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Mon, 04 May 2020 21:39:26 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",3,64,"style","Trailing whitespace is superfluous."," `content-length` = ""86"", location = ""/api/sources/cec83c/"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",5,101,"style","Lines should not be more than 100 characters."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","line_length_linter" -"vignettes/crunch/0/api/sources-POST.R",5,110,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",6,69,"style","Trailing whitespace is superfluous.","""list"")), all_headers = list(list(status = 201L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",7,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:26 GMT"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",8,84,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""86"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",9,61,"style","Trailing whitespace is superfluous."," location = ""/api/sources/cec83c/"", server = ""nginx"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",10,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",11,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",12,61,"style","Trailing whitespace is superfluous."," `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",13,64,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = "".crunch.io"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",14,101,"style","Lines should not be more than 100 characters."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164366, class = c(""POSIXct"", ","line_length_linter" -"vignettes/crunch/0/api/sources-POST.R",14,101,"style","Trailing whitespace is superfluous."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164366, class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",15,71,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = ""token"", value = ""REDACTED""), row.names = c(NA, ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",16,101,"style","Lines should not be more than 100 characters.","-1L), class = ""data.frame""), content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/sources/\""}""), ","line_length_linter" -"vignettes/crunch/0/api/sources-POST.R",16,112,"style","Trailing whitespace is superfluous.","-1L), class = ""data.frame""), content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/sources/\""}""), ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",18,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.6e-05, ","trailing_whitespace_linter" -"vignettes/crunch/0/api/sources-POST.R",19,72,"style","Trailing whitespace is superfluous."," connect = 2.7e-05, pretransfer = 0.00014, starttransfer = 0.000145, ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",1,76,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/c25696/variables/"", status_code = 201L, ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:32 GMT"", ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",3,83,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""0"", ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",4,61,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/c25696/variables/d270c8/"", ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",5,101,"style","Lines should not be more than 100 characters."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, PATCH, POST"", ","line_length_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",5,103,"style","Trailing whitespace is superfluous."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, PATCH, POST"", ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",6,61,"style","Trailing whitespace is superfluous."," `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",7,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 201L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",8,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:32 GMT"", ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",9,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",10,89,"style","Trailing whitespace is superfluous."," `content-length` = ""0"", location = ""/api/datasets/c25696/variables/d270c8/"", ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",11,64,"style","Trailing whitespace is superfluous."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",12,101,"style","Lines should not be more than 100 characters."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","line_length_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",12,108,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",13,68,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = "".crunch.io"", ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",14,101,"style","Lines should not be more than 100 characters."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164372, class = c(""POSIXct"", ","line_length_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",14,105,"style","Trailing whitespace is superfluous."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164372, class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",15,75,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = ""token"", value = ""REDACTED""), row.names = c(NA, ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",16,101,"style","Lines should not be more than 100 characters."," -1L), class = ""data.frame""), content = charToRaw(""""), date = structure(1588628372, class = c(""POSIXct"", ","line_length_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",16,108,"style","Trailing whitespace is superfluous."," -1L), class = ""data.frame""), content = charToRaw(""""), date = structure(1588628372, class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",17,77,"style","Trailing whitespace is superfluous."," ""POSIXt""), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.8e-05, ","trailing_whitespace_linter" -"vignettes/crunch/3/api/datasets/c25696/variables-f8b90f-POST.R",18,72,"style","Trailing whitespace is superfluous."," connect = 2.9e-05, pretransfer = 9.8e-05, starttransfer = 0.000103, ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",1,76,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/c25696/variables/"", status_code = 201L, ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:37 GMT"", ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",3,83,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""0"", ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",4,61,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/c25696/variables/6af3ce/"", ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",5,101,"style","Lines should not be more than 100 characters."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, PATCH, POST"", ","line_length_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",5,103,"style","Trailing whitespace is superfluous."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, PATCH, POST"", ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",6,61,"style","Trailing whitespace is superfluous."," `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",7,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 201L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",8,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Mon, 04 May 2020 21:39:37 GMT"", ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",9,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",10,89,"style","Trailing whitespace is superfluous."," `content-length` = ""0"", location = ""/api/datasets/c25696/variables/6af3ce/"", ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",11,64,"style","Trailing whitespace is superfluous."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",12,101,"style","Lines should not be more than 100 characters."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","line_length_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",12,108,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `set-cookie` = ""REDACTED""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",13,68,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = "".crunch.io"", ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",14,101,"style","Lines should not be more than 100 characters."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164377, class = c(""POSIXct"", ","line_length_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",14,105,"style","Trailing whitespace is superfluous."," flag = TRUE, path = ""/"", secure = FALSE, expiration = structure(1620164377, class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",15,75,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = ""token"", value = ""REDACTED""), row.names = c(NA, ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",16,101,"style","Lines should not be more than 100 characters."," -1L), class = ""data.frame""), content = charToRaw(""""), date = structure(1588628377, class = c(""POSIXct"", ","line_length_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",16,108,"style","Trailing whitespace is superfluous."," -1L), class = ""data.frame""), content = charToRaw(""""), date = structure(1588628377, class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",17,77,"style","Trailing whitespace is superfluous."," ""POSIXt""), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.4e-05, ","trailing_whitespace_linter" -"vignettes/crunch/5/api/datasets/c25696/variables-111581-POST.R",18,71,"style","Trailing whitespace is superfluous."," connect = 2.5e-05, pretransfer = 8.8e-05, starttransfer = 9.3e-05, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",76,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",77,27,"style","Trailing whitespace is superfluous."," mean(ndogs) ~ country, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",102,18,"style","Trailing whitespace is superfluous."," private_deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",103,9,"style","Trailing whitespace is superfluous."," ~q1, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",104,40,"style","Trailing whitespace is superfluous."," title = ""Bar Plot of Favorite Pet"", ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",133,8,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",134,47,"style","Trailing whitespace is superfluous."," ""This survey was collected by ACME surveys"", ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",179,101,"style","Lines should not be more than 100 characters.","# (Note this controls the order of the slides in a deck, which controls how they appear in the web app's","line_length_linter" -"vignettes/deck-cookbook.Rmd",180,101,"style","Lines should not be more than 100 characters.","# deck viewer and Excel and PowerPoint exports, but does not change order or position of an existing ","line_length_linter" -"vignettes/deck-cookbook.Rmd",180,101,"style","Trailing whitespace is superfluous.","# deck viewer and Excel and PowerPoint exports, but does not change order or position of an existing ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",228,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",229,9,"style","Trailing whitespace is superfluous."," ~q1, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",244,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",245,19,"style","Trailing whitespace is superfluous."," ~q1 + country, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",251,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",252,26,"style","Trailing whitespace is superfluous."," ~q1 + country + wave, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",270,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",271,14,"style","Trailing whitespace is superfluous."," ~allpets, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",276,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",277,50,"style","Trailing whitespace is superfluous."," ~categories(allpets) + subvariables(allpets), ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",312,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",318,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",337,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",338,34,"style","Trailing whitespace is superfluous."," ~scorecard(allpets, allpets), ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",369,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",370,9,"style","Trailing whitespace is superfluous."," ~q1, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",380,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",381,48,"style","Trailing whitespace is superfluous."," ~categories(petloc) + subvariables(petloc), ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",400,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",401,9,"style","Trailing whitespace is superfluous."," ~q1, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",422,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",423,9,"style","Trailing whitespace is superfluous."," ~q1, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",451,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",452,19,"style","Trailing whitespace is superfluous."," ~q1 + country, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",459,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",460,16,"style","Trailing whitespace is superfluous."," ~q1 + wave, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",480,19,"style","Trailing whitespace is superfluous."," template_deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",481,9,"style","Trailing whitespace is superfluous."," ~q1, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",496,10,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",540,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",561,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",583,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",585,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",589,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",609,14,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",620,14,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/deck-cookbook.Rmd",631,14,"style","Trailing whitespace is superfluous."," deck, ","trailing_whitespace_linter" -"vignettes/derive.Rmd",16,14,"style","Put spaces around all infix operators.","options(width=120)","infix_spaces_linter" -"vignettes/export.Rmd",15,14,"style","Put spaces around all infix operators.","options(width=120)","infix_spaces_linter" -"vignettes/export.Rmd",33,36,"style","Put spaces around all infix operators.","party_id <- as.vector(ds$pid3, mode=""id"")","infix_spaces_linter" -"vignettes/export.Rmd",64,30,"style","Put spaces around all infix operators.","df <- as.data.frame(ds, force=TRUE)","infix_spaces_linter" -"vignettes/export.Rmd",76,81,"style","Put spaces around all infix operators.","df <- as.data.frame(ds[ds$pid3 == ""Democrat"", c(""age"", ""educ"", ""gender"")], force=TRUE)","infix_spaces_linter" -"vignettes/export.Rmd",115,23,"style","Put spaces around all infix operators.","exportDataset(ds, file=""econ.sav"", format=""spss"")","infix_spaces_linter" -"vignettes/export.Rmd",115,42,"style","Put spaces around all infix operators.","exportDataset(ds, file=""econ.sav"", format=""spss"")","infix_spaces_linter" -"vignettes/export.Rmd",121,19,"style","Put spaces around all infix operators.","write.csv(ds, file=""econ.csv"")","infix_spaces_linter" -"vignettes/export.Rmd",129,70,"style","Put spaces around all infix operators.","write.csv(ds[ds$pid3 == ""Democrat"", c(""age"", ""educ"", ""gender"")], file=""demo-demos.csv"")","infix_spaces_linter" -"vignettes/filters.Rmd",15,14,"style","Put spaces around all infix operators.","options(width=120)","infix_spaces_linter" -"vignettes/filters.Rmd",33,19,"style","Put spaces around all infix operators.","cat(printdems, sep=""\n"")","infix_spaces_linter" -"vignettes/filters.Rmd",37,47,"style","Put spaces around all infix operators.","round(crtabs(mean(track) ~ educ + gender, data=dems), 2)","infix_spaces_linter" -"vignettes/filters.Rmd",90,28,"style","Put spaces around all infix operators.","cat(print.young.males1, sep=""\n"")","infix_spaces_linter" -"vignettes/filters.Rmd",125,28,"style","Put spaces around all infix operators.","cat(print.young.males2, sep=""\n"")","infix_spaces_linter" -"vignettes/filters.Rmd",144,27,"style","Put spaces around all infix operators.","cat(high_perc_skipped, sep=""\n"")","infix_spaces_linter" -"vignettes/fork-and-merge.Rmd",50,101,"style","Lines should not be more than 100 characters.","forked_ds$ImportantHiringCA <- makeArray(forked_ds[, c(""ImportantHiringTechExp"", ""ImportantHiringPMExp"")],","line_length_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Thu, 25 Mar 2021 15:16:07 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",3,66,"style","Trailing whitespace is superfluous."," `content-length` = ""176"", location = ""/api/datasets/5b6c9f/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",5,64,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",6,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",6,111,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",7,68,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",8,69,"style","Trailing whitespace is superfluous.","""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",9,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:16:07 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",10,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""176"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",11,62,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/5b6c9f/"", server = ""nginx"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",12,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",13,68,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",14,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",14,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",15,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",16,62,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",17,63,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",19,95,"style","Trailing whitespace is superfluous."," )), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",20,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",20,119,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.8e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets-cc4309-POST.R",23,69,"style","Trailing whitespace is superfluous."," connect = 3e-05, pretransfer = 8.6e-05, starttransfer = 9.1e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/5b6c9f/batches/"", status_code = 202L, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:28 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""179"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",4,101,"style","Lines should not be more than 100 characters."," location = ""/api/datasets/5b6c9f/batches/import_batch%3A5b6c9f%24c6f12343-98a7-414c-b850-f4bc7ab927e2/"", ","line_length_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",4,113,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/5b6c9f/batches/import_batch%3A5b6c9f%24c6f12343-98a7-414c-b850-f4bc7ab927e2/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",5,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",7,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",7,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",8,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",9,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",10,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:28 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",11,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",12,101,"style","Lines should not be more than 100 characters."," `content-length` = ""179"", location = ""/api/datasets/5b6c9f/batches/import_batch%3A5b6c9f%24c6f12343-98a7-414c-b850-f4bc7ab927e2/"", ","line_length_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",12,143,"style","Trailing whitespace is superfluous."," `content-length` = ""179"", location = ""/api/datasets/5b6c9f/batches/import_batch%3A5b6c9f%24c6f12343-98a7-414c-b850-f4bc7ab927e2/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",13,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",14,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",15,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",15,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",16,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",17,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",18,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",19,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",20,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",20,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",21,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/batches/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",21,134,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/batches/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",23,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.8e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/batches-0671b5-POST.R",24,69,"style","Trailing whitespace is superfluous."," connect = 2.9e-05, pretransfer = 8.5e-05, starttransfer = 9e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",1,72,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/5b6c9f/forks/"", status_code = 202L, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:31 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""176"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",4,62,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/9540f6/"", server = ""nginx"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",5,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",7,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",7,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",8,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",9,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",10,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:31 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",11,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",12,74,"style","Trailing whitespace is superfluous."," `content-length` = ""176"", location = ""/api/datasets/9540f6/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",13,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",14,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",15,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",15,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",16,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",17,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",18,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",19,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",20,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",20,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",21,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/forks/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",21,132,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/forks/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",23,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.3e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/datasets/5b6c9f/forks-fd3738-POST.R",24,71,"style","Trailing whitespace is superfluous."," connect = 2.4e-05, pretransfer = 7.5e-05, starttransfer = 7.9e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Thu, 25 Mar 2021 15:18:27 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",3,64,"style","Trailing whitespace is superfluous."," `content-length` = ""86"", location = ""/api/sources/16269c/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",5,95,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",6,73,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",7,68,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",8,69,"style","Trailing whitespace is superfluous.","""list"")), all_headers = list(list(status = 201L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",9,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:27 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",10,84,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""86"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",11,61,"style","Trailing whitespace is superfluous."," location = ""/api/sources/16269c/"", server = ""nginx"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",12,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",13,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",14,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",14,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",15,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",16,62,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",17,63,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",19,95,"style","Trailing whitespace is superfluous."," )), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",20,87,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/sources/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.8e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/0/api/sources-POST.R",23,71,"style","Trailing whitespace is superfluous."," connect = 3e-05, pretransfer = 0.000183, starttransfer = 0.000189, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",1,76,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/9540f6/variables/"", status_code = 201L, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:35 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",3,83,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""0"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",4,61,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/9540f6/variables/a57c56/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",5,101,"style","Lines should not be more than 100 characters."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, PATCH, POST"", ","line_length_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",5,103,"style","Trailing whitespace is superfluous."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, PATCH, POST"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",6,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",6,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",7,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",8,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 201L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",9,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:35 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",10,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",11,89,"style","Trailing whitespace is superfluous."," `content-length` = ""0"", location = ""/api/datasets/9540f6/variables/a57c56/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",12,64,"style","Trailing whitespace is superfluous."," server = ""nginx"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",13,93,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",14,81,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",15,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",16,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",17,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",18,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",19,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",19,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",20,79,"style","Trailing whitespace is superfluous."," content = charToRaw(""""), date = structure(1616685515, class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",21,77,"style","Trailing whitespace is superfluous."," ""POSIXt""), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.7e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/1/api/datasets/9540f6/variables-ada561-POST.R",22,71,"style","Trailing whitespace is superfluous."," connect = 2.9e-05, pretransfer = 8.9e-05, starttransfer = 9.4e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/5b6c9f/actions/"", status_code = 202L, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:37 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""178"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",4,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",5,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",6,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",6,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",7,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",8,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",9,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:37 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",10,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",11,85,"style","Trailing whitespace is superfluous."," `content-length` = ""178"", server = ""nginx"", `content-encoding` = ""gzip"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",12,82,"style","Trailing whitespace is superfluous."," vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, POST"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",13,67,"style","Trailing whitespace is superfluous."," `x-timing` = """", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",14,81,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",15,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",16,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",17,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",18,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",19,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",19,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",20,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/actions/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",20,134,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/actions/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.5e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/2/api/datasets/5b6c9f/actions-5eb487-POST.R",23,71,"style","Trailing whitespace is superfluous."," connect = 2.6e-05, pretransfer = 7.9e-05, starttransfer = 8.4e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Thu, 25 Mar 2021 15:18:40 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",3,66,"style","Trailing whitespace is superfluous."," `content-length` = ""176"", location = ""/api/datasets/25c7c7/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",5,64,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",6,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",6,111,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",7,68,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",8,69,"style","Trailing whitespace is superfluous.","""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",9,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:18:40 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",10,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""176"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",11,62,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/25c7c7/"", server = ""nginx"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",12,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",13,68,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",14,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",14,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",15,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",16,62,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",17,63,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",19,95,"style","Trailing whitespace is superfluous."," )), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",20,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",20,119,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.5e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets-2ea7ca-POST.R",23,73,"style","Trailing whitespace is superfluous."," connect = 2.6e-05, pretransfer = 0.000106, starttransfer = 0.000109, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/25c7c7/batches/"", status_code = 202L, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:21:29 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""179"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",4,101,"style","Lines should not be more than 100 characters."," location = ""/api/datasets/25c7c7/batches/import_batch%3A25c7c7%24f8ecc6af-28ee-4ae1-8877-566f570f1b96/"", ","line_length_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",4,113,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/25c7c7/batches/import_batch%3A25c7c7%24f8ecc6af-28ee-4ae1-8877-566f570f1b96/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",5,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",7,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",7,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",8,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",9,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",10,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:21:29 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",11,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",12,101,"style","Lines should not be more than 100 characters."," `content-length` = ""179"", location = ""/api/datasets/25c7c7/batches/import_batch%3A25c7c7%24f8ecc6af-28ee-4ae1-8877-566f570f1b96/"", ","line_length_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",12,143,"style","Trailing whitespace is superfluous."," `content-length` = ""179"", location = ""/api/datasets/25c7c7/batches/import_batch%3A25c7c7%24f8ecc6af-28ee-4ae1-8877-566f570f1b96/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",13,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",14,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",15,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",15,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",16,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",17,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",18,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",19,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",20,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",20,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",21,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/25c7c7/batches/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",21,134,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/25c7c7/batches/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",23,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.7e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/datasets/25c7c7/batches-271ee6-POST.R",24,71,"style","Trailing whitespace is superfluous."," connect = 2.8e-05, pretransfer = 8.1e-05, starttransfer = 8.6e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Thu, 25 Mar 2021 15:21:29 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",3,64,"style","Trailing whitespace is superfluous."," `content-length` = ""86"", location = ""/api/sources/e2adbc/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",5,95,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",6,73,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",7,68,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",8,69,"style","Trailing whitespace is superfluous.","""list"")), all_headers = list(list(status = 201L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",9,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:21:29 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",10,84,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""86"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",11,61,"style","Trailing whitespace is superfluous."," location = ""/api/sources/e2adbc/"", server = ""nginx"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",12,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",13,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",14,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",14,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",15,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",16,62,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",17,63,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",19,95,"style","Trailing whitespace is superfluous."," )), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",20,87,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/sources/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.4e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/3/api/sources-POST.R",23,73,"style","Trailing whitespace is superfluous."," connect = 2.5e-05, pretransfer = 0.000137, starttransfer = 0.000142, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",1,72,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/5b6c9f/forks/"", status_code = 202L, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:21:31 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""175"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",4,62,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/d04628/"", server = ""nginx"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",5,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",7,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",7,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",8,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",9,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",10,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:21:31 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",11,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",12,74,"style","Trailing whitespace is superfluous."," `content-length` = ""175"", location = ""/api/datasets/d04628/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",13,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",14,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",15,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",15,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",16,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",17,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",18,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",19,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",20,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",20,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",21,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/forks/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",21,132,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/forks/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",23,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.5e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/5b6c9f/forks-61bbe9-POST.R",24,71,"style","Trailing whitespace is superfluous."," connect = 2.6e-05, pretransfer = 7.8e-05, starttransfer = 8.3e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/d04628/batches/"", status_code = 202L, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:22:41 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""177"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",4,101,"style","Lines should not be more than 100 characters."," location = ""/api/datasets/d04628/batches/import_batch%3Ad04628%2427437777-7092-4ad7-8705-4e154e217872/"", ","line_length_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",4,113,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/d04628/batches/import_batch%3Ad04628%2427437777-7092-4ad7-8705-4e154e217872/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",5,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",7,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",7,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",8,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",9,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",10,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:22:41 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",11,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",12,101,"style","Lines should not be more than 100 characters."," `content-length` = ""177"", location = ""/api/datasets/d04628/batches/import_batch%3Ad04628%2427437777-7092-4ad7-8705-4e154e217872/"", ","line_length_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",12,143,"style","Trailing whitespace is superfluous."," `content-length` = ""177"", location = ""/api/datasets/d04628/batches/import_batch%3Ad04628%2427437777-7092-4ad7-8705-4e154e217872/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",13,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",14,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",15,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",15,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",16,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",17,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",18,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",19,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",20,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",20,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",21,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/d04628/batches/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",21,134,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/d04628/batches/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",23,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.5e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/4/api/datasets/d04628/batches-cb43a7-POST.R",24,71,"style","Trailing whitespace is superfluous."," connect = 2.7e-05, pretransfer = 7.4e-05, starttransfer = 7.9e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/5b6c9f/actions/"", status_code = 202L, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:51 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""179"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",4,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",5,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",6,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",6,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",7,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",8,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",9,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:51 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",10,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",11,85,"style","Trailing whitespace is superfluous."," `content-length` = ""179"", server = ""nginx"", `content-encoding` = ""gzip"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",12,82,"style","Trailing whitespace is superfluous."," vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, POST"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",13,67,"style","Trailing whitespace is superfluous."," `x-timing` = """", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",14,81,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",15,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",16,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",17,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",18,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",19,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",19,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",20,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/actions/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",20,134,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/actions/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.9e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/5/api/datasets/5b6c9f/actions-f90f4d-POST.R",23,71,"style","Trailing whitespace is superfluous."," connect = 3.1e-05, pretransfer = 8.8e-05, starttransfer = 9.2e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Thu, 25 Mar 2021 15:23:55 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",3,66,"style","Trailing whitespace is superfluous."," `content-length` = ""176"", location = ""/api/datasets/b5a775/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",5,64,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",6,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",6,111,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",7,68,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",8,69,"style","Trailing whitespace is superfluous.","""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",9,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:55 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",10,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""176"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",11,62,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/b5a775/"", server = ""nginx"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",12,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",13,68,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",14,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",14,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",15,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",16,62,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",17,63,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",19,95,"style","Trailing whitespace is superfluous."," )), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",20,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",20,119,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.7e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets-b06465-POST.R",23,71,"style","Trailing whitespace is superfluous."," connect = 2.8e-05, pretransfer = 8.1e-05, starttransfer = 8.6e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",1,72,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/5b6c9f/forks/"", status_code = 202L, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:59 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""176"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",4,62,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/91e745/"", server = ""nginx"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",5,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",7,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",7,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",8,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",9,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",10,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:59 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",11,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",12,74,"style","Trailing whitespace is superfluous."," `content-length` = ""176"", location = ""/api/datasets/91e745/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",13,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",14,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",15,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",15,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",16,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",17,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",18,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",19,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",20,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",20,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",21,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/forks/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",21,132,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/forks/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",23,67,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/5b6c9f/forks-b623cc-POST.R",24,71,"style","Trailing whitespace is superfluous."," connect = 2.1e-05, pretransfer = 6.1e-05, starttransfer = 6.4e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",1,76,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/91e745/variables/"", status_code = 202L, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:26:22 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""208"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",4,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",5,89,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, PATCH, POST"", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",6,77,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",7,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",8,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",9,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:26:22 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",10,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",11,85,"style","Trailing whitespace is superfluous."," `content-length` = ""208"", server = ""nginx"", `content-encoding` = ""gzip"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",12,89,"style","Trailing whitespace is superfluous."," vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, PATCH, POST"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",13,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",13,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",14,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",15,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",16,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",17,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",18,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",18,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",19,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""description\"": \""Progress status of adapt job\"", \""value\"": \""/api/progress/\"", \""element\"": \""shoji:view\""}""), ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",19,140,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""description\"": \""Progress status of adapt job\"", \""value\"": \""/api/progress/\"", \""element\"": \""shoji:view\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",21,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.6e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/91e745/variables-b83135-POST.R",22,69,"style","Trailing whitespace is superfluous."," connect = 2.7e-05, pretransfer = 7.7e-05, starttransfer = 9e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/b5a775/batches/"", status_code = 202L, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:57 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""178"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",4,101,"style","Lines should not be more than 100 characters."," location = ""/api/datasets/b5a775/batches/import_batch%3Ab5a775%24125593e4-5a97-42e8-b680-fb537a150a66/"", ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",4,113,"style","Trailing whitespace is superfluous."," location = ""/api/datasets/b5a775/batches/import_batch%3Ab5a775%24125593e4-5a97-42e8-b680-fb537a150a66/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",5,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",6,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",7,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",7,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",8,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",9,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",10,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:57 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",11,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",12,101,"style","Lines should not be more than 100 characters."," `content-length` = ""178"", location = ""/api/datasets/b5a775/batches/import_batch%3Ab5a775%24125593e4-5a97-42e8-b680-fb537a150a66/"", ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",12,143,"style","Trailing whitespace is superfluous."," `content-length` = ""178"", location = ""/api/datasets/b5a775/batches/import_batch%3Ab5a775%24125593e4-5a97-42e8-b680-fb537a150a66/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",13,93,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",14,65,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",15,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",15,119,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",16,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",17,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",18,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",19,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",20,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",20,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",21,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/b5a775/batches/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",21,134,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/b5a775/batches/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",23,67,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 3e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/datasets/b5a775/batches-8164d5-POST.R",24,71,"style","Trailing whitespace is superfluous."," connect = 3.2e-05, pretransfer = 8.9e-05, starttransfer = 9.4e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",2,95,"style","Trailing whitespace is superfluous."," date = ""Thu, 25 Mar 2021 15:23:56 GMT"", `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",3,64,"style","Trailing whitespace is superfluous."," `content-length` = ""86"", location = ""/api/sources/4f9156/"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",4,85,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",5,95,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",6,73,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",7,68,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",8,69,"style","Trailing whitespace is superfluous.","""list"")), all_headers = list(list(status = 201L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",9,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:23:56 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",10,84,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""86"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",11,61,"style","Trailing whitespace is superfluous."," location = ""/api/sources/4f9156/"", server = ""nginx"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",12,71,"style","Trailing whitespace is superfluous."," `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",13,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",14,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",14,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",15,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",16,62,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",17,63,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",19,95,"style","Trailing whitespace is superfluous."," )), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",20,87,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/sources/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.4e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/6/api/sources-POST.R",23,73,"style","Trailing whitespace is superfluous."," connect = 2.5e-05, pretransfer = 0.000155, starttransfer = 0.000161, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",1,74,"style","Trailing whitespace is superfluous.","structure(list(url = ""/api/datasets/5b6c9f/actions/"", status_code = 202L, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",2,69,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:26:26 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",3,85,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", `content-length` = ""178"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",4,89,"style","Trailing whitespace is superfluous."," server = ""nginx"", `content-encoding` = ""gzip"", vary = ""Cookie, Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",5,61,"style","Trailing whitespace is superfluous."," allow = ""GET, HEAD, OPTIONS, POST"", `x-timing` = """", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",6,101,"style","Lines should not be more than 100 characters."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","line_length_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",6,115,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",7,72,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",8,73,"style","Trailing whitespace is superfluous."," ""list"")), all_headers = list(list(status = 202L, version = ""HTTP/2"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",9,73,"style","Trailing whitespace is superfluous."," headers = structure(list(date = ""Thu, 25 Mar 2021 15:26:26 GMT"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",10,63,"style","Trailing whitespace is superfluous."," `content-type` = ""application/json;charset=utf-8"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",11,85,"style","Trailing whitespace is superfluous."," `content-length` = ""178"", server = ""nginx"", `content-encoding` = ""gzip"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",12,82,"style","Trailing whitespace is superfluous."," vary = ""Cookie, Accept-Encoding"", allow = ""GET, HEAD, OPTIONS, POST"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",13,67,"style","Trailing whitespace is superfluous."," `x-timing` = """", `x-xss-protection` = ""1; mode=block"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",14,81,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000; includeSubDomains"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",15,76,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",16,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",17,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",18,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",19,101,"style","Lines should not be more than 100 characters."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","line_length_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",19,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",20,101,"style","Lines should not be more than 100 characters."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/actions/\"", \""value\"": \""/api/progress/\""}""), ","line_length_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",20,134,"style","Trailing whitespace is superfluous."," content = charToRaw(""{\""element\"": \""shoji:view\"", \""self\"": \""/api/datasets/5b6c9f/actions/\"", \""value\"": \""/api/progress/\""}""), ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",22,69,"style","Trailing whitespace is superfluous."," ), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.6e-05, ","trailing_whitespace_linter" -"vignettes/fork-and-merge/8/api/datasets/5b6c9f/actions-531d9a-POST.R",23,71,"style","Trailing whitespace is superfluous."," connect = 2.7e-05, pretransfer = 8.2e-05, starttransfer = 8.7e-05, ","trailing_whitespace_linter" -"vignettes/subtotals.Rmd",19,14,"style","Put spaces around all infix operators.","options(width=120)","infix_spaces_linter" -"vignettes/subtotals.Rmd",27,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/subtotals.Rmd",33,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/subtotals.Rmd",187,101,"style","Lines should not be more than 100 characters.","transforms(cube)$q1$insertions <- list(Heading(""Mammals"", position = ""top""), Heading(""Other"", after = ""Dog""))","line_length_linter" -"vignettes/variable-order.Rmd",15,14,"style","Put spaces around all infix operators.","options(width=120)","infix_spaces_linter" -"vignettes/variables.Rmd",20,14,"style","Put spaces around all infix operators.","options(width=120)","infix_spaces_linter" -"vignettes/variables.Rmd",61,27,"style","Put spaces around all infix operators.","cat(summary.track.var, sep=""\n"")","infix_spaces_linter" -"vignettes/variables.Rmd",68,101,"style","Lines should not be more than 100 characters.","description(track.var) <- ""In your opinon, is the country going in the right direction, or is it on the wrong track?""","line_length_linter" -"vignettes/variables.Rmd",211,73,"style","Put spaces around all infix operators.","ids(categories(track.var)) <- sample(ids(categories(track.var)), replace=FALSE)","infix_spaces_linter" diff --git a/.dev/revdep_emails/crunch/email-body b/.dev/revdep_emails/crunch/email-body deleted file mode 100644 index 2926f2564..000000000 --- a/.dev/revdep_emails/crunch/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Greg Freedman Ellis! Thank you for using {lintr} in your package {crunch}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/Crunch-io/rcrunch (hash: 5f78824de8c653398fc36866ae127549a008db7e) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 340s on CRAN vs. 185s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/dampack/attachments/dampack.warnings b/.dev/revdep_emails/dampack/attachments/dampack.warnings deleted file mode 100644 index 182961f94..000000000 --- a/.dev/revdep_emails/dampack/attachments/dampack.warnings +++ /dev/null @@ -1,2 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Trying to remove β€˜camel_case_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/dampack/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/dampack/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index d34293462..000000000 --- a/.dev/revdep_emails/dampack/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,331 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/calculate_outcome.R",32,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (outcome == ""nhb_loss"" | outcome == ""nmb_loss"") {","vector_logic_linter" -"R/calculate_outcome.R",43,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (outcome == ""nhb_loss_voi"" | outcome == ""nmb_loss_voi"") {","vector_logic_linter" -"R/create_sa.R",146,17,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (all_strat | (x$n_strategies <= n_trunc)) {","vector_logic_linter" -"R/evsi.R",140,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(length(n) == 1 | length(n) == n_params)) {","vector_logic_linter" -"R/evsi.R",144,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(length(n0) == 1 | length(n0) == n_params)) {","vector_logic_linter" -"R/evsi.R",315,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(unique(x$WTP)) == 1 & ""n"" %in% names(x)) {","vector_logic_linter" -"R/evsi.R",319,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (!(""n"" %in% names(x)) | (""n"" %in% names(x) & length(unique(x$n)) == 1)) {","vector_logic_linter" -"R/evsi.R",319,56,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (!(""n"" %in% names(x)) | (""n"" %in% names(x) & length(unique(x$n)) == 1)) {","vector_logic_linter" -"R/evsi.R",323,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (length(unique(x$WTP > 1)) & length(unique(x$n)) > 1) {","vector_logic_linter" -"R/icers.R",63,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (n_cost != n_eff | n_eff != n_strat) {","vector_logic_linter" -"R/icers.R",221,7,"warning","no visible global function definition for β€˜pivot_longer’"," pivot_longer(cols = everything(), names_to = ""Strategy"") %>%","object_usage_linter" -"R/icers.R",227,7,"warning","no visible global function definition for β€˜pivot_longer’"," pivot_longer(cols = everything(), names_to = ""Strategy"") %>%","object_usage_linter" -"R/metamodel.R",62,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (length(params) != 2 & analysis == ""twoway"") {","vector_logic_linter" -"R/metamodel.R",111,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (analysis == ""twoway"" | analysis == ""multiway"") {","vector_logic_linter" -"R/metamodel.R",324,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(i) & length(i) != 2) {","vector_logic_linter" -"R/metamodel.R",446,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (p_range[1] < psa_range[1] | p_range[2] > psa_range[2]) {","vector_logic_linter" -"R/owsa.R",136,7,"warning","no visible global function definition for β€˜pivot_longer’"," pivot_longer(cols = everything(),","object_usage_linter" -"R/owsa.R",181,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (min_rel_diff < 0 | min_rel_diff > 1) {","vector_logic_linter" -"R/psa.R",163,5,"warning","no visible global function definition for β€˜pivot_longer’"," pivot_longer(cost,","object_usage_linter" -"R/psa.R",169,5,"warning","no visible global function definition for β€˜pivot_longer’"," pivot_longer(effectiveness,","object_usage_linter" -"R/psa.R",204,32,"warning","no visible binding for global variable β€˜Effectiveness’"," ellipse(cor(Effectiveness, Cost),","object_usage_linter" -"R/psa.R",204,32,"warning","no visible binding for global variable β€˜Effectiveness’"," ellipse(cor(Effectiveness, Cost),","object_usage_linter" -"R/psa.R",204,32,"warning","no visible binding for global variable β€˜Effectiveness’"," ellipse(cor(Effectiveness, Cost),","object_usage_linter" -"R/psa.R",204,47,"warning","no visible binding for global variable β€˜Cost’"," ellipse(cor(Effectiveness, Cost),","object_usage_linter" -"R/psa.R",204,47,"warning","no visible binding for global variable β€˜Cost’"," ellipse(cor(Effectiveness, Cost),","object_usage_linter" -"R/psa.R",204,47,"warning","no visible binding for global variable β€˜Cost’"," ellipse(cor(Effectiveness, Cost),","object_usage_linter" -"R/run_dsa.R",52,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.list(params_basecase) | is.null(names(params_basecase))) {","vector_logic_linter" -"R/run_dsa.R",215,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.list(params_basecase) | is.null(names(params_basecase)))","vector_logic_linter" -"R/run_psa.R",85,78,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (i / (nrow(psa_samp) / 10) == round(i / (nrow(psa_samp) / 10), 0) & progress == TRUE) {","vector_logic_linter" -"R/run_psa.R",96,78,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (i / (nrow(psa_samp) / 10) == round(i / (nrow(psa_samp) / 10), 0) & progress == TRUE) {","vector_logic_linter" -"R/twsa.R",28,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(param1) | is.null(param2)) {","vector_logic_linter" -"tests/testthat/util_models_detfun.R",41,64,"style","Use FALSE instead of the symbol F."," nrow = length(state_name), byrow = F)","T_and_F_symbol_linter" -"vignettes/basic_cea.Rmd",71,33,"style","Put spaces around all infix operators.","icer_hiv <- calculate_icers(cost=v_hiv_costs, ","infix_spaces_linter" -"vignettes/basic_cea.Rmd",71,46,"style","Trailing whitespace is superfluous.","icer_hiv <- calculate_icers(cost=v_hiv_costs, ","trailing_whitespace_linter" -"vignettes/basic_cea.Rmd",72,35,"style","Put spaces around all infix operators."," effect=v_hiv_qalys, ","infix_spaces_linter" -"vignettes/basic_cea.Rmd",72,48,"style","Trailing whitespace is superfluous."," effect=v_hiv_qalys, ","trailing_whitespace_linter" -"vignettes/basic_cea.Rmd",73,39,"style","Put spaces around all infix operators."," strategies=v_hiv_strat_names)","infix_spaces_linter" -"vignettes/basic_cea.Rmd",101,15,"style","Trailing whitespace is superfluous.","plot(icer_hiv, ","trailing_whitespace_linter" -"vignettes/basic_cea.Rmd",102,11,"style","Put spaces around all infix operators."," label=""all"")","infix_spaces_linter" -"vignettes/basic_cea.Rmd",107,15,"style","Trailing whitespace is superfluous.","plot(icer_hiv, ","trailing_whitespace_linter" -"vignettes/basic_cea.Rmd",108,11,"style","Put spaces around all infix operators."," label=""all"") +","infix_spaces_linter" -"vignettes/basic_cea.Rmd",157,25,"style","Put spaces around all infix operators."," filter(Status == ""ND"")%>%","infix_spaces_linter" -"vignettes/dsa_generation.Rmd",43,80,"style","Trailing whitespace is superfluous."," # -- disease progression parameters (annual): r_HD, p_S1S2, hr_S1D, hr_S2D, ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",49,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",51,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",55,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",57,24,"warning","no visible binding for global variable β€˜r_disc’"," v_dw <- 1 / ((1 + r_disc) ^ (0:n_cycles))","object_usage_linter" -"vignettes/dsa_generation.Rmd",57,37,"warning","no visible binding for global variable β€˜n_cycles’"," v_dw <- 1 / ((1 + r_disc) ^ (0:n_cycles))","object_usage_linter" -"vignettes/dsa_generation.Rmd",58,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",60,29,"warning","no visible binding for global variable β€˜c_H’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" -"vignettes/dsa_generation.Rmd",60,41,"warning","no visible binding for global variable β€˜c_S1’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" -"vignettes/dsa_generation.Rmd",60,54,"warning","no visible binding for global variable β€˜c_S2’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" -"vignettes/dsa_generation.Rmd",60,66,"warning","no visible binding for global variable β€˜c_D’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" -"vignettes/dsa_generation.Rmd",61,32,"warning","no visible binding for global variable β€˜u_H’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" -"vignettes/dsa_generation.Rmd",61,44,"warning","no visible binding for global variable β€˜u_S1’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" -"vignettes/dsa_generation.Rmd",61,57,"warning","no visible binding for global variable β€˜u_S2’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" -"vignettes/dsa_generation.Rmd",61,69,"warning","no visible binding for global variable β€˜u_D’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" -"vignettes/dsa_generation.Rmd",62,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",64,14,"warning","no visible binding for global variable β€˜hr_S1D’"," r_S1D <- hr_S1D * r_HD # rate of death in sick state","object_usage_linter" -"vignettes/dsa_generation.Rmd",64,23,"warning","no visible binding for global variable β€˜r_HD’"," r_S1D <- hr_S1D * r_HD # rate of death in sick state","object_usage_linter" -"vignettes/dsa_generation.Rmd",65,14,"warning","no visible binding for global variable β€˜hr_S2D’"," r_S2D <- hr_S2D * r_HD # rate of death in sicker state","object_usage_linter" -"vignettes/dsa_generation.Rmd",65,23,"warning","no visible binding for global variable β€˜r_HD’"," r_S2D <- hr_S2D * r_HD # rate of death in sicker state","object_usage_linter" -"vignettes/dsa_generation.Rmd",68,23,"warning","no visible binding for global variable β€˜r_HD’"," p_HD <- 1 - exp(-r_HD) # probability of dying when healthy","object_usage_linter" -"vignettes/dsa_generation.Rmd",69,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",70,48,"style","Trailing whitespace is superfluous."," ## Initialize transition probability matrix ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",71,85,"style","Trailing whitespace is superfluous."," # all transitions to a non-death state are assumed to be conditional on survival ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",72,21,"style","Trailing whitespace is superfluous."," m_P <- matrix(0, ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",73,52,"style","Trailing whitespace is superfluous."," nrow = n_states, ncol = n_states, ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",77,42,"warning","no visible binding for global variable β€˜p_HS1’"," m_P[""H"", ""H""] <- (1 - p_HD) * (1 - p_HS1) ","object_usage_linter" -"vignettes/dsa_generation.Rmd",77,48,"style","Trailing whitespace is superfluous."," m_P[""H"", ""H""] <- (1 - p_HD) * (1 - p_HS1) ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",78,37,"warning","no visible binding for global variable β€˜p_HS1’"," m_P[""H"", ""S1""] <- (1 - p_HD) * p_HS1 ","object_usage_linter" -"vignettes/dsa_generation.Rmd",78,42,"style","Trailing whitespace is superfluous."," m_P[""H"", ""S1""] <- (1 - p_HD) * p_HS1 ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",81,38,"warning","no visible binding for global variable β€˜p_S1H’"," m_P[""S1"", ""H""] <- (1 - p_S1D) * p_S1H","object_usage_linter" -"vignettes/dsa_generation.Rmd",82,44,"warning","no visible binding for global variable β€˜p_S1H’"," m_P[""S1"", ""S1""] <- (1 - p_S1D) * (1 - (p_S1H + p_S1S2))","object_usage_linter" -"vignettes/dsa_generation.Rmd",82,52,"warning","no visible binding for global variable β€˜p_S1S2’"," m_P[""S1"", ""S1""] <- (1 - p_S1D) * (1 - (p_S1H + p_S1S2))","object_usage_linter" -"vignettes/dsa_generation.Rmd",83,38,"warning","no visible binding for global variable β€˜p_S1S2’"," m_P[""S1"", ""S2""] <- (1 - p_S1D) * p_S1S2","object_usage_linter" -"vignettes/dsa_generation.Rmd",90,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",91,67,"style","Trailing whitespace is superfluous."," # check that all transition matrix entries are between 0 and 1 ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",92,7,"style","Place a space before left parenthesis, except in a function call."," if(!all(m_P <= 1 & m_P >= 0)){","spaces_left_parentheses_linter" -"vignettes/dsa_generation.Rmd",92,34,"style","There should be a space before an opening curly brace."," if(!all(m_P <= 1 & m_P >= 0)){","brace_linter" -"vignettes/dsa_generation.Rmd",92,34,"style","There should be a space between a right parenthesis and a body expression."," if(!all(m_P <= 1 & m_P >= 0)){","paren_body_linter" -"vignettes/dsa_generation.Rmd",96,47,"style","Commas should always have a space after."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","commas_linter" -"vignettes/dsa_generation.Rmd",96,53,"style","Commas should always have a space after."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","commas_linter" -"vignettes/dsa_generation.Rmd",96,64,"style","There should be a space before an opening curly brace."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","brace_linter" -"vignettes/dsa_generation.Rmd",96,64,"style","There should be a space between a right parenthesis and a body expression."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","paren_body_linter" -"vignettes/dsa_generation.Rmd",99,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",102,34,"warning","no visible binding for global variable β€˜n_cycles’"," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","object_usage_linter" -"vignettes/dsa_generation.Rmd",102,34,"warning","no visible binding for global variable β€˜n_cycles’"," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","object_usage_linter" -"vignettes/dsa_generation.Rmd",102,46,"style","Commas should never have a space before."," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","commas_linter" -"vignettes/dsa_generation.Rmd",102,48,"style","Trailing whitespace is superfluous."," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",105,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",107,36,"warning","no visible binding for global variable β€˜n_cycles’"," v_C <- v_Q <- numeric(length = n_cycles + 1)","object_usage_linter" -"vignettes/dsa_generation.Rmd",108,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",110,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",111,21,"warning","no visible binding for global variable β€˜v_s_init’"," m_Trace[1, ] <- v_s_init # initialize Markov trace","object_usage_linter" -"vignettes/dsa_generation.Rmd",114,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",115,17,"warning","no visible binding for global variable β€˜n_cycles’"," for (t in 1:n_cycles){ # throughout the number of cycles","object_usage_linter" -"vignettes/dsa_generation.Rmd",117,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",119,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",121,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",123,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",125,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",128,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",131,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",133,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",136,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",144,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",156,56,"style","There should be a space before an opening curly brace.","simulate_strategies <- function(l_params, wtp = 100000){","brace_linter" -"vignettes/dsa_generation.Rmd",156,56,"style","There should be a space between a right parenthesis and a body expression.","simulate_strategies <- function(l_params, wtp = 100000){","paren_body_linter" -"vignettes/dsa_generation.Rmd",159,80,"style","Trailing whitespace is superfluous."," # -- disease progression parameters (annual): r_HD, p_S1S2, hr_S1D, hr_S2D, ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",169,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",171,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",177,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",180,18,"warning","no visible binding for global variable β€˜u_trtA’"," u_S1_trtA <- u_trtA","object_usage_linter" -"vignettes/dsa_generation.Rmd",182,18,"warning","no visible binding for global variable β€˜c_S1’"," c_S1_trtA <- c_S1 + c_trtA","object_usage_linter" -"vignettes/dsa_generation.Rmd",182,25,"warning","no visible binding for global variable β€˜c_trtA’"," c_S1_trtA <- c_S1 + c_trtA","object_usage_linter" -"vignettes/dsa_generation.Rmd",183,18,"warning","no visible binding for global variable β€˜c_S2’"," c_S2_trtA <- c_S2 + c_trtA","object_usage_linter" -"vignettes/dsa_generation.Rmd",183,25,"warning","no visible binding for global variable β€˜c_trtA’"," c_S2_trtA <- c_S2 + c_trtA","object_usage_linter" -"vignettes/dsa_generation.Rmd",184,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",187,29,"warning","no visible binding for global variable β€˜p_S1S2’"," r_S1S2_trtB <- -log(1 - p_S1S2) * hr_S1S2_trtB ","object_usage_linter" -"vignettes/dsa_generation.Rmd",187,39,"warning","no visible binding for global variable β€˜hr_S1S2_trtB’"," r_S1S2_trtB <- -log(1 - p_S1S2) * hr_S1S2_trtB ","object_usage_linter" -"vignettes/dsa_generation.Rmd",187,51,"style","Trailing whitespace is superfluous."," r_S1S2_trtB <- -log(1 - p_S1S2) * hr_S1S2_trtB ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",190,18,"warning","no visible binding for global variable β€˜c_S1’"," c_S1_trtB <- c_S1 + c_trtB","object_usage_linter" -"vignettes/dsa_generation.Rmd",190,25,"warning","no visible binding for global variable β€˜c_trtB’"," c_S1_trtB <- c_S1 + c_trtB","object_usage_linter" -"vignettes/dsa_generation.Rmd",191,18,"warning","no visible binding for global variable β€˜c_S2’"," c_S2_trtB <- c_S2 + c_trtB","object_usage_linter" -"vignettes/dsa_generation.Rmd",191,25,"warning","no visible binding for global variable β€˜c_trtB’"," c_S2_trtB <- c_S2 + c_trtB","object_usage_linter" -"vignettes/dsa_generation.Rmd",193,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",194,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",202,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",203,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",206,42,"warning","no visible binding for global variable β€˜n_cycles’"," l_params_markov <- list(n_cycles = n_cycles, r_disc = r_disc, v_s_init = v_s_init,","object_usage_linter" -"vignettes/dsa_generation.Rmd",206,61,"warning","no visible binding for global variable β€˜r_disc’"," l_params_markov <- list(n_cycles = n_cycles, r_disc = r_disc, v_s_init = v_s_init,","object_usage_linter" -"vignettes/dsa_generation.Rmd",206,80,"warning","no visible binding for global variable β€˜v_s_init’"," l_params_markov <- list(n_cycles = n_cycles, r_disc = r_disc, v_s_init = v_s_init,","object_usage_linter" -"vignettes/dsa_generation.Rmd",207,38,"warning","no visible binding for global variable β€˜c_H’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" -"vignettes/dsa_generation.Rmd",207,50,"warning","no visible binding for global variable β€˜c_S2’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" -"vignettes/dsa_generation.Rmd",207,63,"warning","no visible binding for global variable β€˜c_S1’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" -"vignettes/dsa_generation.Rmd",207,75,"warning","no visible binding for global variable β€˜c_D’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" -"vignettes/dsa_generation.Rmd",208,38,"warning","no visible binding for global variable β€˜u_H’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" -"vignettes/dsa_generation.Rmd",208,50,"warning","no visible binding for global variable β€˜u_S2’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" -"vignettes/dsa_generation.Rmd",208,63,"warning","no visible binding for global variable β€˜u_S1’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" -"vignettes/dsa_generation.Rmd",208,75,"warning","no visible binding for global variable β€˜u_D’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" -"vignettes/dsa_generation.Rmd",209,38,"warning","no visible binding for global variable β€˜r_HD’"," r_HD = r_HD, hr_S1D = hr_S1D, hr_S2D = hr_S2D,","object_usage_linter" -"vignettes/dsa_generation.Rmd",209,53,"warning","no visible binding for global variable β€˜hr_S1D’"," r_HD = r_HD, hr_S1D = hr_S1D, hr_S2D = hr_S2D,","object_usage_linter" -"vignettes/dsa_generation.Rmd",209,70,"warning","no visible binding for global variable β€˜hr_S2D’"," r_HD = r_HD, hr_S1D = hr_S1D, hr_S2D = hr_S2D,","object_usage_linter" -"vignettes/dsa_generation.Rmd",210,39,"warning","no visible binding for global variable β€˜p_HS1’"," p_HS1 = p_HS1, p_S1H = p_S1H, p_S1S2 = p_S1S2)","object_usage_linter" -"vignettes/dsa_generation.Rmd",210,54,"warning","no visible binding for global variable β€˜p_S1H’"," p_HS1 = p_HS1, p_S1H = p_S1H, p_S1S2 = p_S1S2)","object_usage_linter" -"vignettes/dsa_generation.Rmd",210,70,"warning","no visible binding for global variable β€˜p_S1S2’"," p_HS1 = p_HS1, p_S1H = p_S1H, p_S1S2 = p_S1S2)","object_usage_linter" -"vignettes/dsa_generation.Rmd",211,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",212,45,"style","There should be a space before an opening curly brace."," if (v_names_strat[i] == ""Treatment_A""){","brace_linter" -"vignettes/dsa_generation.Rmd",212,45,"style","There should be a space between a right parenthesis and a body expression."," if (v_names_strat[i] == ""Treatment_A""){","paren_body_linter" -"vignettes/dsa_generation.Rmd",216,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",217,16,"style","Place a space before left parenthesis, except in a function call."," } else if(v_names_strat[i] == ""Treatment_B""){","spaces_left_parentheses_linter" -"vignettes/dsa_generation.Rmd",217,51,"style","There should be a space before an opening curly brace."," } else if(v_names_strat[i] == ""Treatment_B""){","brace_linter" -"vignettes/dsa_generation.Rmd",217,51,"style","There should be a space between a right parenthesis and a body expression."," } else if(v_names_strat[i] == ""Treatment_B""){","paren_body_linter" -"vignettes/dsa_generation.Rmd",224,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",230,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",242,41,"style","Trailing whitespace is superfluous."," r_HD = 0.002, ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",243,39,"style","Trailing whitespace is superfluous."," hr_S1D = 3, ","trailing_whitespace_linter" -"vignettes/dsa_generation.Rmd",248,41,"style","Trailing whitespace is superfluous."," c_S2 = 15000, ","trailing_whitespace_linter" -"vignettes/psa_analysis.Rmd",98,28,"style","Trailing whitespace is superfluous.","psa_sum <- summary(psa_obj, ","trailing_whitespace_linter" -"vignettes/psa_analysis.Rmd",106,50,"style","Trailing whitespace is superfluous.","icers <- calculate_icers(cost = psa_sum$meanCost, ","trailing_whitespace_linter" -"vignettes/psa_analysis.Rmd",107,54,"style","Trailing whitespace is superfluous."," effect = psa_sum$meanEffect, ","trailing_whitespace_linter" -"vignettes/psa_analysis.Rmd",119,40,"style","Trailing whitespace is superfluous.","ceac_obj <- ceac(wtp = example_psa$wtp, ","trailing_whitespace_linter" -"vignettes/psa_analysis.Rmd",133,15,"style","Trailing whitespace is superfluous.","plot(ceac_obj, ","trailing_whitespace_linter" -"vignettes/psa_analysis.Rmd",134,22,"style","Trailing whitespace is superfluous."," frontier = TRUE, ","trailing_whitespace_linter" -"vignettes/psa_analysis.Rmd",145,43,"style","Trailing whitespace is superfluous.","el <- calc_exp_loss(wtp = example_psa$wtp, ","trailing_whitespace_linter" -"vignettes/psa_analysis.Rmd",148,9,"style","Trailing whitespace is superfluous.","plot(el, ","trailing_whitespace_linter" -"vignettes/psa_analysis.Rmd",149,20,"style","Trailing whitespace is superfluous."," n_x_ticks = 8, ","trailing_whitespace_linter" -"vignettes/psa_analysis.Rmd",183,16,"style","Trailing whitespace is superfluous.","owsa_tornado(o, ","trailing_whitespace_linter" -"vignettes/psa_analysis.Rmd",189,16,"style","Trailing whitespace is superfluous.","owsa_tornado(o, ","trailing_whitespace_linter" -"vignettes/psa_analysis.Rmd",198,18,"style","Trailing whitespace is superfluous.","owsa_opt_strat(o, ","trailing_whitespace_linter" -"vignettes/psa_analysis.Rmd",205,18,"style","Trailing whitespace is superfluous.","owsa_opt_strat(o, ","trailing_whitespace_linter" -"vignettes/psa_analysis.Rmd",214,20,"style","Trailing whitespace is superfluous.","tw <- twsa(psa_obj, ","trailing_whitespace_linter" -"vignettes/psa_analysis.Rmd",215,34,"style","Trailing whitespace is superfluous."," param1 = ""pFailChemo"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",39,80,"style","Trailing whitespace is superfluous."," # -- disease progression parameters (annual): r_HD, p_S1S2, hr_S1D, hr_S2D, ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",45,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",47,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",51,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",53,24,"warning","no visible binding for global variable β€˜r_disc’"," v_dw <- 1 / ((1 + r_disc) ^ (0:n_cycles))","object_usage_linter" -"vignettes/psa_generation.Rmd",53,37,"warning","no visible binding for global variable β€˜n_cycles’"," v_dw <- 1 / ((1 + r_disc) ^ (0:n_cycles))","object_usage_linter" -"vignettes/psa_generation.Rmd",54,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",56,29,"warning","no visible binding for global variable β€˜c_H’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" -"vignettes/psa_generation.Rmd",56,41,"warning","no visible binding for global variable β€˜c_S1’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" -"vignettes/psa_generation.Rmd",56,54,"warning","no visible binding for global variable β€˜c_S2’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" -"vignettes/psa_generation.Rmd",56,66,"warning","no visible binding for global variable β€˜c_D’"," v_state_cost <- c(""H"" = c_H, ""S1"" = c_S1, ""S2"" = c_S2, ""D"" = c_D)","object_usage_linter" -"vignettes/psa_generation.Rmd",57,32,"warning","no visible binding for global variable β€˜u_H’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" -"vignettes/psa_generation.Rmd",57,44,"warning","no visible binding for global variable β€˜u_S1’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" -"vignettes/psa_generation.Rmd",57,57,"warning","no visible binding for global variable β€˜u_S2’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" -"vignettes/psa_generation.Rmd",57,69,"warning","no visible binding for global variable β€˜u_D’"," v_state_utility <- c(""H"" = u_H, ""S1"" = u_S1, ""S2"" = u_S2, ""D"" = u_D)","object_usage_linter" -"vignettes/psa_generation.Rmd",58,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",60,14,"warning","no visible binding for global variable β€˜hr_S1D’"," r_S1D <- hr_S1D * r_HD # rate of death in sick state","object_usage_linter" -"vignettes/psa_generation.Rmd",60,23,"warning","no visible binding for global variable β€˜r_HD’"," r_S1D <- hr_S1D * r_HD # rate of death in sick state","object_usage_linter" -"vignettes/psa_generation.Rmd",61,14,"warning","no visible binding for global variable β€˜hr_S2D’"," r_S2D <- hr_S2D * r_HD # rate of death in sicker state","object_usage_linter" -"vignettes/psa_generation.Rmd",61,23,"warning","no visible binding for global variable β€˜r_HD’"," r_S2D <- hr_S2D * r_HD # rate of death in sicker state","object_usage_linter" -"vignettes/psa_generation.Rmd",64,23,"warning","no visible binding for global variable β€˜r_HD’"," p_HD <- 1 - exp(-r_HD) # probability of dying when healthy","object_usage_linter" -"vignettes/psa_generation.Rmd",65,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",66,48,"style","Trailing whitespace is superfluous."," ## Initialize transition probability matrix ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",67,85,"style","Trailing whitespace is superfluous."," # all transitions to a non-death state are assumed to be conditional on survival ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",68,21,"style","Trailing whitespace is superfluous."," m_P <- matrix(0, ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",69,52,"style","Trailing whitespace is superfluous."," nrow = n_states, ncol = n_states, ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",73,42,"warning","no visible binding for global variable β€˜p_HS1’"," m_P[""H"", ""H""] <- (1 - p_HD) * (1 - p_HS1) ","object_usage_linter" -"vignettes/psa_generation.Rmd",73,48,"style","Trailing whitespace is superfluous."," m_P[""H"", ""H""] <- (1 - p_HD) * (1 - p_HS1) ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",74,37,"warning","no visible binding for global variable β€˜p_HS1’"," m_P[""H"", ""S1""] <- (1 - p_HD) * p_HS1 ","object_usage_linter" -"vignettes/psa_generation.Rmd",74,42,"style","Trailing whitespace is superfluous."," m_P[""H"", ""S1""] <- (1 - p_HD) * p_HS1 ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",77,38,"warning","no visible binding for global variable β€˜p_S1H’"," m_P[""S1"", ""H""] <- (1 - p_S1D) * p_S1H","object_usage_linter" -"vignettes/psa_generation.Rmd",78,44,"warning","no visible binding for global variable β€˜p_S1H’"," m_P[""S1"", ""S1""] <- (1 - p_S1D) * (1 - (p_S1H + p_S1S2))","object_usage_linter" -"vignettes/psa_generation.Rmd",78,52,"warning","no visible binding for global variable β€˜p_S1S2’"," m_P[""S1"", ""S1""] <- (1 - p_S1D) * (1 - (p_S1H + p_S1S2))","object_usage_linter" -"vignettes/psa_generation.Rmd",79,38,"warning","no visible binding for global variable β€˜p_S1S2’"," m_P[""S1"", ""S2""] <- (1 - p_S1D) * p_S1S2","object_usage_linter" -"vignettes/psa_generation.Rmd",86,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",87,67,"style","Trailing whitespace is superfluous."," # check that all transition matrix entries are between 0 and 1 ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",88,7,"style","Place a space before left parenthesis, except in a function call."," if(!all(m_P <= 1 & m_P >= 0)){","spaces_left_parentheses_linter" -"vignettes/psa_generation.Rmd",88,34,"style","There should be a space before an opening curly brace."," if(!all(m_P <= 1 & m_P >= 0)){","brace_linter" -"vignettes/psa_generation.Rmd",88,34,"style","There should be a space between a right parenthesis and a body expression."," if(!all(m_P <= 1 & m_P >= 0)){","paren_body_linter" -"vignettes/psa_generation.Rmd",92,47,"style","Commas should always have a space after."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","commas_linter" -"vignettes/psa_generation.Rmd",92,53,"style","Commas should always have a space after."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","commas_linter" -"vignettes/psa_generation.Rmd",92,64,"style","There should be a space before an opening curly brace."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","brace_linter" -"vignettes/psa_generation.Rmd",92,64,"style","There should be a space between a right parenthesis and a body expression."," if (!all.equal(as.numeric(rowSums(m_P)),rep(1,n_states))){","paren_body_linter" -"vignettes/psa_generation.Rmd",95,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",98,34,"warning","no visible binding for global variable β€˜n_cycles’"," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","object_usage_linter" -"vignettes/psa_generation.Rmd",98,34,"warning","no visible binding for global variable β€˜n_cycles’"," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","object_usage_linter" -"vignettes/psa_generation.Rmd",98,46,"style","Commas should never have a space before."," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","commas_linter" -"vignettes/psa_generation.Rmd",98,48,"style","Trailing whitespace is superfluous."," m_Trace <- matrix(NA, nrow = n_cycles + 1 , ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",101,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",103,36,"warning","no visible binding for global variable β€˜n_cycles’"," v_C <- v_Q <- numeric(length = n_cycles + 1)","object_usage_linter" -"vignettes/psa_generation.Rmd",104,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",106,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",107,21,"warning","no visible binding for global variable β€˜v_s_init’"," m_Trace[1, ] <- v_s_init # initialize Markov trace","object_usage_linter" -"vignettes/psa_generation.Rmd",110,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",111,17,"warning","no visible binding for global variable β€˜n_cycles’"," for (t in 1:n_cycles){ # throughout the number of cycles","object_usage_linter" -"vignettes/psa_generation.Rmd",113,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",115,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",117,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",119,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",121,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",124,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",127,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",129,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",132,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",140,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",148,56,"style","There should be a space before an opening curly brace.","simulate_strategies <- function(l_params, wtp = 100000){","brace_linter" -"vignettes/psa_generation.Rmd",148,56,"style","There should be a space between a right parenthesis and a body expression.","simulate_strategies <- function(l_params, wtp = 100000){","paren_body_linter" -"vignettes/psa_generation.Rmd",151,80,"style","Trailing whitespace is superfluous."," # -- disease progression parameters (annual): r_HD, p_S1S2, hr_S1D, hr_S2D, ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",161,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",163,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",169,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",172,18,"warning","no visible binding for global variable β€˜u_trtA’"," u_S1_trtA <- u_trtA","object_usage_linter" -"vignettes/psa_generation.Rmd",174,18,"warning","no visible binding for global variable β€˜c_S1’"," c_S1_trtA <- c_S1 + c_trtA","object_usage_linter" -"vignettes/psa_generation.Rmd",174,25,"warning","no visible binding for global variable β€˜c_trtA’"," c_S1_trtA <- c_S1 + c_trtA","object_usage_linter" -"vignettes/psa_generation.Rmd",175,18,"warning","no visible binding for global variable β€˜c_S2’"," c_S2_trtA <- c_S2 + c_trtA","object_usage_linter" -"vignettes/psa_generation.Rmd",175,25,"warning","no visible binding for global variable β€˜c_trtA’"," c_S2_trtA <- c_S2 + c_trtA","object_usage_linter" -"vignettes/psa_generation.Rmd",176,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",179,29,"warning","no visible binding for global variable β€˜p_S1S2’"," r_S1S2_trtB <- -log(1 - p_S1S2) * hr_S1S2_trtB ","object_usage_linter" -"vignettes/psa_generation.Rmd",179,39,"warning","no visible binding for global variable β€˜hr_S1S2_trtB’"," r_S1S2_trtB <- -log(1 - p_S1S2) * hr_S1S2_trtB ","object_usage_linter" -"vignettes/psa_generation.Rmd",179,51,"style","Trailing whitespace is superfluous."," r_S1S2_trtB <- -log(1 - p_S1S2) * hr_S1S2_trtB ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",182,18,"warning","no visible binding for global variable β€˜c_S1’"," c_S1_trtB <- c_S1 + c_trtB","object_usage_linter" -"vignettes/psa_generation.Rmd",182,25,"warning","no visible binding for global variable β€˜c_trtB’"," c_S1_trtB <- c_S1 + c_trtB","object_usage_linter" -"vignettes/psa_generation.Rmd",183,18,"warning","no visible binding for global variable β€˜c_S2’"," c_S2_trtB <- c_S2 + c_trtB","object_usage_linter" -"vignettes/psa_generation.Rmd",183,25,"warning","no visible binding for global variable β€˜c_trtB’"," c_S2_trtB <- c_S2 + c_trtB","object_usage_linter" -"vignettes/psa_generation.Rmd",185,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",186,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",194,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",195,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",198,42,"warning","no visible binding for global variable β€˜n_cycles’"," l_params_markov <- list(n_cycles = n_cycles, r_disc = r_disc, v_s_init = v_s_init,","object_usage_linter" -"vignettes/psa_generation.Rmd",198,61,"warning","no visible binding for global variable β€˜r_disc’"," l_params_markov <- list(n_cycles = n_cycles, r_disc = r_disc, v_s_init = v_s_init,","object_usage_linter" -"vignettes/psa_generation.Rmd",198,80,"warning","no visible binding for global variable β€˜v_s_init’"," l_params_markov <- list(n_cycles = n_cycles, r_disc = r_disc, v_s_init = v_s_init,","object_usage_linter" -"vignettes/psa_generation.Rmd",199,38,"warning","no visible binding for global variable β€˜c_H’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" -"vignettes/psa_generation.Rmd",199,50,"warning","no visible binding for global variable β€˜c_S2’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" -"vignettes/psa_generation.Rmd",199,63,"warning","no visible binding for global variable β€˜c_S1’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" -"vignettes/psa_generation.Rmd",199,75,"warning","no visible binding for global variable β€˜c_D’"," c_H = c_H, c_S1 = c_S2, c_S2 = c_S1, c_D = c_D,","object_usage_linter" -"vignettes/psa_generation.Rmd",200,38,"warning","no visible binding for global variable β€˜u_H’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" -"vignettes/psa_generation.Rmd",200,50,"warning","no visible binding for global variable β€˜u_S2’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" -"vignettes/psa_generation.Rmd",200,63,"warning","no visible binding for global variable β€˜u_S1’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" -"vignettes/psa_generation.Rmd",200,75,"warning","no visible binding for global variable β€˜u_D’"," u_H = u_H, u_S1 = u_S2, u_S2 = u_S1, u_D = u_D,","object_usage_linter" -"vignettes/psa_generation.Rmd",201,38,"warning","no visible binding for global variable β€˜r_HD’"," r_HD = r_HD, hr_S1D = hr_S1D, hr_S2D = hr_S2D,","object_usage_linter" -"vignettes/psa_generation.Rmd",201,53,"warning","no visible binding for global variable β€˜hr_S1D’"," r_HD = r_HD, hr_S1D = hr_S1D, hr_S2D = hr_S2D,","object_usage_linter" -"vignettes/psa_generation.Rmd",201,70,"warning","no visible binding for global variable β€˜hr_S2D’"," r_HD = r_HD, hr_S1D = hr_S1D, hr_S2D = hr_S2D,","object_usage_linter" -"vignettes/psa_generation.Rmd",202,39,"warning","no visible binding for global variable β€˜p_HS1’"," p_HS1 = p_HS1, p_S1H = p_S1H, p_S1S2 = p_S1S2)","object_usage_linter" -"vignettes/psa_generation.Rmd",202,54,"warning","no visible binding for global variable β€˜p_S1H’"," p_HS1 = p_HS1, p_S1H = p_S1H, p_S1S2 = p_S1S2)","object_usage_linter" -"vignettes/psa_generation.Rmd",202,70,"warning","no visible binding for global variable β€˜p_S1S2’"," p_HS1 = p_HS1, p_S1H = p_S1H, p_S1S2 = p_S1S2)","object_usage_linter" -"vignettes/psa_generation.Rmd",203,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",204,45,"style","There should be a space before an opening curly brace."," if (v_names_strat[i] == ""Treatment_A""){","brace_linter" -"vignettes/psa_generation.Rmd",204,45,"style","There should be a space between a right parenthesis and a body expression."," if (v_names_strat[i] == ""Treatment_A""){","paren_body_linter" -"vignettes/psa_generation.Rmd",208,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",209,16,"style","Place a space before left parenthesis, except in a function call."," } else if(v_names_strat[i] == ""Treatment_B""){","spaces_left_parentheses_linter" -"vignettes/psa_generation.Rmd",209,51,"style","There should be a space before an opening curly brace."," } else if(v_names_strat[i] == ""Treatment_B""){","brace_linter" -"vignettes/psa_generation.Rmd",209,51,"style","There should be a space between a right parenthesis and a body expression."," } else if(v_names_strat[i] == ""Treatment_B""){","paren_body_linter" -"vignettes/psa_generation.Rmd",216,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",222,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",238,24,"style","Trailing whitespace is superfluous."," ""p_HS1"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",239,24,"style","Trailing whitespace is superfluous."," ""p_S1H"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",240,25,"style","Trailing whitespace is superfluous."," ""p_S1S2"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",242,24,"style","Trailing whitespace is superfluous."," ""hr_S1"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",246,22,"style","Trailing whitespace is superfluous."," ""c_H"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",247,23,"style","Trailing whitespace is superfluous."," ""c_S1"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",254,23,"style","Trailing whitespace is superfluous."," ""u_S2"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",258,22,"style","Trailing whitespace is superfluous."," ""beta"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",259,22,"style","Trailing whitespace is superfluous."," ""beta"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",263,28,"style","Trailing whitespace is superfluous."," ""log-normal"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",266,23,"style","Trailing whitespace is superfluous."," ""gamma"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",267,23,"style","Trailing whitespace is superfluous."," ""gamma"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",269,23,"style","Trailing whitespace is superfluous."," ""gamma"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",270,23,"style","Trailing whitespace is superfluous."," ""gamma"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",272,34,"style","Trailing whitespace is superfluous."," ""truncated-normal"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",273,34,"style","Trailing whitespace is superfluous."," ""truncated-normal"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",274,34,"style","Trailing whitespace is superfluous."," ""truncated-normal"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",278,39,"style","Trailing whitespace is superfluous."," ""a, b"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",279,39,"style","Trailing whitespace is superfluous."," ""a, b"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",282,43,"style","Trailing whitespace is superfluous."," ""mean, sd"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",283,43,"style","Trailing whitespace is superfluous."," ""mean, sd"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",286,47,"style","Trailing whitespace is superfluous."," ""shape, scale"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",287,47,"style","Trailing whitespace is superfluous."," ""shape, scale"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",292,51,"style","Trailing whitespace is superfluous."," ""mean, sd, ll, ul"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",293,51,"style","Trailing whitespace is superfluous."," ""mean, sd, ll, ul"", ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",298,38,"style","Trailing whitespace is superfluous."," c(7.5, 42.5), ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",299,35,"style","Trailing whitespace is superfluous."," c(12, 12), ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",302,35,"style","Trailing whitespace is superfluous."," c(3, 0.5), ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",306,37,"style","Trailing whitespace is superfluous."," c(44.5, 45), ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",308,39,"style","Trailing whitespace is superfluous."," c(900, 16.67), ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",313,46,"style","Trailing whitespace is superfluous."," c(0.75, 0.02, NA, 1), ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",316,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",332,41,"style","Trailing whitespace is superfluous."," r_HD = 0.002, ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",333,39,"style","Trailing whitespace is superfluous."," hr_S1D = 3, ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",338,41,"style","Trailing whitespace is superfluous."," c_S2 = 15000, ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",364,62,"style","Trailing whitespace is superfluous.","cea_psa <- make_psa_obj(cost = psa_output$Cost$other_outcome, ","trailing_whitespace_linter" -"vignettes/psa_generation.Rmd",365,64,"style","Trailing whitespace is superfluous."," effect = psa_output$QALY$other_outcome, ","trailing_whitespace_linter" -"vignettes/voi.Rmd",37,42,"style","Trailing whitespace is superfluous.","psa_big <- make_psa_obj(example_psa$cost, ","trailing_whitespace_linter" -"vignettes/voi.Rmd",39,48,"style","Trailing whitespace is superfluous."," example_psa$parameters, ","trailing_whitespace_linter" -"vignettes/voi.Rmd",54,24,"style","Trailing whitespace is superfluous."," txtsize = 16, ","trailing_whitespace_linter" -"vignettes/voi.Rmd",55,33,"style","Trailing whitespace is superfluous."," effect_units = ""QALY"", ","trailing_whitespace_linter" -"vignettes/voi.Rmd",57,42,"style","Trailing whitespace is superfluous."," xbreaks = seq(0, 200, by = 10), ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/dampack/email-body b/.dev/revdep_emails/dampack/email-body deleted file mode 100644 index 5b693382a..000000000 --- a/.dev/revdep_emails/dampack/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Greg Knowlton! Thank you for using {lintr} in your package {dampack}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/DARTH-git/dampack (hash: 09da4afe8cb56d99637ee1e51a67bfbdae6385d2) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 27s on CRAN vs. 14s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/dashboardthemes/attachments/dashboardthemes.warnings b/.dev/revdep_emails/dashboardthemes/attachments/dashboardthemes.warnings deleted file mode 100644 index 3c25f3e16..000000000 --- a/.dev/revdep_emails/dashboardthemes/attachments/dashboardthemes.warnings +++ /dev/null @@ -1,263 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Linter closed_curly_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. -Trying to remove β€˜open_curly_linter’, β€˜undesirable_function_linter’, β€˜undesirable_operator_linter’ and β€˜todo_comment_linter’, which are not in `defaults`. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. diff --git a/.dev/revdep_emails/dashboardthemes/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/dashboardthemes/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 35aab9a3a..000000000 --- a/.dev/revdep_emails/dashboardthemes/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,3 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"vignettes/using_dashboardthemes.Rmd",70,3,"error","unexpected symbol"," ...",NA -"vignettes/using_dashboardthemes.Rmd",267,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" diff --git a/.dev/revdep_emails/dashboardthemes/email-body b/.dev/revdep_emails/dashboardthemes/email-body deleted file mode 100644 index 427c235c2..000000000 --- a/.dev/revdep_emails/dashboardthemes/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Nik Lilovski! Thank you for using {lintr} in your package {dashboardthemes}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/nik01010/dashboardthemes (hash: 107e5a56663ed586f54655754069f4680647f37c) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 11s on CRAN vs. 8s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/dat/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/dat/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 6e7ec86ce..000000000 --- a/.dev/revdep_emails/dat/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,7 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/DataFrame.R",64,1,"style","Variable and function name style should be snake_case.","as.DataFrame.data.frame <- function(x, ...) {","object_name_linter" -"R/dataTableBackend.R",44,7,"style","Variable and function name style should be snake_case."," env$.__x__ <- x","object_name_linter" -"R/helper.R",20,13,"style","Variable and function name style should be snake_case."," .self$classOfX <- class(xS3)","object_name_linter" -"R/helper.R",23,13,"style","Variable and function name style should be snake_case."," .self$s4Object <- x","object_name_linter" -"R/helper.R",28,13,"style","Variable and function name style should be snake_case."," .self$classOfX <- class(x)","object_name_linter" -"R/useDplyr.R",12,1,"style","Variable and function name style should be snake_case.",".onAttach <- function(libname, pkgname) {","object_name_linter" diff --git a/.dev/revdep_emails/dat/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/dat/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index a856b4180..000000000 --- a/.dev/revdep_emails/dat/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,44 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/as.function.R",30,3,"style","`else` should come on the same line as the previous `}`."," else if (length(x) == 3) {","brace_linter" -"R/as.function.R",30,8,"style","Either both or neither branch in `if`/`else` should use curly braces."," else if (length(x) == 3) {","brace_linter" -"R/dataTableBackend.R",28,9,"style","Variable and function name style should be snake_case or symbols."," names(listOfNames) <- colsTmp","object_name_linter" -"R/FormulaList.R",47,9,"style","Variable and function name style should be snake_case or symbols."," names(formulaList) <- NULL","object_name_linter" -"R/FormulaList.R",62,3,"style","`else` should come on the same line as the previous `}`."," else if (is.list(object@.n)) {","brace_linter" -"R/helper.R",22,29,"style","Variable and function name style should be snake_case or symbols."," S3Part(x, needClass = ""data.frame"") <- data.frame()","object_name_linter" -"R/helper.R",27,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/helper.R",42,5,"style","`else` should come on the same line as the previous `}`."," else if (!is.null(classOfX)) {","brace_linter" -"R/helper.R",45,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/helper.R",81,10,"style","Variable and function name style should be snake_case or symbols."," S3Part(.Object) <- addTypeCheck(.Object@fun, class(.Object@prototype)) %>%","object_name_linter" -"R/helper.R",87,10,"style","Variable and function name style should be snake_case or symbols."," S3Part(.Object) <- addTypeCheck(.Object@fun, .Object@type)","object_name_linter" -"R/helper.R",92,11,"style","Compound semicolons are discouraged. Replace them by a newline."," force(f); force(l)","semicolon_linter" -"R/helper.R",106,11,"style","Compound semicolons are discouraged. Replace them by a newline."," force(f); force(type)","semicolon_linter" -"R/helper.R",196,10,"style","Variable and function name style should be snake_case or symbols."," S3Part(.Object) <- formula(tmp, lhs = 1, rhs = 1)","object_name_linter" -"R/helper.R",198,3,"style","Variable and function name style should be snake_case or symbols."," .Object@.n <- eval(.nUnevaluated, envir = environment(.Object))","object_name_linter" -"R/map.R",111,10,"style","Either both or neither branch in `if`/`else` should use curly braces."," ind <- if (length(p) == 1 && grepl(""^\\^"", p)) {","brace_linter" -"tests/testthat/test-DataFrame.R",85,9,"style","Variable and function name style should be snake_case or symbols."," datRef[""newVar""] <- datRef$x + 1","object_name_linter" -"tests/testthat/test-DataFrame.R",94,9,"style","Variable and function name style should be snake_case or symbols."," datRef[""newVar""] <- datRef$x + 1","object_name_linter" -"tests/testthat/test-DataFrame.R",95,9,"style","Variable and function name style should be snake_case or symbols."," datRef[""newVar1""] <- datRef$x + 2","object_name_linter" -"tests/testthat/test-DataFrame.R",105,9,"style","Variable and function name style should be snake_case or symbols."," datRef[""newVar""] <- datRef$x + 1","object_name_linter" -"tests/testthat/test-DataFrame.R",106,9,"style","Variable and function name style should be snake_case or symbols."," datRef[""newVar1""] <- datRef$x + 2","object_name_linter" -"tests/testthat/test-DataFrame.R",117,9,"style","Variable and function name style should be snake_case or symbols."," datRef[""newVar""] <- datRef$x + 1","object_name_linter" -"tests/testthat/test-DataFrame.R",118,9,"style","Variable and function name style should be snake_case or symbols."," datRef[""newVar1""] <- datRef$x + 2","object_name_linter" -"tests/testthat/test-DataFrame.R",126,9,"style","Variable and function name style should be snake_case or symbols."," datRef$id <- datRef$x > 4","object_name_linter" -"tests/testthat/test-DataFrame.R",128,15,"style","Variable and function name style should be snake_case or symbols."," names(datRef)[2] <- ""count""","object_name_linter" -"vignettes/Introduction.Rmd",136,1,"style","Variable and function name style should be snake_case or symbols.","DataTable <- function(...) {","object_name_linter" -"vignettes/performance.Rmd",56,1,"style","Variable and function name style should be snake_case or symbols.","N <- 2e7 # more is not possible with small laptop","object_name_linter" -"vignettes/performance.Rmd",57,1,"style","Variable and function name style should be snake_case or symbols.","K <- 100","object_name_linter" -"vignettes/performance.Rmd",60,1,"style","Variable and function name style should be snake_case or symbols.","DT <- data.table(","object_name_linter" -"vignettes/performance.Rmd",61,33,"style","Commas should always have a space after."," id1 = sample(sprintf(""id%03d"",1:K), N, TRUE), # large groups (char)","commas_linter" -"vignettes/performance.Rmd",62,33,"style","Commas should always have a space after."," id2 = sample(sprintf(""id%03d"",1:K), N, TRUE), # large groups (char)","commas_linter" -"vignettes/performance.Rmd",63,34,"style","Commas should always have a space after."," id3 = sample(sprintf(""id%010d"",1:(N/K)), N, TRUE), # small groups (char)","commas_linter" -"vignettes/performance.Rmd",63,38,"style","Put spaces around all infix operators."," id3 = sample(sprintf(""id%010d"",1:(N/K)), N, TRUE), # small groups (char)","infix_spaces_linter" -"vignettes/performance.Rmd",66,17,"style","Put spaces around all infix operators."," id6 = sample(N/K, N, TRUE), # small groups (int)","infix_spaces_linter" -"vignettes/performance.Rmd",69,32,"style","Commas should always have a space after."," v3 = sample(round(runif(100,max=100),4), N, TRUE) # numeric e.g. 23.5749","commas_linter" -"vignettes/performance.Rmd",69,35,"style","Put spaces around all infix operators."," v3 = sample(round(runif(100,max=100),4), N, TRUE) # numeric e.g. 23.5749","infix_spaces_linter" -"vignettes/performance.Rmd",69,41,"style","Commas should always have a space after."," v3 = sample(round(runif(100,max=100),4), N, TRUE) # numeric e.g. 23.5749","commas_linter" -"vignettes/performance.Rmd",74,1,"style","Variable and function name style should be snake_case or symbols.","DT4 <- new(""DataTable"", DT)","object_name_linter" -"vignettes/performance.Rmd",76,29,"style","Commas should always have a space after.","cat(""GB ="", round(sum(gc()[,2]) / 1024, 3), ""\n"")","commas_linter" -"vignettes/performance.Rmd",105,81,"style","Lines should not be more than 80 characters.","system.time(group_by(DT, id4) %>% summarise(V1 = mean(v1), V2 = mean(v2), V3 = mean(v3)))","line_length_linter" -"vignettes/performance.Rmd",106,81,"style","Lines should not be more than 80 characters.","system.time(group_by(DT, id4) %>% summarise(V1 = mean(v1), V2 = mean(v2), V3 = mean(v3)))","line_length_linter" -"vignettes/performance.Rmd",112,81,"style","Lines should not be more than 80 characters.","system.time(group_by(DT, id6) %>% summarise(V1 = sum(v1), V2 = sum(v2), V3 = sum(v3)))","line_length_linter" -"vignettes/performance.Rmd",113,81,"style","Lines should not be more than 80 characters.","system.time(group_by(DT, id6) %>% summarise(V1 = sum(v1), V2 = sum(v2), V3 = sum(v3)))","line_length_linter" diff --git a/.dev/revdep_emails/dat/email-body b/.dev/revdep_emails/dat/email-body deleted file mode 100644 index fbea9e5cc..000000000 --- a/.dev/revdep_emails/dat/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Sebastian Warnholz! Thank you for using {lintr} in your package {dat}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/wahani/dat (hash: 1e5f56bc36f67bcf1cccb29e48e73cce3406c679) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 18s on CRAN vs. 11s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/datarobot/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/datarobot/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 71597f503..000000000 --- a/.dev/revdep_emails/datarobot/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,104 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/doc/AdvancedVignette.R",112,4,"style","Variable and function name style should be snake_case.","lc$binWeight <- NULL","object_name_linter" -"inst/doc/Calendars.R",61,10,"style","Variable and function name style should be snake_case.","calendar$projectIds <- list(""59dab74bbd2a54035786bfc0"")","object_name_linter" -"inst/doc/VariableImportance.R",87,10,"style","Variable and function name style should be snake_case."," deltas$New <- xRef","object_name_linter" -"R/AdvancedTuning.R",34,10,"style","Variable and function name style should be snake_case."," params$tuningParameters <- lapply(params$tuningParameters,","object_name_linter" -"R/Blueprints.R",22,39,"style","Variable and function name style should be snake_case."," blueprint$blueprintId <- blueprint$id","object_name_linter" -"R/Calendars.R",42,10,"style","Variable and function name style should be snake_case."," body$multiseriesIdColumns <- jsonlite::toJSON(multiSeriesIdColumn)","object_name_linter" -"R/CloneProject.R",25,10,"style","Variable and function name style should be snake_case."," body$projectId <- projectId","object_name_linter" -"R/CloneProject.R",26,10,"style","Variable and function name style should be snake_case."," body$projectName <- newProjectName","object_name_linter" -"R/ComplianceDocumentation.R",105,9,"style","Variable and function name style should be snake_case."," query$namePart <- namePart","object_name_linter" -"R/ConfusionChart.R",71,16,"style","Variable and function name style should be snake_case."," chart$data$classMetrics <- as.list(chart$data$classMetrics[[1]])","object_name_linter" -"R/ConfusionChart.R",73,16,"style","Variable and function name style should be snake_case."," chart$data$confusionMatrix <- chart$data$confusionMatrix[[1]]","object_name_linter" -"R/DataSources.R",17,12,"style","Variable and function name style should be snake_case."," elements$dataStoreId <- elements$params$dataStoreId","object_name_linter" -"R/Deployment.R",34,8,"style","Variable and function name style should be snake_case."," body$defaultPredictionServerId <- defaultPredictionServerId","object_name_linter" -"R/Deployment.R",155,7,"style","Variable and function name style should be snake_case."," out$modelHealth <- ApplySchema(out$modelHealth,","object_name_linter" -"R/Deployment.R",157,7,"style","Variable and function name style should be snake_case."," out$accuracyHealth <- ApplySchema(out$accuracyHealth,","object_name_linter" -"R/Deployment.R",159,7,"style","Variable and function name style should be snake_case."," out$serviceHealth <- ApplySchema(out$serviceHealth,","object_name_linter" -"R/Deployment.R",161,7,"style","Variable and function name style should be snake_case."," out$predictionUsage <- ApplySchema(out$predictionUsage,","object_name_linter" -"R/Deployment.R",367,7,"style","Variable and function name style should be snake_case."," out$targetDrift <- ApplySchema(out$targetDrift, ""enabled"")","object_name_linter" -"R/Deployment.R",368,7,"style","Variable and function name style should be snake_case."," out$featureDrift <- ApplySchema(out$featureDrift, ""enabled"")","object_name_linter" -"R/Deployment.R",369,7,"style","Variable and function name style should be snake_case."," out$associationId <- ApplySchema(out$associationId, c(""columnNames"",","object_name_linter" -"R/Deployment.R",395,10,"style","Variable and function name style should be snake_case."," body$targetDrift <- list(enabled = targetDriftEnabled)","object_name_linter" -"R/Deployment.R",398,10,"style","Variable and function name style should be snake_case."," body$featureDrift <- list(enabled = featureDriftEnabled)","object_name_linter" -"R/Deployment.R",584,7,"style","Variable and function name style should be snake_case."," out$dataRobotKey <- out[[""datarobot-key""]]","object_name_linter" -"R/DeploymentAccuracy.R",68,11,"style","Variable and function name style should be snake_case."," query$modelId <- modelId","object_name_linter" -"R/DeploymentAccuracy.R",75,11,"style","Variable and function name style should be snake_case."," query$segmentAttribute <- segmentAttribute","object_name_linter" -"R/DeploymentAccuracy.R",76,11,"style","Variable and function name style should be snake_case."," query$segmentValue <- segmentValue","object_name_linter" -"R/DeploymentAccuracy.R",77,11,"style","Variable and function name style should be snake_case."," query$targetClasses <- targetClasses","object_name_linter" -"R/DeploymentAccuracy.R",187,11,"style","Variable and function name style should be snake_case."," query$modelId <- modelId","object_name_linter" -"R/DeploymentAccuracy.R",194,11,"style","Variable and function name style should be snake_case."," query$bucketSize <- bucketSize","object_name_linter" -"R/DeploymentAccuracy.R",195,11,"style","Variable and function name style should be snake_case."," query$segmentAttribute <- segmentAttribute","object_name_linter" -"R/DeploymentAccuracy.R",196,11,"style","Variable and function name style should be snake_case."," query$segmentValue <- segmentValue","object_name_linter" -"R/DeploymentAccuracy.R",223,25,"style","Variable and function name style should be snake_case."," outlist$summary$sampleSize <- 0L","object_name_linter" -"R/DeploymentAccuracy.R",234,26,"style","Variable and function name style should be snake_case."," outlist$baseline$sampleSize <- 0L","object_name_linter" -"R/DeploymentServiceStats.R",76,11,"style","Variable and function name style should be snake_case."," query$modelId <- modelId","object_name_linter" -"R/DeploymentServiceStats.R",83,11,"style","Variable and function name style should be snake_case."," query$executionTimeQuantile <- executionTimeQuantile","object_name_linter" -"R/DeploymentServiceStats.R",84,11,"style","Variable and function name style should be snake_case."," query$responseTimeQuantile <- responseTimeQuantile","object_name_linter" -"R/DeploymentServiceStats.R",85,11,"style","Variable and function name style should be snake_case."," query$slowRequestsThreshold <- slowRequestsThreshold","object_name_linter" -"R/DeploymentServiceStats.R",86,11,"style","Variable and function name style should be snake_case."," query$segmentAttribute <- segmentAttribute","object_name_linter" -"R/DeploymentServiceStats.R",87,11,"style","Variable and function name style should be snake_case."," query$segmentValue <- segmentValue","object_name_linter" -"R/DeploymentServiceStats.R",99,21,"style","Variable and function name style should be snake_case."," outlist$metrics$totalRequests <- as.integer(outlist$metrics$totalRequests)","object_name_linter" -"R/DeploymentServiceStats.R",100,21,"style","Variable and function name style should be snake_case."," outlist$metrics$slowRequests <- as.integer(outlist$metrics$slowRequests)","object_name_linter" -"R/DeploymentServiceStats.R",101,21,"style","Variable and function name style should be snake_case."," outlist$metrics$medianLoad <- as.integer(outlist$metrics$medianLoad)","object_name_linter" -"R/DeploymentServiceStats.R",102,21,"style","Variable and function name style should be snake_case."," outlist$metrics$peakLoad <- as.integer(outlist$metrics$peakLoad)","object_name_linter" -"R/DeploymentServiceStats.R",103,21,"style","Variable and function name style should be snake_case."," outlist$metrics$numConsumers <- as.integer(outlist$metrics$numConsumers)","object_name_linter" -"R/DeploymentServiceStats.R",211,11,"style","Variable and function name style should be snake_case."," query$modelId <- modelId","object_name_linter" -"R/DeploymentServiceStats.R",218,11,"style","Variable and function name style should be snake_case."," query$bucketSize <- bucketSize","object_name_linter" -"R/DeploymentServiceStats.R",221,11,"style","Variable and function name style should be snake_case."," query$segmentAttribute <- segmentAttribute","object_name_linter" -"R/DeploymentServiceStats.R",222,11,"style","Variable and function name style should be snake_case."," query$segmentValue <- segmentValue","object_name_linter" -"R/Featurelists.R",262,11,"style","Variable and function name style should be snake_case."," flist$featurelistId <- flist$id","object_name_linter" -"R/Featurelists.R",298,11,"style","Variable and function name style should be snake_case."," flist$featurelistId <- flist$id","object_name_linter" -"R/Features.R",219,9,"style","Variable and function name style should be snake_case."," query$binLimit <- binLimit","object_name_linter" -"R/GetPredictions.R",241,9,"style","Variable and function name style should be snake_case."," query$modelId <- modelId","object_name_linter" -"R/GetPredictions.R",242,9,"style","Variable and function name style should be snake_case."," query$datasetId <- datasetId","object_name_linter" -"R/Models.R",236,33,"style","Variable and function name style should be snake_case."," model$projectName <- fullProject$projectName","object_name_linter" -"R/Models.R",237,33,"style","Variable and function name style should be snake_case."," model$projectTarget <- fullProject$target","object_name_linter" -"R/Models.R",238,33,"style","Variable and function name style should be snake_case."," model$projectMetric <- fullProject$metric","object_name_linter" -"R/Models.R",519,10,"style","Variable and function name style should be snake_case."," body$samplePct <- samplePct","object_name_linter" -"R/Models.R",522,10,"style","Variable and function name style should be snake_case."," body$trainingRowCount <- trainingRowCount","object_name_linter" -"R/MultiSeries.R",121,13,"style","Variable and function name style should be snake_case."," payload$multiseriesIdColumns <- multiseriesIdColumns","object_name_linter" -"R/MultiSeries.R",192,13,"style","Variable and function name style should be snake_case."," payload$multiseriesIdColumn <- multiseriesIdColumns","object_name_linter" -"R/MultiSeries.R",202,13,"style","Variable and function name style should be snake_case."," payload$crossSeriesGroupByColumns <- crossSeriesGroupByColumns","object_name_linter" -"R/Partitions.R",172,17,"style","Variable and function name style should be snake_case."," partition$cvHoldoutLevel <- NA","object_name_linter" -"R/Partitions.R",174,17,"style","Variable and function name style should be snake_case."," partition$cvHoldoutLevel <- cvHoldoutLevel","object_name_linter" -"R/Partitions.R",181,17,"style","Variable and function name style should be snake_case."," partition$trainingLevel <- trainingLevel","object_name_linter" -"R/Partitions.R",182,17,"style","Variable and function name style should be snake_case."," partition$holdoutLevel <- holdoutLevel","object_name_linter" -"R/Partitions.R",188,17,"style","Variable and function name style should be snake_case."," partition$validationLevel <- validationLevel","object_name_linter" -"R/Partitions.R",406,13,"style","Variable and function name style should be snake_case."," partition$datetimePartitionColumn <- datetimePartitionColumn","object_name_linter" -"R/Partitions.R",407,13,"style","Variable and function name style should be snake_case."," partition$autopilotDataSelectionMethod <- autopilotDataSelectionMethod","object_name_linter" -"R/Partitions.R",408,13,"style","Variable and function name style should be snake_case."," partition$validationDuration <- validationDuration","object_name_linter" -"R/Partitions.R",409,13,"style","Variable and function name style should be snake_case."," partition$holdoutStartDate <- holdoutStartDate","object_name_linter" -"R/Partitions.R",410,13,"style","Variable and function name style should be snake_case."," partition$holdoutDuration <- holdoutDuration","object_name_linter" -"R/Partitions.R",411,13,"style","Variable and function name style should be snake_case."," partition$disableHoldout <- disableHoldout","object_name_linter" -"R/Partitions.R",412,13,"style","Variable and function name style should be snake_case."," partition$gapDuration <- gapDuration","object_name_linter" -"R/Partitions.R",413,13,"style","Variable and function name style should be snake_case."," partition$numberOfBacktests <- numberOfBacktests","object_name_linter" -"R/Partitions.R",415,13,"style","Variable and function name style should be snake_case."," partition$useTimeSeries <- useTimeSeries","object_name_linter" -"R/Partitions.R",416,13,"style","Variable and function name style should be snake_case."," partition$defaultToKnownInAdvance <- defaultToKnownInAdvance","object_name_linter" -"R/Partitions.R",417,13,"style","Variable and function name style should be snake_case."," partition$featureDerivationWindowStart <- featureDerivationWindowStart","object_name_linter" -"R/Partitions.R",418,13,"style","Variable and function name style should be snake_case."," partition$featureDerivationWindowEnd <- featureDerivationWindowEnd","object_name_linter" -"R/Partitions.R",419,13,"style","Variable and function name style should be snake_case."," partition$featureSettings <- featureSettings","object_name_linter" -"R/Partitions.R",420,13,"style","Variable and function name style should be snake_case."," partition$treatAsExponential <- treatAsExponential","object_name_linter" -"R/Partitions.R",421,13,"style","Variable and function name style should be snake_case."," partition$differencingMethod <- differencingMethod","object_name_linter" -"R/Partitions.R",423,13,"style","Variable and function name style should be snake_case."," partition$windowsBasisUnit <- windowsBasisUnit","object_name_linter" -"R/Partitions.R",424,13,"style","Variable and function name style should be snake_case."," partition$forecastWindowStart <- forecastWindowStart","object_name_linter" -"R/Partitions.R",425,13,"style","Variable and function name style should be snake_case."," partition$forecastWindowEnd <- forecastWindowEnd","object_name_linter" -"R/Partitions.R",426,13,"style","Variable and function name style should be snake_case."," partition$multiseriesIdColumns <- multiseriesIdColumns","object_name_linter" -"R/Partitions.R",427,13,"style","Variable and function name style should be snake_case."," partition$useCrossSeriesFeatures <- useCrossSeries","object_name_linter" -"R/Partitions.R",428,13,"style","Variable and function name style should be snake_case."," partition$aggregationType <- aggregationType","object_name_linter" -"R/Partitions.R",429,13,"style","Variable and function name style should be snake_case."," partition$calendarId <- calendarId","object_name_linter" -"R/Partitions.R",430,13,"style","Variable and function name style should be snake_case."," partition$crossSeriesGroupByColumns <- crossSeriesGroupByColumns","object_name_linter" -"R/Partitions.R",604,8,"style","Variable and function name style should be snake_case."," spec$cvMethod <- NULL","object_name_linter" -"R/Partitions.R",628,8,"style","Variable and function name style should be snake_case."," part$cvMethod <- cvMethods$DATETIME","object_name_linter" -"R/PredictionDatasets.R",120,10,"style","Variable and function name style should be snake_case."," body$forecastPoint <- forecastPoint","object_name_linter" -"R/PredictionDatasets.R",123,10,"style","Variable and function name style should be snake_case."," body$relaxKIAFeaturesCheck <- relaxKIAFeaturesCheck","object_name_linter" -"R/PredictionExplanations.R",191,10,"style","Variable and function name style should be snake_case."," body$maxExplanations <- maxExplanations","object_name_linter" -"R/PredictionExplanations.R",194,10,"style","Variable and function name style should be snake_case."," body$thresholdLow <- thresholdLow","object_name_linter" -"R/PredictionExplanations.R",197,10,"style","Variable and function name style should be snake_case."," body$thresholdHigh <- thresholdHigh","object_name_linter" -"R/PrimeFiles.R",24,11,"style","Variable and function name style should be snake_case."," query$parentModelId <- parentModelId","object_name_linter" -"R/PrimeFiles.R",27,11,"style","Variable and function name style should be snake_case."," query$modelId <- modelId","object_name_linter" -"R/RequestSampleSizeUpdate.R",45,10,"style","Variable and function name style should be snake_case."," body$samplePct <- samplePct","object_name_linter" -"R/RequestSampleSizeUpdate.R",48,10,"style","Variable and function name style should be snake_case."," body$trainingRowCount <- trainingRowCount","object_name_linter" -"R/StartAutopilot.R",170,21,"style","Variable and function name style should be snake_case."," partition$multiseriesIdColumns <- list(partition$multiseriesIdColumns)","object_name_linter" -"R/Validate.R",139,17,"style","Variable and function name style should be snake_case."," partition$validationPct <- validationPct","object_name_linter" -"R/zzz.R",5,1,"style","Variable and function name style should be snake_case.",".onAttach <- function(libname, pkgname) {","object_name_linter" diff --git a/.dev/revdep_emails/datarobot/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/datarobot/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 2d72e02a5..000000000 --- a/.dev/revdep_emails/datarobot/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,967 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/doc/AdvancedTuning.Rmd",22,1,"style","Variable and function name style should be snake_case or symbols.","tuningJobId <- RunInteractiveTuning(myModel)","object_name_linter" -"inst/doc/AdvancedTuning.Rmd",28,1,"style","Variable and function name style should be snake_case or symbols.","tunedModel <- GetModelFromJobId(myModel$projectId, tuningJobId)","object_name_linter" -"inst/doc/AdvancedTuning.Rmd",54,1,"style","Variable and function name style should be snake_case or symbols.","myXGBModel <- GetModel(projectId, modelId)","object_name_linter" -"inst/doc/AdvancedTuning.Rmd",55,1,"style","Variable and function name style should be snake_case or symbols.","RunTune <- StartTuningSession(myXGBModel)","object_name_linter" -"inst/doc/AdvancedTuning.Rmd",56,1,"style","Variable and function name style should be snake_case or symbols.","tuningJob <- RunTune(myXGBModel, colsample_bytree = 0.4, colsample_bylevel = 0.8)","object_name_linter" -"inst/doc/AdvancedTuning.Rmd",56,81,"style","Lines should not be more than 80 characters.","tuningJob <- RunTune(myXGBModel, colsample_bytree = 0.4, colsample_bylevel = 0.8)","line_length_linter" -"inst/doc/AdvancedTuning.Rmd",57,1,"style","Variable and function name style should be snake_case or symbols.","tunedModel <- GetModelFromJobId(projectId, tuningJob)","object_name_linter" -"inst/doc/AdvancedVignette.Rmd",37,81,"style","Lines should not be more than 80 characters.","ConnectToDataRobot(endpoint = ""http:///api/v2"", token = """")","line_length_linter" -"inst/doc/AdvancedVignette.Rmd",46,1,"style","Variable and function name style should be snake_case or symbols.","lendingClubURL <- ""https://s3.amazonaws.com/datarobot_public_datasets/10K_Lending_Club_Loans.csv""","object_name_linter" -"inst/doc/AdvancedVignette.Rmd",46,81,"style","Lines should not be more than 80 characters.","lendingClubURL <- ""https://s3.amazonaws.com/datarobot_public_datasets/10K_Lending_Club_Loans.csv""","line_length_linter" -"inst/doc/AdvancedVignette.Rmd",79,1,"style","Variable and function name style should be snake_case or symbols.","allModels <- ListModels(project)","object_name_linter" -"inst/doc/AdvancedVignette.Rmd",81,1,"style","Variable and function name style should be snake_case or symbols.","modelFrame <- as.data.frame(allModels)","object_name_linter" -"inst/doc/AdvancedVignette.Rmd",83,27,"style","Only use double-quotes.","if (project$metric %in% c('AUC', 'Gini Norm')) {","single_quotes_linter" -"inst/doc/AdvancedVignette.Rmd",83,34,"style","Only use double-quotes.","if (project$metric %in% c('AUC', 'Gini Norm')) {","single_quotes_linter" -"inst/doc/AdvancedVignette.Rmd",84,3,"style","Variable and function name style should be snake_case or symbols."," bestIndex <- which.max(metric)","object_name_linter" -"inst/doc/AdvancedVignette.Rmd",86,3,"style","Variable and function name style should be snake_case or symbols."," bestIndex <- which.min(metric)","object_name_linter" -"inst/doc/AdvancedVignette.Rmd",88,1,"style","Variable and function name style should be snake_case or symbols.","bestModel <- allModels[[bestIndex]]","object_name_linter" -"inst/doc/AdvancedVignette.Rmd",93,1,"style","Variable and function name style should be snake_case or symbols.","allModels <- readRDS(""modelsModelInsights.rds"")","object_name_linter" -"inst/doc/AdvancedVignette.Rmd",94,1,"style","Variable and function name style should be snake_case or symbols.","bestModel <- allModels[[1]]","object_name_linter" -"inst/doc/AdvancedVignette.Rmd",115,1,"style","Variable and function name style should be snake_case or symbols.","ValidationLiftChart <- GetLiftChart(bestModel, source = ""validation"")","object_name_linter" -"inst/doc/AdvancedVignette.Rmd",122,1,"style","Variable and function name style should be snake_case or symbols.","LiftChartPlot <- function(ValidationLiftChart, bins = 10) {","object_name_linter" -"inst/doc/AdvancedVignette.Rmd",122,27,"style","Variable and function name style should be snake_case or symbols.","LiftChartPlot <- function(ValidationLiftChart, bins = 10) {","object_name_linter" -"inst/doc/AdvancedVignette.Rmd",124,5,"style","Variable and function name style should be snake_case or symbols."," ValidationLiftChart$bins <- rep(seq(bins), each = 60 / bins)","object_name_linter" -"inst/doc/AdvancedVignette.Rmd",125,5,"style","Variable and function name style should be snake_case or symbols."," ValidationLiftChart <- data.table(ValidationLiftChart)","object_name_linter" -"inst/doc/AdvancedVignette.Rmd",133,1,"style","Variable and function name style should be snake_case or symbols.","LiftChartData <- LiftChartPlot(ValidationLiftChart)","object_name_linter" -"inst/doc/AdvancedVignette.Rmd",142,3,"style","Commented code should be removed.","# dr_dark_blue <- ""#08233F""","commented_code_linter" -"inst/doc/AdvancedVignette.Rmd",143,3,"style","Commented code should be removed.","# dr_blue <- ""#1F77B4""","commented_code_linter" -"inst/doc/AdvancedVignette.Rmd",144,3,"style","Commented code should be removed.","# dr_orange <- ""#FF7F0E""","commented_code_linter" -"inst/doc/AdvancedVignette.Rmd",145,3,"style","Commented code should be removed.","# LiftChartData <- readRDS(""LiftChartDataVal.rds"")","commented_code_linter" -"inst/doc/AdvancedVignette.Rmd",146,3,"style","Commented code should be removed.","# par(bg = dr_dark_blue)","commented_code_linter" -"inst/doc/AdvancedVignette.Rmd",149,3,"style","Commented code should be removed.","# lines(LiftChartData$Predicted, col = dr_blue, pch = 20, type = ""b"")","commented_code_linter" -"inst/doc/AdvancedVignette.Rmd",156,1,"style","Variable and function name style should be snake_case or symbols.","AllLiftChart <- ListLiftCharts(bestModel)","object_name_linter" -"inst/doc/AdvancedVignette.Rmd",157,1,"style","Variable and function name style should be snake_case or symbols.","LiftChartData <- LiftChartPlot(AllLiftChart[[""crossValidation""]])","object_name_linter" -"inst/doc/AdvancedVignette.Rmd",166,3,"style","Commented code should be removed.","# LiftChartData <- readRDS(""LiftChartDataCV.rds"")","commented_code_linter" -"inst/doc/AdvancedVignette.Rmd",167,3,"style","Commented code should be removed.","# par(bg = dr_dark_blue)","commented_code_linter" -"inst/doc/AdvancedVignette.Rmd",170,3,"style","Commented code should be removed.","# lines(LiftChartData$Predicted, col = dr_blue, pch = 20, type = ""b"")","commented_code_linter" -"inst/doc/AdvancedVignette.Rmd",212,1,"style","Variable and function name style should be snake_case or symbols.","ValidationRocCurve <- GetRocCurve(bestModel)","object_name_linter" -"inst/doc/AdvancedVignette.Rmd",213,1,"style","Variable and function name style should be snake_case or symbols.","ValidationRocPoints <- ValidationRocCurve[[""rocPoints""]]","object_name_linter" -"inst/doc/AdvancedVignette.Rmd",216,81,"style","Lines should not be more than 80 characters.","plot(ValidationRocPoints$falsePositiveRate, ValidationRocPoints$truePositiveRate,","line_length_linter" -"inst/doc/AdvancedVignette.Rmd",218,81,"style","Lines should not be more than 80 characters."," xlab = ""False Positive Rate (Fallout)"", ylab = ""True Positive Rate (Sensitivity)"",","line_length_linter" -"inst/doc/AdvancedVignette.Rmd",220,17,"style","Commas should always have a space after."," ylim = c(0,1), xlim = c(0,1),","commas_linter" -"inst/doc/AdvancedVignette.Rmd",220,32,"style","Commas should always have a space after."," ylim = c(0,1), xlim = c(0,1),","commas_linter" -"inst/doc/AdvancedVignette.Rmd",227,1,"style","Variable and function name style should be snake_case or symbols.","ValidationRocPoints <- readRDS(""ValidationRocPoints.rds"")","object_name_linter" -"inst/doc/AdvancedVignette.Rmd",229,81,"style","Lines should not be more than 80 characters.","plot(ValidationRocPoints$falsePositiveRate, ValidationRocPoints$truePositiveRate,","line_length_linter" -"inst/doc/AdvancedVignette.Rmd",231,81,"style","Lines should not be more than 80 characters."," xlab = ""False Positive Rate (Fallout)"", ylab = ""True Positive Rate (Sensitivity)"",","line_length_linter" -"inst/doc/AdvancedVignette.Rmd",240,1,"style","Variable and function name style should be snake_case or symbols.","AllRocCurve <- ListRocCurves(bestModel)","object_name_linter" -"inst/doc/AdvancedVignette.Rmd",241,1,"style","Variable and function name style should be snake_case or symbols.","CrossValidationRocPoints <- AllRocCurve[['crossValidation']][['rocPoints']]","object_name_linter" -"inst/doc/AdvancedVignette.Rmd",241,42,"style","Only use double-quotes.","CrossValidationRocPoints <- AllRocCurve[['crossValidation']][['rocPoints']]","single_quotes_linter" -"inst/doc/AdvancedVignette.Rmd",241,63,"style","Only use double-quotes.","CrossValidationRocPoints <- AllRocCurve[['crossValidation']][['rocPoints']]","single_quotes_linter" -"inst/doc/AdvancedVignette.Rmd",242,35,"style","Only use double-quotes.","saveRDS(CrossValidationRocPoints, 'CrossValidationRocPoints.rds')","single_quotes_linter" -"inst/doc/AdvancedVignette.Rmd",244,81,"style","Lines should not be more than 80 characters.","plot(CrossValidationRocPoints$falsePositiveRate, CrossValidationRocPoints$truePositiveRate,","line_length_linter" -"inst/doc/AdvancedVignette.Rmd",246,81,"style","Lines should not be more than 80 characters."," xlab = ""False Positive Rate (Fallout)"", ylab = ""True Positive Rate (Sensitivity)"",","line_length_linter" -"inst/doc/AdvancedVignette.Rmd",253,1,"style","Variable and function name style should be snake_case or symbols.","CrossValidationRocPoints <- readRDS(""CrossValidationRocPoints.rds"")","object_name_linter" -"inst/doc/AdvancedVignette.Rmd",255,81,"style","Lines should not be more than 80 characters.","plot(CrossValidationRocPoints$falsePositiveRate, CrossValidationRocPoints$truePositiveRate,","line_length_linter" -"inst/doc/AdvancedVignette.Rmd",257,81,"style","Lines should not be more than 80 characters."," xlab = ""False Positive Rate (Fallout)"", ylab = ""True Positive Rate (Sensitivity)"",","line_length_linter" -"inst/doc/AdvancedVignette.Rmd",267,23,"style","Trailing whitespace is superfluous."," ValidationRocPoints, ","trailing_whitespace_linter" -"inst/doc/AdvancedVignette.Rmd",278,81,"style","Lines should not be more than 80 characters.","threshold <- ValidationRocPoints$threshold[which.max(ValidationRocPoints$f1Score)]","line_length_linter" -"inst/doc/AdvancedVignette.Rmd",284,81,"style","Lines should not be more than 80 characters.","ValidationRocPoints[ValidationRocPoints$threshold == tail(Filter(function(x) x > threshold,","line_length_linter" -"inst/doc/AdvancedVignette.Rmd",285,81,"style","Lines should not be more than 80 characters."," ValidationRocPoints$threshold),","line_length_linter" -"inst/doc/AdvancedVignette.Rmd",302,1,"style","Variable and function name style should be snake_case or symbols.","wordModels <- allModels[grep(""Word"", lapply(allModels, `[[`, ""modelType""))]","object_name_linter" -"inst/doc/AdvancedVignette.Rmd",303,1,"style","Variable and function name style should be snake_case or symbols.","wordModel <- wordModels[[1]]","object_name_linter" -"inst/doc/AdvancedVignette.Rmd",305,1,"style","Variable and function name style should be snake_case or symbols.","wordCloud <- GetWordCloud(project, wordModel$modelId)","object_name_linter" -"inst/doc/AdvancedVignette.Rmd",311,1,"style","Variable and function name style should be snake_case or symbols.","wordCloud <- readRDS(""wordCloudModelInsights.rds"")","object_name_linter" -"inst/doc/AdvancedVignette.Rmd",318,47,"style","Trailing whitespace is superfluous."," colormap::colormap(c(""#255FEC"", ""#2DBEF9"")), ","trailing_whitespace_linter" -"inst/doc/AdvancedVignette.Rmd",320,29,"style","Trailing whitespace is superfluous."," c(""#FFAC9D"", ""#D80909""), ","trailing_whitespace_linter" -"inst/doc/AdvancedVignette.Rmd",329,1,"style","Variable and function name style should be snake_case or symbols.","wordCloud <- wordCloud[!wordCloud$isStopword, ]","object_name_linter" -"inst/doc/AdvancedVignette.Rmd",331,56,"style","Trailing whitespace is superfluous.","# Specify colors similar to what DataRobot produces for ","trailing_whitespace_linter" -"inst/doc/Calendars.Rmd",18,81,"style","Lines should not be more than 80 characters.","calendar <- read.csv(system.file(""extdata"", ""calendar.csv"", package = ""datarobot""))","line_length_linter" -"inst/doc/Calendars.Rmd",31,1,"style","Variable and function name style should be snake_case or symbols.","apiToken <- """"","object_name_linter" -"inst/doc/Calendars.Rmd",72,1,"style","Variable and function name style should be snake_case or symbols.","newCalendar <- UpdateCalendar(calendar, name = ""newName"")","object_name_linter" -"inst/doc/Calendars.Rmd",88,81,"style","Lines should not be more than 80 characters.","project <- SetupProject(timeSeriesData, projectName = ""time series with calendar"")","line_length_linter" -"inst/doc/Calendars.Rmd",91,81,"style","Lines should not be more than 80 characters."," autopilotDataSelectionMethod = ""duration"",","line_length_linter" -"inst/doc/Calendars.Rmd",103,1,"style","Variable and function name style should be snake_case or symbols.","projectId <- ""59dab74bbd2a54035786bfc0""","object_name_linter" -"inst/doc/ComparingSubsets.R",24,1,"style","Variable and function name style should be snake_case or symbols.","modifiedPima$insulin <- NULL","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",63,1,"style","Variable and function name style should be snake_case or symbols.","MissPctInsulin <- round(100 * length(which(PimaIndiansDiabetes$insulin == 0)) /","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",75,1,"style","Variable and function name style should be snake_case or symbols.","insulinMissing <- as.numeric(PimaIndiansDiabetes$insulin == 0)","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",76,1,"style","Variable and function name style should be snake_case or symbols.","modifiedPima <- PimaIndiansDiabetes","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",77,1,"style","Variable and function name style should be snake_case or symbols.","modifiedPima$insulin <- NULL","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",78,1,"style","Variable and function name style should be snake_case or symbols.","modifiedPima$insulinMissing <- insulinMissing","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",84,1,"style","Variable and function name style should be snake_case or symbols.","insulinProject <- StartProject(dataSource = modifiedPima,","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",93,1,"style","Variable and function name style should be snake_case or symbols.","insulinModelList <- ListModels(insulinProject)","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",98,1,"style","Variable and function name style should be snake_case or symbols.","insulinModelList <- readRDS(""insulinModelList.rds"")","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",99,1,"style","Variable and function name style should be snake_case or symbols.","insulinModelFrame <- as.data.frame(insulinModelList, simple = FALSE)","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",107,1,"style","Variable and function name style should be snake_case or symbols.","bestIndex <- which.min(insulinModelFrame$LogLoss.validation)","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",108,1,"style","Variable and function name style should be snake_case or symbols.","worstIndex <- which.max(insulinModelFrame$LogLoss.validation)","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",118,81,"style","Lines should not be more than 80 characters.","plot(insulinModelFrame$AUC.validation, xlab = ""Model number"", ylab = ""Area under the ROC curve"")","line_length_linter" -"inst/doc/ComparingSubsets.Rmd",119,81,"style","Lines should not be more than 80 characters.","points(bestIndex, insulinModelFrame$AUC.validation[bestIndex], pch = 16, col = ""red"")","line_length_linter" -"inst/doc/ComparingSubsets.Rmd",129,1,"style","Variable and function name style should be snake_case or symbols.","modelList <- list(n = 9)","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",130,1,"style","Variable and function name style should be snake_case or symbols.","modelList[[1]] <- insulinModelList","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",131,1,"style","Variable and function name style should be snake_case or symbols.","allVars <- colnames(modifiedPima)[1:8]","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",132,1,"style","Variable and function name style should be snake_case or symbols.","permFile <- tempfile(fileext = ""permFile.csv"")","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",134,3,"style","Variable and function name style should be snake_case or symbols."," varName <- allVars[i]","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",136,3,"style","Variable and function name style should be snake_case or symbols."," projName <- paste(""PermProject"",varName,sep="""")","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",136,35,"style","Commas should always have a space after."," projName <- paste(""PermProject"",varName,sep="""")","commas_linter" -"inst/doc/ComparingSubsets.Rmd",136,43,"style","Commas should always have a space after."," projName <- paste(""PermProject"",varName,sep="""")","commas_linter" -"inst/doc/ComparingSubsets.Rmd",136,46,"style","Put spaces around all infix operators."," projName <- paste(""PermProject"",varName,sep="""")","infix_spaces_linter" -"inst/doc/ComparingSubsets.Rmd",137,3,"style","Variable and function name style should be snake_case or symbols."," permProject <- StartProject(permFile, projectName = projName, target = ""insulinMissing"", wait = TRUE)","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",137,81,"style","Lines should not be more than 80 characters."," permProject <- StartProject(permFile, projectName = projName, target = ""insulinMissing"", wait = TRUE)","line_length_linter" -"inst/doc/ComparingSubsets.Rmd",138,3,"style","Variable and function name style should be snake_case or symbols."," modelList[[i+1]] <- ListModels(permProject)","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",138,15,"style","Put spaces around all infix operators."," modelList[[i+1]] <- ListModels(permProject)","infix_spaces_linter" -"inst/doc/ComparingSubsets.Rmd",147,1,"style","Variable and function name style should be snake_case or symbols.","logLossDeltas <- readRDS(""insulinDeltaFrame.rds"")","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",151,1,"style","Variable and function name style should be snake_case or symbols.","bestRow <- which.min(logLossDeltas$originalLogLoss)","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",152,81,"style","Lines should not be more than 80 characters.","points(seq(1, 8, 1), logLossDeltas[bestRow, 1:8], pch = 16, col = ""limegreen"", cex = 1.5)","line_length_linter" -"inst/doc/ComparingSubsets.Rmd",164,1,"style","Variable and function name style should be snake_case or symbols.","AUCshiftFrame <- readRDS(""AUCshiftFrame.rds"")","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",165,1,"style","Variable and function name style should be snake_case or symbols.","sortIndex <- order(logLossDeltas$originalLogLoss)","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",166,81,"style","Lines should not be more than 80 characters.","plot(AUCshiftFrame$originalAUC[sortIndex], xlab = ""Model number"", ylab = ""Area under ROC curve"")","line_length_linter" -"inst/doc/ComparingSubsets.Rmd",174,1,"style","Variable and function name style should be snake_case or symbols.","missingInsulin <- as.numeric(PimaIndiansDiabetes$insulin == 0)","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",175,1,"style","Variable and function name style should be snake_case or symbols.","missingTriceps <- as.numeric(PimaIndiansDiabetes$triceps == 0)","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",198,1,"style","Variable and function name style should be snake_case or symbols.","lossIndex <- which(dataCar$claimcst0 > 0)","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",199,1,"style","Variable and function name style should be snake_case or symbols.","keepVars <- c(""veh_value"", ""exposure"", ""claimcst0"", ""veh_body"", ""veh_age"",","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",201,1,"style","Variable and function name style should be snake_case or symbols.","lossFrame <- subset(dataCar, claimcst0 > 0, select = keepVars)","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",222,1,"style","Variable and function name style should be snake_case or symbols.","lossPct <- round(100 * length(lossIndex) / nrow(dataCar), digits = 1)","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",223,1,"style","Variable and function name style should be snake_case or symbols.","anomIndex <- which(lossFrame$claimcst0 == 200)","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",224,1,"style","Variable and function name style should be snake_case or symbols.","anomPct <- round(100 * length(anomIndex) / length(lossIndex), digits = 1)","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",235,1,"style","Variable and function name style should be snake_case or symbols.","anomFrame <- lossFrame","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",236,1,"style","Variable and function name style should be snake_case or symbols.","anomFrame$claimcst0 <- NULL","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",237,1,"style","Variable and function name style should be snake_case or symbols.","anomFrame$anomaly <- anomaly","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",238,1,"style","Variable and function name style should be snake_case or symbols.","anomProject <- StartProject(anomFrame, projectName = ""AnomalyProject"", target = anomaly, wait = TRUE)","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",238,81,"style","Lines should not be more than 80 characters.","anomProject <- StartProject(anomFrame, projectName = ""AnomalyProject"", target = anomaly, wait = TRUE)","line_length_linter" -"inst/doc/ComparingSubsets.Rmd",239,1,"style","Variable and function name style should be snake_case or symbols.","anomalyModelList <- ListModels(anomProject)","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",247,1,"style","Variable and function name style should be snake_case or symbols.","anomalyLeaderboard <- readRDS(""anomalyModelList.rds"")","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",248,1,"style","Variable and function name style should be snake_case or symbols.","anomalyLeaderFrame <- as.data.frame(anomalyLeaderboard, simple = FALSE)","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",249,1,"style","Variable and function name style should be snake_case or symbols.","plotPct <- max(anomalyLeaderFrame$samplePct)","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",250,81,"style","Lines should not be more than 80 characters.","plot(anomalyLeaderboard, pct = plotPct, orderDecreasing = TRUE, xlim = c(0, 0.45))","line_length_linter" -"inst/doc/ComparingSubsets.Rmd",251,81,"style","Lines should not be more than 80 characters.","abline(v = min(anomalyLeaderFrame$LogLoss.validation), lty = 2, lwd = 2, col = ""magenta"")","line_length_linter" -"inst/doc/ComparingSubsets.Rmd",258,1,"style","Variable and function name style should be snake_case or symbols.","AAUC <- anomalyLeaderFrame$AUC.validation","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",259,1,"style","Variable and function name style should be snake_case or symbols.","samplePct <- anomalyLeaderFrame$samplePct","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",262,1,"style","Variable and function name style should be snake_case or symbols.","Index64 <- which(samplePct == sizes[3])","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",264,1,"style","Variable and function name style should be snake_case or symbols.","Index32 <- which(samplePct == sizes[2])","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",266,1,"style","Variable and function name style should be snake_case or symbols.","Index16 <- which(samplePct == sizes[1])","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",275,1,"style","Variable and function name style should be snake_case or symbols.","anomAUCDeltaFrame <- readRDS(""anomAUCDeltaFrame.rds"")","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",276,1,"style","Variable and function name style should be snake_case or symbols.","bestIndex <- which.min(anomalyLeaderFrame$LogLoss.validation)","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",277,1,"style","Variable and function name style should be snake_case or symbols.","bestExpModel <- as.character(anomalyLeaderFrame$expandedModel)[bestIndex]","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",278,1,"style","Variable and function name style should be snake_case or symbols.","bestRow <- which(anomAUCDeltaFrame$expandedModel == bestExpModel)","object_name_linter" -"inst/doc/ComparingSubsets.Rmd",282,14,"style","Put spaces around all infix operators."," what=c(0, 1, 1, 1), ylim=c(-0.1, 0.1))","infix_spaces_linter" -"inst/doc/ComparingSubsets.Rmd",282,34,"style","Put spaces around all infix operators."," what=c(0, 1, 1, 1), ylim=c(-0.1, 0.1))","infix_spaces_linter" -"inst/doc/ComparingSubsets.Rmd",283,81,"style","Lines should not be more than 80 characters.","points(seq(1, 7, 1), anomAUCDeltaFrame[bestRow, 1:7], pch = 16, col = ""limegreen"", cex = 1.5)","line_length_linter" -"inst/doc/ComplianceDocumentation.Rmd",26,1,"style","Variable and function name style should be snake_case or symbols.","apiToken <- """"","object_name_linter" -"inst/doc/ComplianceDocumentation.Rmd",59,81,"style","Lines should not be more than 80 characters.","UploadComplianceDocTemplate(name = ""myNewTemplate"", filename = ""path/to/modified_file.json"")","line_length_linter" -"inst/doc/ComplianceDocumentation.Rmd",67,81,"style","Lines should not be more than 80 characters."," ""regularText"" = ""This dataset had a lot of Missing Values. See the chart below: {{missingValues}}"",","line_length_linter" -"inst/doc/ComplianceDocumentation.Rmd",70,81,"style","Lines should not be more than 80 characters."," ""regularText"" = ""{{blueprintDiagram}} /n Blueprint for this model"",","line_length_linter" -"inst/doc/ComplianceDocumentation.Rmd",72,81,"style","Lines should not be more than 80 characters.","UploadComplianceDocTemplate(name = ""myNewTemplateFromSections"", sections = sections)","line_length_linter" -"inst/doc/ComplianceDocumentation.Rmd",78,1,"style","Variable and function name style should be snake_case or symbols.","myTemplate <- ListComplianceDocTemplates(namePart = ""myNewTemplateFromSections"")[[1]]","object_name_linter" -"inst/doc/ComplianceDocumentation.Rmd",78,81,"style","Lines should not be more than 80 characters.","myTemplate <- ListComplianceDocTemplates(namePart = ""myNewTemplateFromSections"")[[1]]","line_length_linter" -"inst/doc/ComplianceDocumentation.Rmd",87,1,"style","Variable and function name style should be snake_case or symbols.","myTemplate <- ListComplianceDocTemplates(namePart = ""myNewTemplate"")[[1]]","object_name_linter" -"inst/doc/DatetimePartitionedProjects.Rmd",26,81,"style","Lines should not be more than 80 characters.","lending <- read.csv(""https://s3.amazonaws.com/datarobot_public_datasets/10K_Lending_Club_Loans.csv"")","line_length_linter" -"inst/doc/DatetimePartitionedProjects.Rmd",27,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""earliest_cr_line"",","line_length_linter" -"inst/doc/DatetimePartitionedProjects.Rmd",43,81,"style","Lines should not be more than 80 characters."," ""1989-12-01"", ConstructDurationString(days = 100))","line_length_linter" -"inst/doc/DatetimePartitionedProjects.Rmd",44,81,"style","Lines should not be more than 80 characters.","backtest[[2]] <- CreateBacktestSpecification(1, ConstructDurationString(), ""1999-10-01"",","line_length_linter" -"inst/doc/DatetimePartitionedProjects.Rmd",45,81,"style","Lines should not be more than 80 characters."," ConstructDurationString(days = 100))","line_length_linter" -"inst/doc/DatetimePartitionedProjects.Rmd",67,81,"style","Lines should not be more than 80 characters.","# Retrieve a datetime model. There is now a new retrieval function specific to datetime partitioning","line_length_linter" -"inst/doc/DatetimePartitionedProjects.Rmd",71,1,"style","Variable and function name style should be snake_case or symbols.","scoreJobId <- ScoreBacktests(dt_model)","object_name_linter" -"inst/doc/DatetimePartitionedProjects.Rmd",75,1,"style","Variable and function name style should be snake_case or symbols.","dtModelWithBt <- GetDatetimeModel(proj, dt_model$modelId)","object_name_linter" -"inst/doc/DatetimePartitionedProjects.Rmd",78,81,"style","Lines should not be more than 80 characters.","# One has to request a `Frozen` model to keep the hyper-parameters static and avoid lookahead bias.","line_length_linter" -"inst/doc/DatetimePartitionedProjects.Rmd",79,81,"style","Lines should not be more than 80 characters.","# Within the context of deployment, this can be used to retrain a resulting model on more recent data.","line_length_linter" -"inst/doc/DatetimePartitionedProjects.Rmd",80,81,"style","Lines should not be more than 80 characters.","UpdateProject(proj, holdoutUnlocked = TRUE) # If retraining on 100% of the data, we need to unlock the holdout set.","line_length_linter" -"inst/doc/DatetimePartitionedProjects.Rmd",81,1,"style","Variable and function name style should be snake_case or symbols.","modelJobId_frozen <- RequestFrozenDatetimeModel(dt_model,","object_name_linter" -"inst/doc/DatetimePartitionedProjects.Rmd",82,81,"style","Lines should not be more than 80 characters."," trainingStartDate = as.Date(""1950/12/1""),","line_length_linter" -"inst/doc/DatetimePartitionedProjects.Rmd",83,81,"style","Lines should not be more than 80 characters."," trainingEndDate = as.Date(""1998/3/1""))","line_length_linter" -"inst/doc/DatetimePartitionedProjects.Rmd",87,1,"style","Variable and function name style should be snake_case or symbols.","modelJobId <- RequestNewDatetimeModel(proj, bps[[1]], trainingRowCount = 100)","object_name_linter" -"inst/doc/DatetimePartitionedProjects.Rmd",91,1,"style","Variable and function name style should be snake_case or symbols.","modelJobId <- RequestNewDatetimeModel(proj, bps[[1]],","object_name_linter" -"inst/doc/DatetimePartitionedProjects.Rmd",92,81,"style","Lines should not be more than 80 characters."," trainingDuration = ConstructDurationString(months=10))","line_length_linter" -"inst/doc/DatetimePartitionedProjects.Rmd",92,90,"style","Put spaces around all infix operators."," trainingDuration = ConstructDurationString(months=10))","infix_spaces_linter" -"inst/doc/Deployment.Rmd",31,1,"style","Variable and function name style should be snake_case or symbols.","predictionServer <- ListPredictionServers()[[1]]","object_name_linter" -"inst/doc/Deployment.Rmd",34,81,"style","Lines should not be more than 80 characters."," description = ""A new deployment for demo purposes"",","line_length_linter" -"inst/doc/Deployment.Rmd",83,1,"style","Variable and function name style should be snake_case or symbols.","newModel <- ListModels(project)[[2]]","object_name_linter" -"inst/doc/Deployment.Rmd",96,1,"style","Variable and function name style should be snake_case or symbols.","newModel <- ListModels(project)[[2]]","object_name_linter" -"inst/doc/IntroductionToDataRobot.Rmd",49,81,"style","Lines should not be more than 80 characters.","ConnectToDataRobot(endpoint = ""YOUR-ENDPOINT-HERE"", token = ""YOUR-API_TOKEN-HERE"")","line_length_linter" -"inst/doc/IntroductionToDataRobot.Rmd",111,1,"style","Variable and function name style should be snake_case or symbols.","listOfBostonModels <- readRDS(""listOfBostonModels.rds"")","object_name_linter" -"inst/doc/IntroductionToDataRobot.Rmd",112,1,"style","Variable and function name style should be snake_case or symbols.","fullFrame <- as.data.frame(listOfBostonModels, simple = FALSE)","object_name_linter" -"inst/doc/IntroductionToDataRobot.Rmd",118,1,"style","Variable and function name style should be snake_case or symbols.","listOfBostonModels <- ListModels(project)","object_name_linter" -"inst/doc/IntroductionToDataRobot.Rmd",153,1,"style","Variable and function name style should be snake_case or symbols.","modelFrame <- as.data.frame(listOfBostonModels)","object_name_linter" -"inst/doc/IntroductionToDataRobot.Rmd",183,1,"style","Variable and function name style should be snake_case or symbols.","bestModel <- GetRecommendedModel(project)","object_name_linter" -"inst/doc/IntroductionToDataRobot.Rmd",184,1,"style","Variable and function name style should be snake_case or symbols.","bestPredictions <- Predict(bestModel, Boston)","object_name_linter" -"inst/doc/IntroductionToDataRobot.Rmd",202,1,"style","Variable and function name style should be snake_case or symbols.","bestPredictions <- readRDS(""bestPredictions.rds"")","object_name_linter" -"inst/doc/IntroductionToDataRobot.Rmd",203,33,"style","Put spaces around all infix operators.","plot(medv, bestPredictions, xlab=""Observed medv value"", ylab=""Predicted medv value"",","infix_spaces_linter" -"inst/doc/IntroductionToDataRobot.Rmd",203,61,"style","Put spaces around all infix operators.","plot(medv, bestPredictions, xlab=""Observed medv value"", ylab=""Predicted medv value"",","infix_spaces_linter" -"inst/doc/IntroductionToDataRobot.Rmd",203,81,"style","Lines should not be more than 80 characters.","plot(medv, bestPredictions, xlab=""Observed medv value"", ylab=""Predicted medv value"",","line_length_linter" -"inst/doc/Multiclass.Rmd",26,1,"style","Variable and function name style should be snake_case or symbols.","apiToken <- """"","object_name_linter" -"inst/doc/Multiclass.Rmd",92,1,"style","Variable and function name style should be snake_case or symbols.","confusionChart <- GetConfusionChart(model, source = DataPartition$VALIDATION)","object_name_linter" -"inst/doc/PartialDependence.R",52,3,"style","Variable and function name style should be snake_case or symbols."," outFrame[, refIndex] <- grid[1]","object_name_linter" -"inst/doc/PartialDependence.R",55,5,"style","Variable and function name style should be snake_case or symbols."," upFrame[, refIndex] <- grid[i]","object_name_linter" -"inst/doc/PartialDependence.R",71,3,"style","Variable and function name style should be snake_case or symbols."," hatFrame$prediction <- yHat","object_name_linter" -"inst/doc/PartialDependence.R",73,12,"style","Variable and function name style should be snake_case or symbols."," colnames(hatSum)[2] <- model$modelType","object_name_linter" -"inst/doc/PartialDependence.R",79,5,"style","Variable and function name style should be snake_case or symbols."," hatFrame$prediction <- yHat","object_name_linter" -"inst/doc/PartialDependence.R",81,14,"style","Variable and function name style should be snake_case or symbols."," colnames(upSum)[2] <- model$modelType","object_name_linter" -"inst/doc/PartialDependence.Rmd",31,1,"style","Variable and function name style should be snake_case or symbols.","concreteFrame <- read.csv(system.file(""extdata"", ""concreteData.csv"", package = ""datarobot""))","object_name_linter" -"inst/doc/PartialDependence.Rmd",31,81,"style","Lines should not be more than 80 characters.","concreteFrame <- read.csv(system.file(""extdata"", ""concreteData.csv"", package = ""datarobot""))","line_length_linter" -"inst/doc/PartialDependence.Rmd",43,1,"style","Variable and function name style should be snake_case or symbols.","myDRProject <- StartProject(concreteFrame, ""ConcreteProject"", target = ""strength"", wait = TRUE)","object_name_linter" -"inst/doc/PartialDependence.Rmd",43,81,"style","Lines should not be more than 80 characters.","myDRProject <- StartProject(concreteFrame, ""ConcreteProject"", target = ""strength"", wait = TRUE)","line_length_linter" -"inst/doc/PartialDependence.Rmd",48,1,"style","Variable and function name style should be snake_case or symbols.","concreteModels <- readRDS(""concreteModels.rds"")","object_name_linter" -"inst/doc/PartialDependence.Rmd",49,1,"style","Variable and function name style should be snake_case or symbols.","fullFrame <- as.data.frame(concreteModels, simple = FALSE)","object_name_linter" -"inst/doc/PartialDependence.Rmd",50,1,"style","Variable and function name style should be snake_case or symbols.","modelsFrame <- as.data.frame(concreteModels)","object_name_linter" -"inst/doc/PartialDependence.Rmd",56,1,"style","Variable and function name style should be snake_case or symbols.","concreteModels <- ListModels(myDRProject)","object_name_linter" -"inst/doc/PartialDependence.Rmd",80,1,"style","Variable and function name style should be snake_case or symbols.","poorCol <- c(""black"", ""red"", rep(""black"", 13))","object_name_linter" -"inst/doc/PartialDependence.Rmd",99,1,"style","Variable and function name style should be snake_case or symbols.","ridgeRows <- grep(""Ridge"", modelsFrame$modelType)","object_name_linter" -"inst/doc/PartialDependence.Rmd",104,1,"style","Variable and function name style should be snake_case or symbols.","goodCol <- c(rep(""black"", 3), ""red"", rep(""black"", 6), ""red"", rep(""black"", 3), ""red"")","object_name_linter" -"inst/doc/PartialDependence.Rmd",104,81,"style","Lines should not be more than 80 characters.","goodCol <- c(rep(""black"", 3), ""red"", rep(""black"", 6), ""red"", rep(""black"", 3), ""red"")","line_length_linter" -"inst/doc/PartialDependence.Rmd",156,1,"style","Variable and function name style should be snake_case or symbols.","FullAverageDataset <- function(covarFrame, refCovar, numGrid, plotRange = NULL) {","object_name_linter" -"inst/doc/PartialDependence.Rmd",156,32,"style","Variable and function name style should be snake_case or symbols.","FullAverageDataset <- function(covarFrame, refCovar, numGrid, plotRange = NULL) {","object_name_linter" -"inst/doc/PartialDependence.Rmd",156,44,"style","Variable and function name style should be snake_case or symbols.","FullAverageDataset <- function(covarFrame, refCovar, numGrid, plotRange = NULL) {","object_name_linter" -"inst/doc/PartialDependence.Rmd",156,54,"style","Variable and function name style should be snake_case or symbols.","FullAverageDataset <- function(covarFrame, refCovar, numGrid, plotRange = NULL) {","object_name_linter" -"inst/doc/PartialDependence.Rmd",156,63,"style","Variable and function name style should be snake_case or symbols.","FullAverageDataset <- function(covarFrame, refCovar, numGrid, plotRange = NULL) {","object_name_linter" -"inst/doc/PartialDependence.Rmd",156,81,"style","Lines should not be more than 80 characters.","FullAverageDataset <- function(covarFrame, refCovar, numGrid, plotRange = NULL) {","line_length_linter" -"inst/doc/PartialDependence.Rmd",158,3,"style","Variable and function name style should be snake_case or symbols."," refIndex <- which(covars == refCovar)","object_name_linter" -"inst/doc/PartialDependence.Rmd",159,3,"style","Variable and function name style should be snake_case or symbols."," refVar <- covarFrame[, refIndex]","object_name_linter" -"inst/doc/PartialDependence.Rmd",168,3,"style","Variable and function name style should be snake_case or symbols."," outFrame <- covarFrame","object_name_linter" -"inst/doc/PartialDependence.Rmd",169,3,"style","Variable and function name style should be snake_case or symbols."," outFrame[, refIndex] <- grid[1]","object_name_linter" -"inst/doc/PartialDependence.Rmd",171,5,"style","Variable and function name style should be snake_case or symbols."," upFrame <- covarFrame","object_name_linter" -"inst/doc/PartialDependence.Rmd",172,5,"style","Variable and function name style should be snake_case or symbols."," upFrame[, refIndex] <- grid[i]","object_name_linter" -"inst/doc/PartialDependence.Rmd",173,5,"style","Variable and function name style should be snake_case or symbols."," outFrame <- rbind.data.frame(outFrame, upFrame)","object_name_linter" -"inst/doc/PartialDependence.Rmd",184,1,"style","Variable and function name style should be snake_case or symbols.","PDPbuilder <- function(covarFrame, refCovar, listOfModels,","object_name_linter" -"inst/doc/PartialDependence.Rmd",184,24,"style","Variable and function name style should be snake_case or symbols.","PDPbuilder <- function(covarFrame, refCovar, listOfModels,","object_name_linter" -"inst/doc/PartialDependence.Rmd",184,36,"style","Variable and function name style should be snake_case or symbols.","PDPbuilder <- function(covarFrame, refCovar, listOfModels,","object_name_linter" -"inst/doc/PartialDependence.Rmd",184,46,"style","Variable and function name style should be snake_case or symbols.","PDPbuilder <- function(covarFrame, refCovar, listOfModels,","object_name_linter" -"inst/doc/PartialDependence.Rmd",185,24,"style","Variable and function name style should be snake_case or symbols."," numGrid = 100, plotRange = NULL) {","object_name_linter" -"inst/doc/PartialDependence.Rmd",185,39,"style","Variable and function name style should be snake_case or symbols."," numGrid = 100, plotRange = NULL) {","object_name_linter" -"inst/doc/PartialDependence.Rmd",186,3,"style","Variable and function name style should be snake_case or symbols."," augmentedFrame <- FullAverageDataset(covarFrame, refCovar,","object_name_linter" -"inst/doc/PartialDependence.Rmd",188,3,"style","Variable and function name style should be snake_case or symbols."," nModels <- length(listOfModels)","object_name_linter" -"inst/doc/PartialDependence.Rmd",191,3,"style","Variable and function name style should be snake_case or symbols."," yHat <- Predict(model, augmentedFrame)","object_name_linter" -"inst/doc/PartialDependence.Rmd",192,3,"style","Variable and function name style should be snake_case or symbols."," hatFrame <- augmentedFrame","object_name_linter" -"inst/doc/PartialDependence.Rmd",193,3,"style","Variable and function name style should be snake_case or symbols."," hatFrame$prediction <- yHat","object_name_linter" -"inst/doc/PartialDependence.Rmd",194,3,"style","Variable and function name style should be snake_case or symbols."," hatSum <- summaryBy(list(c(""prediction""), c(refCovar)), data = hatFrame, FUN = mean)","object_name_linter" -"inst/doc/PartialDependence.Rmd",194,13,"warning","no visible global function definition for β€˜summaryBy’"," hatSum <- summaryBy(list(c(""prediction""), c(refCovar)), data = hatFrame, FUN = mean)","object_usage_linter" -"inst/doc/PartialDependence.Rmd",194,81,"style","Lines should not be more than 80 characters."," hatSum <- summaryBy(list(c(""prediction""), c(refCovar)), data = hatFrame, FUN = mean)","line_length_linter" -"inst/doc/PartialDependence.Rmd",195,12,"style","Variable and function name style should be snake_case or symbols."," colnames(hatSum)[2] <- model$modelType","object_name_linter" -"inst/doc/PartialDependence.Rmd",199,5,"style","Variable and function name style should be snake_case or symbols."," yHat <- Predict(model, augmentedFrame)","object_name_linter" -"inst/doc/PartialDependence.Rmd",200,5,"style","Variable and function name style should be snake_case or symbols."," hatFrame <- augmentedFrame","object_name_linter" -"inst/doc/PartialDependence.Rmd",201,5,"style","Variable and function name style should be snake_case or symbols."," hatFrame$prediction <- yHat","object_name_linter" -"inst/doc/PartialDependence.Rmd",202,5,"style","Variable and function name style should be snake_case or symbols."," upSum <- summaryBy(list(c(""prediction""), c(refCovar)), data = hatFrame, FUN = mean)","object_name_linter" -"inst/doc/PartialDependence.Rmd",202,14,"warning","no visible global function definition for β€˜summaryBy’"," upSum <- summaryBy(list(c(""prediction""), c(refCovar)), data = hatFrame, FUN = mean)","object_usage_linter" -"inst/doc/PartialDependence.Rmd",202,81,"style","Lines should not be more than 80 characters."," upSum <- summaryBy(list(c(""prediction""), c(refCovar)), data = hatFrame, FUN = mean)","line_length_linter" -"inst/doc/PartialDependence.Rmd",203,14,"style","Variable and function name style should be snake_case or symbols."," colnames(upSum)[2] <- model$modelType","object_name_linter" -"inst/doc/PartialDependence.Rmd",204,5,"style","Variable and function name style should be snake_case or symbols."," hatSum <- merge(hatSum, upSum)","object_name_linter" -"inst/doc/PartialDependence.Rmd",215,1,"style","Variable and function name style should be snake_case or symbols.","modelList <- list(concreteModels[[1]], concreteModels[[5]],","object_name_linter" -"inst/doc/PartialDependence.Rmd",217,1,"style","Variable and function name style should be snake_case or symbols.","agePDPframe <- PDPbuilder(concreteFrame[, 1:8], ""age"", modelList)","object_name_linter" -"inst/doc/PartialDependence.Rmd",223,1,"style","Variable and function name style should be snake_case or symbols.","PDPlot <- function(PDframe, Response, ltypes,","object_name_linter" -"inst/doc/PartialDependence.Rmd",223,20,"style","Variable and function name style should be snake_case or symbols.","PDPlot <- function(PDframe, Response, ltypes,","object_name_linter" -"inst/doc/PartialDependence.Rmd",223,29,"style","Variable and function name style should be snake_case or symbols.","PDPlot <- function(PDframe, Response, ltypes,","object_name_linter" -"inst/doc/PartialDependence.Rmd",224,20,"style","Variable and function name style should be snake_case or symbols."," lColors, ...) {","object_name_linter" -"inst/doc/PartialDependence.Rmd",225,3,"style","Variable and function name style should be snake_case or symbols."," Rng <- range(Response)","object_name_linter" -"inst/doc/PartialDependence.Rmd",226,3,"style","Variable and function name style should be snake_case or symbols."," nModels <- ncol(PDframe) - 1","object_name_linter" -"inst/doc/PartialDependence.Rmd",227,3,"style","Variable and function name style should be snake_case or symbols."," modelNames <- colnames(PDframe)[2: (nModels + 1)]","object_name_linter" -"inst/doc/PartialDependence.Rmd",228,40,"style","Put spaces around all infix operators."," plot(PDframe[, 1], PDframe[, 2], ylim=Rng, type = ""l"",","infix_spaces_linter" -"inst/doc/PartialDependence.Rmd",232,22,"style","Put spaces around all infix operators."," abline(h = Rng, lty=3, lwd=2, col=""black"")","infix_spaces_linter" -"inst/doc/PartialDependence.Rmd",232,29,"style","Put spaces around all infix operators."," abline(h = Rng, lty=3, lwd=2, col=""black"")","infix_spaces_linter" -"inst/doc/PartialDependence.Rmd",232,36,"style","Put spaces around all infix operators."," abline(h = Rng, lty=3, lwd=2, col=""black"")","infix_spaces_linter" -"inst/doc/PartialDependence.Rmd",245,10,"style","Put spaces around all infix operators.","par(mfrow=c(1, 1))","infix_spaces_linter" -"inst/doc/PartialDependence.Rmd",246,1,"style","Variable and function name style should be snake_case or symbols.","agePDPframe <- readRDS(""agePDPframe.rds"")","object_name_linter" -"inst/doc/PartialDependence.Rmd",247,1,"style","Variable and function name style should be snake_case or symbols.","Response <- concreteFrame$strength","object_name_linter" -"inst/doc/PartialDependence.Rmd",249,1,"style","Variable and function name style should be snake_case or symbols.","lColors <- c(""limegreen"", ""black"", ""blue"", ""magenta"")","object_name_linter" -"inst/doc/PartialDependence.Rmd",256,10,"style","Put spaces around all infix operators.","par(mfrow=c(1, 1))","infix_spaces_linter" -"inst/doc/PartialDependence.Rmd",257,1,"style","Variable and function name style should be snake_case or symbols.","cementPDPframe <- readRDS(""cementPDPframe.rds"")","object_name_linter" -"inst/doc/PartialDependence.Rmd",264,10,"style","Put spaces around all infix operators.","par(mfrow=c(1, 1))","infix_spaces_linter" -"inst/doc/PartialDependence.Rmd",265,1,"style","Variable and function name style should be snake_case or symbols.","waterPDPframe <- readRDS(""waterPDPframe.rds"")","object_name_linter" -"inst/doc/PartialDependence.Rmd",272,10,"style","Put spaces around all infix operators.","par(mfrow=c(1, 1))","infix_spaces_linter" -"inst/doc/PartialDependence.Rmd",273,1,"style","Variable and function name style should be snake_case or symbols.","blastPDPframe <- readRDS(""blastPDPframe.rds"")","object_name_linter" -"inst/doc/PredictionExplanations.Rmd",144,1,"error","Missing chunk end for chunk (maybe starting at line 144).","```{r results = ""asis"", message = FALSE, warning = FALSE, eval = FALSE}",NA -"inst/doc/RatingTables.Rmd",26,1,"style","Variable and function name style should be snake_case or symbols.","apiToken <- """"","object_name_linter" -"inst/doc/RatingTables.Rmd",36,1,"style","Variable and function name style should be snake_case or symbols.","projectId <- ""59dab74bbd2a54035786bfc0""","object_name_linter" -"inst/doc/RatingTables.Rmd",37,1,"style","Variable and function name style should be snake_case or symbols.","ratingTables <- ListRatingTables(projectId)","object_name_linter" -"inst/doc/RatingTables.Rmd",38,1,"style","Variable and function name style should be snake_case or symbols.","ratingTable <- ratingTables[[1]]","object_name_linter" -"inst/doc/RatingTables.Rmd",43,1,"style","Variable and function name style should be snake_case or symbols.","ratingTable <- readRDS(""ratingTable.rds"")","object_name_linter" -"inst/doc/RatingTables.Rmd",50,1,"style","Variable and function name style should be snake_case or symbols.","projectId <- ""59dab74bbd2a54035786bfc0""","object_name_linter" -"inst/doc/RatingTables.Rmd",51,1,"style","Variable and function name style should be snake_case or symbols.","ratingTableModels <- ListRatingTableModels(projectId)","object_name_linter" -"inst/doc/RatingTables.Rmd",52,1,"style","Variable and function name style should be snake_case or symbols.","ratingTableModel <- ratingTableModels[[1]]","object_name_linter" -"inst/doc/RatingTables.Rmd",53,1,"style","Variable and function name style should be snake_case or symbols.","ratingTableId <- ratingTableModel$ratingTableId","object_name_linter" -"inst/doc/RatingTables.Rmd",54,1,"style","Variable and function name style should be snake_case or symbols.","ratingTable <- GetRatingTable(projectId, ratingTableId)","object_name_linter" -"inst/doc/RatingTables.Rmd",59,1,"style","Variable and function name style should be snake_case or symbols.","ratingTable <- readRDS(""ratingTable.rds"")","object_name_linter" -"inst/doc/RatingTables.Rmd",66,1,"style","Variable and function name style should be snake_case or symbols.","projectId <- ""59dab74bbd2a54035786bfc0""","object_name_linter" -"inst/doc/RatingTables.Rmd",67,1,"style","Variable and function name style should be snake_case or symbols.","modelId <- ""59dd0b01d9575702bec96e4""","object_name_linter" -"inst/doc/RatingTables.Rmd",68,1,"style","Variable and function name style should be snake_case or symbols.","ratingTableModel <- GetRatingTableModel(projectId, modelId)","object_name_linter" -"inst/doc/RatingTables.Rmd",69,1,"style","Variable and function name style should be snake_case or symbols.","ratingTableId <- ratingTableModel$ratingTableId","object_name_linter" -"inst/doc/RatingTables.Rmd",70,1,"style","Variable and function name style should be snake_case or symbols.","ratingTable <- GetRatingTable(projectId, ratingTableId)","object_name_linter" -"inst/doc/RatingTables.Rmd",75,1,"style","Variable and function name style should be snake_case or symbols.","ratingTable <- readRDS(""ratingTable.rds"")","object_name_linter" -"inst/doc/RatingTables.Rmd",94,1,"style","Variable and function name style should be snake_case or symbols.","newRatingTableJobId <- CreateRatingTable(project,","object_name_linter" -"inst/doc/RatingTables.Rmd",98,1,"style","Variable and function name style should be snake_case or symbols.","newRatingTable <- GetRatingTableFromJobId(project, newRatingTableJobId)","object_name_linter" -"inst/doc/RatingTables.Rmd",103,1,"style","Variable and function name style should be snake_case or symbols.","ratingTable <- readRDS(""ratingTable.rds"")","object_name_linter" -"inst/doc/RatingTables.Rmd",113,1,"style","Variable and function name style should be snake_case or symbols.","newModelJobId <- RequestNewRatingTableModel(project, newRatingTable)","object_name_linter" -"inst/doc/RatingTables.Rmd",114,1,"style","Variable and function name style should be snake_case or symbols.","newRatingTableModel <- GetRatingTableModelFromJobId(project, newModelJobId)","object_name_linter" -"inst/doc/RatingTables.Rmd",119,1,"style","Variable and function name style should be snake_case or symbols.","newRatingTableModel <- readRDS(""ratingTableModel.RDS"")","object_name_linter" -"inst/doc/TimeSeries.Rmd",67,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""timestamp"",","line_length_linter" -"inst/doc/TimeSeries.Rmd",69,81,"style","Lines should not be more than 80 characters.","StartProject(dataSource = data, target = ""target"", partition = partition, metric = ""RMSE"")","line_length_linter" -"inst/doc/TimeSeries.Rmd",86,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""timestamp"",","line_length_linter" -"inst/doc/TimeSeries.Rmd",87,81,"style","Lines should not be more than 80 characters."," featureDerivationWindowStart = -24,","line_length_linter" -"inst/doc/TimeSeries.Rmd",88,81,"style","Lines should not be more than 80 characters."," featureDerivationWindowEnd = -12,","line_length_linter" -"inst/doc/TimeSeries.Rmd",104,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""timestamp"",","line_length_linter" -"inst/doc/TimeSeries.Rmd",136,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""timestamp"",","line_length_linter" -"inst/doc/TimeSeries.Rmd",138,81,"style","Lines should not be more than 80 characters."," featureSettings = list(""featureName"" = ""holiday"",","line_length_linter" -"inst/doc/TimeSeries.Rmd",139,81,"style","Lines should not be more than 80 characters."," ""knownInAdvance"" = TRUE))","line_length_linter" -"inst/doc/TimeSeries.Rmd",150,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""timestamp"",","line_length_linter" -"inst/doc/TimeSeries.Rmd",152,81,"style","Lines should not be more than 80 characters."," featureSettings = list(list(""featureName"" = ""holiday"",","line_length_linter" -"inst/doc/TimeSeries.Rmd",153,81,"style","Lines should not be more than 80 characters."," ""knownInAdvance"" = TRUE),","line_length_linter" -"inst/doc/TimeSeries.Rmd",154,81,"style","Lines should not be more than 80 characters."," list(""featureName"" = ""weekend"",","line_length_linter" -"inst/doc/TimeSeries.Rmd",155,81,"style","Lines should not be more than 80 characters."," ""knownInAdvance"" = TRUE)))","line_length_linter" -"inst/doc/TimeSeries.Rmd",186,81,"style","Lines should not be more than 80 characters.","data <- read.csv(system.file(""extdata"", ""multiseries.csv"", package = ""datarobot""))","line_length_linter" -"inst/doc/TimeSeries.Rmd",187,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""timestamp"",","line_length_linter" -"inst/doc/TimeSeries.Rmd",189,81,"style","Lines should not be more than 80 characters."," multiseriesIdColumns = ""series_id"")","line_length_linter" -"inst/doc/TimeSeries.Rmd",219,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""timestamp"",","line_length_linter" -"inst/doc/TimeSeries.Rmd",221,81,"style","Lines should not be more than 80 characters."," featureSettings = list(list(""featureName"" = ""sales"",","line_length_linter" -"inst/doc/TimeSeries.Rmd",222,81,"style","Lines should not be more than 80 characters."," ""doNotDerive"" = TRUE)))","line_length_linter" -"inst/doc/TrainingPredictions.Rmd",26,1,"style","Variable and function name style should be snake_case or symbols.","trainingPredictions <- GetTrainingPredictionsForModel(model, dataSubset = DataSubset$All)","object_name_linter" -"inst/doc/TrainingPredictions.Rmd",26,81,"style","Lines should not be more than 80 characters.","trainingPredictions <- GetTrainingPredictionsForModel(model, dataSubset = DataSubset$All)","line_length_linter" -"inst/doc/TrainingPredictions.Rmd",27,81,"style","Lines should not be more than 80 characters.","kable(head(trainingPredictions), longtable = TRUE, booktabs = TRUE, row.names = TRUE)","line_length_linter" -"inst/doc/TrainingPredictions.Rmd",32,1,"style","Variable and function name style should be snake_case or symbols.","trainingPredictions <- readRDS(""trainingPredictions.rds"")","object_name_linter" -"inst/doc/TrainingPredictions.Rmd",33,81,"style","Lines should not be more than 80 characters.","kable(head(trainingPredictions), longtable = TRUE, booktabs = TRUE, row.names = TRUE)","line_length_linter" -"inst/doc/TrainingPredictions.Rmd",41,1,"style","Variable and function name style should be snake_case or symbols.","jobId <- RequestTrainingPredictions(model, dataSubset = DataSubset$All)","object_name_linter" -"inst/doc/TrainingPredictions.Rmd",43,1,"style","Variable and function name style should be snake_case or symbols.","trainingPredictions <- GetTrainingPredictionsFromJobId(projectId, jobId) # blocks until job complete","object_name_linter" -"inst/doc/TrainingPredictions.Rmd",43,81,"style","Lines should not be more than 80 characters.","trainingPredictions <- GetTrainingPredictionsFromJobId(projectId, jobId) # blocks until job complete","line_length_linter" -"inst/doc/TrainingPredictions.Rmd",44,81,"style","Lines should not be more than 80 characters.","kable(head(trainingPredictions), longtable = TRUE, booktabs = TRUE, row.names = TRUE)","line_length_linter" -"inst/doc/TrainingPredictions.Rmd",49,1,"style","Variable and function name style should be snake_case or symbols.","trainingPredictions <- readRDS(""trainingPredictions.rds"")","object_name_linter" -"inst/doc/TrainingPredictions.Rmd",50,81,"style","Lines should not be more than 80 characters.","kable(head(trainingPredictions), longtable = TRUE, booktabs = TRUE, row.names = TRUE)","line_length_linter" -"inst/doc/TrainingPredictions.Rmd",56,1,"style","Variable and function name style should be snake_case or symbols.","trainingPredictions <- ListTrainingPredictions(projectId)","object_name_linter" -"inst/doc/TrainingPredictions.Rmd",57,1,"style","Variable and function name style should be snake_case or symbols.","trainingPredictionId <- trainingPredictions[[1]]$id","object_name_linter" -"inst/doc/TrainingPredictions.Rmd",58,1,"style","Variable and function name style should be snake_case or symbols.","trainingPrediction <- GetTrainingPredictions(projectId, trainingPredictionId)","object_name_linter" -"inst/doc/TrainingPredictions.Rmd",59,81,"style","Lines should not be more than 80 characters.","kable(head(trainingPrediction), longtable = TRUE, booktabs = TRUE, row.names = TRUE)","line_length_linter" -"inst/doc/TrainingPredictions.Rmd",63,1,"style","Variable and function name style should be snake_case or symbols.","trainingPrediction <- readRDS(""trainingPrediction.rds"")","object_name_linter" -"inst/doc/TrainingPredictions.Rmd",64,81,"style","Lines should not be more than 80 characters.","kable(head(trainingPrediction), longtable = TRUE, booktabs = TRUE, row.names = TRUE)","line_length_linter" -"inst/doc/TrainingPredictions.Rmd",73,81,"style","Lines should not be more than 80 characters.","DownloadTrainingPredictions(projectId, trainingPredictionId, ""trainingPredictions.csv"")","line_length_linter" -"inst/doc/VariableImportance.R",51,3,"style","Variable and function name style should be snake_case or symbols."," keepCols[5] <- metricNames[1]","object_name_linter" -"inst/doc/VariableImportance.R",52,12,"style","Variable and function name style should be snake_case or symbols."," colnames(outFrame) <- keepCols","object_name_linter" -"inst/doc/VariableImportance.R",58,14,"style","Variable and function name style should be snake_case or symbols."," colnames(upFrame) <- c(""blueprintId"", metricNames[i])","object_name_linter" -"inst/doc/VariableImportance.Rmd",60,81,"style","Lines should not be more than 80 characters.","friedman <- read.csv(system.file(""extdata"", ""Friedman1.csv.gz"", package = ""datarobot""))","line_length_linter" -"inst/doc/VariableImportance.Rmd",61,1,"style","Variable and function name style should be snake_case or symbols.","originalProject <- StartProject(friedman, ""OriginalProject"", target = ""Y"", wait = TRUE)","object_name_linter" -"inst/doc/VariableImportance.Rmd",61,81,"style","Lines should not be more than 80 characters.","originalProject <- StartProject(friedman, ""OriginalProject"", target = ""Y"", wait = TRUE)","line_length_linter" -"inst/doc/VariableImportance.Rmd",62,1,"style","Variable and function name style should be snake_case or symbols.","originalModels <- ListModels(originalProject)","object_name_linter" -"inst/doc/VariableImportance.Rmd",70,1,"style","Variable and function name style should be snake_case or symbols.","PermuteColumn <- function(originalFile, colName, permutedFile, iseed = 317) {","object_name_linter" -"inst/doc/VariableImportance.Rmd",70,27,"style","Variable and function name style should be snake_case or symbols.","PermuteColumn <- function(originalFile, colName, permutedFile, iseed = 317) {","object_name_linter" -"inst/doc/VariableImportance.Rmd",70,41,"style","Variable and function name style should be snake_case or symbols.","PermuteColumn <- function(originalFile, colName, permutedFile, iseed = 317) {","object_name_linter" -"inst/doc/VariableImportance.Rmd",70,50,"style","Variable and function name style should be snake_case or symbols.","PermuteColumn <- function(originalFile, colName, permutedFile, iseed = 317) {","object_name_linter" -"inst/doc/VariableImportance.Rmd",72,3,"style","Variable and function name style should be snake_case or symbols."," originalFile <- system.file(""extdata"", originalFile, package = ""datarobot"")","object_name_linter" -"inst/doc/VariableImportance.Rmd",74,3,"style","Variable and function name style should be snake_case or symbols."," varNames <- colnames(dframe)","object_name_linter" -"inst/doc/VariableImportance.Rmd",75,3,"style","Variable and function name style should be snake_case or symbols."," colIndex <- which(varNames == colName)","object_name_linter" -"inst/doc/VariableImportance.Rmd",76,15,"style","Commas should never have a space before."," x <- dframe[ ,colIndex]","commas_linter" -"inst/doc/VariableImportance.Rmd",76,15,"style","Do not place spaces after square brackets."," x <- dframe[ ,colIndex]","spaces_inside_linter" -"inst/doc/VariableImportance.Rmd",76,17,"style","Commas should always have a space after."," x <- dframe[ ,colIndex]","commas_linter" -"inst/doc/VariableImportance.Rmd",78,3,"style","Variable and function name style should be snake_case or symbols."," outFrame <- dframe","object_name_linter" -"inst/doc/VariableImportance.Rmd",79,3,"style","Variable and function name style should be snake_case or symbols."," outFrame[ ,colIndex] <- y","object_name_linter" -"inst/doc/VariableImportance.Rmd",79,12,"style","Commas should never have a space before."," outFrame[ ,colIndex] <- y","commas_linter" -"inst/doc/VariableImportance.Rmd",79,12,"style","Do not place spaces after square brackets."," outFrame[ ,colIndex] <- y","spaces_inside_linter" -"inst/doc/VariableImportance.Rmd",79,14,"style","Commas should always have a space after."," outFrame[ ,colIndex] <- y","commas_linter" -"inst/doc/VariableImportance.Rmd",80,46,"style","Put spaces around all infix operators."," write.csv(outFrame, permutedFile, row.names=FALSE)","infix_spaces_linter" -"inst/doc/VariableImportance.Rmd",87,1,"style","Variable and function name style should be snake_case or symbols.","modelList <- list(n = 11)","object_name_linter" -"inst/doc/VariableImportance.Rmd",88,1,"style","Variable and function name style should be snake_case or symbols.","modelList[[1]] <- originalModels","object_name_linter" -"inst/doc/VariableImportance.Rmd",89,1,"style","Variable and function name style should be snake_case or symbols.","permFile <- tempfile(fileext = ""permFile.csv"")","object_name_linter" -"inst/doc/VariableImportance.Rmd",91,3,"style","Variable and function name style should be snake_case or symbols."," varName <- paste(""X"",i,sep="""")","object_name_linter" -"inst/doc/VariableImportance.Rmd",91,24,"style","Commas should always have a space after."," varName <- paste(""X"",i,sep="""")","commas_linter" -"inst/doc/VariableImportance.Rmd",91,26,"style","Commas should always have a space after."," varName <- paste(""X"",i,sep="""")","commas_linter" -"inst/doc/VariableImportance.Rmd",91,29,"style","Put spaces around all infix operators."," varName <- paste(""X"",i,sep="""")","infix_spaces_linter" -"inst/doc/VariableImportance.Rmd",93,3,"style","Variable and function name style should be snake_case or symbols."," projName <- paste(""PermProject"", varName, sep = """")","object_name_linter" -"inst/doc/VariableImportance.Rmd",94,3,"style","Variable and function name style should be snake_case or symbols."," permProject <- StartProject(permFile, projectName = projName, target = ""Y"", wait = TRUE)","object_name_linter" -"inst/doc/VariableImportance.Rmd",94,81,"style","Lines should not be more than 80 characters."," permProject <- StartProject(permFile, projectName = projName, target = ""Y"", wait = TRUE)","line_length_linter" -"inst/doc/VariableImportance.Rmd",95,3,"style","Variable and function name style should be snake_case or symbols."," modelList[[i+1]] <- ListModels(permProject)","object_name_linter" -"inst/doc/VariableImportance.Rmd",95,15,"style","Put spaces around all infix operators."," modelList[[i+1]] <- ListModels(permProject)","infix_spaces_linter" -"inst/doc/VariableImportance.Rmd",101,1,"style","Variable and function name style should be snake_case or symbols.","modelList <- readRDS(""PermutationModelList.rds"")","object_name_linter" -"inst/doc/VariableImportance.Rmd",116,1,"style","Variable and function name style should be snake_case or symbols.","PermutationMerge <- function(compositeList, matchPct = NULL, metricNames, matchMetric = NULL) {","object_name_linter" -"inst/doc/VariableImportance.Rmd",116,30,"style","Variable and function name style should be snake_case or symbols.","PermutationMerge <- function(compositeList, matchPct = NULL, metricNames, matchMetric = NULL) {","object_name_linter" -"inst/doc/VariableImportance.Rmd",116,45,"style","Variable and function name style should be snake_case or symbols.","PermutationMerge <- function(compositeList, matchPct = NULL, metricNames, matchMetric = NULL) {","object_name_linter" -"inst/doc/VariableImportance.Rmd",116,62,"style","Variable and function name style should be snake_case or symbols.","PermutationMerge <- function(compositeList, matchPct = NULL, metricNames, matchMetric = NULL) {","object_name_linter" -"inst/doc/VariableImportance.Rmd",116,75,"style","Variable and function name style should be snake_case or symbols.","PermutationMerge <- function(compositeList, matchPct = NULL, metricNames, matchMetric = NULL) {","object_name_linter" -"inst/doc/VariableImportance.Rmd",116,81,"style","Lines should not be more than 80 characters.","PermutationMerge <- function(compositeList, matchPct = NULL, metricNames, matchMetric = NULL) {","line_length_linter" -"inst/doc/VariableImportance.Rmd",124,5,"style","Variable and function name style should be snake_case or symbols."," projectMetric <- compositeList[[1]][[1]]$projectMetric","object_name_linter" -"inst/doc/VariableImportance.Rmd",125,5,"style","Variable and function name style should be snake_case or symbols."," matchMetric <- paste(projectMetric, ""validation"", sep = ""."")","object_name_linter" -"inst/doc/VariableImportance.Rmd",127,3,"style","Variable and function name style should be snake_case or symbols."," getCols <- c(""modelType"", ""expandedModel"", ""samplePct"", ""blueprintId"", matchMetric)","object_name_linter" -"inst/doc/VariableImportance.Rmd",127,81,"style","Lines should not be more than 80 characters."," getCols <- c(""modelType"", ""expandedModel"", ""samplePct"", ""blueprintId"", matchMetric)","line_length_linter" -"inst/doc/VariableImportance.Rmd",128,3,"style","Variable and function name style should be snake_case or symbols."," outFrame <- df[index, getCols]","object_name_linter" -"inst/doc/VariableImportance.Rmd",129,3,"style","Variable and function name style should be snake_case or symbols."," keepCols <- getCols","object_name_linter" -"inst/doc/VariableImportance.Rmd",130,3,"style","Variable and function name style should be snake_case or symbols."," keepCols[5] <- metricNames[1]","object_name_linter" -"inst/doc/VariableImportance.Rmd",131,12,"style","Variable and function name style should be snake_case or symbols."," colnames(outFrame) <- keepCols","object_name_linter" -"inst/doc/VariableImportance.Rmd",136,5,"style","Variable and function name style should be snake_case or symbols."," upFrame <- df[index, c(""blueprintId"", matchMetric)]","object_name_linter" -"inst/doc/VariableImportance.Rmd",137,14,"style","Variable and function name style should be snake_case or symbols."," colnames(upFrame) <- c(""blueprintId"", metricNames[i])","object_name_linter" -"inst/doc/VariableImportance.Rmd",138,5,"style","Variable and function name style should be snake_case or symbols."," outFrame <- merge(outFrame, upFrame, by = ""blueprintId"")","object_name_linter" -"inst/doc/VariableImportance.Rmd",147,1,"style","Variable and function name style should be snake_case or symbols.","metricNames <- c(""originalRMSE"", paste(""X"", seq(1, 10, 1), ""RMSE"", sep = """"))","object_name_linter" -"inst/doc/VariableImportance.Rmd",148,1,"style","Variable and function name style should be snake_case or symbols.","mergeFrame <- PermutationMerge(modelList, 16, metricNames)","object_name_linter" -"inst/doc/VariableImportance.Rmd",156,1,"style","Variable and function name style should be snake_case or symbols.","BeanNames <- c(""None"", paste(""X"", seq(1, 10, 1), sep = """"))","object_name_linter" -"inst/doc/VariableImportance.Rmd",167,1,"style","Variable and function name style should be snake_case or symbols.","ComputeDeltas <- function(mergeFrame, refCol, permNames, shiftNames) {","object_name_linter" -"inst/doc/VariableImportance.Rmd",167,27,"style","Variable and function name style should be snake_case or symbols.","ComputeDeltas <- function(mergeFrame, refCol, permNames, shiftNames) {","object_name_linter" -"inst/doc/VariableImportance.Rmd",167,39,"style","Variable and function name style should be snake_case or symbols.","ComputeDeltas <- function(mergeFrame, refCol, permNames, shiftNames) {","object_name_linter" -"inst/doc/VariableImportance.Rmd",167,47,"style","Variable and function name style should be snake_case or symbols.","ComputeDeltas <- function(mergeFrame, refCol, permNames, shiftNames) {","object_name_linter" -"inst/doc/VariableImportance.Rmd",167,58,"style","Variable and function name style should be snake_case or symbols.","ComputeDeltas <- function(mergeFrame, refCol, permNames, shiftNames) {","object_name_linter" -"inst/doc/VariableImportance.Rmd",168,3,"style","Variable and function name style should be snake_case or symbols."," allNames <- colnames(mergeFrame)","object_name_linter" -"inst/doc/VariableImportance.Rmd",169,3,"style","Variable and function name style should be snake_case or symbols."," refIndex <- which(allNames == refCol)","object_name_linter" -"inst/doc/VariableImportance.Rmd",170,3,"style","Variable and function name style should be snake_case or symbols."," xRef <- mergeFrame[, refIndex]","object_name_linter" -"inst/doc/VariableImportance.Rmd",171,3,"style","Variable and function name style should be snake_case or symbols."," permCols <- which(allNames %in% permNames)","object_name_linter" -"inst/doc/VariableImportance.Rmd",172,3,"style","Variable and function name style should be snake_case or symbols."," xPerm <- mergeFrame[, permCols]","object_name_linter" -"inst/doc/VariableImportance.Rmd",176,3,"style","Variable and function name style should be snake_case or symbols."," newIndex <- which(colnames(deltas) == ""New"")","object_name_linter" -"inst/doc/VariableImportance.Rmd",185,1,"style","Variable and function name style should be snake_case or symbols.","allNames <- colnames(mergeFrame)","object_name_linter" -"inst/doc/VariableImportance.Rmd",186,1,"style","Variable and function name style should be snake_case or symbols.","refCol <- allNames[5]","object_name_linter" -"inst/doc/VariableImportance.Rmd",187,1,"style","Variable and function name style should be snake_case or symbols.","permNames <- allNames[6:15]","object_name_linter" -"inst/doc/VariableImportance.Rmd",188,1,"style","Variable and function name style should be snake_case or symbols.","shiftNames <- paste(""X"", seq(1, 10, 1), sep = """")","object_name_linter" -"inst/doc/VariableImportance.Rmd",189,1,"style","Variable and function name style should be snake_case or symbols.","deltaFrame <- ComputeDeltas(mergeFrame, refCol, permNames, shiftNames)","object_name_linter" -"inst/doc/VariableImportance.Rmd",193,10,"style","Put spaces around all infix operators.","par(mfrow=c(1, 1))","infix_spaces_linter" -"inst/doc/VariableImportance.Rmd",198,1,"style","Variable and function name style should be snake_case or symbols.","bestRow <- which.min(deltaFrame$originalRMSE)","object_name_linter" -"inst/doc/VariableImportance.Rmd",199,1,"style","Variable and function name style should be snake_case or symbols.","bestModel <- mergeFrame$modelType[bestRow]","object_name_linter" -"inst/doc/VariableImportance.Rmd",200,81,"style","Lines should not be more than 80 characters.","points(seq(1, 10, 1), deltaFrame[bestRow, 1:10], pch = 16, col = ""limegreen"", cex = 1.5)","line_length_linter" -"inst/doc/VariableImportance.Rmd",219,1,"style","Variable and function name style should be snake_case or symbols.","varImpSummary <- function(deltaFrame, refCol, oneIndex) {","object_name_linter" -"inst/doc/VariableImportance.Rmd",219,27,"style","Variable and function name style should be snake_case or symbols.","varImpSummary <- function(deltaFrame, refCol, oneIndex) {","object_name_linter" -"inst/doc/VariableImportance.Rmd",219,39,"style","Variable and function name style should be snake_case or symbols.","varImpSummary <- function(deltaFrame, refCol, oneIndex) {","object_name_linter" -"inst/doc/VariableImportance.Rmd",219,47,"style","Variable and function name style should be snake_case or symbols.","varImpSummary <- function(deltaFrame, refCol, oneIndex) {","object_name_linter" -"inst/doc/VariableImportance.Rmd",221,3,"style","Variable and function name style should be snake_case or symbols."," refIndex <- which(vars == refCol)","object_name_linter" -"inst/doc/VariableImportance.Rmd",222,3,"style","Variable and function name style should be snake_case or symbols."," refValue <- deltaFrame[, refIndex]","object_name_linter" -"inst/doc/VariableImportance.Rmd",223,11,"style","Put spaces around all infix operators."," wts <- 1/refValue # Performance-weights = reciprocal fitting measure","infix_spaces_linter" -"inst/doc/VariableImportance.Rmd",224,3,"style","Variable and function name style should be snake_case or symbols."," deltasOnly <- deltaFrame[, -refIndex]","object_name_linter" -"inst/doc/VariableImportance.Rmd",225,3,"style","Variable and function name style should be snake_case or symbols."," thisModel <- as.numeric(deltasOnly[oneIndex, ])","object_name_linter" -"inst/doc/VariableImportance.Rmd",226,34,"style","Put spaces around all infix operators."," avg <- apply(deltasOnly, MARGIN=2, mean)","infix_spaces_linter" -"inst/doc/VariableImportance.Rmd",227,3,"style","Variable and function name style should be snake_case or symbols."," WtAvgFunction <- function(x, w) { sum(w * x) / sum(w) }","object_name_linter" -"inst/doc/VariableImportance.Rmd",227,35,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," WtAvgFunction <- function(x, w) { sum(w * x) / sum(w) }","brace_linter" -"inst/doc/VariableImportance.Rmd",227,57,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," WtAvgFunction <- function(x, w) { sum(w * x) / sum(w) }","brace_linter" -"inst/doc/VariableImportance.Rmd",228,3,"style","Variable and function name style should be snake_case or symbols."," wtAvg <- apply(deltasOnly, MARGIN = 2, WtAvgFunction, wts)","object_name_linter" -"inst/doc/VariableImportance.Rmd",229,3,"style","Variable and function name style should be snake_case or symbols."," varImpFrame <- data.frame(average = avg,","object_name_linter" -"inst/doc/VariableImportance.Rmd",239,1,"style","Variable and function name style should be snake_case or symbols.","varImp <- varImpSummary(deltaFrame, ""originalRMSE"", bestRow)","object_name_linter" -"inst/doc/VariableImportance.Rmd",241,1,"style","Variable and function name style should be snake_case or symbols.","wtAvg <- round(varImp$weightedAverage, digits = 3)","object_name_linter" -"R/AdvancedTuning.R",80,1,"style","Variable and function names should not be longer than 30 characters.","summary.listOfDataRobotTuningParameters <- function(object, ...) {","object_length_linter" -"R/AdvancedTuning.R",171,11,"style","Variable and function name style should be snake_case or symbols."," formals(tuningFunction) <- args","object_name_linter" -"R/AnomalyAssessment.R",5,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotAnomalyAssessmentRecord""","object_name_linter" -"R/AnomalyAssessment.R",12,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotShapFeatureContribution""","object_name_linter" -"R/AnomalyAssessment.R",18,3,"style","Variable and function name style should be snake_case or symbols."," outList$timestamp <- parseRFC3339Timestamp(outList$timestamp)","object_name_linter" -"R/AnomalyAssessment.R",22,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotPredictionWithExplanationsRow""","object_name_linter" -"R/AnomalyAssessment.R",32,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotAnomalyAssessmentExplanations""","object_name_linter" -"R/AnomalyAssessment.R",43,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotPreviewBin""","object_name_linter" -"R/AnomalyAssessment.R",53,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotAnomalyAssessmentPredictionsPreview""","object_name_linter" -"R/ApplySchema.R",16,13,"style","Variable and function name style should be snake_case or symbols."," names(outList) <- elements","object_name_linter" -"R/asDataFrame.R",44,47,"style","Variable and function name style should be snake_case or symbols.","as.data.frame.listOfBlueprints <- function(x, row.names = NULL,","object_name_linter" -"R/asDataFrame.R",68,14,"style","Variable and function name style should be snake_case or symbols."," rownames(sumFrame) <- row.names","object_name_linter" -"R/asDataFrame.R",75,49,"style","Variable and function name style should be snake_case or symbols.","as.data.frame.listOfFeaturelists <- function(x, row.names = NULL,","object_name_linter" -"R/asDataFrame.R",84,11,"style","Variable and function name style should be snake_case or symbols."," class(upFrame$features) <- ""list""","object_name_linter" -"R/asDataFrame.R",94,14,"style","Variable and function name style should be snake_case or symbols."," rownames(sumFrame) <- row.names","object_name_linter" -"R/asDataFrame.R",151,16,"style","Variable and function name style should be snake_case or symbols."," rownames(outFrame) <- row.names","object_name_linter" -"R/asDataFrame.R",185,16,"style","Variable and function name style should be snake_case or symbols."," colnames(validFrame) <- paste(colnames(validFrame), ""validation"",","object_name_linter" -"R/asDataFrame.R",188,16,"style","Variable and function name style should be snake_case or symbols."," colnames(crossFrame) <- paste(colnames(crossFrame),","object_name_linter" -"R/asDataFrame.R",191,16,"style","Variable and function name style should be snake_case or symbols."," colnames(holdFrame) <- paste(colnames(holdFrame), ""holdout"", sep = ""."")","object_name_linter" -"R/asDataFrame.R",197,16,"style","Variable and function name style should be snake_case or symbols."," rownames(outFrame) <- row.names","object_name_linter" -"R/asDataFrame.R",223,12,"style","Variable and function name style should be snake_case or symbols."," colnames(metricFrame) <- metricNames","object_name_linter" -"R/asDataFrame.R",239,49,"style","Variable and function name style should be snake_case or symbols.","as.data.frame.projectSummaryList <- function(x, row.names = NULL,","object_name_linter" -"R/asDataFrame.R",262,14,"style","Variable and function name style should be snake_case or symbols."," rownames(outFrame) <- row.names","object_name_linter" -"R/asDataFrame.R",270,1,"style","Variable and function names should not be longer than 30 characters.","as.data.frame.listOfDataRobotPredictionDatasets <- function(x, row.names = NULL,","object_length_linter" -"R/asDataFrame.R",270,64,"style","Variable and function name style should be snake_case or symbols.","as.data.frame.listOfDataRobotPredictionDatasets <- function(x, row.names = NULL,","object_name_linter" -"R/asDataFrame.R",294,14,"style","Variable and function name style should be snake_case or symbols."," rownames(sumFrame) <- row.names","object_name_linter" -"R/Blenders.R",69,11,"style","Variable and function name style should be snake_case or symbols."," names(modelDetails)[idIndex] <- ""modelId""","object_name_linter" -"R/Blenders.R",70,5,"style","Variable and function name style should be snake_case or symbols."," modelDetails$metrics <- ReformatMetrics(modelDetails$metrics)","object_name_linter" -"R/Blenders.R",75,7,"style","Variable and function name style should be snake_case or symbols."," modelDetails$processes <- character(0)","object_name_linter" -"R/Blenders.R",163,9,"style","Variable and function name style should be snake_case or symbols."," class(returnModel) <- ""dataRobotBlenderModel""","object_name_linter" -"R/Blenders.R",187,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotBlenderModel""","object_name_linter" -"R/Blueprints.R",27,9,"style","Variable and function name style should be snake_case or symbols."," class(blueprintList) <- c(""listOfBlueprints"", ""listSubclass"")","object_name_linter" -"R/Calendars.R",57,3,"style","Variable and function name style should be snake_case or symbols."," outList$id <- outList$Id","object_name_linter" -"R/Calendars.R",59,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotCalendar""","object_name_linter" -"R/ConfusionChart.R",82,3,"style","Variable and function name style should be snake_case or symbols."," outList$data <- as.list(outList$data)","object_name_linter" -"R/ConnectToDataRobot.R",70,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (!is.na(envEndpoint) & !is.na(envToken)) {","vector_logic_linter" -"R/DataRobotRequests.R",193,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (endpoint == """" | token == """") {","vector_logic_linter" -"R/DataSources.R",50,3,"style","Variable and function name style should be snake_case or symbols."," outList$params <- ApplySchema(outList$params, c(""dataSourceId"", ""table""))","object_name_linter" -"R/DataSources.R",51,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotDataSource""","object_name_linter" -"R/DataStores.R",48,3,"style","Variable and function name style should be snake_case or symbols."," outList$params <- ApplySchema(outList$params, c(""driverId"", ""jdbcUrl""))","object_name_linter" -"R/DataStores.R",49,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotDataStore""","object_name_linter" -"R/DatetimeTrendPlots.R",140,5,"style","Variable and function name style should be snake_case or symbols."," outList$backtestMetadata$training[] <- lapply(","object_name_linter" -"R/DatetimeTrendPlots.R",143,5,"style","Variable and function name style should be snake_case or symbols."," outList$backtestMetadata$validation[] <- lapply(","object_name_linter" -"R/DatetimeTrendPlots.R",146,5,"style","Variable and function name style should be snake_case or symbols."," outList$holdoutMetadata$training <- lapply(","object_name_linter" -"R/DatetimeTrendPlots.R",149,5,"style","Variable and function name style should be snake_case or symbols."," outList$holdoutMetadata$validation <- lapply(","object_name_linter" -"R/DatetimeTrendPlots.R",290,9,"style","Variable and function name style should be snake_case or symbols."," outList$calendarEvents$date <- do.call(","object_name_linter" -"R/DeploymentAccuracy.R",161,34,"style","Any function spanning multiple lines should use curly braces."," responses <- lapply(metrics, function(m)","brace_linter" -"R/DeploymentMonitoringUtils.R",39,9,"style","Variable and function name style should be snake_case or symbols."," periodContainer$period <- list()","object_name_linter" -"R/DeploymentMonitoringUtils.R",40,9,"style","Variable and function name style should be snake_case or symbols."," periodContainer$period$start <- NA","object_name_linter" -"R/DeploymentMonitoringUtils.R",41,9,"style","Variable and function name style should be snake_case or symbols."," periodContainer$period$end <- NA","object_name_linter" -"R/Drivers.R",47,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotDriver""","object_name_linter" -"R/FeatureAssociations.R",78,3,"style","Variable and function name style should be snake_case or symbols."," outList$values <- as.data.frame(outList$values)","object_name_linter" -"R/FeatureAssociations.R",79,12,"style","Variable and function name style should be snake_case or symbols."," colnames(outList$values) <- c(""feature1"", ""feature2"", ""relativeFreq"")","object_name_linter" -"R/Featurelists.R",46,9,"style","Variable and function name style should be snake_case or symbols."," names(featurelistInfo)[idIndex] <- ""featurelistId""","object_name_linter" -"R/Featurelists.R",78,3,"style","Variable and function name style should be snake_case or symbols."," featurelistInfo$id <- NULL","object_name_linter" -"R/Features.R",149,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotFeatureInfo""","object_name_linter" -"R/Features.R",161,3,"style","Variable and function name style should be snake_case or symbols."," outList$summary <- ApplySchema(outList$summary, descriptiveStatisticsElements)","object_name_linter" -"R/Features.R",230,39,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," }) }) }","brace_linter" -"R/GetPredictions.R",94,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/GetPredictions.R",97,27,"style","Any function spanning multiple lines should use curly braces."," function(x) stats::setNames(x$value,","brace_linter" -"R/GetPredictJobs.R",32,3,"style","Variable and function name style should be snake_case or symbols."," predictJobStatus$id <- NULL","object_name_linter" -"R/ListModelJobs.R",58,11,"style","Variable and function name style should be snake_case or symbols."," names(pendingList)[idIndex] <- ""modelJobId""","object_name_linter" -"R/MissingValuesReport.R",60,5,"style","Variable and function name style should be snake_case or symbols."," inList[[i]]$feature <- NULL # Drop feature from within list","object_name_linter" -"R/MissingValuesReport.R",62,7,"style","Variable and function name style should be snake_case or symbols."," inList[[i]]$tasks[[j]]$id <- names(inList[[i]]$tasks)[[j]]","object_name_linter" -"R/MissingValuesReport.R",63,7,"style","Variable and function name style should be snake_case or symbols."," inList[[i]]$tasks[[j]]$name <- as.character(inList[[i]]$tasks[[j]]$name)","object_name_linter" -"R/MissingValuesReport.R",66,5,"style","Variable and function name style should be snake_case or symbols."," inList[[i]]$tasks <- unname(inList[[i]]$tasks)","object_name_linter" -"R/ModelRecommendations.R",25,9,"style","Variable and function name style should be snake_case or symbols."," class(modelRecommendations) <- c(""listOfModelRecommendations"", ""listSubclass"")","object_name_linter" -"R/ModelRecommendations.R",73,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotModelRecommendation""","object_name_linter" -"R/Models.R",91,11,"style","Variable and function name style should be snake_case or symbols."," names(modelDetails)[names(modelDetails) == ""id""] <- ""modelId""","object_name_linter" -"R/Models.R",92,5,"style","Variable and function name style should be snake_case or symbols."," modelDetails$metrics <- ReformatMetrics(modelDetails$metrics)","object_name_linter" -"R/Models.R",97,7,"style","Variable and function name style should be snake_case or symbols."," modelDetails$processes <- character(0)","object_name_linter" -"R/Models.R",153,11,"style","Variable and function name style should be snake_case or symbols."," names(modelDetails)[idIndex] <- ""modelId""","object_name_linter" -"R/Models.R",154,5,"style","Variable and function name style should be snake_case or symbols."," modelDetails$metrics <- ReformatMetrics(modelDetails$metrics)","object_name_linter" -"R/Models.R",159,7,"style","Variable and function name style should be snake_case or symbols."," modelDetails$processes <- character(0)","object_name_linter" -"R/Models.R",214,7,"style","`else` should come on the same line as the previous `}`."," else if (identical(filter$isStarred, FALSE)) {","brace_linter" -"R/Models.R",248,9,"style","Variable and function name style should be snake_case or symbols."," class(returnList) <- c(""listOfModels"", ""listSubclass"")","object_name_linter" -"R/Models.R",296,9,"style","Variable and function name style should be snake_case or symbols."," class(returnModel) <- ""dataRobotModel""","object_name_linter" -"R/Models.R",348,9,"style","Variable and function name style should be snake_case or symbols."," class(returnModel) <- ""dataRobotFrozenModel""","object_name_linter" -"R/Models.R",585,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotModel""","object_name_linter" -"R/Models.R",614,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotFrozenModel""","object_name_linter" -"R/Models.R",686,3,"style","Variable and function name style should be snake_case or symbols."," outList$parameters <- lapply(outList$parameters, as.dataRobotNameValueSchema)","object_name_linter" -"R/Models.R",752,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotDatetimeModel""","object_name_linter" -"R/Models.R",763,5,"style","Variable and function name style should be snake_case or symbols."," bodyFrame[fieldName] <- featurelist","object_name_linter" -"R/Models.R",768,11,"style","Variable and function name style should be snake_case or symbols."," names(bodyFrame)[1] <- fieldName","object_name_linter" -"R/Models.R",885,11,"style","Variable and function name style should be snake_case or symbols."," names(modelDetails)[names(modelDetails) == ""id""] <- ""modelId""","object_name_linter" -"R/Models.R",886,5,"style","Variable and function name style should be snake_case or symbols."," modelDetails$metrics <- ReformatMetrics(modelDetails$metrics)","object_name_linter" -"R/Models.R",891,7,"style","Variable and function name style should be snake_case or symbols."," modelDetails$processes <- character(0)","object_name_linter" -"R/Models.R",894,11,"style","Variable and function name style should be snake_case or symbols."," class(modelDetails) <- ""dataRobotDatetimeModel""","object_name_linter" -"R/Models.R",942,9,"style","Variable and function name style should be snake_case or symbols."," class(returnModel) <- ""dataRobotDatetimeModel""","object_name_linter" -"R/Models.R",1172,3,"warning","local variable β€˜response’ assigned but may not be used"," response <- DataRobotGET(routeString, as = ""file"", filename = fileName,","object_usage_linter" -"R/ParetoFront.R",70,3,"style","Variable and function name style should be snake_case or symbols."," outList$hyperparameters <- as.list(outList$hyperparameters)","object_name_linter" -"R/ParetoFront.R",71,3,"style","Variable and function name style should be snake_case or symbols."," outList$solutions <- as.list(outList$solutions)","object_name_linter" -"R/Partitions.R",473,7,"style","Variable and function name style should be snake_case or symbols."," outList$backtests <- as.dataRobotBacktestSpecification(outList$backtests)","object_name_linter" -"R/Partitions.R",689,3,"style","Variable and function name style should be snake_case or symbols."," outList$backtests <- ApplySchema(outList$backtests, backtestElements)","object_name_linter" -"R/PredictionDatasets.R",228,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotPredictionDataset""","object_name_linter" -"R/PredictionDatasets.R",233,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- c(""listOfDataRobotPredictionDatasets"", ""listSubclass"")","object_name_linter" -"R/PredictionExplanations.R",107,9,"style","Variable and function name style should be snake_case or symbols."," class(pseudoModel) <- ""dataRobotModel""","object_name_linter" -"R/PredictionExplanations.R",473,3,"style","Variable and function name style should be snake_case or symbols."," outDf$prediction <- vapply(explains, `[[`, predictionType, ""prediction"")","object_name_linter" -"R/PredictionExplanations.R",494,7,"style","Variable and function name style should be snake_case or symbols."," outDf[paste0(""class"", m, ""Label"")] <- labels","object_name_linter" -"R/PredictionExplanations.R",497,7,"style","Variable and function name style should be snake_case or symbols."," outDf[paste0(""class"", m, ""Probability"")] <- values","object_name_linter" -"R/PredictionExplanations.R",508,5,"style","Variable and function name style should be snake_case or symbols."," outDf[paste0(""explanation"", n, ""FeatureName"")] <-","object_name_linter" -"R/PredictionExplanations.R",522,5,"style","Variable and function name style should be snake_case or symbols."," outDf[paste0(""explanation"", n, ""QualitativeStrength"")] <-","object_name_linter" -"R/PredictionExplanations.R",533,5,"style","Variable and function name style should be snake_case or symbols."," outDf[paste0(""explanation"", n, ""Strength"")] <- if (length(strength) > 1) {","object_name_linter" -"R/PredictionExplanations.R",536,5,"style","Variable and function name style should be snake_case or symbols."," outDf[paste0(""explanation"", n, ""Label"")] <-","object_name_linter" -"R/PrimeModels.R",99,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- c(""dataRobotPrimeModels"", ""data.frame"")","object_name_linter" -"R/PrimeModels.R",105,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- c(""dataRobotPrimeModel"")","object_name_linter" -"R/Projects.R",127,11,"style","Variable and function name style should be snake_case or symbols."," names(projectSummaryData)[[idIndex]] <- ""projectId""","object_name_linter" -"R/Projects.R",129,11,"style","Variable and function name style should be snake_case or symbols."," class(projectSummaryData) <- ""projectSummaryList""","object_name_linter" -"R/Projects.R",177,9,"style","Variable and function name style should be snake_case or symbols."," names(projectDetails)[idIndex] <- ""projectId""","object_name_linter" -"R/Projects.R",183,9,"style","Variable and function name style should be snake_case or symbols."," class(outProject) <- ""dataRobotProject""","object_name_linter" -"R/RatingTables.R",102,9,"style","Variable and function name style should be snake_case or symbols."," class(ratingTables) <- c(""listOfRatingTables"", ""listSubclass"")","object_name_linter" -"R/RatingTables.R",258,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotRatingTableModel""","object_name_linter" -"R/RatingTables.R",268,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotRatingTable""","object_name_linter" -"R/ReformatMetrics.R",22,5,"style","Variable and function name style should be snake_case or symbols."," outList[[i]] <- as.data.frame(lapply(metricsList[[i]], ReplaceFunction))","object_name_linter" -"R/ReformatMetrics.R",25,9,"style","Variable and function name style should be snake_case or symbols."," names(outList) <- names(metricsList)","object_name_linter" -"R/ResidualsChart.R",48,3,"style","Variable and function name style should be snake_case or symbols."," outList$data <- as.data.frame(outList$data)","object_name_linter" -"R/ResidualsChart.R",52,5,"style","Variable and function name style should be snake_case or symbols."," outList$data[""rowNumber""] <- NA","object_name_linter" -"R/ResidualsChart.R",54,12,"style","Variable and function name style should be snake_case or symbols."," colnames(outList$data) <- c(""actual"",","object_name_linter" -"R/ResidualsChart.R",59,3,"style","Variable and function name style should be snake_case or symbols."," outList$histogram$occurrences <- as.integer(outList$histogram$occurrences)","object_name_linter" -"R/ResidualsChart.R",60,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotResiduals""","object_name_linter" -"R/ServerData.R",6,3,"style","Variable and function name style should be snake_case or symbols."," serverData$`next` <- NULL","object_name_linter" -"R/ServerData.R",7,3,"style","Variable and function name style should be snake_case or symbols."," serverData$previous <- NULL","object_name_linter" -"R/SetupProject.R",41,5,"style","Variable and function name style should be snake_case or symbols."," dataList$url <- dataSource","object_name_linter" -"R/SetupProject.R",43,5,"style","Variable and function name style should be snake_case or symbols."," dataList$file <- UploadData(dataSource)","object_name_linter" -"R/SetupProject.R",186,9,"style","Variable and function name style should be snake_case or symbols."," class(outList) <- ""dataRobotProject""","object_name_linter" -"R/StartAutopilot.R",124,3,"style","Variable and function name style should be snake_case or symbols."," bodyList$metric <- metric","object_name_linter" -"R/StartAutopilot.R",125,3,"style","Variable and function name style should be snake_case or symbols."," bodyList$weights <- weights","object_name_linter" -"R/StartAutopilot.R",126,3,"style","Variable and function name style should be snake_case or symbols."," bodyList$mode <- mode","object_name_linter" -"R/StartAutopilot.R",127,3,"style","Variable and function name style should be snake_case or symbols."," bodyList$quickrun <- quickrun","object_name_linter" -"R/StartAutopilot.R",128,3,"style","Variable and function name style should be snake_case or symbols."," bodyList$seed <- seed","object_name_linter" -"R/StartAutopilot.R",136,3,"style","Variable and function name style should be snake_case or symbols."," bodyList$offset <- offset","object_name_linter" -"R/StartAutopilot.R",137,3,"style","Variable and function name style should be snake_case or symbols."," bodyList$exposure <- exposure","object_name_linter" -"R/TrainingPredictions.R",120,37,"style","Any function spanning multiple lines should use curly braces."," function(x) stats::setNames(x$value,","brace_linter" -"R/utils.R",87,3,"style","Variable and function name style should be snake_case or symbols."," out.vec[var.pos] <- var.nms","object_name_linter" -"R/utils.R",88,3,"style","Variable and function name style should be snake_case or symbols."," out.vec[-var.pos] <- data.nms[!(data.nms %in% var.nms)]","object_name_linter" -"R/Validate.R",36,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(is(model, ""dataRobotModel"") | is(model, ""dataRobotFrozenModel"") |","vector_logic_linter" -"R/Validate.R",36,73,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(is(model, ""dataRobotModel"") | is(model, ""dataRobotFrozenModel"") |","vector_logic_linter" -"R/Validate.R",158,3,"style","`else` should come on the same line as the previous `}`."," else if (!""associationId"" %in% names(actuals)) {","brace_linter" -"R/Validate.R",161,3,"style","`else` should come on the same line as the previous `}`."," else if (max(nchar(actuals[[""associationId""]])) > 128) {","brace_linter" -"R/Validate.R",164,3,"style","`else` should come on the same line as the previous `}`."," else if (!is.character(actuals[[""associationId""]])) {","brace_linter" -"R/Validate.R",167,3,"style","`else` should come on the same line as the previous `}`."," else if (!""actualValue"" %in% names(actuals)) {","brace_linter" -"R/Validate.R",195,3,"style","`else` should come on the same line as the previous `}`."," else if (!(""timeSeriesEligible"" %in% names(properties))) {","brace_linter" -"R/Validate.R",198,3,"style","`else` should come on the same line as the previous `}`."," else if (!(""crossSeriesEligible"" %in% names(properties))) {","brace_linter" -"R/Validate.R",201,3,"style","`else` should come on the same line as the previous `}`."," else if (!isTRUE(properties$timeSeriesEligible)) {","brace_linter" -"tests/testthat/helper-fixtures.R",14,1,"style","Variable and function name style should be snake_case or symbols.","fakeProjectJson$id <- fakeProject$projectId","object_name_linter" -"tests/testthat/helper-fixtures.R",16,7,"style","Variable and function name style should be snake_case or symbols.","class(fakeProjectJson) <- ""list""","object_name_linter" -"tests/testthat/test-StartAutopilot.R",66,55,"warning","no visible binding for global variable β€˜projectUrl’"," getStub$onCall(7)$returns(httr:::response(url = projectUrl,","object_usage_linter" -"tests/testthat/test-StartAutopilot.R",71,55,"warning","no visible binding for global variable β€˜projectUrl’"," getStub$onCall(5)$returns(httr:::response(url = projectUrl,","object_usage_linter" -"tests/testthat/test-StartAutopilot.R",76,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"tests/testthat/test-StartAutopilot.R",78,53,"warning","no visible binding for global variable β€˜projectUrl’"," getStub$onCall(3)$returns(httr:::response(url = projectUrl,","object_usage_linter" -"tests/testthat/test-StartAutopilot.R",112,49,"warning","no visible binding for global variable β€˜fakeEndpoint’"," ""datarobot:::Endpoint"" = function() fakeEndpoint,","object_usage_linter" -"tests/testthat/test-StartAutopilot.R",113,46,"warning","no visible binding for global variable β€˜fakeToken’"," ""datarobot:::Token"" = function() fakeToken,","object_usage_linter" -"vignettes/AdvancedTuning.Rmd",22,1,"style","Variable and function name style should be snake_case or symbols.","tuningJobId <- RunInteractiveTuning(myModel)","object_name_linter" -"vignettes/AdvancedTuning.Rmd",28,1,"style","Variable and function name style should be snake_case or symbols.","tunedModel <- GetModelFromJobId(myModel$projectId, tuningJobId)","object_name_linter" -"vignettes/AdvancedTuning.Rmd",54,1,"style","Variable and function name style should be snake_case or symbols.","myXGBModel <- GetModel(projectId, modelId)","object_name_linter" -"vignettes/AdvancedTuning.Rmd",55,1,"style","Variable and function name style should be snake_case or symbols.","RunTune <- StartTuningSession(myXGBModel)","object_name_linter" -"vignettes/AdvancedTuning.Rmd",56,1,"style","Variable and function name style should be snake_case or symbols.","tuningJob <- RunTune(myXGBModel, colsample_bytree = 0.4, colsample_bylevel = 0.8)","object_name_linter" -"vignettes/AdvancedTuning.Rmd",56,81,"style","Lines should not be more than 80 characters.","tuningJob <- RunTune(myXGBModel, colsample_bytree = 0.4, colsample_bylevel = 0.8)","line_length_linter" -"vignettes/AdvancedTuning.Rmd",57,1,"style","Variable and function name style should be snake_case or symbols.","tunedModel <- GetModelFromJobId(projectId, tuningJob)","object_name_linter" -"vignettes/AdvancedVignette.Rmd",37,81,"style","Lines should not be more than 80 characters.","ConnectToDataRobot(endpoint = ""http:///api/v2"", token = """")","line_length_linter" -"vignettes/AdvancedVignette.Rmd",46,1,"style","Variable and function name style should be snake_case or symbols.","lendingClubURL <- ""https://s3.amazonaws.com/datarobot_public_datasets/10K_Lending_Club_Loans.csv""","object_name_linter" -"vignettes/AdvancedVignette.Rmd",46,81,"style","Lines should not be more than 80 characters.","lendingClubURL <- ""https://s3.amazonaws.com/datarobot_public_datasets/10K_Lending_Club_Loans.csv""","line_length_linter" -"vignettes/AdvancedVignette.Rmd",79,1,"style","Variable and function name style should be snake_case or symbols.","allModels <- ListModels(project)","object_name_linter" -"vignettes/AdvancedVignette.Rmd",81,1,"style","Variable and function name style should be snake_case or symbols.","modelFrame <- as.data.frame(allModels)","object_name_linter" -"vignettes/AdvancedVignette.Rmd",83,27,"style","Only use double-quotes.","if (project$metric %in% c('AUC', 'Gini Norm')) {","single_quotes_linter" -"vignettes/AdvancedVignette.Rmd",83,34,"style","Only use double-quotes.","if (project$metric %in% c('AUC', 'Gini Norm')) {","single_quotes_linter" -"vignettes/AdvancedVignette.Rmd",84,3,"style","Variable and function name style should be snake_case or symbols."," bestIndex <- which.max(metric)","object_name_linter" -"vignettes/AdvancedVignette.Rmd",86,3,"style","Variable and function name style should be snake_case or symbols."," bestIndex <- which.min(metric)","object_name_linter" -"vignettes/AdvancedVignette.Rmd",88,1,"style","Variable and function name style should be snake_case or symbols.","bestModel <- allModels[[bestIndex]]","object_name_linter" -"vignettes/AdvancedVignette.Rmd",93,1,"style","Variable and function name style should be snake_case or symbols.","allModels <- readRDS(""modelsModelInsights.rds"")","object_name_linter" -"vignettes/AdvancedVignette.Rmd",94,1,"style","Variable and function name style should be snake_case or symbols.","bestModel <- allModels[[1]]","object_name_linter" -"vignettes/AdvancedVignette.Rmd",115,1,"style","Variable and function name style should be snake_case or symbols.","ValidationLiftChart <- GetLiftChart(bestModel, source = ""validation"")","object_name_linter" -"vignettes/AdvancedVignette.Rmd",122,1,"style","Variable and function name style should be snake_case or symbols.","LiftChartPlot <- function(ValidationLiftChart, bins = 10) {","object_name_linter" -"vignettes/AdvancedVignette.Rmd",122,27,"style","Variable and function name style should be snake_case or symbols.","LiftChartPlot <- function(ValidationLiftChart, bins = 10) {","object_name_linter" -"vignettes/AdvancedVignette.Rmd",124,5,"style","Variable and function name style should be snake_case or symbols."," ValidationLiftChart$bins <- rep(seq(bins), each = 60 / bins)","object_name_linter" -"vignettes/AdvancedVignette.Rmd",125,5,"style","Variable and function name style should be snake_case or symbols."," ValidationLiftChart <- data.table(ValidationLiftChart)","object_name_linter" -"vignettes/AdvancedVignette.Rmd",133,1,"style","Variable and function name style should be snake_case or symbols.","LiftChartData <- LiftChartPlot(ValidationLiftChart)","object_name_linter" -"vignettes/AdvancedVignette.Rmd",142,3,"style","Commented code should be removed.","# dr_dark_blue <- ""#08233F""","commented_code_linter" -"vignettes/AdvancedVignette.Rmd",143,3,"style","Commented code should be removed.","# dr_blue <- ""#1F77B4""","commented_code_linter" -"vignettes/AdvancedVignette.Rmd",144,3,"style","Commented code should be removed.","# dr_orange <- ""#FF7F0E""","commented_code_linter" -"vignettes/AdvancedVignette.Rmd",145,3,"style","Commented code should be removed.","# LiftChartData <- readRDS(""LiftChartDataVal.rds"")","commented_code_linter" -"vignettes/AdvancedVignette.Rmd",146,3,"style","Commented code should be removed.","# par(bg = dr_dark_blue)","commented_code_linter" -"vignettes/AdvancedVignette.Rmd",149,3,"style","Commented code should be removed.","# lines(LiftChartData$Predicted, col = dr_blue, pch = 20, type = ""b"")","commented_code_linter" -"vignettes/AdvancedVignette.Rmd",156,1,"style","Variable and function name style should be snake_case or symbols.","AllLiftChart <- ListLiftCharts(bestModel)","object_name_linter" -"vignettes/AdvancedVignette.Rmd",157,1,"style","Variable and function name style should be snake_case or symbols.","LiftChartData <- LiftChartPlot(AllLiftChart[[""crossValidation""]])","object_name_linter" -"vignettes/AdvancedVignette.Rmd",166,3,"style","Commented code should be removed.","# LiftChartData <- readRDS(""LiftChartDataCV.rds"")","commented_code_linter" -"vignettes/AdvancedVignette.Rmd",167,3,"style","Commented code should be removed.","# par(bg = dr_dark_blue)","commented_code_linter" -"vignettes/AdvancedVignette.Rmd",170,3,"style","Commented code should be removed.","# lines(LiftChartData$Predicted, col = dr_blue, pch = 20, type = ""b"")","commented_code_linter" -"vignettes/AdvancedVignette.Rmd",212,1,"style","Variable and function name style should be snake_case or symbols.","ValidationRocCurve <- GetRocCurve(bestModel)","object_name_linter" -"vignettes/AdvancedVignette.Rmd",213,1,"style","Variable and function name style should be snake_case or symbols.","ValidationRocPoints <- ValidationRocCurve[[""rocPoints""]]","object_name_linter" -"vignettes/AdvancedVignette.Rmd",216,81,"style","Lines should not be more than 80 characters.","plot(ValidationRocPoints$falsePositiveRate, ValidationRocPoints$truePositiveRate,","line_length_linter" -"vignettes/AdvancedVignette.Rmd",218,81,"style","Lines should not be more than 80 characters."," xlab = ""False Positive Rate (Fallout)"", ylab = ""True Positive Rate (Sensitivity)"",","line_length_linter" -"vignettes/AdvancedVignette.Rmd",220,17,"style","Commas should always have a space after."," ylim = c(0,1), xlim = c(0,1),","commas_linter" -"vignettes/AdvancedVignette.Rmd",220,32,"style","Commas should always have a space after."," ylim = c(0,1), xlim = c(0,1),","commas_linter" -"vignettes/AdvancedVignette.Rmd",227,1,"style","Variable and function name style should be snake_case or symbols.","ValidationRocPoints <- readRDS(""ValidationRocPoints.rds"")","object_name_linter" -"vignettes/AdvancedVignette.Rmd",229,81,"style","Lines should not be more than 80 characters.","plot(ValidationRocPoints$falsePositiveRate, ValidationRocPoints$truePositiveRate,","line_length_linter" -"vignettes/AdvancedVignette.Rmd",231,81,"style","Lines should not be more than 80 characters."," xlab = ""False Positive Rate (Fallout)"", ylab = ""True Positive Rate (Sensitivity)"",","line_length_linter" -"vignettes/AdvancedVignette.Rmd",240,1,"style","Variable and function name style should be snake_case or symbols.","AllRocCurve <- ListRocCurves(bestModel)","object_name_linter" -"vignettes/AdvancedVignette.Rmd",241,1,"style","Variable and function name style should be snake_case or symbols.","CrossValidationRocPoints <- AllRocCurve[['crossValidation']][['rocPoints']]","object_name_linter" -"vignettes/AdvancedVignette.Rmd",241,42,"style","Only use double-quotes.","CrossValidationRocPoints <- AllRocCurve[['crossValidation']][['rocPoints']]","single_quotes_linter" -"vignettes/AdvancedVignette.Rmd",241,63,"style","Only use double-quotes.","CrossValidationRocPoints <- AllRocCurve[['crossValidation']][['rocPoints']]","single_quotes_linter" -"vignettes/AdvancedVignette.Rmd",242,35,"style","Only use double-quotes.","saveRDS(CrossValidationRocPoints, 'CrossValidationRocPoints.rds')","single_quotes_linter" -"vignettes/AdvancedVignette.Rmd",244,81,"style","Lines should not be more than 80 characters.","plot(CrossValidationRocPoints$falsePositiveRate, CrossValidationRocPoints$truePositiveRate,","line_length_linter" -"vignettes/AdvancedVignette.Rmd",246,81,"style","Lines should not be more than 80 characters."," xlab = ""False Positive Rate (Fallout)"", ylab = ""True Positive Rate (Sensitivity)"",","line_length_linter" -"vignettes/AdvancedVignette.Rmd",253,1,"style","Variable and function name style should be snake_case or symbols.","CrossValidationRocPoints <- readRDS(""CrossValidationRocPoints.rds"")","object_name_linter" -"vignettes/AdvancedVignette.Rmd",255,81,"style","Lines should not be more than 80 characters.","plot(CrossValidationRocPoints$falsePositiveRate, CrossValidationRocPoints$truePositiveRate,","line_length_linter" -"vignettes/AdvancedVignette.Rmd",257,81,"style","Lines should not be more than 80 characters."," xlab = ""False Positive Rate (Fallout)"", ylab = ""True Positive Rate (Sensitivity)"",","line_length_linter" -"vignettes/AdvancedVignette.Rmd",267,23,"style","Trailing whitespace is superfluous."," ValidationRocPoints, ","trailing_whitespace_linter" -"vignettes/AdvancedVignette.Rmd",278,81,"style","Lines should not be more than 80 characters.","threshold <- ValidationRocPoints$threshold[which.max(ValidationRocPoints$f1Score)]","line_length_linter" -"vignettes/AdvancedVignette.Rmd",284,81,"style","Lines should not be more than 80 characters.","ValidationRocPoints[ValidationRocPoints$threshold == tail(Filter(function(x) x > threshold,","line_length_linter" -"vignettes/AdvancedVignette.Rmd",285,81,"style","Lines should not be more than 80 characters."," ValidationRocPoints$threshold),","line_length_linter" -"vignettes/AdvancedVignette.Rmd",302,1,"style","Variable and function name style should be snake_case or symbols.","wordModels <- allModels[grep(""Word"", lapply(allModels, `[[`, ""modelType""))]","object_name_linter" -"vignettes/AdvancedVignette.Rmd",303,1,"style","Variable and function name style should be snake_case or symbols.","wordModel <- wordModels[[1]]","object_name_linter" -"vignettes/AdvancedVignette.Rmd",305,1,"style","Variable and function name style should be snake_case or symbols.","wordCloud <- GetWordCloud(project, wordModel$modelId)","object_name_linter" -"vignettes/AdvancedVignette.Rmd",311,1,"style","Variable and function name style should be snake_case or symbols.","wordCloud <- readRDS(""wordCloudModelInsights.rds"")","object_name_linter" -"vignettes/AdvancedVignette.Rmd",318,47,"style","Trailing whitespace is superfluous."," colormap::colormap(c(""#255FEC"", ""#2DBEF9"")), ","trailing_whitespace_linter" -"vignettes/AdvancedVignette.Rmd",320,29,"style","Trailing whitespace is superfluous."," c(""#FFAC9D"", ""#D80909""), ","trailing_whitespace_linter" -"vignettes/AdvancedVignette.Rmd",329,1,"style","Variable and function name style should be snake_case or symbols.","wordCloud <- wordCloud[!wordCloud$isStopword, ]","object_name_linter" -"vignettes/AdvancedVignette.Rmd",331,56,"style","Trailing whitespace is superfluous.","# Specify colors similar to what DataRobot produces for ","trailing_whitespace_linter" -"vignettes/Calendars.Rmd",18,81,"style","Lines should not be more than 80 characters.","calendar <- read.csv(system.file(""extdata"", ""calendar.csv"", package = ""datarobot""))","line_length_linter" -"vignettes/Calendars.Rmd",31,1,"style","Variable and function name style should be snake_case or symbols.","apiToken <- """"","object_name_linter" -"vignettes/Calendars.Rmd",72,1,"style","Variable and function name style should be snake_case or symbols.","newCalendar <- UpdateCalendar(calendar, name = ""newName"")","object_name_linter" -"vignettes/Calendars.Rmd",88,81,"style","Lines should not be more than 80 characters.","project <- SetupProject(timeSeriesData, projectName = ""time series with calendar"")","line_length_linter" -"vignettes/Calendars.Rmd",91,81,"style","Lines should not be more than 80 characters."," autopilotDataSelectionMethod = ""duration"",","line_length_linter" -"vignettes/Calendars.Rmd",103,1,"style","Variable and function name style should be snake_case or symbols.","projectId <- ""59dab74bbd2a54035786bfc0""","object_name_linter" -"vignettes/ComparingSubsets.Rmd",63,1,"style","Variable and function name style should be snake_case or symbols.","MissPctInsulin <- round(100 * length(which(PimaIndiansDiabetes$insulin == 0)) /","object_name_linter" -"vignettes/ComparingSubsets.Rmd",75,1,"style","Variable and function name style should be snake_case or symbols.","insulinMissing <- as.numeric(PimaIndiansDiabetes$insulin == 0)","object_name_linter" -"vignettes/ComparingSubsets.Rmd",76,1,"style","Variable and function name style should be snake_case or symbols.","modifiedPima <- PimaIndiansDiabetes","object_name_linter" -"vignettes/ComparingSubsets.Rmd",77,1,"style","Variable and function name style should be snake_case or symbols.","modifiedPima$insulin <- NULL","object_name_linter" -"vignettes/ComparingSubsets.Rmd",78,1,"style","Variable and function name style should be snake_case or symbols.","modifiedPima$insulinMissing <- insulinMissing","object_name_linter" -"vignettes/ComparingSubsets.Rmd",84,1,"style","Variable and function name style should be snake_case or symbols.","insulinProject <- StartProject(dataSource = modifiedPima,","object_name_linter" -"vignettes/ComparingSubsets.Rmd",93,1,"style","Variable and function name style should be snake_case or symbols.","insulinModelList <- ListModels(insulinProject)","object_name_linter" -"vignettes/ComparingSubsets.Rmd",98,1,"style","Variable and function name style should be snake_case or symbols.","insulinModelList <- readRDS(""insulinModelList.rds"")","object_name_linter" -"vignettes/ComparingSubsets.Rmd",99,1,"style","Variable and function name style should be snake_case or symbols.","insulinModelFrame <- as.data.frame(insulinModelList, simple = FALSE)","object_name_linter" -"vignettes/ComparingSubsets.Rmd",107,1,"style","Variable and function name style should be snake_case or symbols.","bestIndex <- which.min(insulinModelFrame$LogLoss.validation)","object_name_linter" -"vignettes/ComparingSubsets.Rmd",108,1,"style","Variable and function name style should be snake_case or symbols.","worstIndex <- which.max(insulinModelFrame$LogLoss.validation)","object_name_linter" -"vignettes/ComparingSubsets.Rmd",118,81,"style","Lines should not be more than 80 characters.","plot(insulinModelFrame$AUC.validation, xlab = ""Model number"", ylab = ""Area under the ROC curve"")","line_length_linter" -"vignettes/ComparingSubsets.Rmd",119,81,"style","Lines should not be more than 80 characters.","points(bestIndex, insulinModelFrame$AUC.validation[bestIndex], pch = 16, col = ""red"")","line_length_linter" -"vignettes/ComparingSubsets.Rmd",129,1,"style","Variable and function name style should be snake_case or symbols.","modelList <- list(n = 9)","object_name_linter" -"vignettes/ComparingSubsets.Rmd",130,1,"style","Variable and function name style should be snake_case or symbols.","modelList[[1]] <- insulinModelList","object_name_linter" -"vignettes/ComparingSubsets.Rmd",131,1,"style","Variable and function name style should be snake_case or symbols.","allVars <- colnames(modifiedPima)[1:8]","object_name_linter" -"vignettes/ComparingSubsets.Rmd",132,1,"style","Variable and function name style should be snake_case or symbols.","permFile <- tempfile(fileext = ""permFile.csv"")","object_name_linter" -"vignettes/ComparingSubsets.Rmd",134,3,"style","Variable and function name style should be snake_case or symbols."," varName <- allVars[i]","object_name_linter" -"vignettes/ComparingSubsets.Rmd",136,3,"style","Variable and function name style should be snake_case or symbols."," projName <- paste(""PermProject"",varName,sep="""")","object_name_linter" -"vignettes/ComparingSubsets.Rmd",136,35,"style","Commas should always have a space after."," projName <- paste(""PermProject"",varName,sep="""")","commas_linter" -"vignettes/ComparingSubsets.Rmd",136,43,"style","Commas should always have a space after."," projName <- paste(""PermProject"",varName,sep="""")","commas_linter" -"vignettes/ComparingSubsets.Rmd",136,46,"style","Put spaces around all infix operators."," projName <- paste(""PermProject"",varName,sep="""")","infix_spaces_linter" -"vignettes/ComparingSubsets.Rmd",137,3,"style","Variable and function name style should be snake_case or symbols."," permProject <- StartProject(permFile, projectName = projName, target = ""insulinMissing"", wait = TRUE)","object_name_linter" -"vignettes/ComparingSubsets.Rmd",137,81,"style","Lines should not be more than 80 characters."," permProject <- StartProject(permFile, projectName = projName, target = ""insulinMissing"", wait = TRUE)","line_length_linter" -"vignettes/ComparingSubsets.Rmd",138,3,"style","Variable and function name style should be snake_case or symbols."," modelList[[i+1]] <- ListModels(permProject)","object_name_linter" -"vignettes/ComparingSubsets.Rmd",138,15,"style","Put spaces around all infix operators."," modelList[[i+1]] <- ListModels(permProject)","infix_spaces_linter" -"vignettes/ComparingSubsets.Rmd",147,1,"style","Variable and function name style should be snake_case or symbols.","logLossDeltas <- readRDS(""insulinDeltaFrame.rds"")","object_name_linter" -"vignettes/ComparingSubsets.Rmd",151,1,"style","Variable and function name style should be snake_case or symbols.","bestRow <- which.min(logLossDeltas$originalLogLoss)","object_name_linter" -"vignettes/ComparingSubsets.Rmd",152,81,"style","Lines should not be more than 80 characters.","points(seq(1, 8, 1), logLossDeltas[bestRow, 1:8], pch = 16, col = ""limegreen"", cex = 1.5)","line_length_linter" -"vignettes/ComparingSubsets.Rmd",164,1,"style","Variable and function name style should be snake_case or symbols.","AUCshiftFrame <- readRDS(""AUCshiftFrame.rds"")","object_name_linter" -"vignettes/ComparingSubsets.Rmd",165,1,"style","Variable and function name style should be snake_case or symbols.","sortIndex <- order(logLossDeltas$originalLogLoss)","object_name_linter" -"vignettes/ComparingSubsets.Rmd",166,81,"style","Lines should not be more than 80 characters.","plot(AUCshiftFrame$originalAUC[sortIndex], xlab = ""Model number"", ylab = ""Area under ROC curve"")","line_length_linter" -"vignettes/ComparingSubsets.Rmd",174,1,"style","Variable and function name style should be snake_case or symbols.","missingInsulin <- as.numeric(PimaIndiansDiabetes$insulin == 0)","object_name_linter" -"vignettes/ComparingSubsets.Rmd",175,1,"style","Variable and function name style should be snake_case or symbols.","missingTriceps <- as.numeric(PimaIndiansDiabetes$triceps == 0)","object_name_linter" -"vignettes/ComparingSubsets.Rmd",198,1,"style","Variable and function name style should be snake_case or symbols.","lossIndex <- which(dataCar$claimcst0 > 0)","object_name_linter" -"vignettes/ComparingSubsets.Rmd",199,1,"style","Variable and function name style should be snake_case or symbols.","keepVars <- c(""veh_value"", ""exposure"", ""claimcst0"", ""veh_body"", ""veh_age"",","object_name_linter" -"vignettes/ComparingSubsets.Rmd",201,1,"style","Variable and function name style should be snake_case or symbols.","lossFrame <- subset(dataCar, claimcst0 > 0, select = keepVars)","object_name_linter" -"vignettes/ComparingSubsets.Rmd",222,1,"style","Variable and function name style should be snake_case or symbols.","lossPct <- round(100 * length(lossIndex) / nrow(dataCar), digits = 1)","object_name_linter" -"vignettes/ComparingSubsets.Rmd",223,1,"style","Variable and function name style should be snake_case or symbols.","anomIndex <- which(lossFrame$claimcst0 == 200)","object_name_linter" -"vignettes/ComparingSubsets.Rmd",224,1,"style","Variable and function name style should be snake_case or symbols.","anomPct <- round(100 * length(anomIndex) / length(lossIndex), digits = 1)","object_name_linter" -"vignettes/ComparingSubsets.Rmd",235,1,"style","Variable and function name style should be snake_case or symbols.","anomFrame <- lossFrame","object_name_linter" -"vignettes/ComparingSubsets.Rmd",236,1,"style","Variable and function name style should be snake_case or symbols.","anomFrame$claimcst0 <- NULL","object_name_linter" -"vignettes/ComparingSubsets.Rmd",237,1,"style","Variable and function name style should be snake_case or symbols.","anomFrame$anomaly <- anomaly","object_name_linter" -"vignettes/ComparingSubsets.Rmd",238,1,"style","Variable and function name style should be snake_case or symbols.","anomProject <- StartProject(anomFrame, projectName = ""AnomalyProject"", target = anomaly, wait = TRUE)","object_name_linter" -"vignettes/ComparingSubsets.Rmd",238,81,"style","Lines should not be more than 80 characters.","anomProject <- StartProject(anomFrame, projectName = ""AnomalyProject"", target = anomaly, wait = TRUE)","line_length_linter" -"vignettes/ComparingSubsets.Rmd",239,1,"style","Variable and function name style should be snake_case or symbols.","anomalyModelList <- ListModels(anomProject)","object_name_linter" -"vignettes/ComparingSubsets.Rmd",247,1,"style","Variable and function name style should be snake_case or symbols.","anomalyLeaderboard <- readRDS(""anomalyModelList.rds"")","object_name_linter" -"vignettes/ComparingSubsets.Rmd",248,1,"style","Variable and function name style should be snake_case or symbols.","anomalyLeaderFrame <- as.data.frame(anomalyLeaderboard, simple = FALSE)","object_name_linter" -"vignettes/ComparingSubsets.Rmd",249,1,"style","Variable and function name style should be snake_case or symbols.","plotPct <- max(anomalyLeaderFrame$samplePct)","object_name_linter" -"vignettes/ComparingSubsets.Rmd",250,81,"style","Lines should not be more than 80 characters.","plot(anomalyLeaderboard, pct = plotPct, orderDecreasing = TRUE, xlim = c(0, 0.45))","line_length_linter" -"vignettes/ComparingSubsets.Rmd",251,81,"style","Lines should not be more than 80 characters.","abline(v = min(anomalyLeaderFrame$LogLoss.validation), lty = 2, lwd = 2, col = ""magenta"")","line_length_linter" -"vignettes/ComparingSubsets.Rmd",258,1,"style","Variable and function name style should be snake_case or symbols.","AAUC <- anomalyLeaderFrame$AUC.validation","object_name_linter" -"vignettes/ComparingSubsets.Rmd",259,1,"style","Variable and function name style should be snake_case or symbols.","samplePct <- anomalyLeaderFrame$samplePct","object_name_linter" -"vignettes/ComparingSubsets.Rmd",262,1,"style","Variable and function name style should be snake_case or symbols.","Index64 <- which(samplePct == sizes[3])","object_name_linter" -"vignettes/ComparingSubsets.Rmd",264,1,"style","Variable and function name style should be snake_case or symbols.","Index32 <- which(samplePct == sizes[2])","object_name_linter" -"vignettes/ComparingSubsets.Rmd",266,1,"style","Variable and function name style should be snake_case or symbols.","Index16 <- which(samplePct == sizes[1])","object_name_linter" -"vignettes/ComparingSubsets.Rmd",275,1,"style","Variable and function name style should be snake_case or symbols.","anomAUCDeltaFrame <- readRDS(""anomAUCDeltaFrame.rds"")","object_name_linter" -"vignettes/ComparingSubsets.Rmd",276,1,"style","Variable and function name style should be snake_case or symbols.","bestIndex <- which.min(anomalyLeaderFrame$LogLoss.validation)","object_name_linter" -"vignettes/ComparingSubsets.Rmd",277,1,"style","Variable and function name style should be snake_case or symbols.","bestExpModel <- as.character(anomalyLeaderFrame$expandedModel)[bestIndex]","object_name_linter" -"vignettes/ComparingSubsets.Rmd",278,1,"style","Variable and function name style should be snake_case or symbols.","bestRow <- which(anomAUCDeltaFrame$expandedModel == bestExpModel)","object_name_linter" -"vignettes/ComparingSubsets.Rmd",282,14,"style","Put spaces around all infix operators."," what=c(0, 1, 1, 1), ylim=c(-0.1, 0.1))","infix_spaces_linter" -"vignettes/ComparingSubsets.Rmd",282,34,"style","Put spaces around all infix operators."," what=c(0, 1, 1, 1), ylim=c(-0.1, 0.1))","infix_spaces_linter" -"vignettes/ComparingSubsets.Rmd",283,81,"style","Lines should not be more than 80 characters.","points(seq(1, 7, 1), anomAUCDeltaFrame[bestRow, 1:7], pch = 16, col = ""limegreen"", cex = 1.5)","line_length_linter" -"vignettes/ComplianceDocumentation.Rmd",26,1,"style","Variable and function name style should be snake_case or symbols.","apiToken <- """"","object_name_linter" -"vignettes/ComplianceDocumentation.Rmd",59,81,"style","Lines should not be more than 80 characters.","UploadComplianceDocTemplate(name = ""myNewTemplate"", filename = ""path/to/modified_file.json"")","line_length_linter" -"vignettes/ComplianceDocumentation.Rmd",67,81,"style","Lines should not be more than 80 characters."," ""regularText"" = ""This dataset had a lot of Missing Values. See the chart below: {{missingValues}}"",","line_length_linter" -"vignettes/ComplianceDocumentation.Rmd",70,81,"style","Lines should not be more than 80 characters."," ""regularText"" = ""{{blueprintDiagram}} /n Blueprint for this model"",","line_length_linter" -"vignettes/ComplianceDocumentation.Rmd",72,81,"style","Lines should not be more than 80 characters.","UploadComplianceDocTemplate(name = ""myNewTemplateFromSections"", sections = sections)","line_length_linter" -"vignettes/ComplianceDocumentation.Rmd",78,1,"style","Variable and function name style should be snake_case or symbols.","myTemplate <- ListComplianceDocTemplates(namePart = ""myNewTemplateFromSections"")[[1]]","object_name_linter" -"vignettes/ComplianceDocumentation.Rmd",78,81,"style","Lines should not be more than 80 characters.","myTemplate <- ListComplianceDocTemplates(namePart = ""myNewTemplateFromSections"")[[1]]","line_length_linter" -"vignettes/ComplianceDocumentation.Rmd",87,1,"style","Variable and function name style should be snake_case or symbols.","myTemplate <- ListComplianceDocTemplates(namePart = ""myNewTemplate"")[[1]]","object_name_linter" -"vignettes/DatetimePartitionedProjects.Rmd",26,81,"style","Lines should not be more than 80 characters.","lending <- read.csv(""https://s3.amazonaws.com/datarobot_public_datasets/10K_Lending_Club_Loans.csv"")","line_length_linter" -"vignettes/DatetimePartitionedProjects.Rmd",27,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""earliest_cr_line"",","line_length_linter" -"vignettes/DatetimePartitionedProjects.Rmd",43,81,"style","Lines should not be more than 80 characters."," ""1989-12-01"", ConstructDurationString(days = 100))","line_length_linter" -"vignettes/DatetimePartitionedProjects.Rmd",44,81,"style","Lines should not be more than 80 characters.","backtest[[2]] <- CreateBacktestSpecification(1, ConstructDurationString(), ""1999-10-01"",","line_length_linter" -"vignettes/DatetimePartitionedProjects.Rmd",45,81,"style","Lines should not be more than 80 characters."," ConstructDurationString(days = 100))","line_length_linter" -"vignettes/DatetimePartitionedProjects.Rmd",67,81,"style","Lines should not be more than 80 characters.","# Retrieve a datetime model. There is now a new retrieval function specific to datetime partitioning","line_length_linter" -"vignettes/DatetimePartitionedProjects.Rmd",71,1,"style","Variable and function name style should be snake_case or symbols.","scoreJobId <- ScoreBacktests(dt_model)","object_name_linter" -"vignettes/DatetimePartitionedProjects.Rmd",75,1,"style","Variable and function name style should be snake_case or symbols.","dtModelWithBt <- GetDatetimeModel(proj, dt_model$modelId)","object_name_linter" -"vignettes/DatetimePartitionedProjects.Rmd",78,81,"style","Lines should not be more than 80 characters.","# One has to request a `Frozen` model to keep the hyper-parameters static and avoid lookahead bias.","line_length_linter" -"vignettes/DatetimePartitionedProjects.Rmd",79,81,"style","Lines should not be more than 80 characters.","# Within the context of deployment, this can be used to retrain a resulting model on more recent data.","line_length_linter" -"vignettes/DatetimePartitionedProjects.Rmd",80,81,"style","Lines should not be more than 80 characters.","UpdateProject(proj, holdoutUnlocked = TRUE) # If retraining on 100% of the data, we need to unlock the holdout set.","line_length_linter" -"vignettes/DatetimePartitionedProjects.Rmd",81,1,"style","Variable and function name style should be snake_case or symbols.","modelJobId_frozen <- RequestFrozenDatetimeModel(dt_model,","object_name_linter" -"vignettes/DatetimePartitionedProjects.Rmd",82,81,"style","Lines should not be more than 80 characters."," trainingStartDate = as.Date(""1950/12/1""),","line_length_linter" -"vignettes/DatetimePartitionedProjects.Rmd",83,81,"style","Lines should not be more than 80 characters."," trainingEndDate = as.Date(""1998/3/1""))","line_length_linter" -"vignettes/DatetimePartitionedProjects.Rmd",87,1,"style","Variable and function name style should be snake_case or symbols.","modelJobId <- RequestNewDatetimeModel(proj, bps[[1]], trainingRowCount = 100)","object_name_linter" -"vignettes/DatetimePartitionedProjects.Rmd",91,1,"style","Variable and function name style should be snake_case or symbols.","modelJobId <- RequestNewDatetimeModel(proj, bps[[1]],","object_name_linter" -"vignettes/DatetimePartitionedProjects.Rmd",92,81,"style","Lines should not be more than 80 characters."," trainingDuration = ConstructDurationString(months=10))","line_length_linter" -"vignettes/DatetimePartitionedProjects.Rmd",92,90,"style","Put spaces around all infix operators."," trainingDuration = ConstructDurationString(months=10))","infix_spaces_linter" -"vignettes/Deployment.Rmd",31,1,"style","Variable and function name style should be snake_case or symbols.","predictionServer <- ListPredictionServers()[[1]]","object_name_linter" -"vignettes/Deployment.Rmd",34,81,"style","Lines should not be more than 80 characters."," description = ""A new deployment for demo purposes"",","line_length_linter" -"vignettes/Deployment.Rmd",83,1,"style","Variable and function name style should be snake_case or symbols.","newModel <- ListModels(project)[[2]]","object_name_linter" -"vignettes/Deployment.Rmd",96,1,"style","Variable and function name style should be snake_case or symbols.","newModel <- ListModels(project)[[2]]","object_name_linter" -"vignettes/IntroductionToDataRobot.Rmd",49,81,"style","Lines should not be more than 80 characters.","ConnectToDataRobot(endpoint = ""YOUR-ENDPOINT-HERE"", token = ""YOUR-API_TOKEN-HERE"")","line_length_linter" -"vignettes/IntroductionToDataRobot.Rmd",111,1,"style","Variable and function name style should be snake_case or symbols.","listOfBostonModels <- readRDS(""listOfBostonModels.rds"")","object_name_linter" -"vignettes/IntroductionToDataRobot.Rmd",112,1,"style","Variable and function name style should be snake_case or symbols.","fullFrame <- as.data.frame(listOfBostonModels, simple = FALSE)","object_name_linter" -"vignettes/IntroductionToDataRobot.Rmd",118,1,"style","Variable and function name style should be snake_case or symbols.","listOfBostonModels <- ListModels(project)","object_name_linter" -"vignettes/IntroductionToDataRobot.Rmd",153,1,"style","Variable and function name style should be snake_case or symbols.","modelFrame <- as.data.frame(listOfBostonModels)","object_name_linter" -"vignettes/IntroductionToDataRobot.Rmd",183,1,"style","Variable and function name style should be snake_case or symbols.","bestModel <- GetRecommendedModel(project)","object_name_linter" -"vignettes/IntroductionToDataRobot.Rmd",184,1,"style","Variable and function name style should be snake_case or symbols.","bestPredictions <- Predict(bestModel, Boston)","object_name_linter" -"vignettes/IntroductionToDataRobot.Rmd",202,1,"style","Variable and function name style should be snake_case or symbols.","bestPredictions <- readRDS(""bestPredictions.rds"")","object_name_linter" -"vignettes/IntroductionToDataRobot.Rmd",203,33,"style","Put spaces around all infix operators.","plot(medv, bestPredictions, xlab=""Observed medv value"", ylab=""Predicted medv value"",","infix_spaces_linter" -"vignettes/IntroductionToDataRobot.Rmd",203,61,"style","Put spaces around all infix operators.","plot(medv, bestPredictions, xlab=""Observed medv value"", ylab=""Predicted medv value"",","infix_spaces_linter" -"vignettes/IntroductionToDataRobot.Rmd",203,81,"style","Lines should not be more than 80 characters.","plot(medv, bestPredictions, xlab=""Observed medv value"", ylab=""Predicted medv value"",","line_length_linter" -"vignettes/Multiclass.Rmd",26,1,"style","Variable and function name style should be snake_case or symbols.","apiToken <- """"","object_name_linter" -"vignettes/Multiclass.Rmd",92,1,"style","Variable and function name style should be snake_case or symbols.","confusionChart <- GetConfusionChart(model, source = DataPartition$VALIDATION)","object_name_linter" -"vignettes/PartialDependence.Rmd",31,1,"style","Variable and function name style should be snake_case or symbols.","concreteFrame <- read.csv(system.file(""extdata"", ""concreteData.csv"", package = ""datarobot""))","object_name_linter" -"vignettes/PartialDependence.Rmd",31,81,"style","Lines should not be more than 80 characters.","concreteFrame <- read.csv(system.file(""extdata"", ""concreteData.csv"", package = ""datarobot""))","line_length_linter" -"vignettes/PartialDependence.Rmd",43,1,"style","Variable and function name style should be snake_case or symbols.","myDRProject <- StartProject(concreteFrame, ""ConcreteProject"", target = ""strength"", wait = TRUE)","object_name_linter" -"vignettes/PartialDependence.Rmd",43,81,"style","Lines should not be more than 80 characters.","myDRProject <- StartProject(concreteFrame, ""ConcreteProject"", target = ""strength"", wait = TRUE)","line_length_linter" -"vignettes/PartialDependence.Rmd",48,1,"style","Variable and function name style should be snake_case or symbols.","concreteModels <- readRDS(""concreteModels.rds"")","object_name_linter" -"vignettes/PartialDependence.Rmd",49,1,"style","Variable and function name style should be snake_case or symbols.","fullFrame <- as.data.frame(concreteModels, simple = FALSE)","object_name_linter" -"vignettes/PartialDependence.Rmd",50,1,"style","Variable and function name style should be snake_case or symbols.","modelsFrame <- as.data.frame(concreteModels)","object_name_linter" -"vignettes/PartialDependence.Rmd",56,1,"style","Variable and function name style should be snake_case or symbols.","concreteModels <- ListModels(myDRProject)","object_name_linter" -"vignettes/PartialDependence.Rmd",80,1,"style","Variable and function name style should be snake_case or symbols.","poorCol <- c(""black"", ""red"", rep(""black"", 13))","object_name_linter" -"vignettes/PartialDependence.Rmd",99,1,"style","Variable and function name style should be snake_case or symbols.","ridgeRows <- grep(""Ridge"", modelsFrame$modelType)","object_name_linter" -"vignettes/PartialDependence.Rmd",104,1,"style","Variable and function name style should be snake_case or symbols.","goodCol <- c(rep(""black"", 3), ""red"", rep(""black"", 6), ""red"", rep(""black"", 3), ""red"")","object_name_linter" -"vignettes/PartialDependence.Rmd",104,81,"style","Lines should not be more than 80 characters.","goodCol <- c(rep(""black"", 3), ""red"", rep(""black"", 6), ""red"", rep(""black"", 3), ""red"")","line_length_linter" -"vignettes/PartialDependence.Rmd",156,1,"style","Variable and function name style should be snake_case or symbols.","FullAverageDataset <- function(covarFrame, refCovar, numGrid, plotRange = NULL) {","object_name_linter" -"vignettes/PartialDependence.Rmd",156,32,"style","Variable and function name style should be snake_case or symbols.","FullAverageDataset <- function(covarFrame, refCovar, numGrid, plotRange = NULL) {","object_name_linter" -"vignettes/PartialDependence.Rmd",156,44,"style","Variable and function name style should be snake_case or symbols.","FullAverageDataset <- function(covarFrame, refCovar, numGrid, plotRange = NULL) {","object_name_linter" -"vignettes/PartialDependence.Rmd",156,54,"style","Variable and function name style should be snake_case or symbols.","FullAverageDataset <- function(covarFrame, refCovar, numGrid, plotRange = NULL) {","object_name_linter" -"vignettes/PartialDependence.Rmd",156,63,"style","Variable and function name style should be snake_case or symbols.","FullAverageDataset <- function(covarFrame, refCovar, numGrid, plotRange = NULL) {","object_name_linter" -"vignettes/PartialDependence.Rmd",156,81,"style","Lines should not be more than 80 characters.","FullAverageDataset <- function(covarFrame, refCovar, numGrid, plotRange = NULL) {","line_length_linter" -"vignettes/PartialDependence.Rmd",158,3,"style","Variable and function name style should be snake_case or symbols."," refIndex <- which(covars == refCovar)","object_name_linter" -"vignettes/PartialDependence.Rmd",159,3,"style","Variable and function name style should be snake_case or symbols."," refVar <- covarFrame[, refIndex]","object_name_linter" -"vignettes/PartialDependence.Rmd",168,3,"style","Variable and function name style should be snake_case or symbols."," outFrame <- covarFrame","object_name_linter" -"vignettes/PartialDependence.Rmd",169,3,"style","Variable and function name style should be snake_case or symbols."," outFrame[, refIndex] <- grid[1]","object_name_linter" -"vignettes/PartialDependence.Rmd",171,5,"style","Variable and function name style should be snake_case or symbols."," upFrame <- covarFrame","object_name_linter" -"vignettes/PartialDependence.Rmd",172,5,"style","Variable and function name style should be snake_case or symbols."," upFrame[, refIndex] <- grid[i]","object_name_linter" -"vignettes/PartialDependence.Rmd",173,5,"style","Variable and function name style should be snake_case or symbols."," outFrame <- rbind.data.frame(outFrame, upFrame)","object_name_linter" -"vignettes/PartialDependence.Rmd",184,1,"style","Variable and function name style should be snake_case or symbols.","PDPbuilder <- function(covarFrame, refCovar, listOfModels,","object_name_linter" -"vignettes/PartialDependence.Rmd",184,24,"style","Variable and function name style should be snake_case or symbols.","PDPbuilder <- function(covarFrame, refCovar, listOfModels,","object_name_linter" -"vignettes/PartialDependence.Rmd",184,36,"style","Variable and function name style should be snake_case or symbols.","PDPbuilder <- function(covarFrame, refCovar, listOfModels,","object_name_linter" -"vignettes/PartialDependence.Rmd",184,46,"style","Variable and function name style should be snake_case or symbols.","PDPbuilder <- function(covarFrame, refCovar, listOfModels,","object_name_linter" -"vignettes/PartialDependence.Rmd",185,24,"style","Variable and function name style should be snake_case or symbols."," numGrid = 100, plotRange = NULL) {","object_name_linter" -"vignettes/PartialDependence.Rmd",185,39,"style","Variable and function name style should be snake_case or symbols."," numGrid = 100, plotRange = NULL) {","object_name_linter" -"vignettes/PartialDependence.Rmd",186,3,"style","Variable and function name style should be snake_case or symbols."," augmentedFrame <- FullAverageDataset(covarFrame, refCovar,","object_name_linter" -"vignettes/PartialDependence.Rmd",188,3,"style","Variable and function name style should be snake_case or symbols."," nModels <- length(listOfModels)","object_name_linter" -"vignettes/PartialDependence.Rmd",191,3,"style","Variable and function name style should be snake_case or symbols."," yHat <- Predict(model, augmentedFrame)","object_name_linter" -"vignettes/PartialDependence.Rmd",192,3,"style","Variable and function name style should be snake_case or symbols."," hatFrame <- augmentedFrame","object_name_linter" -"vignettes/PartialDependence.Rmd",193,3,"style","Variable and function name style should be snake_case or symbols."," hatFrame$prediction <- yHat","object_name_linter" -"vignettes/PartialDependence.Rmd",194,3,"style","Variable and function name style should be snake_case or symbols."," hatSum <- summaryBy(list(c(""prediction""), c(refCovar)), data = hatFrame, FUN = mean)","object_name_linter" -"vignettes/PartialDependence.Rmd",194,13,"warning","no visible global function definition for β€˜summaryBy’"," hatSum <- summaryBy(list(c(""prediction""), c(refCovar)), data = hatFrame, FUN = mean)","object_usage_linter" -"vignettes/PartialDependence.Rmd",194,81,"style","Lines should not be more than 80 characters."," hatSum <- summaryBy(list(c(""prediction""), c(refCovar)), data = hatFrame, FUN = mean)","line_length_linter" -"vignettes/PartialDependence.Rmd",195,12,"style","Variable and function name style should be snake_case or symbols."," colnames(hatSum)[2] <- model$modelType","object_name_linter" -"vignettes/PartialDependence.Rmd",199,5,"style","Variable and function name style should be snake_case or symbols."," yHat <- Predict(model, augmentedFrame)","object_name_linter" -"vignettes/PartialDependence.Rmd",200,5,"style","Variable and function name style should be snake_case or symbols."," hatFrame <- augmentedFrame","object_name_linter" -"vignettes/PartialDependence.Rmd",201,5,"style","Variable and function name style should be snake_case or symbols."," hatFrame$prediction <- yHat","object_name_linter" -"vignettes/PartialDependence.Rmd",202,5,"style","Variable and function name style should be snake_case or symbols."," upSum <- summaryBy(list(c(""prediction""), c(refCovar)), data = hatFrame, FUN = mean)","object_name_linter" -"vignettes/PartialDependence.Rmd",202,14,"warning","no visible global function definition for β€˜summaryBy’"," upSum <- summaryBy(list(c(""prediction""), c(refCovar)), data = hatFrame, FUN = mean)","object_usage_linter" -"vignettes/PartialDependence.Rmd",202,81,"style","Lines should not be more than 80 characters."," upSum <- summaryBy(list(c(""prediction""), c(refCovar)), data = hatFrame, FUN = mean)","line_length_linter" -"vignettes/PartialDependence.Rmd",203,14,"style","Variable and function name style should be snake_case or symbols."," colnames(upSum)[2] <- model$modelType","object_name_linter" -"vignettes/PartialDependence.Rmd",204,5,"style","Variable and function name style should be snake_case or symbols."," hatSum <- merge(hatSum, upSum)","object_name_linter" -"vignettes/PartialDependence.Rmd",215,1,"style","Variable and function name style should be snake_case or symbols.","modelList <- list(concreteModels[[1]], concreteModels[[5]],","object_name_linter" -"vignettes/PartialDependence.Rmd",217,1,"style","Variable and function name style should be snake_case or symbols.","agePDPframe <- PDPbuilder(concreteFrame[, 1:8], ""age"", modelList)","object_name_linter" -"vignettes/PartialDependence.Rmd",223,1,"style","Variable and function name style should be snake_case or symbols.","PDPlot <- function(PDframe, Response, ltypes,","object_name_linter" -"vignettes/PartialDependence.Rmd",223,20,"style","Variable and function name style should be snake_case or symbols.","PDPlot <- function(PDframe, Response, ltypes,","object_name_linter" -"vignettes/PartialDependence.Rmd",223,29,"style","Variable and function name style should be snake_case or symbols.","PDPlot <- function(PDframe, Response, ltypes,","object_name_linter" -"vignettes/PartialDependence.Rmd",224,20,"style","Variable and function name style should be snake_case or symbols."," lColors, ...) {","object_name_linter" -"vignettes/PartialDependence.Rmd",225,3,"style","Variable and function name style should be snake_case or symbols."," Rng <- range(Response)","object_name_linter" -"vignettes/PartialDependence.Rmd",226,3,"style","Variable and function name style should be snake_case or symbols."," nModels <- ncol(PDframe) - 1","object_name_linter" -"vignettes/PartialDependence.Rmd",227,3,"style","Variable and function name style should be snake_case or symbols."," modelNames <- colnames(PDframe)[2: (nModels + 1)]","object_name_linter" -"vignettes/PartialDependence.Rmd",228,40,"style","Put spaces around all infix operators."," plot(PDframe[, 1], PDframe[, 2], ylim=Rng, type = ""l"",","infix_spaces_linter" -"vignettes/PartialDependence.Rmd",232,22,"style","Put spaces around all infix operators."," abline(h = Rng, lty=3, lwd=2, col=""black"")","infix_spaces_linter" -"vignettes/PartialDependence.Rmd",232,29,"style","Put spaces around all infix operators."," abline(h = Rng, lty=3, lwd=2, col=""black"")","infix_spaces_linter" -"vignettes/PartialDependence.Rmd",232,36,"style","Put spaces around all infix operators."," abline(h = Rng, lty=3, lwd=2, col=""black"")","infix_spaces_linter" -"vignettes/PartialDependence.Rmd",245,10,"style","Put spaces around all infix operators.","par(mfrow=c(1, 1))","infix_spaces_linter" -"vignettes/PartialDependence.Rmd",246,1,"style","Variable and function name style should be snake_case or symbols.","agePDPframe <- readRDS(""agePDPframe.rds"")","object_name_linter" -"vignettes/PartialDependence.Rmd",247,1,"style","Variable and function name style should be snake_case or symbols.","Response <- concreteFrame$strength","object_name_linter" -"vignettes/PartialDependence.Rmd",249,1,"style","Variable and function name style should be snake_case or symbols.","lColors <- c(""limegreen"", ""black"", ""blue"", ""magenta"")","object_name_linter" -"vignettes/PartialDependence.Rmd",256,10,"style","Put spaces around all infix operators.","par(mfrow=c(1, 1))","infix_spaces_linter" -"vignettes/PartialDependence.Rmd",257,1,"style","Variable and function name style should be snake_case or symbols.","cementPDPframe <- readRDS(""cementPDPframe.rds"")","object_name_linter" -"vignettes/PartialDependence.Rmd",264,10,"style","Put spaces around all infix operators.","par(mfrow=c(1, 1))","infix_spaces_linter" -"vignettes/PartialDependence.Rmd",265,1,"style","Variable and function name style should be snake_case or symbols.","waterPDPframe <- readRDS(""waterPDPframe.rds"")","object_name_linter" -"vignettes/PartialDependence.Rmd",272,10,"style","Put spaces around all infix operators.","par(mfrow=c(1, 1))","infix_spaces_linter" -"vignettes/PartialDependence.Rmd",273,1,"style","Variable and function name style should be snake_case or symbols.","blastPDPframe <- readRDS(""blastPDPframe.rds"")","object_name_linter" -"vignettes/PredictionExplanations.Rmd",144,1,"error","Missing chunk end for chunk (maybe starting at line 144).","```{r results = ""asis"", message = FALSE, warning = FALSE, eval = FALSE}",NA -"vignettes/RatingTables.Rmd",26,1,"style","Variable and function name style should be snake_case or symbols.","apiToken <- """"","object_name_linter" -"vignettes/RatingTables.Rmd",36,1,"style","Variable and function name style should be snake_case or symbols.","projectId <- ""59dab74bbd2a54035786bfc0""","object_name_linter" -"vignettes/RatingTables.Rmd",37,1,"style","Variable and function name style should be snake_case or symbols.","ratingTables <- ListRatingTables(projectId)","object_name_linter" -"vignettes/RatingTables.Rmd",38,1,"style","Variable and function name style should be snake_case or symbols.","ratingTable <- ratingTables[[1]]","object_name_linter" -"vignettes/RatingTables.Rmd",43,1,"style","Variable and function name style should be snake_case or symbols.","ratingTable <- readRDS(""ratingTable.rds"")","object_name_linter" -"vignettes/RatingTables.Rmd",50,1,"style","Variable and function name style should be snake_case or symbols.","projectId <- ""59dab74bbd2a54035786bfc0""","object_name_linter" -"vignettes/RatingTables.Rmd",51,1,"style","Variable and function name style should be snake_case or symbols.","ratingTableModels <- ListRatingTableModels(projectId)","object_name_linter" -"vignettes/RatingTables.Rmd",52,1,"style","Variable and function name style should be snake_case or symbols.","ratingTableModel <- ratingTableModels[[1]]","object_name_linter" -"vignettes/RatingTables.Rmd",53,1,"style","Variable and function name style should be snake_case or symbols.","ratingTableId <- ratingTableModel$ratingTableId","object_name_linter" -"vignettes/RatingTables.Rmd",54,1,"style","Variable and function name style should be snake_case or symbols.","ratingTable <- GetRatingTable(projectId, ratingTableId)","object_name_linter" -"vignettes/RatingTables.Rmd",59,1,"style","Variable and function name style should be snake_case or symbols.","ratingTable <- readRDS(""ratingTable.rds"")","object_name_linter" -"vignettes/RatingTables.Rmd",66,1,"style","Variable and function name style should be snake_case or symbols.","projectId <- ""59dab74bbd2a54035786bfc0""","object_name_linter" -"vignettes/RatingTables.Rmd",67,1,"style","Variable and function name style should be snake_case or symbols.","modelId <- ""59dd0b01d9575702bec96e4""","object_name_linter" -"vignettes/RatingTables.Rmd",68,1,"style","Variable and function name style should be snake_case or symbols.","ratingTableModel <- GetRatingTableModel(projectId, modelId)","object_name_linter" -"vignettes/RatingTables.Rmd",69,1,"style","Variable and function name style should be snake_case or symbols.","ratingTableId <- ratingTableModel$ratingTableId","object_name_linter" -"vignettes/RatingTables.Rmd",70,1,"style","Variable and function name style should be snake_case or symbols.","ratingTable <- GetRatingTable(projectId, ratingTableId)","object_name_linter" -"vignettes/RatingTables.Rmd",75,1,"style","Variable and function name style should be snake_case or symbols.","ratingTable <- readRDS(""ratingTable.rds"")","object_name_linter" -"vignettes/RatingTables.Rmd",94,1,"style","Variable and function name style should be snake_case or symbols.","newRatingTableJobId <- CreateRatingTable(project,","object_name_linter" -"vignettes/RatingTables.Rmd",98,1,"style","Variable and function name style should be snake_case or symbols.","newRatingTable <- GetRatingTableFromJobId(project, newRatingTableJobId)","object_name_linter" -"vignettes/RatingTables.Rmd",103,1,"style","Variable and function name style should be snake_case or symbols.","ratingTable <- readRDS(""ratingTable.rds"")","object_name_linter" -"vignettes/RatingTables.Rmd",113,1,"style","Variable and function name style should be snake_case or symbols.","newModelJobId <- RequestNewRatingTableModel(project, newRatingTable)","object_name_linter" -"vignettes/RatingTables.Rmd",114,1,"style","Variable and function name style should be snake_case or symbols.","newRatingTableModel <- GetRatingTableModelFromJobId(project, newModelJobId)","object_name_linter" -"vignettes/RatingTables.Rmd",119,1,"style","Variable and function name style should be snake_case or symbols.","newRatingTableModel <- readRDS(""ratingTableModel.RDS"")","object_name_linter" -"vignettes/TimeSeries.Rmd",67,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""timestamp"",","line_length_linter" -"vignettes/TimeSeries.Rmd",69,81,"style","Lines should not be more than 80 characters.","StartProject(dataSource = data, target = ""target"", partition = partition, metric = ""RMSE"")","line_length_linter" -"vignettes/TimeSeries.Rmd",86,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""timestamp"",","line_length_linter" -"vignettes/TimeSeries.Rmd",87,81,"style","Lines should not be more than 80 characters."," featureDerivationWindowStart = -24,","line_length_linter" -"vignettes/TimeSeries.Rmd",88,81,"style","Lines should not be more than 80 characters."," featureDerivationWindowEnd = -12,","line_length_linter" -"vignettes/TimeSeries.Rmd",104,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""timestamp"",","line_length_linter" -"vignettes/TimeSeries.Rmd",136,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""timestamp"",","line_length_linter" -"vignettes/TimeSeries.Rmd",138,81,"style","Lines should not be more than 80 characters."," featureSettings = list(""featureName"" = ""holiday"",","line_length_linter" -"vignettes/TimeSeries.Rmd",139,81,"style","Lines should not be more than 80 characters."," ""knownInAdvance"" = TRUE))","line_length_linter" -"vignettes/TimeSeries.Rmd",150,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""timestamp"",","line_length_linter" -"vignettes/TimeSeries.Rmd",152,81,"style","Lines should not be more than 80 characters."," featureSettings = list(list(""featureName"" = ""holiday"",","line_length_linter" -"vignettes/TimeSeries.Rmd",153,81,"style","Lines should not be more than 80 characters."," ""knownInAdvance"" = TRUE),","line_length_linter" -"vignettes/TimeSeries.Rmd",154,81,"style","Lines should not be more than 80 characters."," list(""featureName"" = ""weekend"",","line_length_linter" -"vignettes/TimeSeries.Rmd",155,81,"style","Lines should not be more than 80 characters."," ""knownInAdvance"" = TRUE)))","line_length_linter" -"vignettes/TimeSeries.Rmd",186,81,"style","Lines should not be more than 80 characters.","data <- read.csv(system.file(""extdata"", ""multiseries.csv"", package = ""datarobot""))","line_length_linter" -"vignettes/TimeSeries.Rmd",187,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""timestamp"",","line_length_linter" -"vignettes/TimeSeries.Rmd",189,81,"style","Lines should not be more than 80 characters."," multiseriesIdColumns = ""series_id"")","line_length_linter" -"vignettes/TimeSeries.Rmd",219,81,"style","Lines should not be more than 80 characters.","partition <- CreateDatetimePartitionSpecification(datetimePartitionColumn = ""timestamp"",","line_length_linter" -"vignettes/TimeSeries.Rmd",221,81,"style","Lines should not be more than 80 characters."," featureSettings = list(list(""featureName"" = ""sales"",","line_length_linter" -"vignettes/TimeSeries.Rmd",222,81,"style","Lines should not be more than 80 characters."," ""doNotDerive"" = TRUE)))","line_length_linter" -"vignettes/TrainingPredictions.Rmd",26,1,"style","Variable and function name style should be snake_case or symbols.","trainingPredictions <- GetTrainingPredictionsForModel(model, dataSubset = DataSubset$All)","object_name_linter" -"vignettes/TrainingPredictions.Rmd",26,81,"style","Lines should not be more than 80 characters.","trainingPredictions <- GetTrainingPredictionsForModel(model, dataSubset = DataSubset$All)","line_length_linter" -"vignettes/TrainingPredictions.Rmd",27,81,"style","Lines should not be more than 80 characters.","kable(head(trainingPredictions), longtable = TRUE, booktabs = TRUE, row.names = TRUE)","line_length_linter" -"vignettes/TrainingPredictions.Rmd",32,1,"style","Variable and function name style should be snake_case or symbols.","trainingPredictions <- readRDS(""trainingPredictions.rds"")","object_name_linter" -"vignettes/TrainingPredictions.Rmd",33,81,"style","Lines should not be more than 80 characters.","kable(head(trainingPredictions), longtable = TRUE, booktabs = TRUE, row.names = TRUE)","line_length_linter" -"vignettes/TrainingPredictions.Rmd",41,1,"style","Variable and function name style should be snake_case or symbols.","jobId <- RequestTrainingPredictions(model, dataSubset = DataSubset$All)","object_name_linter" -"vignettes/TrainingPredictions.Rmd",43,1,"style","Variable and function name style should be snake_case or symbols.","trainingPredictions <- GetTrainingPredictionsFromJobId(projectId, jobId) # blocks until job complete","object_name_linter" -"vignettes/TrainingPredictions.Rmd",43,81,"style","Lines should not be more than 80 characters.","trainingPredictions <- GetTrainingPredictionsFromJobId(projectId, jobId) # blocks until job complete","line_length_linter" -"vignettes/TrainingPredictions.Rmd",44,81,"style","Lines should not be more than 80 characters.","kable(head(trainingPredictions), longtable = TRUE, booktabs = TRUE, row.names = TRUE)","line_length_linter" -"vignettes/TrainingPredictions.Rmd",49,1,"style","Variable and function name style should be snake_case or symbols.","trainingPredictions <- readRDS(""trainingPredictions.rds"")","object_name_linter" -"vignettes/TrainingPredictions.Rmd",50,81,"style","Lines should not be more than 80 characters.","kable(head(trainingPredictions), longtable = TRUE, booktabs = TRUE, row.names = TRUE)","line_length_linter" -"vignettes/TrainingPredictions.Rmd",56,1,"style","Variable and function name style should be snake_case or symbols.","trainingPredictions <- ListTrainingPredictions(projectId)","object_name_linter" -"vignettes/TrainingPredictions.Rmd",57,1,"style","Variable and function name style should be snake_case or symbols.","trainingPredictionId <- trainingPredictions[[1]]$id","object_name_linter" -"vignettes/TrainingPredictions.Rmd",58,1,"style","Variable and function name style should be snake_case or symbols.","trainingPrediction <- GetTrainingPredictions(projectId, trainingPredictionId)","object_name_linter" -"vignettes/TrainingPredictions.Rmd",59,81,"style","Lines should not be more than 80 characters.","kable(head(trainingPrediction), longtable = TRUE, booktabs = TRUE, row.names = TRUE)","line_length_linter" -"vignettes/TrainingPredictions.Rmd",63,1,"style","Variable and function name style should be snake_case or symbols.","trainingPrediction <- readRDS(""trainingPrediction.rds"")","object_name_linter" -"vignettes/TrainingPredictions.Rmd",64,81,"style","Lines should not be more than 80 characters.","kable(head(trainingPrediction), longtable = TRUE, booktabs = TRUE, row.names = TRUE)","line_length_linter" -"vignettes/TrainingPredictions.Rmd",73,81,"style","Lines should not be more than 80 characters.","DownloadTrainingPredictions(projectId, trainingPredictionId, ""trainingPredictions.csv"")","line_length_linter" -"vignettes/VariableImportance.Rmd",60,81,"style","Lines should not be more than 80 characters.","friedman <- read.csv(system.file(""extdata"", ""Friedman1.csv.gz"", package = ""datarobot""))","line_length_linter" -"vignettes/VariableImportance.Rmd",61,1,"style","Variable and function name style should be snake_case or symbols.","originalProject <- StartProject(friedman, ""OriginalProject"", target = ""Y"", wait = TRUE)","object_name_linter" -"vignettes/VariableImportance.Rmd",61,81,"style","Lines should not be more than 80 characters.","originalProject <- StartProject(friedman, ""OriginalProject"", target = ""Y"", wait = TRUE)","line_length_linter" -"vignettes/VariableImportance.Rmd",62,1,"style","Variable and function name style should be snake_case or symbols.","originalModels <- ListModels(originalProject)","object_name_linter" -"vignettes/VariableImportance.Rmd",70,1,"style","Variable and function name style should be snake_case or symbols.","PermuteColumn <- function(originalFile, colName, permutedFile, iseed = 317) {","object_name_linter" -"vignettes/VariableImportance.Rmd",70,27,"style","Variable and function name style should be snake_case or symbols.","PermuteColumn <- function(originalFile, colName, permutedFile, iseed = 317) {","object_name_linter" -"vignettes/VariableImportance.Rmd",70,41,"style","Variable and function name style should be snake_case or symbols.","PermuteColumn <- function(originalFile, colName, permutedFile, iseed = 317) {","object_name_linter" -"vignettes/VariableImportance.Rmd",70,50,"style","Variable and function name style should be snake_case or symbols.","PermuteColumn <- function(originalFile, colName, permutedFile, iseed = 317) {","object_name_linter" -"vignettes/VariableImportance.Rmd",72,3,"style","Variable and function name style should be snake_case or symbols."," originalFile <- system.file(""extdata"", originalFile, package = ""datarobot"")","object_name_linter" -"vignettes/VariableImportance.Rmd",74,3,"style","Variable and function name style should be snake_case or symbols."," varNames <- colnames(dframe)","object_name_linter" -"vignettes/VariableImportance.Rmd",75,3,"style","Variable and function name style should be snake_case or symbols."," colIndex <- which(varNames == colName)","object_name_linter" -"vignettes/VariableImportance.Rmd",76,15,"style","Commas should never have a space before."," x <- dframe[ ,colIndex]","commas_linter" -"vignettes/VariableImportance.Rmd",76,15,"style","Do not place spaces after square brackets."," x <- dframe[ ,colIndex]","spaces_inside_linter" -"vignettes/VariableImportance.Rmd",76,17,"style","Commas should always have a space after."," x <- dframe[ ,colIndex]","commas_linter" -"vignettes/VariableImportance.Rmd",78,3,"style","Variable and function name style should be snake_case or symbols."," outFrame <- dframe","object_name_linter" -"vignettes/VariableImportance.Rmd",79,3,"style","Variable and function name style should be snake_case or symbols."," outFrame[ ,colIndex] <- y","object_name_linter" -"vignettes/VariableImportance.Rmd",79,12,"style","Commas should never have a space before."," outFrame[ ,colIndex] <- y","commas_linter" -"vignettes/VariableImportance.Rmd",79,12,"style","Do not place spaces after square brackets."," outFrame[ ,colIndex] <- y","spaces_inside_linter" -"vignettes/VariableImportance.Rmd",79,14,"style","Commas should always have a space after."," outFrame[ ,colIndex] <- y","commas_linter" -"vignettes/VariableImportance.Rmd",80,46,"style","Put spaces around all infix operators."," write.csv(outFrame, permutedFile, row.names=FALSE)","infix_spaces_linter" -"vignettes/VariableImportance.Rmd",87,1,"style","Variable and function name style should be snake_case or symbols.","modelList <- list(n = 11)","object_name_linter" -"vignettes/VariableImportance.Rmd",88,1,"style","Variable and function name style should be snake_case or symbols.","modelList[[1]] <- originalModels","object_name_linter" -"vignettes/VariableImportance.Rmd",89,1,"style","Variable and function name style should be snake_case or symbols.","permFile <- tempfile(fileext = ""permFile.csv"")","object_name_linter" -"vignettes/VariableImportance.Rmd",91,3,"style","Variable and function name style should be snake_case or symbols."," varName <- paste(""X"",i,sep="""")","object_name_linter" -"vignettes/VariableImportance.Rmd",91,24,"style","Commas should always have a space after."," varName <- paste(""X"",i,sep="""")","commas_linter" -"vignettes/VariableImportance.Rmd",91,26,"style","Commas should always have a space after."," varName <- paste(""X"",i,sep="""")","commas_linter" -"vignettes/VariableImportance.Rmd",91,29,"style","Put spaces around all infix operators."," varName <- paste(""X"",i,sep="""")","infix_spaces_linter" -"vignettes/VariableImportance.Rmd",93,3,"style","Variable and function name style should be snake_case or symbols."," projName <- paste(""PermProject"", varName, sep = """")","object_name_linter" -"vignettes/VariableImportance.Rmd",94,3,"style","Variable and function name style should be snake_case or symbols."," permProject <- StartProject(permFile, projectName = projName, target = ""Y"", wait = TRUE)","object_name_linter" -"vignettes/VariableImportance.Rmd",94,81,"style","Lines should not be more than 80 characters."," permProject <- StartProject(permFile, projectName = projName, target = ""Y"", wait = TRUE)","line_length_linter" -"vignettes/VariableImportance.Rmd",95,3,"style","Variable and function name style should be snake_case or symbols."," modelList[[i+1]] <- ListModels(permProject)","object_name_linter" -"vignettes/VariableImportance.Rmd",95,15,"style","Put spaces around all infix operators."," modelList[[i+1]] <- ListModels(permProject)","infix_spaces_linter" -"vignettes/VariableImportance.Rmd",101,1,"style","Variable and function name style should be snake_case or symbols.","modelList <- readRDS(""PermutationModelList.rds"")","object_name_linter" -"vignettes/VariableImportance.Rmd",116,1,"style","Variable and function name style should be snake_case or symbols.","PermutationMerge <- function(compositeList, matchPct = NULL, metricNames, matchMetric = NULL) {","object_name_linter" -"vignettes/VariableImportance.Rmd",116,30,"style","Variable and function name style should be snake_case or symbols.","PermutationMerge <- function(compositeList, matchPct = NULL, metricNames, matchMetric = NULL) {","object_name_linter" -"vignettes/VariableImportance.Rmd",116,45,"style","Variable and function name style should be snake_case or symbols.","PermutationMerge <- function(compositeList, matchPct = NULL, metricNames, matchMetric = NULL) {","object_name_linter" -"vignettes/VariableImportance.Rmd",116,62,"style","Variable and function name style should be snake_case or symbols.","PermutationMerge <- function(compositeList, matchPct = NULL, metricNames, matchMetric = NULL) {","object_name_linter" -"vignettes/VariableImportance.Rmd",116,75,"style","Variable and function name style should be snake_case or symbols.","PermutationMerge <- function(compositeList, matchPct = NULL, metricNames, matchMetric = NULL) {","object_name_linter" -"vignettes/VariableImportance.Rmd",116,81,"style","Lines should not be more than 80 characters.","PermutationMerge <- function(compositeList, matchPct = NULL, metricNames, matchMetric = NULL) {","line_length_linter" -"vignettes/VariableImportance.Rmd",124,5,"style","Variable and function name style should be snake_case or symbols."," projectMetric <- compositeList[[1]][[1]]$projectMetric","object_name_linter" -"vignettes/VariableImportance.Rmd",125,5,"style","Variable and function name style should be snake_case or symbols."," matchMetric <- paste(projectMetric, ""validation"", sep = ""."")","object_name_linter" -"vignettes/VariableImportance.Rmd",127,3,"style","Variable and function name style should be snake_case or symbols."," getCols <- c(""modelType"", ""expandedModel"", ""samplePct"", ""blueprintId"", matchMetric)","object_name_linter" -"vignettes/VariableImportance.Rmd",127,81,"style","Lines should not be more than 80 characters."," getCols <- c(""modelType"", ""expandedModel"", ""samplePct"", ""blueprintId"", matchMetric)","line_length_linter" -"vignettes/VariableImportance.Rmd",128,3,"style","Variable and function name style should be snake_case or symbols."," outFrame <- df[index, getCols]","object_name_linter" -"vignettes/VariableImportance.Rmd",129,3,"style","Variable and function name style should be snake_case or symbols."," keepCols <- getCols","object_name_linter" -"vignettes/VariableImportance.Rmd",130,3,"style","Variable and function name style should be snake_case or symbols."," keepCols[5] <- metricNames[1]","object_name_linter" -"vignettes/VariableImportance.Rmd",131,12,"style","Variable and function name style should be snake_case or symbols."," colnames(outFrame) <- keepCols","object_name_linter" -"vignettes/VariableImportance.Rmd",136,5,"style","Variable and function name style should be snake_case or symbols."," upFrame <- df[index, c(""blueprintId"", matchMetric)]","object_name_linter" -"vignettes/VariableImportance.Rmd",137,14,"style","Variable and function name style should be snake_case or symbols."," colnames(upFrame) <- c(""blueprintId"", metricNames[i])","object_name_linter" -"vignettes/VariableImportance.Rmd",138,5,"style","Variable and function name style should be snake_case or symbols."," outFrame <- merge(outFrame, upFrame, by = ""blueprintId"")","object_name_linter" -"vignettes/VariableImportance.Rmd",147,1,"style","Variable and function name style should be snake_case or symbols.","metricNames <- c(""originalRMSE"", paste(""X"", seq(1, 10, 1), ""RMSE"", sep = """"))","object_name_linter" -"vignettes/VariableImportance.Rmd",148,1,"style","Variable and function name style should be snake_case or symbols.","mergeFrame <- PermutationMerge(modelList, 16, metricNames)","object_name_linter" -"vignettes/VariableImportance.Rmd",156,1,"style","Variable and function name style should be snake_case or symbols.","BeanNames <- c(""None"", paste(""X"", seq(1, 10, 1), sep = """"))","object_name_linter" -"vignettes/VariableImportance.Rmd",167,1,"style","Variable and function name style should be snake_case or symbols.","ComputeDeltas <- function(mergeFrame, refCol, permNames, shiftNames) {","object_name_linter" -"vignettes/VariableImportance.Rmd",167,27,"style","Variable and function name style should be snake_case or symbols.","ComputeDeltas <- function(mergeFrame, refCol, permNames, shiftNames) {","object_name_linter" -"vignettes/VariableImportance.Rmd",167,39,"style","Variable and function name style should be snake_case or symbols.","ComputeDeltas <- function(mergeFrame, refCol, permNames, shiftNames) {","object_name_linter" -"vignettes/VariableImportance.Rmd",167,47,"style","Variable and function name style should be snake_case or symbols.","ComputeDeltas <- function(mergeFrame, refCol, permNames, shiftNames) {","object_name_linter" -"vignettes/VariableImportance.Rmd",167,58,"style","Variable and function name style should be snake_case or symbols.","ComputeDeltas <- function(mergeFrame, refCol, permNames, shiftNames) {","object_name_linter" -"vignettes/VariableImportance.Rmd",168,3,"style","Variable and function name style should be snake_case or symbols."," allNames <- colnames(mergeFrame)","object_name_linter" -"vignettes/VariableImportance.Rmd",169,3,"style","Variable and function name style should be snake_case or symbols."," refIndex <- which(allNames == refCol)","object_name_linter" -"vignettes/VariableImportance.Rmd",170,3,"style","Variable and function name style should be snake_case or symbols."," xRef <- mergeFrame[, refIndex]","object_name_linter" -"vignettes/VariableImportance.Rmd",171,3,"style","Variable and function name style should be snake_case or symbols."," permCols <- which(allNames %in% permNames)","object_name_linter" -"vignettes/VariableImportance.Rmd",172,3,"style","Variable and function name style should be snake_case or symbols."," xPerm <- mergeFrame[, permCols]","object_name_linter" -"vignettes/VariableImportance.Rmd",176,3,"style","Variable and function name style should be snake_case or symbols."," newIndex <- which(colnames(deltas) == ""New"")","object_name_linter" -"vignettes/VariableImportance.Rmd",185,1,"style","Variable and function name style should be snake_case or symbols.","allNames <- colnames(mergeFrame)","object_name_linter" -"vignettes/VariableImportance.Rmd",186,1,"style","Variable and function name style should be snake_case or symbols.","refCol <- allNames[5]","object_name_linter" -"vignettes/VariableImportance.Rmd",187,1,"style","Variable and function name style should be snake_case or symbols.","permNames <- allNames[6:15]","object_name_linter" -"vignettes/VariableImportance.Rmd",188,1,"style","Variable and function name style should be snake_case or symbols.","shiftNames <- paste(""X"", seq(1, 10, 1), sep = """")","object_name_linter" -"vignettes/VariableImportance.Rmd",189,1,"style","Variable and function name style should be snake_case or symbols.","deltaFrame <- ComputeDeltas(mergeFrame, refCol, permNames, shiftNames)","object_name_linter" -"vignettes/VariableImportance.Rmd",193,10,"style","Put spaces around all infix operators.","par(mfrow=c(1, 1))","infix_spaces_linter" -"vignettes/VariableImportance.Rmd",198,1,"style","Variable and function name style should be snake_case or symbols.","bestRow <- which.min(deltaFrame$originalRMSE)","object_name_linter" -"vignettes/VariableImportance.Rmd",199,1,"style","Variable and function name style should be snake_case or symbols.","bestModel <- mergeFrame$modelType[bestRow]","object_name_linter" -"vignettes/VariableImportance.Rmd",200,81,"style","Lines should not be more than 80 characters.","points(seq(1, 10, 1), deltaFrame[bestRow, 1:10], pch = 16, col = ""limegreen"", cex = 1.5)","line_length_linter" -"vignettes/VariableImportance.Rmd",219,1,"style","Variable and function name style should be snake_case or symbols.","varImpSummary <- function(deltaFrame, refCol, oneIndex) {","object_name_linter" -"vignettes/VariableImportance.Rmd",219,27,"style","Variable and function name style should be snake_case or symbols.","varImpSummary <- function(deltaFrame, refCol, oneIndex) {","object_name_linter" -"vignettes/VariableImportance.Rmd",219,39,"style","Variable and function name style should be snake_case or symbols.","varImpSummary <- function(deltaFrame, refCol, oneIndex) {","object_name_linter" -"vignettes/VariableImportance.Rmd",219,47,"style","Variable and function name style should be snake_case or symbols.","varImpSummary <- function(deltaFrame, refCol, oneIndex) {","object_name_linter" -"vignettes/VariableImportance.Rmd",221,3,"style","Variable and function name style should be snake_case or symbols."," refIndex <- which(vars == refCol)","object_name_linter" -"vignettes/VariableImportance.Rmd",222,3,"style","Variable and function name style should be snake_case or symbols."," refValue <- deltaFrame[, refIndex]","object_name_linter" -"vignettes/VariableImportance.Rmd",223,11,"style","Put spaces around all infix operators."," wts <- 1/refValue # Performance-weights = reciprocal fitting measure","infix_spaces_linter" -"vignettes/VariableImportance.Rmd",224,3,"style","Variable and function name style should be snake_case or symbols."," deltasOnly <- deltaFrame[, -refIndex]","object_name_linter" -"vignettes/VariableImportance.Rmd",225,3,"style","Variable and function name style should be snake_case or symbols."," thisModel <- as.numeric(deltasOnly[oneIndex, ])","object_name_linter" -"vignettes/VariableImportance.Rmd",226,34,"style","Put spaces around all infix operators."," avg <- apply(deltasOnly, MARGIN=2, mean)","infix_spaces_linter" -"vignettes/VariableImportance.Rmd",227,3,"style","Variable and function name style should be snake_case or symbols."," WtAvgFunction <- function(x, w) { sum(w * x) / sum(w) }","object_name_linter" -"vignettes/VariableImportance.Rmd",227,35,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," WtAvgFunction <- function(x, w) { sum(w * x) / sum(w) }","brace_linter" -"vignettes/VariableImportance.Rmd",227,57,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," WtAvgFunction <- function(x, w) { sum(w * x) / sum(w) }","brace_linter" -"vignettes/VariableImportance.Rmd",228,3,"style","Variable and function name style should be snake_case or symbols."," wtAvg <- apply(deltasOnly, MARGIN = 2, WtAvgFunction, wts)","object_name_linter" -"vignettes/VariableImportance.Rmd",229,3,"style","Variable and function name style should be snake_case or symbols."," varImpFrame <- data.frame(average = avg,","object_name_linter" -"vignettes/VariableImportance.Rmd",239,1,"style","Variable and function name style should be snake_case or symbols.","varImp <- varImpSummary(deltaFrame, ""originalRMSE"", bestRow)","object_name_linter" -"vignettes/VariableImportance.Rmd",241,1,"style","Variable and function name style should be snake_case or symbols.","wtAvg <- round(varImp$weightedAverage, digits = 3)","object_name_linter" diff --git a/.dev/revdep_emails/datarobot/email-body b/.dev/revdep_emails/datarobot/email-body deleted file mode 100644 index 93af736c5..000000000 --- a/.dev/revdep_emails/datarobot/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello AJ Alon! Thank you for using {lintr} in your package {datarobot}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cran/datarobot (hash: d9f4f286f1d16fdd872e670febdce76910730909) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 172s on CRAN vs. 147s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/datastructures/attachments/datastructures.failure b/.dev/revdep_emails/datastructures/attachments/datastructures.failure deleted file mode 100644 index c3d4a1db0..000000000 --- a/.dev/revdep_emails/datastructures/attachments/datastructures.failure +++ /dev/null @@ -1 +0,0 @@ -object 'absolute_paths_linter' not found diff --git a/.dev/revdep_emails/datastructures/email-body b/.dev/revdep_emails/datastructures/email-body deleted file mode 100644 index 229573b02..000000000 --- a/.dev/revdep_emails/datastructures/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Simon Dirmeier! Thank you for using {lintr} in your package {datastructures}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/dirmeier/datastructures (hash: c69faa25d7eb5094e20a7410e5bcab44fed4eef9) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 9s on CRAN vs. 0s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/describer/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/describer/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index c18888fb2..000000000 --- a/.dev/revdep_emails/describer/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,2 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/describe.R",83,1,"style","Variable and function name style should be snake_case.","describe.data.frame <- function(.x) {","object_name_linter" diff --git a/.dev/revdep_emails/describer/email-body b/.dev/revdep_emails/describer/email-body deleted file mode 100644 index 399f7eeb1..000000000 --- a/.dev/revdep_emails/describer/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Paul Hendricks! Thank you for using {lintr} in your package {describer}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/paulhendricks/describer (hash: bc72c7b9538747c17159ef40656a859a1b295dc9) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 3s on CRAN vs. 1s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/devtools/email-body b/.dev/revdep_emails/devtools/email-body deleted file mode 100644 index 57e445dcc..000000000 --- a/.dev/revdep_emails/devtools/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Jennifer Bryan! Thank you for using {lintr} in your package {devtools}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/r-lib/devtools (hash: dd960cc75c5650d7fb9fbfed33fb1b57cc0de758) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 0s on CRAN vs. 3s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/diffusr/attachments/diffusr.failure b/.dev/revdep_emails/diffusr/attachments/diffusr.failure deleted file mode 100644 index c3d4a1db0..000000000 --- a/.dev/revdep_emails/diffusr/attachments/diffusr.failure +++ /dev/null @@ -1 +0,0 @@ -object 'absolute_paths_linter' not found diff --git a/.dev/revdep_emails/diffusr/email-body b/.dev/revdep_emails/diffusr/email-body deleted file mode 100644 index 8f9f02c2d..000000000 --- a/.dev/revdep_emails/diffusr/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Simon Dirmeier! Thank you for using {lintr} in your package {diffusr}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/dirmeier/diffusr (hash: c3005d42f186f0c736c0dfe094a713c05e0c2ad5) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 3s on CRAN vs. 0s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/dittodb/attachments/dittodb.warnings b/.dev/revdep_emails/dittodb/attachments/dittodb.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/dittodb/attachments/dittodb.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/dittodb/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/dittodb/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 596ce57ed..000000000 --- a/.dev/revdep_emails/dittodb/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,728 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/nycflights13-sql.R",50,41,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (inherits(con, ""SQLiteConnection"") | schema == """") {","vector_logic_linter" -"vignettes/dittodb/nycflights/conInfo-.R",1,69,"style","Trailing whitespace is superfluous.","list(host = ""127.0.0.1"", username = ""travis"", dbname = ""nycflights"", ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/conInfo-.R",2,94,"style","Trailing whitespace is superfluous."," con.type = ""127.0.0.1 via TCP/IP"", db.version = ""10.4.12-MariaDB-1:10.4.12+maria~bionic"", ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/SELECT-16d120.R",1,64,"style","Trailing whitespace is superfluous.","structure(list(day = 1:31, mean_delay = c(0x1.55fd54de872a1p+5, ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/SELECT-16d120.R",2,66,"style","Trailing whitespace is superfluous.","0x1.59e435941788dp+5, 0x1.0f393c4c771f6p+5, 0x1.baeff05b9e3cap+4, ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/SELECT-16d120.R",3,66,"style","Trailing whitespace is superfluous.","0x1.1c90412a948cbp+5, 0x1.e78c809868c81p+4, 0x1.67eea7da1dc83p+5, ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/SELECT-16d120.R",4,66,"style","Trailing whitespace is superfluous.","0x1.c1cf68f8013cfp+5, 0x1.603062afefb64p+5, 0x1.a4022947a53a4p+5, ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/SELECT-16d120.R",5,66,"style","Trailing whitespace is superfluous.","0x1.4ee3566690b4fp+5, 0x1.544397c49e8f1p+5, 0x1.444be7f3df2b9p+5, ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/SELECT-16d120.R",6,66,"style","Trailing whitespace is superfluous.","0x1.13e1aaa03ab5cp+5, 0x1.c2b1018fed867p+4, 0x1.0024cd47277d8p+5, ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/SELECT-16d120.R",7,66,"style","Trailing whitespace is superfluous.","0x1.45ed38b2dce19p+5, 0x1.615182d6f26c8p+5, 0x1.4b4858bf824f1p+5, ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/SELECT-16d120.R",8,66,"style","Trailing whitespace is superfluous.","0x1.ef6ff9df0ef05p+4, 0x1.e34fb5df73593p+4, 0x1.7919380ff74a9p+5, ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/SELECT-16d120.R",9,66,"style","Trailing whitespace is superfluous.","0x1.63e23337f7ce1p+5, 0x1.56d7c319729fap+5, 0x1.593dde5542ad9p+5, ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/SELECT-16d120.R",10,66,"style","Trailing whitespace is superfluous.","0x1.1016cdd7d9ab7p+5, 0x1.5c258f74b99bdp+5, 0x1.90ab3046fb0abp+5, ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/SELECT-e53189.R",1,65,"style","Trailing whitespace is superfluous.","structure(list(month = 1:12, mean_delay = c(0x1.13d1e5a46fdcp+5, ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/SELECT-e53189.R",2,66,"style","Trailing whitespace is superfluous.","0x1.0d837f713f91bp+5, 0x1.4492c49ce57bcp+5, 0x1.55eaa80cc1cf3p+5, ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/SELECT-e53189.R",3,65,"style","Trailing whitespace is superfluous.","0x1.4f163c59bf3a3p+5, 0x1.ade7fa6ccb7dp+5, 0x1.af9cb5a5cabccp+5, ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/SELECT-e53189.R",4,65,"style","Trailing whitespace is superfluous.","0x1.3c1a8138c6202p+5, 0x1.3671c4fbc61bp+5, 0x1.d0961ced931dbp+4, ","trailing_whitespace_linter" -"vignettes/dittodb/nycflights/SELECT-e53189.R",5,86,"style","Trailing whitespace is superfluous.","0x1.b7c0e577c0e57p+4, 0x1.3dd1671e576e9p+5)), class = ""data.frame"", row.names = c(NA, ","trailing_whitespace_linter" -"vignettes/travelling-old/resultInfo-6f7e1a.R",1,69,"style","Trailing whitespace is superfluous.","list(statement = ""SELECT * FROM \""flights\"" AS \""zzz13\"" WHERE 0=1"", ","trailing_whitespace_linter" -"vignettes/travelling-old/resultInfo-6f7e1a.R",2,70,"style","Trailing whitespace is superfluous."," isSelect = 1L, rowsAffected = -1L, rowCount = 0L, completed = 0L, ","trailing_whitespace_linter" -"vignettes/travelling-old/resultInfo-6f7e1a.R",3,66,"style","Trailing whitespace is superfluous."," fieldDescription = list(list(name = c(""year"", ""month"", ""day"", ","trailing_whitespace_linter" -"vignettes/travelling-old/resultInfo-6f7e1a.R",4,77,"style","Trailing whitespace is superfluous."," ""dep_time"", ""sched_dep_time"", ""dep_delay"", ""arr_time"", ""sched_arr_time"", ","trailing_whitespace_linter" -"vignettes/travelling-old/resultInfo-6f7e1a.R",5,67,"style","Trailing whitespace is superfluous."," ""arr_delay"", ""carrier"", ""flight"", ""tailnum"", ""origin"", ""dest"", ","trailing_whitespace_linter" -"vignettes/travelling-old/resultInfo-6f7e1a.R",6,76,"style","Trailing whitespace is superfluous."," ""air_time"", ""distance"", ""hour"", ""minute"", ""time_hour""), Sclass = c(13L, ","trailing_whitespace_linter" -"vignettes/travelling-old/resultInfo-6f7e1a.R",7,64,"style","Trailing whitespace is superfluous."," 13L, 13L, 13L, 13L, 14L, 13L, 13L, 14L, 16L, 13L, 16L, 16L, ","trailing_whitespace_linter" -"vignettes/travelling-old/resultInfo-6f7e1a.R",8,64,"style","Trailing whitespace is superfluous."," 16L, 14L, 14L, 14L, 14L, 16L), type = c(23L, 23L, 23L, 23L, ","trailing_whitespace_linter" -"vignettes/travelling-old/resultInfo-6f7e1a.R",9,62,"style","Trailing whitespace is superfluous."," 23L, 701L, 23L, 23L, 701L, 25L, 23L, 25L, 25L, 25L, 701L, ","trailing_whitespace_linter" -"vignettes/travelling-old/resultInfo-6f7e1a.R",10,62,"style","Trailing whitespace is superfluous."," 701L, 701L, 701L, 1184L), len = c(4L, 4L, 4L, 4L, 4L, 8L, ","trailing_whitespace_linter" -"vignettes/travelling-old/resultInfo-6f7e1a.R",11,61,"style","Trailing whitespace is superfluous."," 4L, 4L, 8L, -1L, 4L, -1L, -1L, -1L, 8L, 8L, 8L, 8L, 8L), ","trailing_whitespace_linter" -"vignettes/travelling-old/resultInfo-6f7e1a.R",12,62,"style","Trailing whitespace is superfluous."," precision = c(-1L, -1L, -1L, -1L, -1L, -1L, -1L, -1L, ","trailing_whitespace_linter" -"vignettes/travelling-old/resultInfo-6f7e1a.R",14,61,"style","Trailing whitespace is superfluous."," ), scale = c(-1L, -1L, -1L, -1L, -1L, -1L, -1L, -1L, ","trailing_whitespace_linter" -"vignettes/travelling-old/resultInfo-6f7e1a.R",16,64,"style","Trailing whitespace is superfluous."," ), nullOK = c(TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, ","trailing_whitespace_linter" -"vignettes/travelling-old/resultInfo-6f7e1a.R",17,62,"style","Trailing whitespace is superfluous."," TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, TRUE, ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",1,67,"style","Trailing whitespace is superfluous.","structure(list(tailnum = c(""N912XJ"", ""N645JB"", ""N904WN"", ""N3BWAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",2,70,"style","Trailing whitespace is superfluous.","""N3CJAA"", ""N14972"", ""N667UA"", ""N998AT"", ""N521JB"", ""N16559"", ""N14186"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",3,70,"style","Trailing whitespace is superfluous.","""N16170"", ""N789JB"", ""N409WN"", ""N593JB"", ""N11535"", ""N505AA"", ""N8928A"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",4,70,"style","Trailing whitespace is superfluous.","""N3DPAA"", ""N34222"", ""N639VA"", ""N480AA"", ""N511MQ"", ""N77518"", ""N697DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",5,70,"style","Trailing whitespace is superfluous.","""N87527"", ""N652SW"", ""N651JB"", ""N640AA"", ""N304DQ"", ""N643JB"", ""N988DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",6,70,"style","Trailing whitespace is superfluous.","""N231JB"", ""N14542"", ""N531JB"", ""N14573"", ""N76519"", ""N13161"", ""N567UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",7,70,"style","Trailing whitespace is superfluous.","""N201LV"", ""N27962"", ""N198JB"", ""N520MQ"", ""N689MQ"", ""N369NW"", ""N8432A"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",8,70,"style","Trailing whitespace is superfluous.","""N14902"", ""N8EGMQ"", ""N336NB"", ""N3FJAA"", ""N905DL"", ""N628VA"", ""N12136"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",9,70,"style","Trailing whitespace is superfluous.","""N550WN"", ""N353SW"", ""N844VA"", ""N738US"", ""N371NB"", ""N431WN"", ""N11206"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",10,69,"style","Trailing whitespace is superfluous.","""N412WN"", ""N832UA"", ""N14993"", ""N495UA"", ""N3759"", ""N314US"", ""N14231"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",11,70,"style","Trailing whitespace is superfluous.","""N176DN"", ""N363NB"", ""N3AHAA"", ""N5DMAA"", ""N764US"", ""N802MQ"", ""N33209"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",12,70,"style","Trailing whitespace is superfluous.","""N38451"", ""N14219"", ""N320US"", ""N8903A"", ""N3FCAA"", ""N682MQ"", ""N672DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",13,70,"style","Trailing whitespace is superfluous.","""N173US"", ""N691CA"", ""N33103"", ""N210WN"", ""N8877A"", ""N638JB"", ""N558UW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",14,70,"style","Trailing whitespace is superfluous.","""N820AS"", ""N479UA"", ""N180US"", ""N334JB"", ""N33292"", ""N513UA"", ""N775JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",15,70,"style","Trailing whitespace is superfluous.","""N528MQ"", ""N955DL"", ""N405UA"", ""N377NW"", ""N611QX"", ""N7732A"", ""N320AA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",16,70,"style","Trailing whitespace is superfluous.","""N11192"", ""N3769L"", ""N622VA"", ""N338AA"", ""N504UA"", ""N7739A"", ""N841UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",17,70,"style","Trailing whitespace is superfluous.","""N987AT"", ""N11113"", ""N14106"", ""N903WN"", ""N3CGAA"", ""N621VA"", ""N477AA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",18,70,"style","Trailing whitespace is superfluous.","""N837UA"", ""N339NB"", ""N374DA"", ""N8869B"", ""N284JB"", ""N924DL"", ""N8775A"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",19,70,"style","Trailing whitespace is superfluous.","""N836UA"", ""N324JB"", ""N833UA"", ""N13553"", ""N999DN"", ""N3763D"", ""N12996"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",20,70,"style","Trailing whitespace is superfluous.","""N513MQ"", ""N722US"", ""N14904"", ""N591AA"", ""N539MQ"", ""N14977"", ""N12924"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",21,70,"style","Trailing whitespace is superfluous.","""N358NB"", ""N877AS"", ""N554UA"", ""N76514"", ""N203JB"", ""N12135"", ""N387SW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",22,70,"style","Trailing whitespace is superfluous.","""N27722"", ""N444UA"", ""N469UA"", ""N575UA"", ""N3AUAA"", ""N306JB"", ""N24128"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",23,70,"style","Trailing whitespace is superfluous.","""N617MQ"", ""N642DL"", ""N595UA"", ""N588JB"", ""N3HSAA"", ""N915DE"", ""N3HTAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",24,70,"style","Trailing whitespace is superfluous.","""N592UA"", ""N37253"", ""N629JB"", ""N585UA"", ""N265WN"", ""N4XRAA"", ""N941DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",25,70,"style","Trailing whitespace is superfluous.","""N838VA"", ""N267AT"", ""N3JXAA"", ""N523UA"", ""N912DL"", ""N707TW"", ""N3GRAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",26,70,"style","Trailing whitespace is superfluous.","""N934WN"", ""N370SW"", ""N17133"", ""N594JB"", ""N11119"", ""N8942A"", ""N524JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",27,70,"style","Trailing whitespace is superfluous.","""N608QX"", ""N534JB"", ""N21130"", ""N534MQ"", ""N14105"", ""N659DL"", ""N18102"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",28,70,"style","Trailing whitespace is superfluous.","""N470UA"", ""N7714B"", ""N535MQ"", ""N910DE"", ""N921WN"", ""N918DL"", ""N703TW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",29,70,"style","Trailing whitespace is superfluous.","""N998DL"", ""N8982A"", ""N735MQ"", ""N76065"", ""N354NW"", ""N13994"", ""N644JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",30,70,"style","Trailing whitespace is superfluous.","""N282WN"", ""N722MQ"", ""N502UA"", ""N13202"", ""N66057"", ""N26545"", ""N37474"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",31,70,"style","Trailing whitespace is superfluous.","""N527AA"", ""N544AA"", ""N24212"", ""N935XJ"", ""N352AA"", ""N920AT"", ""N630JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",32,70,"style","Trailing whitespace is superfluous.","""N79402"", ""N8305E"", ""N849VA"", ""N477WN"", ""N603JB"", ""N8907A"", ""N4UCAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",33,70,"style","Trailing whitespace is superfluous.","""N535UW"", ""N8560F"", ""N17984"", ""N11189"", ""N709EV"", ""N727SW"", ""N3GLAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",34,69,"style","Trailing whitespace is superfluous.","""N7726A"", ""N3765"", ""N14959"", ""N796SW"", ""N325US"", ""N11165"", ""N3KBAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",35,69,"style","Trailing whitespace is superfluous.","""N4WVAA"", ""N713EV"", ""N3ASAA"", ""N8541D"", ""N744P"", ""N444WN"", ""N33294"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",36,70,"style","Trailing whitespace is superfluous.","""N476UA"", ""N845VA"", ""N950DL"", ""N937XJ"", ""N741SA"", ""N562UW"", ""N417UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",37,70,"style","Trailing whitespace is superfluous.","""N3ERAA"", ""N14179"", ""N684MQ"", ""N8800G"", ""N37252"", ""N11187"", ""N547JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",38,70,"style","Trailing whitespace is superfluous.","""N510JB"", ""N592JB"", ""N12569"", ""N16149"", ""N585AA"", ""N714CB"", ""N517MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",39,70,"style","Trailing whitespace is superfluous.","""N3HUAA"", ""N366NW"", ""N5EMAA"", ""N723EV"", ""N66051"", ""N961AT"", ""N365NW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",40,70,"style","Trailing whitespace is superfluous.","""N248WN"", ""N269WN"", ""N18557"", ""N390AA"", ""N18120"", ""N344AA"", ""N805UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",41,70,"style","Trailing whitespace is superfluous.","""N76529"", ""N661MQ"", ""N16713"", ""N426UA"", ""N356NW"", ""N3736C"", ""N27733"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",42,70,"style","Trailing whitespace is superfluous.","""N328AA"", ""N466UA"", ""N547AA"", ""N3FKAA"", ""N345NW"", ""N983DL"", ""N410UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",43,70,"style","Trailing whitespace is superfluous.","""N794JB"", ""N181UW"", ""N76516"", ""N75426"", ""N232WN"", ""N5DNAA"", ""N675DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",44,70,"style","Trailing whitespace is superfluous.","""N23721"", ""N624VA"", ""N604LR"", ""N830MQ"", ""N914DL"", ""N361NB"", ""N458UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",45,70,"style","Trailing whitespace is superfluous.","""N379DA"", ""N633DL"", ""N947DL"", ""N401WN"", ""N261AT"", ""N3FHAA"", ""N591JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",46,70,"style","Trailing whitespace is superfluous.","""N77066"", ""N601AW"", ""N702TW"", ""N8554A"", ""N15912"", ""N37466"", ""N331NW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",47,70,"style","Trailing whitespace is superfluous.","""N605LR"", ""N706JB"", ""N518UA"", ""N721MQ"", ""N695DL"", ""N14116"", ""N840VA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",48,70,"style","Trailing whitespace is superfluous.","""N904XJ"", ""N526JB"", ""N285WN"", ""N633VA"", ""N519AA"", ""N364NW"", ""N719EV"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",49,70,"style","Trailing whitespace is superfluous.","""N942MQ"", ""N476WN"", ""N529VA"", ""N3CKAA"", ""N533UA"", ""N372NW"", ""N529JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",50,70,"style","Trailing whitespace is superfluous.","""N504JB"", ""N705TW"", ""N121UW"", ""N16178"", ""N733SA"", ""N515MQ"", ""N195UW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",51,70,"style","Trailing whitespace is superfluous.","""N663MQ"", ""N328NW"", ""N8964E"", ""N625VA"", ""N852VA"", ""N340NW"", ""N544MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",52,70,"style","Trailing whitespace is superfluous.","""N327NB"", ""N6EAMQ"", ""N163US"", ""N11176"", ""N13989"", ""N585JB"", ""N374JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",53,70,"style","Trailing whitespace is superfluous.","""N8736A"", ""N370NW"", ""N717TW"", ""N6704Z"", ""N760JB"", ""N14148"", ""N3CYAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",54,70,"style","Trailing whitespace is superfluous.","""N14543"", ""N5DYAA"", ""N8936A"", ""N599JB"", ""N329AA"", ""N749US"", ""N324AA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",55,70,"style","Trailing whitespace is superfluous.","""N600LR"", ""N951FR"", ""N611MQ"", ""N4UBAA"", ""N690DL"", ""N758SW"", ""N338NB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",56,70,"style","Trailing whitespace is superfluous.","""N534UA"", ""N920DL"", ""N550NW"", ""N455UA"", ""N907MQ"", ""N358NW"", ""N850MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",57,70,"style","Trailing whitespace is superfluous.","""N419UA"", ""N3DHAA"", ""N984DL"", ""N39728"", ""N8790A"", ""N337AT"", ""N979DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",58,70,"style","Trailing whitespace is superfluous.","""N3FVAA"", ""N3CTAA"", ""N324US"", ""N730EV"", ""N41104"", ""N765SW"", ""N76515"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",59,70,"style","Trailing whitespace is superfluous.","""N3GSAA"", ""N8698A"", ""N76528"", ""N173AT"", ""N509MQ"", ""N805MQ"", ""N724MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",60,70,"style","Trailing whitespace is superfluous.","""N938DL"", ""N201FR"", ""N433UA"", ""N712EV"", ""N853VA"", ""N564JB"", ""N438UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",61,70,"style","Trailing whitespace is superfluous.","""N747SA"", ""N561JB"", ""N29906"", ""N387DA"", ""N924XJ"", ""N913DL"", ""N11127"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",62,70,"style","Trailing whitespace is superfluous.","""N326US"", ""N8696C"", ""N722TW"", ""N481AA"", ""N543UW"", ""N675AW"", ""N302NB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",63,70,"style","Trailing whitespace is superfluous.","""N270WN"", ""N482AA"", ""N632SW"", ""N310NW"", ""N77530"", ""N4WNAA"", ""N950UW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",64,70,"style","Trailing whitespace is superfluous.","""N828AS"", ""N296PQ"", ""N19554"", ""N963DL"", ""N893AT"", ""N530VA"", ""N827UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",65,70,"style","Trailing whitespace is superfluous.","""N76502"", ""N68453"", ""N24729"", ""N641VA"", ""N553UA"", ""N510UW"", ""N627JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",66,70,"style","Trailing whitespace is superfluous.","""N821MQ"", ""N506JB"", ""N3BGAA"", ""N18101"", ""N3KEAA"", ""N16918"", ""N844MH"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",67,70,"style","Trailing whitespace is superfluous.","""N402UA"", ""N550UW"", ""N758US"", ""N391DA"", ""N662JB"", ""N908XJ"", ""N801UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",68,70,"style","Trailing whitespace is superfluous.","""N649MQ"", ""N466WN"", ""N8646A"", ""N241WN"", ""N18223"", ""N17245"", ""N14731"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",69,70,"style","Trailing whitespace is superfluous.","""N16147"", ""N990DL"", ""N993DL"", ""N639AA"", ""N29717"", ""N934XJ"", ""N996DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",70,70,"style","Trailing whitespace is superfluous.","""N913XJ"", ""N562JB"", ""N5EHAA"", ""N582AA"", ""N839UA"", ""N4XVAA"", ""N178JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",71,70,"style","Trailing whitespace is superfluous.","""N445WN"", ""N915AT"", ""N214FR"", ""N891AT"", ""N8532G"", ""N239JB"", ""N948DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",72,70,"style","Trailing whitespace is superfluous.","""N915WN"", ""N827AS"", ""N4XCAA"", ""N645MQ"", ""N834AS"", ""N5CAAA"", ""N11547"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",73,70,"style","Trailing whitespace is superfluous.","""N351NB"", ""N927AT"", ""N463WN"", ""N452UA"", ""N29129"", ""N14562"", ""N899AT"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",74,70,"style","Trailing whitespace is superfluous.","""N913DE"", ""N437UA"", ""N354JB"", ""N501AA"", ""N842UA"", ""N827MQ"", ""N408WN"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",75,70,"style","Trailing whitespace is superfluous.","""N803UA"", ""N355NW"", ""N283JB"", ""N507MQ"", ""N508AA"", ""N509JB"", ""N176AT"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",76,70,"style","Trailing whitespace is superfluous.","""N627VA"", ""N715JB"", ""N348NW"", ""N3BAAA"", ""N8683B"", ""N13716"", ""N646JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",77,70,"style","Trailing whitespace is superfluous.","""N936DL"", ""N78438"", ""N3BDAA"", ""N638VA"", ""N507JB"", ""N403UA"", ""N16234"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",78,70,"style","Trailing whitespace is superfluous.","""N932XJ"", ""N784JB"", ""N297WN"", ""N902MQ"", ""N959UW"", ""N228JB"", ""N521VA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",79,70,"style","Trailing whitespace is superfluous.","""N3HGAA"", ""N906AT"", ""N267JB"", ""N507UA"", ""N612JB"", ""N17730"", ""N564UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",80,70,"style","Trailing whitespace is superfluous.","""N399DA"", ""N351JB"", ""N349NW"", ""N555LV"", ""N504MQ"", ""N16561"", ""N25134"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",81,70,"style","Trailing whitespace is superfluous.","""N607LR"", ""N833AY"", ""N615AA"", ""N607JB"", ""N3EPAA"", ""N577UA"", ""N324NB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",82,70,"style","Trailing whitespace is superfluous.","""N8930E"", ""N519JB"", ""N458WN"", ""N754EV"", ""N911DA"", ""N21129"", ""N16709"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",83,70,"style","Trailing whitespace is superfluous.","""N339JB"", ""N997AT"", ""N927LR"", ""N4XXAA"", ""N946DL"", ""N3HEAA"", ""N36444"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",84,70,"style","Trailing whitespace is superfluous.","""N16541"", ""N776WN"", ""N574UA"", ""N75435"", ""N14570"", ""N323JB"", ""N8933B"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",85,70,"style","Trailing whitespace is superfluous.","""N34110"", ""N17126"", ""N771SA"", ""N820AY"", ""N715UW"", ""N710EV"", ""N940DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",86,70,"style","Trailing whitespace is superfluous.","""N8598B"", ""N705JB"", ""N8506C"", ""N807JB"", ""N394DA"", ""N634VA"", ""N348JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",87,70,"style","Trailing whitespace is superfluous.","""N3DSAA"", ""N355JB"", ""N8972E"", ""N293PQ"", ""N3DUAA"", ""N13133"", ""N14950"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",88,70,"style","Trailing whitespace is superfluous.","""N524MQ"", ""N904DL"", ""N27190"", ""N8960A"", ""N484UA"", ""N624JB"", ""N3AJAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",89,70,"style","Trailing whitespace is superfluous.","""N930XJ"", ""N77520"", ""N335AA"", ""N635VA"", ""N8940E"", ""N849MQ"", ""N713SW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",90,70,"style","Trailing whitespace is superfluous.","""N75433"", ""N316JB"", ""N12900"", ""N768SW"", ""N972DL"", ""N3FSAA"", ""N346NB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",91,70,"style","Trailing whitespace is superfluous.","""N908MQ"", ""N3JCAA"", ""N950WN"", ""N959AT"", ""N842MQ"", ""N3GDAA"", ""N8315C"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",92,70,"style","Trailing whitespace is superfluous.","""N624AG"", ""N14118"", ""N446UA"", ""N752EV"", ""N172DN"", ""N457UW"", ""N7735A"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",93,70,"style","Trailing whitespace is superfluous.","""N430UA"", ""N14905"", ""N805JB"", ""N580UA"", ""N545UA"", ""N709TW"", ""N601LR"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",94,70,"style","Trailing whitespace is superfluous.","""N218FR"", ""N404UA"", ""N23139"", ""N497UA"", ""N257WN"", ""N17138"", ""N959DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",95,70,"style","Trailing whitespace is superfluous.","""N652DL"", ""N351NW"", ""N603DL"", ""N569UA"", ""N855UA"", ""N329NW"", ""N735SA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",96,70,"style","Trailing whitespace is superfluous.","""N995DL"", ""N38467"", ""N563JB"", ""N3KPAA"", ""N472UA"", ""N75861"", ""N4WSAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",97,70,"style","Trailing whitespace is superfluous.","""N16963"", ""N583AA"", ""N13979"", ""N12567"", ""N539AA"", ""N927XJ"", ""N571JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",98,70,"style","Trailing whitespace is superfluous.","""N519UA"", ""N353AT"", ""N640JB"", ""N11536"", ""N597UA"", ""N79279"", ""N3EFAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",99,70,"style","Trailing whitespace is superfluous.","""N15574"", ""N636JB"", ""N528VA"", ""N3APAA"", ""N14953"", ""N486AA"", ""N991DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",100,70,"style","Trailing whitespace is superfluous.","""N514MQ"", ""N14203"", ""N928DN"", ""N11109"", ""N8839E"", ""N184US"", ""N76504"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",101,70,"style","Trailing whitespace is superfluous.","""N425UA"", ""N631VA"", ""N15980"", ""N3GJAA"", ""N764SW"", ""N353NB"", ""N982DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",102,70,"style","Trailing whitespace is superfluous.","""N825AS"", ""N508JB"", ""N598JB"", ""N3ANAA"", ""N342NW"", ""N746JB"", ""N9EAMQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",103,70,"style","Trailing whitespace is superfluous.","""N708EV"", ""N296JB"", ""N231WN"", ""N8580A"", ""N328JB"", ""N555UA"", ""N380DA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",104,70,"style","Trailing whitespace is superfluous.","""N423UA"", ""N522UA"", ""N222WN"", ""N336AA"", ""N332AA"", ""N292JB"", ""N588UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",105,70,"style","Trailing whitespace is superfluous.","""N8733G"", ""N767UW"", ""N809UA"", ""N244WN"", ""N933LR"", ""N525UA"", ""N929DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",106,70,"style","Trailing whitespace is superfluous.","""N608JB"", ""N14991"", ""N187JB"", ""N980AT"", ""N527VA"", ""N17169"", ""N978DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",107,70,"style","Trailing whitespace is superfluous.","""N625AA"", ""N316NB"", ""N492UA"", ""N944UW"", ""N3FPAA"", ""N3CHAA"", ""N922DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",108,70,"style","Trailing whitespace is superfluous.","""N656JB"", ""N4YTAA"", ""N41135"", ""N566JB"", ""N138EV"", ""N676CA"", ""N813UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",109,70,"style","Trailing whitespace is superfluous.","""N12122"", ""N14214"", ""N3CXAA"", ""N37471"", ""N375NC"", ""N527MQ"", ""N13964"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",110,70,"style","Trailing whitespace is superfluous.","""N11181"", ""N5FGAA"", ""N3GCAA"", ""N946UW"", ""N808UA"", ""N835AS"", ""N737MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",111,70,"style","Trailing whitespace is superfluous.","""N362NW"", ""N673UA"", ""N838MQ"", ""N687MQ"", ""N3BCAA"", ""N435WN"", ""N5CGAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",112,70,"style","Trailing whitespace is superfluous.","""N73276"", ""N667AW"", ""N3750D"", ""N15910"", ""N374NW"", ""N247JB"", ""N516AS"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",113,70,"style","Trailing whitespace is superfluous.","""N707EV"", ""N777QC"", ""N579JB"", ""N337JB"", ""N464UA"", ""N8604C"", ""N847UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",114,70,"style","Trailing whitespace is superfluous.","""N400WN"", ""N3741S"", ""N15973"", ""N13538"", ""N39416"", ""N3DCAA"", ""N416UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",115,70,"style","Trailing whitespace is superfluous.","""N779JB"", ""N16976"", ""N494WN"", ""N807UA"", ""N929XJ"", ""N12195"", ""N3JDAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",116,70,"style","Trailing whitespace is superfluous.","""N1EAMQ"", ""N937DL"", ""N16151"", ""N576UA"", ""N17244"", ""N639MQ"", ""N13958"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",117,70,"style","Trailing whitespace is superfluous.","""N7738A"", ""N6716C"", ""N754UW"", ""N73299"", ""N185UW"", ""N3BRAA"", ""N8797A"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",118,70,"style","Trailing whitespace is superfluous.","""N8409N"", ""N3764D"", ""N954DL"", ""N13718"", ""N15985"", ""N318JB"", ""N197UW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",119,70,"style","Trailing whitespace is superfluous.","""N34111"", ""N509AY"", ""N13913"", ""N553UW"", ""N917WN"", ""N930DL"", ""N3749D"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",120,70,"style","Trailing whitespace is superfluous.","""N3748Y"", ""N218WN"", ""N73251"", ""N13124"", ""N507MJ"", ""N11150"", ""N519MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",121,70,"style","Trailing whitespace is superfluous.","""N928DL"", ""N819UA"", ""N917XJ"", ""N18556"", ""N8674A"", ""N520JB"", ""N8908D"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",122,70,"style","Trailing whitespace is superfluous.","""N910XJ"", ""N811MQ"", ""N609SW"", ""N12167"", ""N12564"", ""N485UA"", ""N556UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",123,70,"style","Trailing whitespace is superfluous.","""N657JB"", ""N18220"", ""N7741C"", ""N431UA"", ""N963WN"", ""N73275"", ""N368JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",124,70,"style","Trailing whitespace is superfluous.","""N12540"", ""N925DL"", ""N8745B"", ""N302DQ"", ""N935WN"", ""N236JB"", ""N16571"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",125,70,"style","Trailing whitespace is superfluous.","""N762US"", ""N912DE"", ""N77431"", ""N308DE"", ""N343NB"", ""N823UA"", ""N331NB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",126,70,"style","Trailing whitespace is superfluous.","""N558JB"", ""N8317M"", ""N75436"", ""N446WN"", ""N465UA"", ""N167US"", ""N587NW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",127,69,"style","Trailing whitespace is superfluous.","""N658JB"", ""N212WN"", ""N3733Z"", ""N3JUAA"", ""N531MQ"", ""N3735D"", ""N1603"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",128,70,"style","Trailing whitespace is superfluous.","""N700GS"", ""N332NW"", ""N516JB"", ""N5ETAA"", ""N4WMAA"", ""N397DA"", ""N13969"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",129,70,"style","Trailing whitespace is superfluous.","""N919DL"", ""N835VA"", ""N706SW"", ""N339AA"", ""N523UW"", ""N16732"", ""N183DN"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",130,70,"style","Trailing whitespace is superfluous.","""N486UA"", ""N12160"", ""N14117"", ""N76505"", ""N623VA"", ""N11565"", ""N3761R"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",131,70,"style","Trailing whitespace is superfluous.","""N710TW"", ""N960DL"", ""N827JB"", ""N314NB"", ""N221WN"", ""N811UA"", ""N76265"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",132,70,"style","Trailing whitespace is superfluous.","""N523JB"", ""N4YDAA"", ""N345NB"", ""N942WN"", ""N848VA"", ""N632MQ"", ""N606JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",133,70,"style","Trailing whitespace is superfluous.","""N925AT"", ""N482WN"", ""N480UA"", ""N3FNAA"", ""N443UA"", ""N502MJ"", ""N950AT"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",134,70,"style","Trailing whitespace is superfluous.","""N13132"", ""N535JB"", ""N894AT"", ""N15572"", ""N761RR"", ""N919DE"", ""N930AT"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",135,70,"style","Trailing whitespace is superfluous.","""N804UA"", ""N360NB"", ""N919FJ"", ""N529UA"", ""N3754A"", ""N512MQ"", ""N928AT"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",136,70,"style","Trailing whitespace is superfluous.","""N78501"", ""N392DA"", ""N857MQ"", ""N8828D"", ""N14237"", ""N766JB"", ""N461UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",137,70,"style","Trailing whitespace is superfluous.","""N744EV"", ""N3JMAA"", ""N615JB"", ""N835UA"", ""N503MQ"", ""N11548"", ""N830UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",138,70,"style","Trailing whitespace is superfluous.","""N487WN"", ""N480WN"", ""N348NB"", ""N922WN"", ""N812UA"", ""N327NW"", ""N12921"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",139,70,"style","Trailing whitespace is superfluous.","""N39418"", ""N292WN"", ""N810MQ"", ""N626VA"", ""N274JB"", ""N815MQ"", ""N565JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",140,70,"style","Trailing whitespace is superfluous.","""N18114"", ""N294WN"", ""N14923"", ""N467UA"", ""N925XJ"", ""N5PBMQ"", ""N21144"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",141,70,"style","Trailing whitespace is superfluous.","""N965DL"", ""N3GWAA"", ""N565AA"", ""N671DN"", ""N820UA"", ""N3JTAA"", ""N14125"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",142,70,"style","Trailing whitespace is superfluous.","""N344AT"", ""N663DN"", ""N615QX"", ""N558UA"", ""N928XJ"", ""N73256"", ""N411UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",143,70,"style","Trailing whitespace is superfluous.","""N515AA"", ""N961DL"", ""N11164"", ""N329NB"", ""N852MQ"", ""N341NW"", ""N339NW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",144,70,"style","Trailing whitespace is superfluous.","""N739GB"", ""N435UA"", ""N319NB"", ""N344NB"", ""N511UA"", ""N3JAAA"", ""N973DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",145,70,"style","Trailing whitespace is superfluous.","""N294PQ"", ""N830AS"", ""N11544"", ""N951DL"", ""N636MQ"", ""N67171"", ""N5CEAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",146,70,"style","Trailing whitespace is superfluous.","""N989DL"", ""N37413"", ""N522AA"", ""N841AY"", ""N3758Y"", ""N14168"", ""N613JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",147,70,"style","Trailing whitespace is superfluous.","""N12175"", ""N563UA"", ""N36476"", ""N3EXAA"", ""N909EV"", ""N320NB"", ""N36272"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",148,70,"style","Trailing whitespace is superfluous.","""N378NW"", ""N12201"", ""N13975"", ""N396DA"", ""N75429"", ""N3757D"", ""N937AT"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",149,70,"style","Trailing whitespace is superfluous.","""N939DL"", ""N553AA"", ""N317NB"", ""N7734H"", ""N310DE"", ""N76523"", ""N442UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",150,70,"style","Trailing whitespace is superfluous.","""N57852"", ""N37409"", ""N964AT"", ""N13566"", ""N525MQ"", ""N718EV"", ""N279JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",151,70,"style","Trailing whitespace is superfluous.","""N510MQ"", ""N738MQ"", ""N17185"", ""N406UA"", ""N247WN"", ""N3JEAA"", ""N944DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",152,70,"style","Trailing whitespace is superfluous.","""N670DN"", ""N918XJ"", ""N605JB"", ""N38454"", ""N27724"", ""N945DL"", ""N477UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",153,70,"style","Trailing whitespace is superfluous.","""N3AEMQ"", ""N276AT"", ""N753EV"", ""N16703"", ""N19966"", ""N13955"", ""N8458A"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",154,70,"style","Trailing whitespace is superfluous.","""N674DL"", ""N750EV"", ""N29917"", ""N8923A"", ""N546MQ"", ""N761ND"", ""N921AT"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",155,70,"style","Trailing whitespace is superfluous.","""N905WN"", ""N711MQ"", ""N515MJ"", ""N290AT"", ""N391CA"", ""N748EV"", ""N13965"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",156,70,"style","Trailing whitespace is superfluous.","""N27200"", ""N566UA"", ""N4XEAA"", ""N708JB"", ""N249JB"", ""N546AA"", ""N836VA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",157,70,"style","Trailing whitespace is superfluous.","""N634JB"", ""N176PQ"", ""N258JB"", ""N27239"", ""N459WN"", ""N16954"", ""N388DA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",158,70,"style","Trailing whitespace is superfluous.","""N467WN"", ""N653JB"", ""N179UW"", ""N560UW"", ""N318US"", ""N508UA"", ""N906DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",159,70,"style","Trailing whitespace is superfluous.","""N329JB"", ""N476AA"", ""N24706"", ""N21537"", ""N836AS"", ""N13978"", ""N902DE"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",160,70,"style","Trailing whitespace is superfluous.","""N936XJ"", ""N821UA"", ""N512UA"", ""N586JB"", ""N679DA"", ""N330NB"", ""N57111"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",161,70,"style","Trailing whitespace is superfluous.","""N13903"", ""N14916"", ""N14188"", ""N8659B"", ""N918FJ"", ""N723SW"", ""N906WN"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",162,70,"style","Trailing whitespace is superfluous.","""N382DA"", ""N634AA"", ""N491WN"", ""N11155"", ""N635JB"", ""N817UA"", ""N901XJ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",163,70,"style","Trailing whitespace is superfluous.","""N11121"", ""N660DL"", ""N493AA"", ""N969DL"", ""N589UA"", ""N526AA"", ""N662DN"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",164,70,"style","Trailing whitespace is superfluous.","""N474AA"", ""N946AT"", ""N81449"", ""N932WN"", ""N436UA"", ""N990AT"", ""N955AT"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",165,70,"style","Trailing whitespace is superfluous.","""N513AA"", ""N384AA"", ""N565UW"", ""N590JB"", ""N934DL"", ""N8623A"", ""N793JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",166,70,"style","Trailing whitespace is superfluous.","""N365AA"", ""N317US"", ""N794SW"", ""N8970D"", ""N3JVAA"", ""N202FR"", ""N155DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",167,70,"style","Trailing whitespace is superfluous.","""N8444F"", ""N656AW"", ""N8971A"", ""N557UA"", ""N319AA"", ""N816MQ"", ""N722EV"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",168,70,"style","Trailing whitespace is superfluous.","""N932DL"", ""N725MQ"", ""N913WN"", ""N4YJAA"", ""N14180"", ""N563UW"", ""N699DL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",169,70,"style","Trailing whitespace is superfluous.","""N37293"", ""N8894A"", ""N283AT"", ""N437AA"", ""N995AT"", ""N554NW"", ""N297PQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",170,70,"style","Trailing whitespace is superfluous.","""N75858"", ""N515UA"", ""N14174"", ""N16999"", ""N8943A"", ""N223WN"", ""N914XJ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",171,70,"style","Trailing whitespace is superfluous.","""N921DL"", ""N920XJ"", ""N490AA"", ""N810UA"", ""N452UW"", ""N34460"", ""N3EDAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",172,70,"style","Trailing whitespace is superfluous.","""N335NB"", ""N403WN"", ""N481WN"", ""N610DL"", ""N3755D"", ""N26549"", ""N832AS"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",173,70,"style","Trailing whitespace is superfluous.","""N966AT"", ""N821JB"", ""N3FWAA"", ""N907DL"", ""N721UW"", ""N566AA"", ""N787SA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",174,70,"style","Trailing whitespace is superfluous.","""N274WN"", ""N301NB"", ""N14974"", ""N692DL"", ""N804MQ"", ""N376NW"", ""N16217"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",175,70,"style","Trailing whitespace is superfluous.","""N11191"", ""N37465"", ""N326NB"", ""N526UA"", ""N388SW"", ""N558AA"", ""N524VA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",176,70,"style","Trailing whitespace is superfluous.","""N949AT"", ""N945AT"", ""N818UA"", ""N828UA"", ""N16911"", ""N197JB"", ""N417WN"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",177,70,"style","Trailing whitespace is superfluous.","""N698MQ"", ""N949UW"", ""N21154"", ""N523VA"", ""N13997"", ""N687DL"", ""N916DE"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",178,70,"style","Trailing whitespace is superfluous.","""N16987"", ""N546UA"", ""N736MQ"", ""N968AT"", ""N633JB"", ""N8968E"", ""N849UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",179,70,"style","Trailing whitespace is superfluous.","""N239WN"", ""N12142"", ""N370AA"", ""N12967"", ""N822UA"", ""N906DE"", ""N8709A"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",180,70,"style","Trailing whitespace is superfluous.","""N530MQ"", ""N717MQ"", ""N506MJ"", ""N32404"", ""N16961"", ""N825UA"", ""N14177"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",181,68,"style","Trailing whitespace is superfluous.","""N3753"", ""N855MQ"", ""N3767"", ""N494AA"", ""N508MQ"", ""N365NB"", ""N723MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",182,70,"style","Trailing whitespace is superfluous.","""N357NB"", ""N503JB"", ""N39423"", ""N374AA"", ""N319US"", ""N750UW"", ""N4YCAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",183,70,"style","Trailing whitespace is superfluous.","""N532MQ"", ""N383DN"", ""N3JSAA"", ""N463UA"", ""N763JB"", ""N420WN"", ""N327AA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",184,70,"style","Trailing whitespace is superfluous.","""N832AY"", ""N418UA"", ""N36207"", ""N14228"", ""N948UW"", ""N439UA"", ""N559JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",185,70,"style","Trailing whitespace is superfluous.","""N356AA"", ""N229JB"", ""N307DQ"", ""N54711"", ""N903XJ"", ""N263AV"", ""N312US"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",186,70,"style","Trailing whitespace is superfluous.","""N900DE"", ""N554JB"", ""N347NW"", ""N826UA"", ""N5EAAA"", ""N432UA"", ""N910FJ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",187,70,"style","Trailing whitespace is superfluous.","""N717EV"", ""N814UA"", ""N964WN"", ""N777NC"", ""N3762Y"", ""N514UA"", ""N26123"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",188,70,"style","Trailing whitespace is superfluous.","""N216JB"", ""N428UA"", ""N361VA"", ""N665JB"", ""N962DL"", ""N701GS"", ""N902XJ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",189,70,"style","Trailing whitespace is superfluous.","""N338NW"", ""N560UA"", ""N960AT"", ""N922XJ"", ""N689DL"", ""N7715E"", ""N16919"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",190,70,"style","Trailing whitespace is superfluous.","""N906MQ"", ""N473WN"", ""N623JB"", ""N353NW"", ""N835MQ"", ""N963DN"", ""N204FR"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",191,70,"style","Trailing whitespace is superfluous.","""N593UA"", ""N809JB"", ""N632VA"", ""N8794B"", ""N854VA"", ""N76503"", ""N37263"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",192,70,"style","Trailing whitespace is superfluous.","""N37281"", ""N323NB"", ""N605QX"", ""N3DGAA"", ""N542AA"", ""N3JRAA"", ""N3GNAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",193,70,"style","Trailing whitespace is superfluous.","""N571AA"", ""N595JB"", ""N232PQ"", ""N184DN"", ""N8673D"", ""N238JB"", ""N34137"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",194,70,"style","Trailing whitespace is superfluous.","""N14143"", ""N496AA"", ""N360NW"", ""N429UA"", ""N650MQ"", ""N569JB"", ""N650AW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",195,70,"style","Trailing whitespace is superfluous.","""N729JB"", ""N298JB"", ""N278AT"", ""N309DE"", ""N906XJ"", ""N3738B"", ""N387AA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",196,70,"style","Trailing whitespace is superfluous.","""N11199"", ""N407UA"", ""N17146"", ""N3GEAA"", ""N838UA"", ""N355NB"", ""N8525B"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",197,70,"style","Trailing whitespace is superfluous.","""N640VA"", ""N16701"", ""N503AA"", ""N975DL"", ""N8475B"", ""N401UA"", ""N11140"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",198,70,"style","Trailing whitespace is superfluous.","""N78285"", ""N13908"", ""N36247"", ""N12552"", ""N967DL"", ""N629VA"", ""N817MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",199,70,"style","Trailing whitespace is superfluous.","""N5DCAA"", ""N445UA"", ""N8884E"", ""N286WN"", ""N978AT"", ""N538UA"", ""N183JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",200,70,"style","Trailing whitespace is superfluous.","""N3CAAA"", ""N3BTAA"", ""N751EV"", ""N631MQ"", ""N393AA"", ""N573UA"", ""N14568"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",201,70,"style","Trailing whitespace is superfluous.","""N635AA"", ""N4XJAA"", ""N192DN"", ""N16951"", ""N518MQ"", ""N3CCAA"", ""N353JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",202,69,"style","Trailing whitespace is superfluous.","""N3766"", ""N13123"", ""N483UA"", ""N373JB"", ""N5CHAA"", ""N206JB"", ""N295PQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",203,70,"style","Trailing whitespace is superfluous.","""N10575"", ""N903DE"", ""N21197"", ""N0EGMQ"", ""N15710"", ""N334NB"", ""N26215"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",204,70,"style","Trailing whitespace is superfluous.","""N612QX"", ""N923FJ"", ""N5DBAA"", ""N273JB"", ""N284AT"", ""N505UA"", ""N3KCAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",205,70,"style","Trailing whitespace is superfluous.","""N505JB"", ""N540US"", ""N3CWAA"", ""N16981"", ""N13949"", ""N8938A"", ""N14153"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",206,70,"style","Trailing whitespace is superfluous.","""N510MJ"", ""N17560"", ""N3760C"", ""N456UA"", ""N968DL"", ""N35407"", ""N626MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",207,70,"style","Trailing whitespace is superfluous.","""N361NW"", ""N770UW"", ""N69059"", ""N366AA"", ""N536JB"", ""N8888D"", ""N304JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",208,70,"style","Trailing whitespace is superfluous.","""N669AW"", ""N716UW"", ""N36915"", ""N851UA"", ""N711HK"", ""N526MQ"", ""N989AT"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",209,70,"style","Trailing whitespace is superfluous.","""N31131"", ""N4YAAA"", ""N3772H"", ""N659JB"", ""N740UW"", ""N484WN"", ""N196DN"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",210,70,"style","Trailing whitespace is superfluous.","""N654UA"", ""N201AA"", ""N3AAAA"", ""N33284"", ""N15986"", ""N916DL"", ""N3BYAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",211,70,"style","Trailing whitespace is superfluous.","""N326AT"", ""N552JB"", ""N712JB"", ""N38443"", ""N527JB"", ""N195DN"", ""N756US"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",212,70,"style","Trailing whitespace is superfluous.","""N8913A"", ""N920DE"", ""N840AY"", ""N13970"", ""N724SW"", ""N25705"", ""N337NW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",213,70,"style","Trailing whitespace is superfluous.","""N911DE"", ""N970DL"", ""N527UA"", ""N818MQ"", ""N15983"", ""N709SW"", ""N578UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",214,70,"style","Trailing whitespace is superfluous.","""N376AA"", ""N13992"", ""N538CA"", ""N833AS"", ""N487UA"", ""N661JB"", ""N5FFAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",215,70,"style","Trailing whitespace is superfluous.","""N599AA"", ""N935AT"", ""N562UA"", ""N206FR"", ""N928MQ"", ""N4YGAA"", ""N3HRAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",216,70,"style","Trailing whitespace is superfluous.","""N587AS"", ""N37287"", ""N845UA"", ""N762SW"", ""N509UA"", ""N372DA"", ""N14171"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",217,70,"style","Trailing whitespace is superfluous.","""N4YUAA"", ""N17229"", ""N6711M"", ""N8672A"", ""N829UA"", ""N895AT"", ""N441WN"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",218,70,"style","Trailing whitespace is superfluous.","""N13914"", ""N738EV"", ""N552UW"", ""N415UA"", ""N482UA"", ""N767NC"", ""N328NB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",219,70,"style","Trailing whitespace is superfluous.","""N570UA"", ""N587JB"", ""N8577D"", ""N759EV"", ""N713TW"", ""N322US"", ""N422UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",220,70,"style","Trailing whitespace is superfluous.","""N8976E"", ""N441UA"", ""N665MQ"", ""N13118"", ""N363NW"", ""N915XJ"", ""N784SW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",221,70,"style","Trailing whitespace is superfluous.","""N976DL"", ""N8501F"", ""N8808H"", ""N910WN"", ""N942AT"", ""N947UW"", ""N48901"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",222,70,"style","Trailing whitespace is superfluous.","""N489UA"", ""N12114"", ""N12957"", ""N923XJ"", ""N507AY"", ""N169UW"", ""N3737C"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",223,70,"style","Trailing whitespace is superfluous.","""N819AY"", ""N38473"", ""N5CPAA"", ""N537JB"", ""N450WN"", ""N18243"", ""N17115"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",224,70,"style","Trailing whitespace is superfluous.","""N14998"", ""N22971"", ""N235WN"", ""N667DN"", ""N713MQ"", ""N716EV"", ""N648JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",225,70,"style","Trailing whitespace is superfluous.","""N24702"", ""N73283"", ""N956AT"", ""N12563"", ""N955WN"", ""N8310C"", ""N14920"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",226,70,"style","Trailing whitespace is superfluous.","""N945UW"", ""N528AA"", ""N741UW"", ""N5EGAA"", ""N12172"", ""N460WN"", ""N521US"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",227,70,"style","Trailing whitespace is superfluous.","""N33203"", ""N943DL"", ""N12109"", ""N649AW"", ""N333NW"", ""N216FR"", ""N179JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",228,70,"style","Trailing whitespace is superfluous.","""N931WN"", ""N3FLAA"", ""N11551"", ""N305AS"", ""N8886A"", ""N37290"", ""N523MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",229,70,"style","Trailing whitespace is superfluous.","""N907DE"", ""N13750"", ""N14558"", ""N758EV"", ""N933AT"", ""N685DA"", ""N265JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",230,70,"style","Trailing whitespace is superfluous.","""N12166"", ""N652JB"", ""N988AT"", ""N734MQ"", ""N994AT"", ""N457UA"", ""N951UW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",231,70,"style","Trailing whitespace is superfluous.","""N76288"", ""N8533D"", ""N740EV"", ""N395DN"", ""N843VA"", ""N133EV"", ""N657MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",232,70,"style","Trailing whitespace is superfluous.","""N371CA"", ""N8492C"", ""N843UA"", ""N594AA"", ""N425AA"", ""N641DL"", ""N741EV"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",233,70,"style","Trailing whitespace is superfluous.","""N537UA"", ""N909XJ"", ""N618JB"", ""N3746H"", ""N804JB"", ""N926XJ"", ""N405WN"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",234,70,"style","Trailing whitespace is superfluous.","""N131EV"", ""N568JB"", ""N983AT"", ""N658MQ"", ""N424AA"", ""N277WN"", ""N359NW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",235,70,"style","Trailing whitespace is superfluous.","""N398CA"", ""N298WN"", ""N3FDAA"", ""N695CA"", ""N3JHAA"", ""N8946A"", ""N506MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",236,70,"style","Trailing whitespace is superfluous.","""N606MQ"", ""N854UA"", ""N346JB"", ""N621JB"", ""N807MQ"", ""N655JB"", ""N307JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",237,70,"style","Trailing whitespace is superfluous.","""N342AA"", ""N322NB"", ""N713UW"", ""N206WN"", ""N37298"", ""N522MQ"", ""N3FYAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",238,70,"style","Trailing whitespace is superfluous.","""N7811F"", ""N587UA"", ""N556JB"", ""N971DL"", ""N3EMAA"", ""N760US"", ""N102UW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",239,70,"style","Trailing whitespace is superfluous.","""N208FR"", ""N716SW"", ""N918DE"", ""N755EV"", ""N517JB"", ""N14960"", ""N73259"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",240,70,"style","Trailing whitespace is superfluous.","""N452WN"", ""N16546"", ""N905XJ"", ""N6712B"", ""N77510"", ""N13995"", ""N3GHAA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",241,70,"style","Trailing whitespace is superfluous.","""N3EVAA"", ""N824UA"", ""N30401"", ""N12221"", ""N12922"", ""N751UW"", ""N78448"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",242,70,"style","Trailing whitespace is superfluous.","""N969AT"", ""N349NB"", ""N15555"", ""N14198"", ""N337NB"", ""N472WN"", ""N386DA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",243,70,"style","Trailing whitespace is superfluous.","""N589JB"", ""N939WN"", ""N651AW"", ""N846UA"", ""N637JB"", ""N909DL"", ""N543AA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",244,70,"style","Trailing whitespace is superfluous.","""N281JB"", ""N628MQ"", ""N4XBAA"", ""N135EV"", ""N12116"", ""N317JB"", ""N583JB"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",245,70,"style","Trailing whitespace is superfluous.","""N3CFAA"", ""N447WN"", ""N846MQ"", ""N460UA"", ""N340NB"", ""N33714"", ""N717JL"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",246,70,"style","Trailing whitespace is superfluous.","""N912WN"", ""N972AT"", ""N834UA"", ""N11137"", ""N35271"", ""N364NB"", ""N33262"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",247,70,"style","Trailing whitespace is superfluous.","""N604QX"", ""N422WN"", ""N190JB"", ""N916XJ"", ""N570JB"", ""N8423C"", ""N14952"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",248,70,"style","Trailing whitespace is superfluous.","""N851NW"", ""N333NB"", ""N352NB"", ""N561UA"", ""N104UW"", ""N542UW"", ""N544UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",249,70,"style","Trailing whitespace is superfluous.","""N910DL"", ""N500MQ"", ""N87507"", ""N815UA"", ""N308AT"", ""N717SA"", ""N907XJ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",250,70,"style","Trailing whitespace is superfluous.","""N12163"", ""N162UW"", ""N174DN"", ""N14907"", ""N371NW"", ""N33286"", ""N720MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",251,70,"style","Trailing whitespace is superfluous.","""N227WN"", ""N13968"", ""N323AA"", ""N668UA"", ""N923AT"", ""N731SA"", ""N727TW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",252,70,"style","Trailing whitespace is superfluous.","""N14162"", ""N565UA"", ""N483WN"", ""N786NC"", ""N3771K"", ""N200WN"", ""N800AY"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",253,70,"style","Trailing whitespace is superfluous.","""N11107"", ""N922EV"", ""N828AW"", ""N3GKAA"", ""N597JB"", ""N24211"", ""N791SW"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",254,70,"style","Trailing whitespace is superfluous.","""N174US"", ""N623DL"", ""N757LV"", ""N935DL"", ""N16183"", ""N79521"", ""N812MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",255,70,"style","Trailing whitespace is superfluous.","""N852UA"", ""N737US"", ""N673MQ"", ""N796JB"", ""N769US"", ""N921XJ"", ""N943AT"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",256,70,"style","Trailing whitespace is superfluous.","""N8588D"", ""N823AY"", ""N795SW"", ""N38727"", ""N77430"", ""N960WN"", ""N844MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",257,70,"style","Trailing whitespace is superfluous.","""N751SW"", ""N522VA"", ""N5FJAA"", ""N724EV"", ""N943WN"", ""N750SA"", ""N323US"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",258,70,"style","Trailing whitespace is superfluous.","""N14704"", ""N13988"", ""N464WN"", ""N931DL"", ""N514AA"", ""N12157"", ""N309US"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",259,69,"style","Trailing whitespace is superfluous.","""N266JB"", ""N203FR"", ""N806JB"", ""N931XJ"", ""N501MQ"", ""N6702"", ""N37420"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",260,70,"style","Trailing whitespace is superfluous.","""N10156"", ""N505MQ"", ""N87513"", ""N8495B"", ""N233LV"", ""N720EV"", ""N812AY"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",261,70,"style","Trailing whitespace is superfluous.","""N933XJ"", ""N496WN"", ""N580JB"", ""N927DA"", ""N3730B"", ""N658AW"", ""N474UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",262,70,"style","Trailing whitespace is superfluous.","""N3BEAA"", ""N192JB"", ""N850UA"", ""N506AA"", ""N802UA"", ""N556UW"", ""N373AA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",263,70,"style","Trailing whitespace is superfluous.","""N584JB"", ""N806UA"", ""N600QX"", ""N426WN"", ""N23708"", ""N371DA"", ""N824MQ"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",264,70,"style","Trailing whitespace is superfluous.","""N917DE"", ""N17128"", ""N415WN"", ""N22909"", ""N381DN"", ""N411WN"", ""N829AS"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",265,70,"style","Trailing whitespace is superfluous.","""N77296"", ""N607AT"", ""N384HA"", ""N840UA"", ""N684WN"", ""N8965E"", ""N541UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",266,70,"style","Trailing whitespace is superfluous.","""N184JB"", ""N205FR"", ""N672AW"", ""N839VA"", ""N389DA"", ""N956WN"", ""N17108"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",267,70,"style","Trailing whitespace is superfluous.","""N641JB"", ""N3GMAA"", ""N176UW"", ""N303DQ"", ""N5FNAA"", ""N826AS"", ""N451UA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",268,70,"style","Trailing whitespace is superfluous.","""N642VA"", ""N380AA"", ""N373NW"", ""N649JB"", ""N543MQ"", ""N571UA"", ""N487AA"", ","trailing_whitespace_linter" -"vignettes/travelling-old/SELECT-cb2164.R",269,70,"style","Trailing whitespace is superfluous.","""N676AW"", ""N630MQ"", ""N354AT"", ""N8325D"", ""N345AA"", ""N344NW"", ""N602LR"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",1,63,"style","Trailing whitespace is superfluous.","structure(list(oid = c(16L, 17L, 18L, 19L, 20L, 21L, 22L, 23L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",2,61,"style","Trailing whitespace is superfluous.","24L, 25L, 26L, 27L, 28L, 29L, 30L, 71L, 75L, 81L, 83L, 114L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",3,63,"style","Trailing whitespace is superfluous.","142L, 194L, 3361L, 3402L, 5017L, 32L, 5069L, 600L, 601L, 602L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",4,66,"style","Trailing whitespace is superfluous.","603L, 604L, 628L, 700L, 701L, 705L, 718L, 790L, 829L, 869L, 650L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",5,62,"style","Trailing whitespace is superfluous.","774L, 1033L, 1042L, 1043L, 1082L, 1083L, 1114L, 1184L, 1186L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",6,63,"style","Trailing whitespace is superfluous.","1266L, 1560L, 1562L, 1700L, 1790L, 2202L, 2203L, 2204L, 2205L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",7,63,"style","Trailing whitespace is superfluous.","4191L, 2206L, 4096L, 4089L, 2950L, 3220L, 3614L, 3642L, 3615L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",8,63,"style","Trailing whitespace is superfluous.","3734L, 3769L, 3802L, 4072L, 2970L, 5038L, 3904L, 3906L, 3908L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",9,63,"style","Trailing whitespace is superfluous.","3910L, 3912L, 3926L, 2249L, 2287L, 2275L, 2276L, 2277L, 2278L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",10,62,"style","Trailing whitespace is superfluous.","2279L, 3838L, 2280L, 2281L, 2283L, 2776L, 3500L, 3115L, 325L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",11,62,"style","Trailing whitespace is superfluous.","3310L, 269L, 3831L, 5077L, 5078L, 5079L, 5080L, 1000L, 1001L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",12,63,"style","Trailing whitespace is superfluous.","1002L, 1003L, 1016L, 1005L, 1006L, 1007L, 1008L, 1009L, 1028L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",13,67,"style","Trailing whitespace is superfluous.","1010L, 1011L, 1012L, 1013L, 199L, 143L, 271L, 1017L, 1018L, 1019L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",14,66,"style","Trailing whitespace is superfluous.","1020L, 1027L, 629L, 1021L, 1022L, 719L, 791L, 1040L, 1041L, 651L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",15,62,"style","Trailing whitespace is superfluous.","775L, 1034L, 1014L, 1015L, 1182L, 1183L, 1115L, 1185L, 1187L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",16,63,"style","Trailing whitespace is superfluous.","1270L, 1561L, 1563L, 1231L, 2201L, 2207L, 2208L, 2209L, 2210L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",17,63,"style","Trailing whitespace is superfluous.","4192L, 2211L, 4097L, 4090L, 2951L, 3221L, 3643L, 3644L, 3645L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",18,63,"style","Trailing whitespace is superfluous.","3735L, 3770L, 3807L, 4073L, 2949L, 5039L, 3905L, 3907L, 3909L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",19,68,"style","Trailing whitespace is superfluous.","3911L, 3913L, 3927L, 1263L, 12000L, 12001L, 12002L, 12003L, 12004L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",20,64,"style","Trailing whitespace is superfluous.","12005L, 12006L, 12007L, 12008L, 12009L, 12010L, 12011L, 12012L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",21,64,"style","Trailing whitespace is superfluous.","12013L, 12014L, 12015L, 12016L, 12017L, 12018L, 12019L, 12020L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",22,63,"style","Trailing whitespace is superfluous.","12021L, 12022L, 12023L, 12024L, 12025L, 1248L, 12026L, 12027L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",23,62,"style","Trailing whitespace is superfluous.","2842L, 2843L, 12028L, 12029L, 12030L, 12031L, 12032L, 12033L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",24,64,"style","Trailing whitespace is superfluous.","12034L, 12035L, 12036L, 12037L, 12038L, 12039L, 12040L, 12041L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",25,63,"style","Trailing whitespace is superfluous.","12042L, 12043L, 12044L, 4066L, 12045L, 12046L, 12047L, 12048L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",26,63,"style","Trailing whitespace is superfluous.","12049L, 12050L, 12051L, 6101L, 12052L, 12053L, 12054L, 12055L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",27,64,"style","Trailing whitespace is superfluous.","12056L, 12057L, 12058L, 12059L, 12060L, 12061L, 12062L, 12063L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",28,64,"style","Trailing whitespace is superfluous.","12064L, 12065L, 12066L, 12067L, 12068L, 12069L, 12070L, 12071L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",29,64,"style","Trailing whitespace is superfluous.","12072L, 12073L, 12074L, 12075L, 12076L, 12077L, 12078L, 12079L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",30,64,"style","Trailing whitespace is superfluous.","12080L, 12081L, 12082L, 12083L, 12084L, 12085L, 12086L, 12088L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",31,64,"style","Trailing whitespace is superfluous.","12092L, 12096L, 12099L, 12102L, 12106L, 12110L, 12114L, 12118L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",32,64,"style","Trailing whitespace is superfluous.","12122L, 12126L, 12130L, 12134L, 12138L, 12142L, 12145L, 12148L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",33,64,"style","Trailing whitespace is superfluous.","12151L, 12155L, 12159L, 12162L, 12166L, 12171L, 12174L, 12177L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",34,64,"style","Trailing whitespace is superfluous.","12180L, 12183L, 12186L, 12189L, 12193L, 12197L, 12201L, 12204L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",35,64,"style","Trailing whitespace is superfluous.","12208L, 12211L, 12215L, 12218L, 12221L, 12225L, 12228L, 12231L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",36,64,"style","Trailing whitespace is superfluous.","12235L, 12238L, 12241L, 12245L, 12248L, 12251L, 12255L, 12259L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",37,64,"style","Trailing whitespace is superfluous.","12262L, 12265L, 12268L, 12271L, 12274L, 12278L, 12282L, 12285L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",38,64,"style","Trailing whitespace is superfluous.","12289L, 12293L, 12296L, 12299L, 12303L, 12307L, 12311L, 12315L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",39,64,"style","Trailing whitespace is superfluous.","12319L, 12323L, 13124L, 13123L, 13127L, 13126L, 13129L, 13128L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",40,64,"style","Trailing whitespace is superfluous.","13131L, 13134L, 13133L, 13136L, 13135L, 13139L, 13143L, 13146L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",41,64,"style","Trailing whitespace is superfluous.","13150L, 13154L, 13158L, 13162L, 13166L, 13170L, 13174L, 13178L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",42,64,"style","Trailing whitespace is superfluous.","13182L, 13186L, 13190L, 13194L, 13198L, 13202L, 13206L, 13210L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",43,64,"style","Trailing whitespace is superfluous.","13213L, 13217L, 13221L, 13225L, 13228L, 13232L, 13235L, 13239L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",44,64,"style","Trailing whitespace is superfluous.","13242L, 13246L, 13248L, 13251L, 13253L, 13256L, 13258L, 13261L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",45,64,"style","Trailing whitespace is superfluous.","13263L, 13266L, 13270L, 13274L, 13277L, 13281L, 13285L, 13289L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",46,64,"style","Trailing whitespace is superfluous.","13293L, 13297L, 13300L, 13304L, 13307L, 13311L, 13315L, 13319L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",47,64,"style","Trailing whitespace is superfluous.","13323L, 13327L, 13331L, 13335L, 13339L, 13342L, 13345L, 13348L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",48,64,"style","Trailing whitespace is superfluous.","13351L, 13355L, 13358L, 13361L, 13365L, 13368L, 13371L, 13375L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",49,64,"style","Trailing whitespace is superfluous.","13379L, 16483L, 16482L, 16485L, 16489L, 16488L, 16491L, 16495L, ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",51,64,"style","Trailing whitespace is superfluous.","), typname = c(""bool"", ""bytea"", ""char"", ""name"", ""int8"", ""int2"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",52,62,"style","Trailing whitespace is superfluous.","""int2vector"", ""int4"", ""regproc"", ""text"", ""oid"", ""tid"", ""xid"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",53,70,"style","Trailing whitespace is superfluous.","""cid"", ""oidvector"", ""pg_type"", ""pg_attribute"", ""pg_proc"", ""pg_class"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",54,66,"style","Trailing whitespace is superfluous.","""json"", ""xml"", ""pg_node_tree"", ""pg_ndistinct"", ""pg_dependencies"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",55,66,"style","Trailing whitespace is superfluous.","""pg_mcv_list"", ""pg_ddl_command"", ""xid8"", ""point"", ""lseg"", ""path"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",56,67,"style","Trailing whitespace is superfluous.","""box"", ""polygon"", ""line"", ""float4"", ""float8"", ""unknown"", ""circle"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",57,69,"style","Trailing whitespace is superfluous.","""money"", ""macaddr"", ""inet"", ""cidr"", ""macaddr8"", ""aclitem"", ""bpchar"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",58,67,"style","Trailing whitespace is superfluous.","""varchar"", ""date"", ""time"", ""timestamp"", ""timestamptz"", ""interval"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",59,67,"style","Trailing whitespace is superfluous.","""timetz"", ""bit"", ""varbit"", ""numeric"", ""refcursor"", ""regprocedure"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",60,65,"style","Trailing whitespace is superfluous.","""regoper"", ""regoperator"", ""regclass"", ""regcollation"", ""regtype"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",61,70,"style","Trailing whitespace is superfluous.","""regrole"", ""regnamespace"", ""uuid"", ""pg_lsn"", ""tsvector"", ""gtsvector"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",62,62,"style","Trailing whitespace is superfluous.","""tsquery"", ""regconfig"", ""regdictionary"", ""jsonb"", ""jsonpath"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",63,68,"style","Trailing whitespace is superfluous.","""txid_snapshot"", ""pg_snapshot"", ""int4range"", ""numrange"", ""tsrange"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",64,71,"style","Trailing whitespace is superfluous.","""tstzrange"", ""daterange"", ""int8range"", ""record"", ""_record"", ""cstring"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",65,75,"style","Trailing whitespace is superfluous.","""any"", ""anyarray"", ""void"", ""trigger"", ""event_trigger"", ""language_handler"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",66,67,"style","Trailing whitespace is superfluous.","""internal"", ""anyelement"", ""anynonarray"", ""anyenum"", ""fdw_handler"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",67,67,"style","Trailing whitespace is superfluous.","""index_am_handler"", ""tsm_handler"", ""table_am_handler"", ""anyrange"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",68,64,"style","Trailing whitespace is superfluous.","""anycompatible"", ""anycompatiblearray"", ""anycompatiblenonarray"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",69,68,"style","Trailing whitespace is superfluous.","""anycompatiblerange"", ""_bool"", ""_bytea"", ""_char"", ""_name"", ""_int8"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",70,62,"style","Trailing whitespace is superfluous.","""_int2"", ""_int2vector"", ""_int4"", ""_regproc"", ""_text"", ""_oid"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",71,64,"style","Trailing whitespace is superfluous.","""_tid"", ""_xid"", ""_cid"", ""_oidvector"", ""_json"", ""_xml"", ""_xid8"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",72,68,"style","Trailing whitespace is superfluous.","""_point"", ""_lseg"", ""_path"", ""_box"", ""_polygon"", ""_line"", ""_float4"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",73,62,"style","Trailing whitespace is superfluous.","""_float8"", ""_circle"", ""_money"", ""_macaddr"", ""_inet"", ""_cidr"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",74,66,"style","Trailing whitespace is superfluous.","""_macaddr8"", ""_aclitem"", ""_bpchar"", ""_varchar"", ""_date"", ""_time"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",75,62,"style","Trailing whitespace is superfluous.","""_timestamp"", ""_timestamptz"", ""_interval"", ""_timetz"", ""_bit"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",76,66,"style","Trailing whitespace is superfluous.","""_varbit"", ""_numeric"", ""_refcursor"", ""_regprocedure"", ""_regoper"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",77,70,"style","Trailing whitespace is superfluous.","""_regoperator"", ""_regclass"", ""_regcollation"", ""_regtype"", ""_regrole"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",78,64,"style","Trailing whitespace is superfluous.","""_regnamespace"", ""_uuid"", ""_pg_lsn"", ""_tsvector"", ""_gtsvector"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",79,67,"style","Trailing whitespace is superfluous.","""_tsquery"", ""_regconfig"", ""_regdictionary"", ""_jsonb"", ""_jsonpath"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",80,61,"style","Trailing whitespace is superfluous.","""_txid_snapshot"", ""_pg_snapshot"", ""_int4range"", ""_numrange"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",81,66,"style","Trailing whitespace is superfluous.","""_tsrange"", ""_tstzrange"", ""_daterange"", ""_int8range"", ""_cstring"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",82,73,"style","Trailing whitespace is superfluous.","""pg_attrdef"", ""pg_constraint"", ""pg_inherits"", ""pg_index"", ""pg_operator"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",83,62,"style","Trailing whitespace is superfluous.","""pg_opfamily"", ""pg_opclass"", ""pg_am"", ""pg_amop"", ""pg_amproc"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",84,76,"style","Trailing whitespace is superfluous.","""pg_language"", ""pg_largeobject_metadata"", ""pg_largeobject"", ""pg_aggregate"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",85,61,"style","Trailing whitespace is superfluous.","""pg_statistic_ext"", ""pg_statistic_ext_data"", ""pg_statistic"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",86,66,"style","Trailing whitespace is superfluous.","""pg_rewrite"", ""pg_trigger"", ""pg_event_trigger"", ""pg_description"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",87,68,"style","Trailing whitespace is superfluous.","""pg_cast"", ""pg_enum"", ""pg_namespace"", ""pg_conversion"", ""pg_depend"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",88,67,"style","Trailing whitespace is superfluous.","""pg_database"", ""pg_db_role_setting"", ""pg_tablespace"", ""pg_authid"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",89,70,"style","Trailing whitespace is superfluous.","""pg_auth_members"", ""pg_shdepend"", ""pg_shdescription"", ""pg_ts_config"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",90,68,"style","Trailing whitespace is superfluous.","""pg_ts_config_map"", ""pg_ts_dict"", ""pg_ts_parser"", ""pg_ts_template"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",91,64,"style","Trailing whitespace is superfluous.","""pg_extension"", ""pg_foreign_data_wrapper"", ""pg_foreign_server"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",92,77,"style","Trailing whitespace is superfluous.","""pg_user_mapping"", ""pg_foreign_table"", ""pg_policy"", ""pg_replication_origin"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",93,67,"style","Trailing whitespace is superfluous.","""pg_default_acl"", ""pg_init_privs"", ""pg_seclabel"", ""pg_shseclabel"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",94,68,"style","Trailing whitespace is superfluous.","""pg_collation"", ""pg_partitioned_table"", ""pg_range"", ""pg_transform"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",95,74,"style","Trailing whitespace is superfluous.","""pg_sequence"", ""pg_publication"", ""pg_publication_rel"", ""pg_subscription"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",96,74,"style","Trailing whitespace is superfluous.","""pg_subscription_rel"", ""pg_toast_2600"", ""pg_toast_2604"", ""pg_toast_3456"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",97,67,"style","Trailing whitespace is superfluous.","""pg_toast_2606"", ""pg_toast_826"", ""pg_toast_2609"", ""pg_toast_3466"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",98,68,"style","Trailing whitespace is superfluous.","""pg_toast_3079"", ""pg_toast_2328"", ""pg_toast_1417"", ""pg_toast_3118"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",99,68,"style","Trailing whitespace is superfluous.","""pg_toast_3394"", ""pg_toast_2612"", ""pg_toast_2615"", ""pg_toast_3350"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",100,68,"style","Trailing whitespace is superfluous.","""pg_toast_3256"", ""pg_toast_1255"", ""pg_toast_2618"", ""pg_toast_3596"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",101,68,"style","Trailing whitespace is superfluous.","""pg_toast_2619"", ""pg_toast_3381"", ""pg_toast_3429"", ""pg_toast_2620"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",102,68,"style","Trailing whitespace is superfluous.","""pg_toast_3600"", ""pg_toast_1247"", ""pg_toast_1418"", ""pg_toast_1260"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",103,68,"style","Trailing whitespace is superfluous.","""pg_toast_1262"", ""pg_toast_2964"", ""pg_toast_6000"", ""pg_toast_2396"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",104,63,"style","Trailing whitespace is superfluous.","""pg_toast_3592"", ""pg_toast_6100"", ""pg_toast_1213"", ""pg_roles"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",105,63,"style","Trailing whitespace is superfluous.","""pg_shadow"", ""pg_group"", ""pg_user"", ""pg_policies"", ""pg_rules"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",106,70,"style","Trailing whitespace is superfluous.","""pg_views"", ""pg_tables"", ""pg_matviews"", ""pg_indexes"", ""pg_sequences"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",107,65,"style","Trailing whitespace is superfluous.","""pg_stats"", ""pg_stats_ext"", ""pg_publication_tables"", ""pg_locks"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",108,76,"style","Trailing whitespace is superfluous.","""pg_cursors"", ""pg_available_extensions"", ""pg_available_extension_versions"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",109,63,"style","Trailing whitespace is superfluous.","""pg_prepared_xacts"", ""pg_prepared_statements"", ""pg_seclabels"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",110,79,"style","Trailing whitespace is superfluous.","""pg_settings"", ""pg_file_settings"", ""pg_hba_file_rules"", ""pg_timezone_abbrevs"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",111,80,"style","Trailing whitespace is superfluous.","""pg_timezone_names"", ""pg_config"", ""pg_shmem_allocations"", ""pg_stat_all_tables"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",112,76,"style","Trailing whitespace is superfluous.","""pg_stat_xact_all_tables"", ""pg_stat_sys_tables"", ""pg_stat_xact_sys_tables"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",113,75,"style","Trailing whitespace is superfluous.","""pg_stat_user_tables"", ""pg_stat_xact_user_tables"", ""pg_statio_all_tables"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",114,72,"style","Trailing whitespace is superfluous.","""pg_statio_sys_tables"", ""pg_statio_user_tables"", ""pg_stat_all_indexes"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",115,72,"style","Trailing whitespace is superfluous.","""pg_stat_sys_indexes"", ""pg_stat_user_indexes"", ""pg_statio_all_indexes"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",116,78,"style","Trailing whitespace is superfluous.","""pg_statio_sys_indexes"", ""pg_statio_user_indexes"", ""pg_statio_all_sequences"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",117,75,"style","Trailing whitespace is superfluous.","""pg_statio_sys_sequences"", ""pg_statio_user_sequences"", ""pg_stat_activity"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",118,63,"style","Trailing whitespace is superfluous.","""pg_stat_replication"", ""pg_stat_slru"", ""pg_stat_wal_receiver"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",119,81,"style","Trailing whitespace is superfluous.","""pg_stat_subscription"", ""pg_stat_ssl"", ""pg_stat_gssapi"", ""pg_replication_slots"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",120,76,"style","Trailing whitespace is superfluous.","""pg_stat_database"", ""pg_stat_database_conflicts"", ""pg_stat_user_functions"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",121,71,"style","Trailing whitespace is superfluous.","""pg_stat_xact_user_functions"", ""pg_stat_archiver"", ""pg_stat_bgwriter"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",122,83,"style","Trailing whitespace is superfluous.","""pg_stat_progress_analyze"", ""pg_stat_progress_vacuum"", ""pg_stat_progress_cluster"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",123,64,"style","Trailing whitespace is superfluous.","""pg_stat_progress_create_index"", ""pg_stat_progress_basebackup"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",124,71,"style","Trailing whitespace is superfluous.","""pg_user_mappings"", ""pg_replication_origin_status"", ""cardinal_number"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",125,75,"style","Trailing whitespace is superfluous.","""_cardinal_number"", ""character_data"", ""_character_data"", ""sql_identifier"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",126,68,"style","Trailing whitespace is superfluous.","""_sql_identifier"", ""information_schema_catalog_name"", ""time_stamp"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",127,62,"style","Trailing whitespace is superfluous.","""_time_stamp"", ""yes_or_no"", ""_yes_or_no"", ""applicable_roles"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",128,69,"style","Trailing whitespace is superfluous.","""administrable_role_authorizations"", ""attributes"", ""character_sets"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",129,69,"style","Trailing whitespace is superfluous.","""check_constraint_routine_usage"", ""check_constraints"", ""collations"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",130,64,"style","Trailing whitespace is superfluous.","""collation_character_set_applicability"", ""column_column_usage"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",131,64,"style","Trailing whitespace is superfluous.","""column_domain_usage"", ""column_privileges"", ""column_udt_usage"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",132,64,"style","Trailing whitespace is superfluous.","""columns"", ""constraint_column_usage"", ""constraint_table_usage"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",133,70,"style","Trailing whitespace is superfluous.","""domain_constraints"", ""domain_udt_usage"", ""domains"", ""enabled_roles"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",134,61,"style","Trailing whitespace is superfluous.","""key_column_usage"", ""parameters"", ""referential_constraints"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",135,67,"style","Trailing whitespace is superfluous.","""role_column_grants"", ""routine_privileges"", ""role_routine_grants"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",136,71,"style","Trailing whitespace is superfluous.","""routines"", ""schemata"", ""sequences"", ""sql_features"", ""pg_toast_13245"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",137,76,"style","Trailing whitespace is superfluous.","""sql_implementation_info"", ""pg_toast_13250"", ""sql_parts"", ""pg_toast_13255"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",138,73,"style","Trailing whitespace is superfluous.","""sql_sizing"", ""pg_toast_13260"", ""table_constraints"", ""table_privileges"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",139,73,"style","Trailing whitespace is superfluous.","""role_table_grants"", ""tables"", ""transforms"", ""triggered_update_columns"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",140,69,"style","Trailing whitespace is superfluous.","""triggers"", ""udt_privileges"", ""role_udt_grants"", ""usage_privileges"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",141,64,"style","Trailing whitespace is superfluous.","""role_usage_grants"", ""user_defined_types"", ""view_column_usage"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",142,75,"style","Trailing whitespace is superfluous.","""view_routine_usage"", ""view_table_usage"", ""views"", ""data_type_privileges"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",143,64,"style","Trailing whitespace is superfluous.","""element_types"", ""_pg_foreign_table_columns"", ""column_options"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",144,61,"style","Trailing whitespace is superfluous.","""_pg_foreign_data_wrappers"", ""foreign_data_wrapper_options"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",145,74,"style","Trailing whitespace is superfluous.","""foreign_data_wrappers"", ""_pg_foreign_servers"", ""foreign_server_options"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",146,66,"style","Trailing whitespace is superfluous.","""foreign_servers"", ""_pg_foreign_tables"", ""foreign_table_options"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",147,63,"style","Trailing whitespace is superfluous.","""foreign_tables"", ""_pg_user_mappings"", ""user_mapping_options"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",148,72,"style","Trailing whitespace is superfluous.","""user_mappings"", ""airlines"", ""_airlines"", ""pg_toast_16481"", ""airports"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",149,72,"style","Trailing whitespace is superfluous.","""_airports"", ""pg_toast_16487"", ""flights"", ""_flights"", ""pg_toast_16493"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-526b8c.R",150,62,"style","Trailing whitespace is superfluous.","""planes"", ""_planes"", ""pg_toast_16499"", ""weather"", ""_weather"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-90cd6a.R",1,72,"style","Trailing whitespace is superfluous.","structure(list(year = integer(0), month = integer(0), day = integer(0), ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-90cd6a.R",2,80,"style","Trailing whitespace is superfluous."," dep_time = integer(0), sched_dep_time = integer(0), dep_delay = numeric(0), ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-90cd6a.R",3,80,"style","Trailing whitespace is superfluous."," arr_time = integer(0), sched_arr_time = integer(0), arr_delay = numeric(0), ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-90cd6a.R",4,73,"style","Trailing whitespace is superfluous."," carrier = character(0), flight = integer(0), tailnum = character(0), ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-90cd6a.R",5,71,"style","Trailing whitespace is superfluous."," origin = character(0), dest = character(0), air_time = numeric(0), ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-90cd6a.R",6,67,"style","Trailing whitespace is superfluous."," distance = numeric(0), hour = numeric(0), minute = numeric(0), ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",1,67,"style","Trailing whitespace is superfluous.","structure(list(tailnum = c(""N912XJ"", ""N645JB"", ""N904WN"", ""N3BWAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",2,70,"style","Trailing whitespace is superfluous.","""N3CJAA"", ""N14972"", ""N667UA"", ""N521JB"", ""N998AT"", ""N16559"", ""N14186"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",3,70,"style","Trailing whitespace is superfluous.","""N16170"", ""N789JB"", ""N593JB"", ""N409WN"", ""N11535"", ""N505AA"", ""N8928A"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",4,70,"style","Trailing whitespace is superfluous.","""N3DPAA"", ""N34222"", ""N639VA"", ""N480AA"", ""N77518"", ""N511MQ"", ""N697DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",5,70,"style","Trailing whitespace is superfluous.","""N87527"", ""N652SW"", ""N651JB"", ""N640AA"", ""N304DQ"", ""N988DL"", ""N643JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",6,70,"style","Trailing whitespace is superfluous.","""N231JB"", ""N14542"", ""N531JB"", ""N14573"", ""N76519"", ""N13161"", ""N567UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",7,70,"style","Trailing whitespace is superfluous.","""N201LV"", ""N27962"", ""N198JB"", ""N520MQ"", ""N689MQ"", ""N369NW"", ""N8432A"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",8,70,"style","Trailing whitespace is superfluous.","""N14902"", ""N8EGMQ"", ""N3FJAA"", ""N336NB"", ""N905DL"", ""N12136"", ""N628VA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",9,70,"style","Trailing whitespace is superfluous.","""N550WN"", ""N844VA"", ""N353SW"", ""N738US"", ""N371NB"", ""N431WN"", ""N11206"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",10,69,"style","Trailing whitespace is superfluous.","""N412WN"", ""N832UA"", ""N14993"", ""N495UA"", ""N3759"", ""N314US"", ""N14231"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",11,70,"style","Trailing whitespace is superfluous.","""N176DN"", ""N363NB"", ""N3AHAA"", ""N5DMAA"", ""N764US"", ""N802MQ"", ""N33209"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",12,70,"style","Trailing whitespace is superfluous.","""N38451"", ""N14219"", ""N320US"", ""N8903A"", ""N682MQ"", ""N672DL"", ""N3FCAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",13,70,"style","Trailing whitespace is superfluous.","""N173US"", ""N691CA"", ""N33103"", ""N210WN"", ""N8877A"", ""N638JB"", ""N558UW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",14,70,"style","Trailing whitespace is superfluous.","""N820AS"", ""N479UA"", ""N180US"", ""N334JB"", ""N33292"", ""N513UA"", ""N775JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",15,70,"style","Trailing whitespace is superfluous.","""N528MQ"", ""N955DL"", ""N405UA"", ""N377NW"", ""N611QX"", ""N7732A"", ""N320AA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",16,70,"style","Trailing whitespace is superfluous.","""N11192"", ""N3769L"", ""N622VA"", ""N338AA"", ""N504UA"", ""N7739A"", ""N841UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",17,70,"style","Trailing whitespace is superfluous.","""N987AT"", ""N11113"", ""N14106"", ""N903WN"", ""N3CGAA"", ""N621VA"", ""N477AA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",18,70,"style","Trailing whitespace is superfluous.","""N837UA"", ""N339NB"", ""N374DA"", ""N8869B"", ""N284JB"", ""N924DL"", ""N8775A"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",19,70,"style","Trailing whitespace is superfluous.","""N836UA"", ""N324JB"", ""N833UA"", ""N13553"", ""N999DN"", ""N3763D"", ""N12996"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",20,70,"style","Trailing whitespace is superfluous.","""N513MQ"", ""N722US"", ""N14904"", ""N591AA"", ""N539MQ"", ""N14977"", ""N12924"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",21,70,"style","Trailing whitespace is superfluous.","""N358NB"", ""N877AS"", ""N554UA"", ""N203JB"", ""N76514"", ""N12135"", ""N387SW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",22,70,"style","Trailing whitespace is superfluous.","""N27722"", ""N444UA"", ""N469UA"", ""N575UA"", ""N3AUAA"", ""N306JB"", ""N24128"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",23,70,"style","Trailing whitespace is superfluous.","""N617MQ"", ""N595UA"", ""N642DL"", ""N588JB"", ""N3HSAA"", ""N915DE"", ""N3HTAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",24,70,"style","Trailing whitespace is superfluous.","""N592UA"", ""N37253"", ""N629JB"", ""N585UA"", ""N265WN"", ""N4XRAA"", ""N941DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",25,70,"style","Trailing whitespace is superfluous.","""N838VA"", ""N267AT"", ""N3JXAA"", ""N523UA"", ""N912DL"", ""N3GRAA"", ""N707TW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",26,70,"style","Trailing whitespace is superfluous.","""N934WN"", ""N370SW"", ""N17133"", ""N594JB"", ""N11119"", ""N8942A"", ""N524JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",27,70,"style","Trailing whitespace is superfluous.","""N608QX"", ""N534JB"", ""N21130"", ""N534MQ"", ""N659DL"", ""N18102"", ""N14105"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",28,70,"style","Trailing whitespace is superfluous.","""N470UA"", ""N7714B"", ""N535MQ"", ""N910DE"", ""N921WN"", ""N918DL"", ""N703TW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",29,70,"style","Trailing whitespace is superfluous.","""N998DL"", ""N8982A"", ""N735MQ"", ""N76065"", ""N354NW"", ""N13994"", ""N644JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",30,70,"style","Trailing whitespace is superfluous.","""N282WN"", ""N722MQ"", ""N502UA"", ""N13202"", ""N66057"", ""N26545"", ""N37474"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",31,70,"style","Trailing whitespace is superfluous.","""N527AA"", ""N544AA"", ""N24212"", ""N935XJ"", ""N352AA"", ""N920AT"", ""N630JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",32,70,"style","Trailing whitespace is superfluous.","""N79402"", ""N8305E"", ""N849VA"", ""N477WN"", ""N603JB"", ""N8907A"", ""N4UCAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",33,70,"style","Trailing whitespace is superfluous.","""N535UW"", ""N8560F"", ""N17984"", ""N11189"", ""N709EV"", ""N727SW"", ""N3GLAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",34,69,"style","Trailing whitespace is superfluous.","""N7726A"", ""N3765"", ""N14959"", ""N796SW"", ""N325US"", ""N11165"", ""N3KBAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",35,69,"style","Trailing whitespace is superfluous.","""N4WVAA"", ""N713EV"", ""N3ASAA"", ""N8541D"", ""N444WN"", ""N744P"", ""N33294"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",36,70,"style","Trailing whitespace is superfluous.","""N476UA"", ""N845VA"", ""N950DL"", ""N937XJ"", ""N741SA"", ""N562UW"", ""N417UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",37,70,"style","Trailing whitespace is superfluous.","""N3ERAA"", ""N14179"", ""N684MQ"", ""N8800G"", ""N37252"", ""N11187"", ""N547JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",38,70,"style","Trailing whitespace is superfluous.","""N510JB"", ""N12569"", ""N592JB"", ""N16149"", ""N585AA"", ""N714CB"", ""N517MQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",39,70,"style","Trailing whitespace is superfluous.","""N3HUAA"", ""N366NW"", ""N5EMAA"", ""N723EV"", ""N66051"", ""N961AT"", ""N365NW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",40,70,"style","Trailing whitespace is superfluous.","""N269WN"", ""N248WN"", ""N18557"", ""N390AA"", ""N18120"", ""N344AA"", ""N805UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",41,70,"style","Trailing whitespace is superfluous.","""N76529"", ""N16713"", ""N661MQ"", ""N426UA"", ""N3736C"", ""N356NW"", ""N27733"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",42,70,"style","Trailing whitespace is superfluous.","""N328AA"", ""N466UA"", ""N547AA"", ""N3FKAA"", ""N345NW"", ""N983DL"", ""N410UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",43,70,"style","Trailing whitespace is superfluous.","""N794JB"", ""N181UW"", ""N76516"", ""N75426"", ""N232WN"", ""N5DNAA"", ""N675DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",44,70,"style","Trailing whitespace is superfluous.","""N23721"", ""N624VA"", ""N830MQ"", ""N604LR"", ""N914DL"", ""N361NB"", ""N458UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",45,70,"style","Trailing whitespace is superfluous.","""N379DA"", ""N633DL"", ""N947DL"", ""N401WN"", ""N261AT"", ""N3FHAA"", ""N591JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",46,70,"style","Trailing whitespace is superfluous.","""N77066"", ""N702TW"", ""N601AW"", ""N8554A"", ""N15912"", ""N37466"", ""N331NW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",47,70,"style","Trailing whitespace is superfluous.","""N605LR"", ""N706JB"", ""N518UA"", ""N695DL"", ""N721MQ"", ""N14116"", ""N840VA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",48,70,"style","Trailing whitespace is superfluous.","""N904XJ"", ""N526JB"", ""N285WN"", ""N633VA"", ""N519AA"", ""N364NW"", ""N942MQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",49,70,"style","Trailing whitespace is superfluous.","""N719EV"", ""N476WN"", ""N529VA"", ""N3CKAA"", ""N533UA"", ""N372NW"", ""N529JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",50,70,"style","Trailing whitespace is superfluous.","""N504JB"", ""N705TW"", ""N121UW"", ""N16178"", ""N515MQ"", ""N733SA"", ""N195UW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",51,70,"style","Trailing whitespace is superfluous.","""N328NW"", ""N663MQ"", ""N8964E"", ""N625VA"", ""N852VA"", ""N544MQ"", ""N327NB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",52,70,"style","Trailing whitespace is superfluous.","""N6EAMQ"", ""N340NW"", ""N163US"", ""N11176"", ""N13989"", ""N585JB"", ""N374JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",53,70,"style","Trailing whitespace is superfluous.","""N8736A"", ""N370NW"", ""N717TW"", ""N6704Z"", ""N760JB"", ""N14148"", ""N3CYAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",54,70,"style","Trailing whitespace is superfluous.","""N14543"", ""N5DYAA"", ""N329AA"", ""N8936A"", ""N599JB"", ""N749US"", ""N324AA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",55,70,"style","Trailing whitespace is superfluous.","""N600LR"", ""N951FR"", ""N611MQ"", ""N690DL"", ""N758SW"", ""N4UBAA"", ""N338NB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",56,70,"style","Trailing whitespace is superfluous.","""N534UA"", ""N550NW"", ""N455UA"", ""N920DL"", ""N907MQ"", ""N358NW"", ""N850MQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",57,70,"style","Trailing whitespace is superfluous.","""N419UA"", ""N3DHAA"", ""N984DL"", ""N39728"", ""N8790A"", ""N337AT"", ""N979DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",58,70,"style","Trailing whitespace is superfluous.","""N3FVAA"", ""N3CTAA"", ""N324US"", ""N730EV"", ""N41104"", ""N765SW"", ""N76515"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",59,70,"style","Trailing whitespace is superfluous.","""N3GSAA"", ""N8698A"", ""N173AT"", ""N76528"", ""N509MQ"", ""N805MQ"", ""N938DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",60,70,"style","Trailing whitespace is superfluous.","""N724MQ"", ""N201FR"", ""N433UA"", ""N712EV"", ""N853VA"", ""N564JB"", ""N438UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",61,70,"style","Trailing whitespace is superfluous.","""N747SA"", ""N561JB"", ""N29906"", ""N387DA"", ""N924XJ"", ""N913DL"", ""N11127"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",62,70,"style","Trailing whitespace is superfluous.","""N326US"", ""N8696C"", ""N722TW"", ""N481AA"", ""N543UW"", ""N675AW"", ""N302NB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",63,70,"style","Trailing whitespace is superfluous.","""N270WN"", ""N482AA"", ""N632SW"", ""N310NW"", ""N77530"", ""N4WNAA"", ""N950UW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",64,70,"style","Trailing whitespace is superfluous.","""N828AS"", ""N296PQ"", ""N19554"", ""N963DL"", ""N530VA"", ""N827UA"", ""N893AT"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",65,70,"style","Trailing whitespace is superfluous.","""N76502"", ""N68453"", ""N641VA"", ""N24729"", ""N553UA"", ""N510UW"", ""N627JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",66,70,"style","Trailing whitespace is superfluous.","""N821MQ"", ""N3BGAA"", ""N506JB"", ""N18101"", ""N16918"", ""N3KEAA"", ""N402UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",67,70,"style","Trailing whitespace is superfluous.","""N844MH"", ""N550UW"", ""N758US"", ""N391DA"", ""N662JB"", ""N908XJ"", ""N801UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",68,70,"style","Trailing whitespace is superfluous.","""N649MQ"", ""N466WN"", ""N8646A"", ""N241WN"", ""N18223"", ""N17245"", ""N14731"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",69,70,"style","Trailing whitespace is superfluous.","""N16147"", ""N990DL"", ""N993DL"", ""N639AA"", ""N29717"", ""N934XJ"", ""N996DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",70,70,"style","Trailing whitespace is superfluous.","""N913XJ"", ""N562JB"", ""N5EHAA"", ""N582AA"", ""N839UA"", ""N4XVAA"", ""N445WN"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",71,70,"style","Trailing whitespace is superfluous.","""N178JB"", ""N915AT"", ""N214FR"", ""N891AT"", ""N8532G"", ""N239JB"", ""N948DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",72,70,"style","Trailing whitespace is superfluous.","""N915WN"", ""N827AS"", ""N4XCAA"", ""N5CAAA"", ""N834AS"", ""N645MQ"", ""N11547"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",73,70,"style","Trailing whitespace is superfluous.","""N351NB"", ""N927AT"", ""N463WN"", ""N452UA"", ""N29129"", ""N14562"", ""N899AT"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",74,70,"style","Trailing whitespace is superfluous.","""N437UA"", ""N913DE"", ""N354JB"", ""N842UA"", ""N501AA"", ""N827MQ"", ""N408WN"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",75,70,"style","Trailing whitespace is superfluous.","""N803UA"", ""N355NW"", ""N283JB"", ""N507MQ"", ""N508AA"", ""N509JB"", ""N627VA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",76,70,"style","Trailing whitespace is superfluous.","""N176AT"", ""N348NW"", ""N715JB"", ""N3BAAA"", ""N8683B"", ""N13716"", ""N646JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",77,70,"style","Trailing whitespace is superfluous.","""N936DL"", ""N78438"", ""N3BDAA"", ""N638VA"", ""N507JB"", ""N403UA"", ""N16234"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",78,70,"style","Trailing whitespace is superfluous.","""N932XJ"", ""N784JB"", ""N297WN"", ""N902MQ"", ""N959UW"", ""N228JB"", ""N521VA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",79,70,"style","Trailing whitespace is superfluous.","""N906AT"", ""N3HGAA"", ""N267JB"", ""N507UA"", ""N612JB"", ""N564UA"", ""N17730"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",80,70,"style","Trailing whitespace is superfluous.","""N399DA"", ""N351JB"", ""N349NW"", ""N555LV"", ""N16561"", ""N504MQ"", ""N25134"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",81,70,"style","Trailing whitespace is superfluous.","""N607LR"", ""N833AY"", ""N615AA"", ""N607JB"", ""N3EPAA"", ""N324NB"", ""N577UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",82,70,"style","Trailing whitespace is superfluous.","""N8930E"", ""N519JB"", ""N458WN"", ""N754EV"", ""N911DA"", ""N21129"", ""N16709"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",83,70,"style","Trailing whitespace is superfluous.","""N339JB"", ""N997AT"", ""N4XXAA"", ""N927LR"", ""N946DL"", ""N3HEAA"", ""N36444"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",84,70,"style","Trailing whitespace is superfluous.","""N16541"", ""N776WN"", ""N574UA"", ""N75435"", ""N14570"", ""N323JB"", ""N8933B"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",85,70,"style","Trailing whitespace is superfluous.","""N34110"", ""N17126"", ""N771SA"", ""N820AY"", ""N715UW"", ""N710EV"", ""N940DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",86,70,"style","Trailing whitespace is superfluous.","""N8598B"", ""N705JB"", ""N8506C"", ""N807JB"", ""N394DA"", ""N634VA"", ""N348JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",87,70,"style","Trailing whitespace is superfluous.","""N3DSAA"", ""N355JB"", ""N8972E"", ""N293PQ"", ""N3DUAA"", ""N13133"", ""N14950"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",88,70,"style","Trailing whitespace is superfluous.","""N524MQ"", ""N904DL"", ""N27190"", ""N8960A"", ""N484UA"", ""N624JB"", ""N3AJAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",89,70,"style","Trailing whitespace is superfluous.","""N930XJ"", ""N77520"", ""N335AA"", ""N635VA"", ""N8940E"", ""N849MQ"", ""N713SW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",90,70,"style","Trailing whitespace is superfluous.","""N75433"", ""N316JB"", ""N12900"", ""N768SW"", ""N972DL"", ""N3FSAA"", ""N346NB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",91,70,"style","Trailing whitespace is superfluous.","""N908MQ"", ""N3JCAA"", ""N950WN"", ""N959AT"", ""N842MQ"", ""N3GDAA"", ""N8315C"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",92,70,"style","Trailing whitespace is superfluous.","""N624AG"", ""N14118"", ""N446UA"", ""N752EV"", ""N172DN"", ""N457UW"", ""N7735A"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",93,70,"style","Trailing whitespace is superfluous.","""N430UA"", ""N14905"", ""N805JB"", ""N580UA"", ""N545UA"", ""N709TW"", ""N601LR"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",94,70,"style","Trailing whitespace is superfluous.","""N218FR"", ""N404UA"", ""N23139"", ""N497UA"", ""N257WN"", ""N17138"", ""N959DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",95,70,"style","Trailing whitespace is superfluous.","""N652DL"", ""N351NW"", ""N603DL"", ""N855UA"", ""N569UA"", ""N329NW"", ""N735SA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",96,70,"style","Trailing whitespace is superfluous.","""N995DL"", ""N38467"", ""N563JB"", ""N3KPAA"", ""N75861"", ""N472UA"", ""N4WSAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",97,70,"style","Trailing whitespace is superfluous.","""N16963"", ""N583AA"", ""N13979"", ""N12567"", ""N539AA"", ""N927XJ"", ""N571JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",98,70,"style","Trailing whitespace is superfluous.","""N519UA"", ""N353AT"", ""N640JB"", ""N11536"", ""N597UA"", ""N79279"", ""N3EFAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",99,70,"style","Trailing whitespace is superfluous.","""N15574"", ""N636JB"", ""N14953"", ""N3APAA"", ""N528VA"", ""N486AA"", ""N514MQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",100,70,"style","Trailing whitespace is superfluous.","""N991DL"", ""N14203"", ""N928DN"", ""N11109"", ""N8839E"", ""N184US"", ""N76504"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",101,70,"style","Trailing whitespace is superfluous.","""N425UA"", ""N631VA"", ""N15980"", ""N3GJAA"", ""N764SW"", ""N353NB"", ""N982DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",102,70,"style","Trailing whitespace is superfluous.","""N825AS"", ""N508JB"", ""N598JB"", ""N342NW"", ""N3ANAA"", ""N746JB"", ""N9EAMQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",103,70,"style","Trailing whitespace is superfluous.","""N296JB"", ""N708EV"", ""N231WN"", ""N8580A"", ""N328JB"", ""N555UA"", ""N380DA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",104,70,"style","Trailing whitespace is superfluous.","""N423UA"", ""N522UA"", ""N222WN"", ""N336AA"", ""N292JB"", ""N332AA"", ""N588UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",105,70,"style","Trailing whitespace is superfluous.","""N8733G"", ""N809UA"", ""N767UW"", ""N244WN"", ""N933LR"", ""N525UA"", ""N608JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",106,70,"style","Trailing whitespace is superfluous.","""N929DL"", ""N14991"", ""N187JB"", ""N980AT"", ""N527VA"", ""N17169"", ""N978DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",107,70,"style","Trailing whitespace is superfluous.","""N625AA"", ""N316NB"", ""N492UA"", ""N944UW"", ""N3FPAA"", ""N922DL"", ""N3CHAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",108,70,"style","Trailing whitespace is superfluous.","""N656JB"", ""N4YTAA"", ""N41135"", ""N566JB"", ""N138EV"", ""N676CA"", ""N813UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",109,70,"style","Trailing whitespace is superfluous.","""N12122"", ""N14214"", ""N3CXAA"", ""N37471"", ""N375NC"", ""N527MQ"", ""N13964"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",110,70,"style","Trailing whitespace is superfluous.","""N11181"", ""N5FGAA"", ""N3GCAA"", ""N946UW"", ""N808UA"", ""N835AS"", ""N737MQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",111,70,"style","Trailing whitespace is superfluous.","""N673UA"", ""N362NW"", ""N838MQ"", ""N687MQ"", ""N3BCAA"", ""N435WN"", ""N5CGAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",112,70,"style","Trailing whitespace is superfluous.","""N73276"", ""N667AW"", ""N3750D"", ""N15910"", ""N374NW"", ""N247JB"", ""N516AS"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",113,70,"style","Trailing whitespace is superfluous.","""N707EV"", ""N777QC"", ""N579JB"", ""N337JB"", ""N464UA"", ""N8604C"", ""N847UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",114,70,"style","Trailing whitespace is superfluous.","""N400WN"", ""N3741S"", ""N15973"", ""N13538"", ""N3DCAA"", ""N39416"", ""N779JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",115,70,"style","Trailing whitespace is superfluous.","""N16976"", ""N416UA"", ""N807UA"", ""N494WN"", ""N929XJ"", ""N12195"", ""N3JDAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",116,70,"style","Trailing whitespace is superfluous.","""N1EAMQ"", ""N937DL"", ""N16151"", ""N576UA"", ""N17244"", ""N639MQ"", ""N13958"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",117,70,"style","Trailing whitespace is superfluous.","""N7738A"", ""N754UW"", ""N6716C"", ""N73299"", ""N185UW"", ""N3BRAA"", ""N8797A"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",118,70,"style","Trailing whitespace is superfluous.","""N8409N"", ""N3764D"", ""N954DL"", ""N13718"", ""N15985"", ""N318JB"", ""N197UW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",119,70,"style","Trailing whitespace is superfluous.","""N34111"", ""N509AY"", ""N13913"", ""N553UW"", ""N917WN"", ""N930DL"", ""N3749D"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",120,70,"style","Trailing whitespace is superfluous.","""N218WN"", ""N73251"", ""N3748Y"", ""N13124"", ""N11150"", ""N507MJ"", ""N519MQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",121,70,"style","Trailing whitespace is superfluous.","""N819UA"", ""N928DL"", ""N917XJ"", ""N18556"", ""N8674A"", ""N520JB"", ""N8908D"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",122,70,"style","Trailing whitespace is superfluous.","""N910XJ"", ""N811MQ"", ""N609SW"", ""N12167"", ""N12564"", ""N485UA"", ""N556UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",123,70,"style","Trailing whitespace is superfluous.","""N657JB"", ""N18220"", ""N7741C"", ""N431UA"", ""N963WN"", ""N73275"", ""N368JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",124,70,"style","Trailing whitespace is superfluous.","""N12540"", ""N925DL"", ""N8745B"", ""N302DQ"", ""N935WN"", ""N236JB"", ""N16571"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",125,70,"style","Trailing whitespace is superfluous.","""N762US"", ""N912DE"", ""N77431"", ""N308DE"", ""N343NB"", ""N823UA"", ""N331NB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",126,70,"style","Trailing whitespace is superfluous.","""N558JB"", ""N8317M"", ""N75436"", ""N446WN"", ""N465UA"", ""N167US"", ""N587NW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",127,70,"style","Trailing whitespace is superfluous.","""N658JB"", ""N212WN"", ""N3733Z"", ""N531MQ"", ""N3JUAA"", ""N3735D"", ""N700GS"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",128,69,"style","Trailing whitespace is superfluous.","""N1603"", ""N332NW"", ""N5ETAA"", ""N516JB"", ""N4WMAA"", ""N397DA"", ""N13969"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",129,70,"style","Trailing whitespace is superfluous.","""N919DL"", ""N835VA"", ""N706SW"", ""N339AA"", ""N523UW"", ""N16732"", ""N486UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",130,70,"style","Trailing whitespace is superfluous.","""N183DN"", ""N12160"", ""N14117"", ""N76505"", ""N623VA"", ""N11565"", ""N3761R"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",131,70,"style","Trailing whitespace is superfluous.","""N710TW"", ""N960DL"", ""N827JB"", ""N314NB"", ""N221WN"", ""N811UA"", ""N76265"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",132,70,"style","Trailing whitespace is superfluous.","""N523JB"", ""N4YDAA"", ""N345NB"", ""N942WN"", ""N848VA"", ""N632MQ"", ""N606JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",133,70,"style","Trailing whitespace is superfluous.","""N925AT"", ""N482WN"", ""N480UA"", ""N3FNAA"", ""N443UA"", ""N502MJ"", ""N950AT"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",134,70,"style","Trailing whitespace is superfluous.","""N894AT"", ""N13132"", ""N535JB"", ""N15572"", ""N761RR"", ""N919DE"", ""N930AT"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",135,70,"style","Trailing whitespace is superfluous.","""N804UA"", ""N360NB"", ""N919FJ"", ""N529UA"", ""N3754A"", ""N512MQ"", ""N928AT"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",136,70,"style","Trailing whitespace is superfluous.","""N78501"", ""N392DA"", ""N857MQ"", ""N8828D"", ""N14237"", ""N766JB"", ""N461UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",137,70,"style","Trailing whitespace is superfluous.","""N744EV"", ""N3JMAA"", ""N615JB"", ""N835UA"", ""N503MQ"", ""N11548"", ""N830UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",138,70,"style","Trailing whitespace is superfluous.","""N487WN"", ""N480WN"", ""N348NB"", ""N922WN"", ""N812UA"", ""N327NW"", ""N12921"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",139,70,"style","Trailing whitespace is superfluous.","""N39418"", ""N292WN"", ""N810MQ"", ""N626VA"", ""N274JB"", ""N815MQ"", ""N565JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",140,70,"style","Trailing whitespace is superfluous.","""N18114"", ""N294WN"", ""N14923"", ""N467UA"", ""N925XJ"", ""N5PBMQ"", ""N21144"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",141,70,"style","Trailing whitespace is superfluous.","""N965DL"", ""N3GWAA"", ""N671DN"", ""N565AA"", ""N820UA"", ""N3JTAA"", ""N14125"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",142,70,"style","Trailing whitespace is superfluous.","""N344AT"", ""N663DN"", ""N615QX"", ""N558UA"", ""N928XJ"", ""N73256"", ""N411UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",143,70,"style","Trailing whitespace is superfluous.","""N515AA"", ""N961DL"", ""N11164"", ""N329NB"", ""N852MQ"", ""N341NW"", ""N339NW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",144,70,"style","Trailing whitespace is superfluous.","""N739GB"", ""N435UA"", ""N319NB"", ""N511UA"", ""N344NB"", ""N3JAAA"", ""N973DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",145,70,"style","Trailing whitespace is superfluous.","""N294PQ"", ""N830AS"", ""N11544"", ""N951DL"", ""N636MQ"", ""N67171"", ""N5CEAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",146,70,"style","Trailing whitespace is superfluous.","""N989DL"", ""N37413"", ""N522AA"", ""N841AY"", ""N3758Y"", ""N14168"", ""N613JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",147,70,"style","Trailing whitespace is superfluous.","""N12175"", ""N563UA"", ""N36476"", ""N3EXAA"", ""N320NB"", ""N909EV"", ""N36272"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",148,70,"style","Trailing whitespace is superfluous.","""N378NW"", ""N12201"", ""N396DA"", ""N13975"", ""N75429"", ""N937AT"", ""N3757D"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",149,70,"style","Trailing whitespace is superfluous.","""N939DL"", ""N553AA"", ""N317NB"", ""N7734H"", ""N310DE"", ""N76523"", ""N442UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",150,70,"style","Trailing whitespace is superfluous.","""N57852"", ""N37409"", ""N964AT"", ""N525MQ"", ""N13566"", ""N718EV"", ""N279JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",151,70,"style","Trailing whitespace is superfluous.","""N510MQ"", ""N738MQ"", ""N17185"", ""N406UA"", ""N247WN"", ""N3JEAA"", ""N944DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",152,70,"style","Trailing whitespace is superfluous.","""N670DN"", ""N918XJ"", ""N605JB"", ""N27724"", ""N38454"", ""N945DL"", ""N477UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",153,70,"style","Trailing whitespace is superfluous.","""N3AEMQ"", ""N276AT"", ""N753EV"", ""N16703"", ""N19966"", ""N8458A"", ""N13955"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",154,70,"style","Trailing whitespace is superfluous.","""N674DL"", ""N750EV"", ""N29917"", ""N8923A"", ""N546MQ"", ""N761ND"", ""N921AT"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",155,70,"style","Trailing whitespace is superfluous.","""N905WN"", ""N711MQ"", ""N515MJ"", ""N290AT"", ""N391CA"", ""N748EV"", ""N13965"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",156,70,"style","Trailing whitespace is superfluous.","""N566UA"", ""N27200"", ""N4XEAA"", ""N708JB"", ""N249JB"", ""N546AA"", ""N836VA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",157,70,"style","Trailing whitespace is superfluous.","""N634JB"", ""N176PQ"", ""N258JB"", ""N27239"", ""N459WN"", ""N16954"", ""N388DA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",158,70,"style","Trailing whitespace is superfluous.","""N467WN"", ""N653JB"", ""N179UW"", ""N560UW"", ""N318US"", ""N508UA"", ""N906DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",159,70,"style","Trailing whitespace is superfluous.","""N329JB"", ""N476AA"", ""N24706"", ""N21537"", ""N836AS"", ""N13978"", ""N902DE"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",160,70,"style","Trailing whitespace is superfluous.","""N936XJ"", ""N821UA"", ""N512UA"", ""N586JB"", ""N679DA"", ""N57111"", ""N330NB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",161,70,"style","Trailing whitespace is superfluous.","""N13903"", ""N14916"", ""N14188"", ""N8659B"", ""N918FJ"", ""N723SW"", ""N906WN"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",162,70,"style","Trailing whitespace is superfluous.","""N382DA"", ""N634AA"", ""N491WN"", ""N11155"", ""N817UA"", ""N635JB"", ""N901XJ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",163,70,"style","Trailing whitespace is superfluous.","""N11121"", ""N660DL"", ""N493AA"", ""N969DL"", ""N589UA"", ""N526AA"", ""N662DN"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",164,70,"style","Trailing whitespace is superfluous.","""N474AA"", ""N946AT"", ""N81449"", ""N932WN"", ""N436UA"", ""N990AT"", ""N955AT"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",165,70,"style","Trailing whitespace is superfluous.","""N513AA"", ""N384AA"", ""N565UW"", ""N934DL"", ""N8623A"", ""N590JB"", ""N793JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",166,70,"style","Trailing whitespace is superfluous.","""N365AA"", ""N317US"", ""N794SW"", ""N8970D"", ""N3JVAA"", ""N202FR"", ""N155DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",167,70,"style","Trailing whitespace is superfluous.","""N8444F"", ""N656AW"", ""N557UA"", ""N8971A"", ""N319AA"", ""N816MQ"", ""N722EV"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",168,70,"style","Trailing whitespace is superfluous.","""N932DL"", ""N725MQ"", ""N913WN"", ""N4YJAA"", ""N14180"", ""N563UW"", ""N699DL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",169,70,"style","Trailing whitespace is superfluous.","""N37293"", ""N8894A"", ""N283AT"", ""N437AA"", ""N995AT"", ""N297PQ"", ""N554NW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",170,70,"style","Trailing whitespace is superfluous.","""N75858"", ""N515UA"", ""N14174"", ""N16999"", ""N8943A"", ""N223WN"", ""N914XJ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",171,70,"style","Trailing whitespace is superfluous.","""N921DL"", ""N920XJ"", ""N490AA"", ""N810UA"", ""N452UW"", ""N3EDAA"", ""N34460"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",172,70,"style","Trailing whitespace is superfluous.","""N335NB"", ""N403WN"", ""N481WN"", ""N610DL"", ""N3755D"", ""N26549"", ""N832AS"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",173,70,"style","Trailing whitespace is superfluous.","""N966AT"", ""N821JB"", ""N3FWAA"", ""N907DL"", ""N721UW"", ""N566AA"", ""N787SA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",174,70,"style","Trailing whitespace is superfluous.","""N274WN"", ""N301NB"", ""N14974"", ""N692DL"", ""N804MQ"", ""N376NW"", ""N16217"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",175,70,"style","Trailing whitespace is superfluous.","""N11191"", ""N37465"", ""N326NB"", ""N526UA"", ""N388SW"", ""N558AA"", ""N524VA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",176,70,"style","Trailing whitespace is superfluous.","""N949AT"", ""N945AT"", ""N818UA"", ""N828UA"", ""N16911"", ""N197JB"", ""N417WN"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",177,70,"style","Trailing whitespace is superfluous.","""N698MQ"", ""N949UW"", ""N21154"", ""N523VA"", ""N13997"", ""N687DL"", ""N916DE"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",178,70,"style","Trailing whitespace is superfluous.","""N16987"", ""N546UA"", ""N736MQ"", ""N968AT"", ""N633JB"", ""N8968E"", ""N849UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",179,70,"style","Trailing whitespace is superfluous.","""N239WN"", ""N12142"", ""N370AA"", ""N12967"", ""N822UA"", ""N906DE"", ""N8709A"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",180,70,"style","Trailing whitespace is superfluous.","""N530MQ"", ""N717MQ"", ""N506MJ"", ""N32404"", ""N16961"", ""N825UA"", ""N14177"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",181,68,"style","Trailing whitespace is superfluous.","""N3753"", ""N855MQ"", ""N3767"", ""N494AA"", ""N508MQ"", ""N365NB"", ""N723MQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",182,70,"style","Trailing whitespace is superfluous.","""N357NB"", ""N503JB"", ""N39423"", ""N374AA"", ""N750UW"", ""N319US"", ""N4YCAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",183,70,"style","Trailing whitespace is superfluous.","""N532MQ"", ""N3JSAA"", ""N383DN"", ""N463UA"", ""N763JB"", ""N420WN"", ""N327AA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",184,70,"style","Trailing whitespace is superfluous.","""N832AY"", ""N418UA"", ""N36207"", ""N14228"", ""N948UW"", ""N439UA"", ""N356AA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",185,70,"style","Trailing whitespace is superfluous.","""N229JB"", ""N559JB"", ""N307DQ"", ""N54711"", ""N903XJ"", ""N263AV"", ""N312US"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",186,70,"style","Trailing whitespace is superfluous.","""N900DE"", ""N554JB"", ""N347NW"", ""N826UA"", ""N5EAAA"", ""N432UA"", ""N910FJ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",187,70,"style","Trailing whitespace is superfluous.","""N814UA"", ""N717EV"", ""N964WN"", ""N777NC"", ""N3762Y"", ""N26123"", ""N514UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",188,70,"style","Trailing whitespace is superfluous.","""N216JB"", ""N428UA"", ""N361VA"", ""N962DL"", ""N665JB"", ""N701GS"", ""N902XJ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",189,70,"style","Trailing whitespace is superfluous.","""N338NW"", ""N560UA"", ""N960AT"", ""N922XJ"", ""N689DL"", ""N7715E"", ""N16919"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",190,70,"style","Trailing whitespace is superfluous.","""N473WN"", ""N906MQ"", ""N623JB"", ""N353NW"", ""N835MQ"", ""N963DN"", ""N204FR"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",191,70,"style","Trailing whitespace is superfluous.","""N593UA"", ""N632VA"", ""N8794B"", ""N809JB"", ""N854VA"", ""N76503"", ""N37263"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",192,70,"style","Trailing whitespace is superfluous.","""N37281"", ""N323NB"", ""N3DGAA"", ""N542AA"", ""N605QX"", ""N3JRAA"", ""N3GNAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",193,70,"style","Trailing whitespace is superfluous.","""N571AA"", ""N595JB"", ""N232PQ"", ""N8673D"", ""N184DN"", ""N238JB"", ""N34137"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",194,70,"style","Trailing whitespace is superfluous.","""N14143"", ""N496AA"", ""N360NW"", ""N429UA"", ""N650MQ"", ""N569JB"", ""N650AW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",195,70,"style","Trailing whitespace is superfluous.","""N729JB"", ""N298JB"", ""N278AT"", ""N309DE"", ""N906XJ"", ""N3738B"", ""N387AA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",196,70,"style","Trailing whitespace is superfluous.","""N11199"", ""N407UA"", ""N17146"", ""N3GEAA"", ""N838UA"", ""N355NB"", ""N8525B"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",197,70,"style","Trailing whitespace is superfluous.","""N640VA"", ""N16701"", ""N503AA"", ""N975DL"", ""N8475B"", ""N401UA"", ""N11140"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",198,70,"style","Trailing whitespace is superfluous.","""N78285"", ""N13908"", ""N36247"", ""N12552"", ""N629VA"", ""N967DL"", ""N817MQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",199,70,"style","Trailing whitespace is superfluous.","""N5DCAA"", ""N445UA"", ""N8884E"", ""N286WN"", ""N978AT"", ""N538UA"", ""N183JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",200,70,"style","Trailing whitespace is superfluous.","""N3BTAA"", ""N751EV"", ""N3CAAA"", ""N631MQ"", ""N393AA"", ""N573UA"", ""N14568"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",201,70,"style","Trailing whitespace is superfluous.","""N635AA"", ""N4XJAA"", ""N192DN"", ""N16951"", ""N518MQ"", ""N3CCAA"", ""N353JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",202,69,"style","Trailing whitespace is superfluous.","""N3766"", ""N13123"", ""N483UA"", ""N5CHAA"", ""N373JB"", ""N206JB"", ""N295PQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",203,70,"style","Trailing whitespace is superfluous.","""N10575"", ""N21197"", ""N903DE"", ""N0EGMQ"", ""N15710"", ""N334NB"", ""N26215"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",204,70,"style","Trailing whitespace is superfluous.","""N612QX"", ""N923FJ"", ""N5DBAA"", ""N273JB"", ""N284AT"", ""N505UA"", ""N3KCAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",205,70,"style","Trailing whitespace is superfluous.","""N505JB"", ""N540US"", ""N13949"", ""N3CWAA"", ""N16981"", ""N8938A"", ""N14153"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",206,70,"style","Trailing whitespace is superfluous.","""N510MJ"", ""N17560"", ""N3760C"", ""N456UA"", ""N968DL"", ""N626MQ"", ""N361NW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",207,70,"style","Trailing whitespace is superfluous.","""N35407"", ""N770UW"", ""N69059"", ""N366AA"", ""N536JB"", ""N8888D"", ""N304JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",208,70,"style","Trailing whitespace is superfluous.","""N669AW"", ""N716UW"", ""N36915"", ""N851UA"", ""N711HK"", ""N526MQ"", ""N989AT"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",209,70,"style","Trailing whitespace is superfluous.","""N31131"", ""N4YAAA"", ""N3772H"", ""N659JB"", ""N740UW"", ""N484WN"", ""N196DN"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",210,70,"style","Trailing whitespace is superfluous.","""N654UA"", ""N201AA"", ""N3AAAA"", ""N33284"", ""N15986"", ""N916DL"", ""N3BYAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",211,70,"style","Trailing whitespace is superfluous.","""N326AT"", ""N552JB"", ""N712JB"", ""N38443"", ""N527JB"", ""N195DN"", ""N756US"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",212,70,"style","Trailing whitespace is superfluous.","""N8913A"", ""N920DE"", ""N840AY"", ""N13970"", ""N724SW"", ""N25705"", ""N337NW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",213,70,"style","Trailing whitespace is superfluous.","""N911DE"", ""N970DL"", ""N527UA"", ""N818MQ"", ""N709SW"", ""N15983"", ""N578UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",214,70,"style","Trailing whitespace is superfluous.","""N376AA"", ""N13992"", ""N833AS"", ""N538CA"", ""N661JB"", ""N487UA"", ""N5FFAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",215,70,"style","Trailing whitespace is superfluous.","""N599AA"", ""N935AT"", ""N562UA"", ""N206FR"", ""N928MQ"", ""N4YGAA"", ""N3HRAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",216,70,"style","Trailing whitespace is superfluous.","""N587AS"", ""N37287"", ""N845UA"", ""N762SW"", ""N509UA"", ""N372DA"", ""N14171"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",217,70,"style","Trailing whitespace is superfluous.","""N4YUAA"", ""N6711M"", ""N17229"", ""N8672A"", ""N895AT"", ""N829UA"", ""N441WN"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",218,70,"style","Trailing whitespace is superfluous.","""N13914"", ""N738EV"", ""N552UW"", ""N482UA"", ""N415UA"", ""N767NC"", ""N328NB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",219,70,"style","Trailing whitespace is superfluous.","""N570UA"", ""N587JB"", ""N8577D"", ""N759EV"", ""N713TW"", ""N322US"", ""N422UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",220,70,"style","Trailing whitespace is superfluous.","""N8976E"", ""N441UA"", ""N665MQ"", ""N13118"", ""N363NW"", ""N915XJ"", ""N784SW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",221,70,"style","Trailing whitespace is superfluous.","""N976DL"", ""N8501F"", ""N910WN"", ""N8808H"", ""N942AT"", ""N947UW"", ""N48901"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",222,70,"style","Trailing whitespace is superfluous.","""N489UA"", ""N12114"", ""N12957"", ""N923XJ"", ""N507AY"", ""N169UW"", ""N3737C"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",223,70,"style","Trailing whitespace is superfluous.","""N819AY"", ""N38473"", ""N5CPAA"", ""N537JB"", ""N450WN"", ""N18243"", ""N17115"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",224,70,"style","Trailing whitespace is superfluous.","""N14998"", ""N22971"", ""N667DN"", ""N235WN"", ""N713MQ"", ""N716EV"", ""N648JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",225,70,"style","Trailing whitespace is superfluous.","""N24702"", ""N73283"", ""N956AT"", ""N12563"", ""N955WN"", ""N8310C"", ""N14920"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",226,70,"style","Trailing whitespace is superfluous.","""N945UW"", ""N528AA"", ""N741UW"", ""N5EGAA"", ""N12172"", ""N460WN"", ""N521US"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",227,70,"style","Trailing whitespace is superfluous.","""N33203"", ""N943DL"", ""N12109"", ""N649AW"", ""N333NW"", ""N216FR"", ""N179JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",228,70,"style","Trailing whitespace is superfluous.","""N931WN"", ""N3FLAA"", ""N11551"", ""N305AS"", ""N8886A"", ""N37290"", ""N523MQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",229,70,"style","Trailing whitespace is superfluous.","""N907DE"", ""N13750"", ""N14558"", ""N758EV"", ""N933AT"", ""N685DA"", ""N265JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",230,70,"style","Trailing whitespace is superfluous.","""N12166"", ""N652JB"", ""N734MQ"", ""N994AT"", ""N988AT"", ""N457UA"", ""N951UW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",231,70,"style","Trailing whitespace is superfluous.","""N76288"", ""N8533D"", ""N740EV"", ""N395DN"", ""N843VA"", ""N133EV"", ""N657MQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",232,70,"style","Trailing whitespace is superfluous.","""N371CA"", ""N8492C"", ""N843UA"", ""N594AA"", ""N425AA"", ""N641DL"", ""N741EV"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",233,70,"style","Trailing whitespace is superfluous.","""N537UA"", ""N909XJ"", ""N618JB"", ""N3746H"", ""N926XJ"", ""N804JB"", ""N405WN"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",234,70,"style","Trailing whitespace is superfluous.","""N131EV"", ""N568JB"", ""N983AT"", ""N658MQ"", ""N424AA"", ""N277WN"", ""N359NW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",235,70,"style","Trailing whitespace is superfluous.","""N398CA"", ""N298WN"", ""N3FDAA"", ""N695CA"", ""N3JHAA"", ""N8946A"", ""N506MQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",236,70,"style","Trailing whitespace is superfluous.","""N606MQ"", ""N346JB"", ""N854UA"", ""N621JB"", ""N807MQ"", ""N342AA"", ""N322NB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",237,70,"style","Trailing whitespace is superfluous.","""N655JB"", ""N307JB"", ""N713UW"", ""N206WN"", ""N37298"", ""N522MQ"", ""N3FYAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",238,70,"style","Trailing whitespace is superfluous.","""N7811F"", ""N556JB"", ""N587UA"", ""N971DL"", ""N760US"", ""N102UW"", ""N208FR"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",239,70,"style","Trailing whitespace is superfluous.","""N3EMAA"", ""N716SW"", ""N918DE"", ""N755EV"", ""N517JB"", ""N14960"", ""N73259"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",240,70,"style","Trailing whitespace is superfluous.","""N452WN"", ""N16546"", ""N905XJ"", ""N77510"", ""N6712B"", ""N13995"", ""N3GHAA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",241,70,"style","Trailing whitespace is superfluous.","""N3EVAA"", ""N824UA"", ""N30401"", ""N12221"", ""N12922"", ""N751UW"", ""N78448"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",242,70,"style","Trailing whitespace is superfluous.","""N969AT"", ""N349NB"", ""N15555"", ""N337NB"", ""N14198"", ""N472WN"", ""N386DA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",243,70,"style","Trailing whitespace is superfluous.","""N589JB"", ""N939WN"", ""N651AW"", ""N846UA"", ""N637JB"", ""N909DL"", ""N543AA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",244,70,"style","Trailing whitespace is superfluous.","""N281JB"", ""N628MQ"", ""N4XBAA"", ""N12116"", ""N135EV"", ""N317JB"", ""N583JB"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",245,70,"style","Trailing whitespace is superfluous.","""N3CFAA"", ""N447WN"", ""N846MQ"", ""N460UA"", ""N340NB"", ""N33714"", ""N717JL"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",246,70,"style","Trailing whitespace is superfluous.","""N912WN"", ""N972AT"", ""N834UA"", ""N11137"", ""N35271"", ""N364NB"", ""N33262"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",247,70,"style","Trailing whitespace is superfluous.","""N604QX"", ""N422WN"", ""N190JB"", ""N916XJ"", ""N570JB"", ""N8423C"", ""N14952"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",248,70,"style","Trailing whitespace is superfluous.","""N851NW"", ""N333NB"", ""N352NB"", ""N561UA"", ""N104UW"", ""N542UW"", ""N544UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",249,70,"style","Trailing whitespace is superfluous.","""N910DL"", ""N87507"", ""N500MQ"", ""N815UA"", ""N308AT"", ""N717SA"", ""N907XJ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",250,70,"style","Trailing whitespace is superfluous.","""N12163"", ""N162UW"", ""N174DN"", ""N14907"", ""N371NW"", ""N33286"", ""N720MQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",251,70,"style","Trailing whitespace is superfluous.","""N227WN"", ""N13968"", ""N323AA"", ""N668UA"", ""N731SA"", ""N923AT"", ""N727TW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",252,70,"style","Trailing whitespace is superfluous.","""N14162"", ""N565UA"", ""N483WN"", ""N786NC"", ""N3771K"", ""N200WN"", ""N800AY"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",253,70,"style","Trailing whitespace is superfluous.","""N11107"", ""N922EV"", ""N828AW"", ""N3GKAA"", ""N24211"", ""N597JB"", ""N791SW"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",254,70,"style","Trailing whitespace is superfluous.","""N174US"", ""N623DL"", ""N757LV"", ""N935DL"", ""N16183"", ""N79521"", ""N812MQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",255,70,"style","Trailing whitespace is superfluous.","""N852UA"", ""N673MQ"", ""N737US"", ""N796JB"", ""N769US"", ""N921XJ"", ""N943AT"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",256,70,"style","Trailing whitespace is superfluous.","""N8588D"", ""N823AY"", ""N795SW"", ""N38727"", ""N77430"", ""N960WN"", ""N844MQ"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",257,70,"style","Trailing whitespace is superfluous.","""N751SW"", ""N522VA"", ""N5FJAA"", ""N724EV"", ""N943WN"", ""N750SA"", ""N323US"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",258,70,"style","Trailing whitespace is superfluous.","""N14704"", ""N13988"", ""N464WN"", ""N931DL"", ""N514AA"", ""N12157"", ""N309US"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",259,69,"style","Trailing whitespace is superfluous.","""N266JB"", ""N203FR"", ""N806JB"", ""N931XJ"", ""N501MQ"", ""N6702"", ""N37420"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",260,70,"style","Trailing whitespace is superfluous.","""N10156"", ""N505MQ"", ""N87513"", ""N8495B"", ""N233LV"", ""N720EV"", ""N812AY"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",261,70,"style","Trailing whitespace is superfluous.","""N933XJ"", ""N496WN"", ""N580JB"", ""N927DA"", ""N3730B"", ""N658AW"", ""N474UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",262,70,"style","Trailing whitespace is superfluous.","""N3BEAA"", ""N192JB"", ""N850UA"", ""N506AA"", ""N802UA"", ""N556UW"", ""N373AA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",263,70,"style","Trailing whitespace is superfluous.","""N584JB"", ""N806UA"", ""N426WN"", ""N23708"", ""N600QX"", ""N824MQ"", ""N371DA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",264,70,"style","Trailing whitespace is superfluous.","""N917DE"", ""N17128"", ""N415WN"", ""N22909"", ""N381DN"", ""N411WN"", ""N829AS"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",265,70,"style","Trailing whitespace is superfluous.","""N77296"", ""N607AT"", ""N384HA"", ""N840UA"", ""N684WN"", ""N8965E"", ""N541UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",266,70,"style","Trailing whitespace is superfluous.","""N184JB"", ""N205FR"", ""N672AW"", ""N839VA"", ""N389DA"", ""N17108"", ""N956WN"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",267,70,"style","Trailing whitespace is superfluous.","""N641JB"", ""N3GMAA"", ""N176UW"", ""N303DQ"", ""N826AS"", ""N5FNAA"", ""N451UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",268,70,"style","Trailing whitespace is superfluous.","""N642VA"", ""N380AA"", ""N373NW"", ""N649JB"", ""N543MQ"", ""N487AA"", ""N571UA"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",269,70,"style","Trailing whitespace is superfluous.","""N630MQ"", ""N676AW"", ""N8325D"", ""N354AT"", ""N345AA"", ""N344NW"", ""N602LR"", ","trailing_whitespace_linter" -"vignettes/travelling/SELECT-cb2164.R",270,72,"style","Trailing whitespace is superfluous.","""N952AT"", ""N637VA"", ""N663JB"")), class = ""data.frame"", row.names = c(NA, ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/dittodb/email-body b/.dev/revdep_emails/dittodb/email-body deleted file mode 100644 index a10309050..000000000 --- a/.dev/revdep_emails/dittodb/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Jonathan Keane! Thank you for using {lintr} in your package {dittodb}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/ropensci/dittodb (hash: 94372d7b1c34cbd3da62c13f8b3ddaf90198188b) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 27s on CRAN vs. 19s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/dupree/attachments/dupree.warnings b/.dev/revdep_emails/dupree/attachments/dupree.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/dupree/attachments/dupree.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/dupree/email-body b/.dev/revdep_emails/dupree/email-body deleted file mode 100644 index dec21ff72..000000000 --- a/.dev/revdep_emails/dupree/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Russ Hyde! Thank you for using {lintr} in your package {dupree}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/russHyde/dupree (hash: d1b30dd4ae4cc3c2b198943e37d829d3e9c02b35) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 10s on CRAN vs. 7s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/dyn.log/attachments/dyn.log.warnings b/.dev/revdep_emails/dyn.log/attachments/dyn.log.warnings deleted file mode 100644 index df8107787..000000000 --- a/.dev/revdep_emails/dyn.log/attachments/dyn.log.warnings +++ /dev/null @@ -1,68 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Trying to remove β€˜dummy_linter’, which is not in `defaults`. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - The use of linters of class 'function' was deprecated in lintr version 2.0.1.9001. Use linters classed as 'linter' (see ?Linter) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. diff --git a/.dev/revdep_emails/dyn.log/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/dyn.log/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index f65babc57..000000000 --- a/.dev/revdep_emails/dyn.log/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,2 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/dispatch.R",123,39,"style","Commas should never have a space before."," args = rlang::pairlist2(msg = ,","commas_linter" diff --git a/.dev/revdep_emails/dyn.log/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/dyn.log/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 92c6447c3..000000000 --- a/.dev/revdep_emails/dyn.log/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,69 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/config.R",99,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(variable) |","vector_logic_linter" -"R/config.R",100,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," nchar(variable) == 0 |","vector_logic_linter" -"R/config.R",126,23,"style","Compound semicolons are discouraged. Replace them by a newline."," envir <- globalenv(); objs <- ls(envir)","semicolon_linter" -"R/config.R",220,5,"warning","local variable β€˜new_layout’ assigned but may not be used"," new_layout <- new_log_layout(","object_usage_linter" -"R/layout.R",125,12,"warning","1:(...) is likely to be wrong in the empty edge case. Use seq_len() instead."," range <- 1:(length(detail$formats))","seq_linter" -"tests/testthat/helper-objects.R",28,18,"style","Compound semicolons are discouraged. Replace them by a newline."," a <- ""test""; b <- 123; c <- 100L","semicolon_linter" -"tests/testthat/helper-objects.R",28,28,"style","Compound semicolons are discouraged. Replace them by a newline."," a <- ""test""; b <- 123; c <- 100L","semicolon_linter" -"tests/testthat/helper-objects.R",61,26,"style","Compound semicolons are discouraged. Replace them by a newline."," a <- ""derived test""; b <- 321; c <- 200L","semicolon_linter" -"tests/testthat/helper-objects.R",61,36,"style","Compound semicolons are discouraged. Replace them by a newline."," a <- ""derived test""; b <- 321; c <- 200L","semicolon_linter" -"tests/testthat/helper-objects.R",84,26,"style","Compound semicolons are discouraged. Replace them by a newline."," a <- ""derived test""; b <- 321; c <- 200L","semicolon_linter" -"tests/testthat/helper-objects.R",84,36,"style","Compound semicolons are discouraged. Replace them by a newline."," a <- ""derived test""; b <- 321; c <- 200L","semicolon_linter" -"tests/testthat/test-dispatch.R",28,18,"style","Compound semicolons are discouraged. Replace them by a newline."," var1 <- ""abc""; var2 <- 123; var3 <- 0.7535651","semicolon_linter" -"tests/testthat/test-dispatch.R",28,31,"style","Compound semicolons are discouraged. Replace them by a newline."," var1 <- ""abc""; var2 <- 123; var3 <- 0.7535651","semicolon_linter" -"tests/testthat/test-dispatch.R",62,18,"style","Compound semicolons are discouraged. Replace them by a newline."," var1 <- ""abc""; var2 <- 123; var3 <- 0.7535651","semicolon_linter" -"tests/testthat/test-dispatch.R",62,31,"style","Compound semicolons are discouraged. Replace them by a newline."," var1 <- ""abc""; var2 <- 123; var3 <- 0.7535651","semicolon_linter" -"tests/testthat/test-dispatch.R",100,18,"style","Compound semicolons are discouraged. Replace them by a newline."," var1 <- ""abc""; var2 <- 123; var3 <- 0.7535651","semicolon_linter" -"tests/testthat/test-dispatch.R",100,31,"style","Compound semicolons are discouraged. Replace them by a newline."," var1 <- ""abc""; var2 <- 123; var3 <- 0.7535651","semicolon_linter" -"vignettes/Configuration.Rmd",31,1,"style","Variable and function name style should be snake_case or symbols.","old.hooks <- fansi::set_knit_hooks(knitr::knit_hooks)","object_name_linter" -"vignettes/Configuration.Rmd",96,34,"style","Trailing whitespace is superfluous.","file.copy(from = configs$default, ","trailing_whitespace_linter" -"vignettes/Configuration.Rmd",125,1,"style","Variable and function name style should be snake_case or symbols.","TestObject <- R6::R6Class(","object_name_linter" -"vignettes/Configuration.Rmd",146,18,"style","Compound semicolons are discouraged. Replace them by a newline."," a <- ""test""; b <- 123; c <- 100L","semicolon_linter" -"vignettes/Configuration.Rmd",146,28,"style","Compound semicolons are discouraged. Replace them by a newline."," a <- ""test""; b <- 123; c <- 100L","semicolon_linter" -"vignettes/Configuration.Rmd",168,1,"style","Variable and function name style should be snake_case or symbols.","DerivedTestObject <- R6::R6Class(","object_name_linter" -"vignettes/Configuration.Rmd",178,26,"style","Compound semicolons are discouraged. Replace them by a newline."," a <- ""derived test""; b <- 321; c <- 200L","semicolon_linter" -"vignettes/Configuration.Rmd",178,36,"style","Compound semicolons are discouraged. Replace them by a newline."," a <- ""derived test""; b <- 321; c <- 200L","semicolon_linter" -"vignettes/Formats.Rmd",33,1,"style","Variable and function name style should be snake_case or symbols.","old.hooks <- fansi::set_knit_hooks(knitr::knit_hooks)","object_name_linter" -"vignettes/Formats.Rmd",79,15,"style","Only use double-quotes."," seperator = '-',","single_quotes_linter" -"vignettes/Formats.Rmd",83,14,"style","Compound semicolons are discouraged. Replace them by a newline.","var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","semicolon_linter" -"vignettes/Formats.Rmd",83,27,"style","Compound semicolons are discouraged. Replace them by a newline.","var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","semicolon_linter" -"vignettes/Formats.Rmd",107,15,"style","Only use double-quotes."," seperator = ' ',","single_quotes_linter" -"vignettes/Formats.Rmd",111,14,"style","Compound semicolons are discouraged. Replace them by a newline.","var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","semicolon_linter" -"vignettes/Formats.Rmd",111,27,"style","Compound semicolons are discouraged. Replace them by a newline.","var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","semicolon_linter" -"vignettes/Formats.Rmd",147,24,"style","Commas should always have a space after.","exec_context <- test(1,2,3)","commas_linter" -"vignettes/Formats.Rmd",147,26,"style","Commas should always have a space after.","exec_context <- test(1,2,3)","commas_linter" -"vignettes/Formats.Rmd",171,40,"style","Only use double-quotes."," new_fmt_metric(crayon::green$bold, 'sysname'),","single_quotes_linter" -"vignettes/Formats.Rmd",172,41,"style","Only use double-quotes."," new_fmt_metric(crayon::blue$yellow, 'release'),","single_quotes_linter" -"vignettes/Formats.Rmd",175,46,"style","Only use double-quotes."," new_fmt_timestamp(crayon::silver$italic, '[%x %H:%M:%S]'),","single_quotes_linter" -"vignettes/Formats.Rmd",176,43,"style","Only use double-quotes."," new_fmt_literal(crayon::magenta$bold, 'fn('),","single_quotes_linter" -"vignettes/Formats.Rmd",177,46,"style","Only use double-quotes."," new_fmt_exec_scope(crayon::magenta$bold, 'calling_fn'),","single_quotes_linter" -"vignettes/Formats.Rmd",178,43,"style","Only use double-quotes."," new_fmt_literal(crayon::magenta$bold, ')'),","single_quotes_linter" -"vignettes/Formats.Rmd",181,52,"style","Only use double-quotes."," new_fmt_exec_scope(crayon::bgYellow$blue$bold, 'call_stack')","single_quotes_linter" -"vignettes/Formats.Rmd",183,15,"style","Only use double-quotes."," seperator = '-',","single_quotes_linter" -"vignettes/Formats.Rmd",184,17,"style","Only use double-quotes."," association = 'ex-sysexec-cs-layout'","single_quotes_linter" -"vignettes/Formats.Rmd",190,7,"warning","local variable β€˜var1’ assigned but may not be used"," var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","object_usage_linter" -"vignettes/Formats.Rmd",190,20,"style","Compound semicolons are discouraged. Replace them by a newline."," var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","semicolon_linter" -"vignettes/Formats.Rmd",190,22,"warning","local variable β€˜var2’ assigned but may not be used"," var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","object_usage_linter" -"vignettes/Formats.Rmd",190,33,"style","Compound semicolons are discouraged. Replace them by a newline."," var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","semicolon_linter" -"vignettes/Formats.Rmd",190,35,"warning","local variable β€˜var3’ assigned but may not be used"," var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","object_usage_linter" -"vignettes/Formats.Rmd",192,7,"warning","no visible binding for global variable β€˜Logger’"," Logger$debug(""my log message - var1: '{var1}', var2: '{var2}', var3: '{var3}'"",","object_usage_linter" -"vignettes/Formats.Rmd",193,29,"style","Only use double-quotes."," layout = 'ex-sysexec-cs-layout')","single_quotes_linter" -"vignettes/Layouts.Rmd",32,23,"style","Put spaces around all infix operators.","options(crayon.enabled=TRUE)","infix_spaces_linter" -"vignettes/Layouts.Rmd",36,1,"style","Variable and function name style should be snake_case or symbols.","old.hooks <- fansi::set_knit_hooks(knitr::knit_hooks)","object_name_linter" -"vignettes/Layouts.Rmd",70,22,"style","Trailing whitespace is superfluous."," new_fmt_log_msg() ","trailing_whitespace_linter" -"vignettes/Layouts.Rmd",108,15,"style","Only use double-quotes."," seperator = '-',","single_quotes_linter" -"vignettes/Layouts.Rmd",117,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/Layouts.Rmd",118,7,"warning","local variable β€˜var1’ assigned but may not be used"," var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","object_usage_linter" -"vignettes/Layouts.Rmd",118,20,"style","Compound semicolons are discouraged. Replace them by a newline."," var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","semicolon_linter" -"vignettes/Layouts.Rmd",118,22,"warning","local variable β€˜var2’ assigned but may not be used"," var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","object_usage_linter" -"vignettes/Layouts.Rmd",118,33,"style","Compound semicolons are discouraged. Replace them by a newline."," var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","semicolon_linter" -"vignettes/Layouts.Rmd",118,35,"warning","local variable β€˜var3’ assigned but may not be used"," var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","object_usage_linter" -"vignettes/Layouts.Rmd",119,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/Layouts.Rmd",120,7,"warning","no visible binding for global variable β€˜Logger’"," Logger$debug(""my log message - var1: '{var1}', var2: '{var2}', var3: '{var3}'"", ","object_usage_linter" -"vignettes/Layouts.Rmd",120,86,"style","Trailing whitespace is superfluous."," Logger$debug(""my log message - var1: '{var1}', var2: '{var2}', var3: '{var3}'"", ","trailing_whitespace_linter" -"vignettes/Layouts.Rmd",121,29,"style","Only use double-quotes."," layout = 'log-with-callstack')","single_quotes_linter" -"vignettes/Levels.Rmd",25,23,"style","Put spaces around all infix operators.","options(crayon.enabled=TRUE)","infix_spaces_linter" -"vignettes/Levels.Rmd",27,1,"style","Variable and function name style should be snake_case or symbols.","old.hooks <- fansi::set_knit_hooks(knitr::knit_hooks)","object_name_linter" -"vignettes/Levels.Rmd",66,14,"style","Compound semicolons are discouraged. Replace them by a newline.","var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","semicolon_linter" -"vignettes/Levels.Rmd",66,27,"style","Compound semicolons are discouraged. Replace them by a newline.","var1 <- ""abc""; var2 <- 123; var3 <- round(runif(1), digits = 6)","semicolon_linter" diff --git a/.dev/revdep_emails/dyn.log/email-body b/.dev/revdep_emails/dyn.log/email-body deleted file mode 100644 index d0d88ff4c..000000000 --- a/.dev/revdep_emails/dyn.log/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Brandon Moretz! Thank you for using {lintr} in your package {dyn.log}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/bmoretz/dyn.log (hash: d5f7548e1e96c372b47505617ce4d59341016c7e) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 24s on CRAN vs. 15s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/edgarWebR/attachments/edgarWebR.warnings b/.dev/revdep_emails/edgarWebR/attachments/edgarWebR.warnings deleted file mode 100644 index 61d9875d5..000000000 --- a/.dev/revdep_emails/edgarWebR/attachments/edgarWebR.warnings +++ /dev/null @@ -1,2 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Trying to remove β€˜absolute_paths_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/edgarWebR/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/edgarWebR/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 1df85e4c8..000000000 --- a/.dev/revdep_emails/edgarWebR/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,19916 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"data-raw/sic_codes.R",43,58,"style","Use FALSE instead of the symbol F."," group = group_name, stringsAsFactors = F)","T_and_F_symbol_linter" -"data-raw/sic_codes.R",47,26,"style","Use FALSE instead of the symbol F.","})), stringsAsFactors = F)","T_and_F_symbol_linter" -"data-raw/sic_codes.R",58,42,"style","Use FALSE instead of the symbol F."," stringsAsFactors = F)","T_and_F_symbol_linter" -"data-raw/sic_codes.R",62,53,"style","Commas should always have a space after."," substr(majors$sic[startsWith(majors$sic, ""0"")], 2,4)","commas_linter" -"data-raw/sic_codes.R",69,42,"style","Use FALSE instead of the symbol F."," stringsAsFactors = F)","T_and_F_symbol_linter" -"data-raw/sic_codes.R",78,43,"style","Use FALSE instead of the symbol F."," stringsAsFactors = F)","T_and_F_symbol_linter" -"data-raw/sic_codes.R",79,36,"style","Commas should always have a space after.","sec_sic <- sec_sic[2:nrow(sec_sic),]","commas_linter" -"data-raw/sic_codes.R",85,62,"style","Use TRUE instead of the symbol T."," by.x = ""major_code"", by.y = ""sic"", all.x = T)","T_and_F_symbol_linter" -"data-raw/sic_codes.R",87,62,"style","Use TRUE instead of the symbol T."," by.x = ""group_code"", by.y = ""sic"", all.x = T)","T_and_F_symbol_linter" -"R/browse_edgar.R",20,32,"style","Put spaces around all infix operators."," before="""",","infix_spaces_linter" -"R/browse_edgar.R",33,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (res$status != ""200"" | res$headers[""content-type""] != ""application/atom+xml"") {","vector_logic_linter" -"R/browse_edgar.R",34,53,"style","Trailing semicolons are not needed."," stop(paste0(""Could not find company: "", ticker));","semicolon_linter" -"R/company_details.R",26,32,"style","Put spaces around all infix operators."," before="""",","infix_spaces_linter" -"R/company_filings.R",24,32,"style","Put spaces around all infix operators."," before="""",","infix_spaces_linter" -"R/effectiveness.R",47,57,"style","Use TRUE instead of the symbol T."," res$type <- sub("" Statements"", """", res$type, fixed = T)","T_and_F_symbol_linter" -"R/effectiveness.R",48,66,"style","Use TRUE instead of the symbol T."," res$division <- sub(""Division of "", """", res$division, fixed = T)","T_and_F_symbol_linter" -"R/parse_filing.R",39,30,"style","Use TRUE instead of the symbol T."," doc <- get_doc(x, clean = T)","T_and_F_symbol_linter" -"R/parse_filing.R",130,43,"style","Use FALSE instead of the symbol F."," stringsAsFactors = F)","T_and_F_symbol_linter" -"R/parse_filing.R",153,40,"style","Use FALSE instead of the symbol F."," include.raw = F,","T_and_F_symbol_linter" -"R/parse_filing.R",154,41,"style","Use FALSE instead of the symbol F."," include.path = F) {","T_and_F_symbol_linter" -"R/parse_filing.R",325,75,"style","Use FALSE instead of the symbol F."," result <- replicate(length(return_cols) + 2, character(), simplify = F)","T_and_F_symbol_linter" -"R/parse_filing.R",350,25,"style","Use TRUE instead of the symbol T."," ignore.case = T)","T_and_F_symbol_linter" -"R/parse_filing.R",366,42,"style","Use TRUE instead of the symbol T."," ignore.case = T)","T_and_F_symbol_linter" -"R/parse_submission.R",58,48,"style","Use TRUE instead of the symbol T."," include.binary = T,","T_and_F_symbol_linter" -"R/parse_submission.R",59,49,"style","Use TRUE instead of the symbol T."," include.content = T) {","T_and_F_symbol_linter" -"R/parse_submission.R",66,17,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.secdoc & (nchar(res) > 8e6)) {","vector_logic_linter" -"R/parse_submission.R",79,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (!is.secdoc & file.exists(res)) {","vector_logic_linter" -"R/parse_submission.R",130,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.binary & !include.binary) {","vector_logic_linter" -"R/parse_submission.R",148,59,"style","Use TRUE instead of the symbol T."," include.binary = T,","T_and_F_symbol_linter" -"R/parse_submission.R",149,60,"style","Use TRUE instead of the symbol T."," include.content = T) {","T_and_F_symbol_linter" -"R/parse_submission.R",153,44,"style","Use FALSE instead of the symbol F."," stringsAsFactors = F)","T_and_F_symbol_linter" -"R/parse_submission.R",156,15,"style","Use FALSE instead of the symbol F."," in.text <- F","T_and_F_symbol_linter" -"R/parse_submission.R",157,17,"style","Use FALSE instead of the symbol F."," is.binary <- F","T_and_F_symbol_linter" -"R/parse_submission.R",160,52,"style","Use FALSE instead of the symbol F."," while (length(l <- readLines(con, n = 1, warn = F)) > 0) {","T_and_F_symbol_linter" -"R/parse_submission.R",163,21,"style","Use FALSE instead of the symbol F."," in.text <- F","T_and_F_symbol_linter" -"R/parse_submission.R",166,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (text.line == 1 & startsWith(l, ""begin "")) {","vector_logic_linter" -"R/parse_submission.R",167,25,"style","Use TRUE instead of the symbol T."," is.binary <- T","T_and_F_symbol_linter" -"R/parse_submission.R",169,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (include.content & (!is.binary || include.binary)) {","vector_logic_linter" -"R/parse_submission.R",187,61,"style","Use FALSE instead of the symbol F."," result <- rbind(result, file.row, stringsAsFactors = F)","T_and_F_symbol_linter" -"R/parse_submission.R",192,19,"style","Use TRUE instead of the symbol T."," in.text <- T","T_and_F_symbol_linter" -"R/parse_submission.R",193,21,"style","Use FALSE instead of the symbol F."," is.binary <- F","T_and_F_symbol_linter" -"R/parse_submission.R",206,54,"style","Use TRUE instead of the symbol T."," txt.lines <- unlist(strsplit(txt, ""\n"", fixed = T))","T_and_F_symbol_linter" -"R/parse_submission.R",216,20,"style","Use FALSE instead of the symbol F."," prior.long <- c(F, (txt.length == 1023 | txt.length == 1025)[-length(txt.length)])","T_and_F_symbol_linter" -"R/utils.R",61,47,"style","Use TRUE instead of the symbol T."," grepl(""^(http|ftp)s?://"", x, ignore.case = T)","T_and_F_symbol_linter" -"R/utils.R",64,33,"style","Use FALSE instead of the symbol F.","get_doc <- function(x, clean = F) {","T_and_F_symbol_linter" -"R/utils.R",77,20,"style","Use TRUE instead of the symbol T."," }, silent = T)","T_and_F_symbol_linter" -"R/utils.R",89,20,"style","Use TRUE instead of the symbol T."," }, silent = T)","T_and_F_symbol_linter" -"R/utils.R",161,23,"style","Use TRUE instead of the symbol T.","), ncol = 2, byrow = T)","T_and_F_symbol_linter" -"R/utils.R",298,24,"style","Use TRUE instead of the symbol T."," fixed = T)","T_and_F_symbol_linter" -"R/utils.R",306,46,"style","Use TRUE instead of the symbol T."," x <- gsub(""
"", ""
"", x, fixed = T)","T_and_F_symbol_linter" -"R/utils.R",308,44,"style","Use TRUE instead of the symbol T."," x <- gsub(""
"", "" "", x, ignore.case = T)","T_and_F_symbol_linter" -"R/utils.R",309,45,"style","Use TRUE instead of the symbol T."," x <- gsub(""
"", "" "", x, ignore.case = T)","T_and_F_symbol_linter" -"R/utils.R",310,46,"style","Use TRUE instead of the symbol T."," x <- gsub("""", "" "", x, ignore.case = T)","T_and_F_symbol_linter" -"R/utils.R",323,28,"style","Use TRUE instead of the symbol T."," free = T)","T_and_F_symbol_linter" -"R/utils.R",327,88,"style","Use TRUE instead of the symbol T."," count(*)) and normalize-space() = '']""), free = T)","T_and_F_symbol_linter" -"R/utils.R",331,67,"style","Use TRUE instead of the symbol T."," xml2::xml_remove(xml2::xml_find_all(doc, ""//header""), free = T)","T_and_F_symbol_linter" -"tests/dev_tests/parse_to_html.R",3,34,"style","Use FALSE instead of the symbol F.","library(dplyr, warn.conflicts = F)","T_and_F_symbol_linter" -"tests/dev_tests/parse_to_html.R",56,55,"style","Use TRUE instead of the symbol T."," include.raw = T,","T_and_F_symbol_linter" -"tests/dev_tests/parse_to_html.R",57,56,"style","Use TRUE instead of the symbol T."," include.path = T)","T_and_F_symbol_linter" -"tests/dev_tests/parse_to_html.R",78,43,"style","Use TRUE instead of the symbol T.","doc <- edgarWebR:::get_doc(href, clean = T)","T_and_F_symbol_linter" -"tests/dev_tests/parse_to_html.R",82,55,"style","Use TRUE instead of the symbol T.","res <- build_parts(edgarWebR:::get_doc(href, clean = T), ""//text"")","T_and_F_symbol_linter" -"tests/testthat/helper_mock.R",36,38,"warning","Conditional expressions require scalar logical operators (&& and ||)","} else if (ewr_mock_bypass == ""true"" | !ewr_has_mocks) {","vector_logic_linter" -"tests/testthat/test_parse_filing.R",15,16,"style","Use TRUE instead of the symbol T."," }, silent = T)","T_and_F_symbol_linter" -"tests/testthat/test_parse_filing.R",20,85,"style","Use TRUE instead of the symbol T."," plain.words <- length(tokenizers::tokenize_words(xml2::xml_text(doc), simplify = T))","T_and_F_symbol_linter" -"tests/testthat/test_parse_filing.R",170,37,"style","Use FALSE instead of the symbol F."," ignore.case = F), ]","T_and_F_symbol_linter" -"vignettes/edgarWebR.Rmd",17,35,"style","Use TRUE instead of the symbol T.","knitr::opts_chunk$set(collapse = T, comment = ""#>"")","T_and_F_symbol_linter" -"vignettes/edgarWebR.Rmd",19,23,"style","Put spaces around all infix operators.","library(dplyr, quietly=TRUE)","infix_spaces_linter" -"vignettes/edgarWebR.Rmd",20,23,"style","Put spaces around all infix operators.","library(purrr, quietly=TRUE)","infix_spaces_linter" -"vignettes/edgarWebR.Rmd",102,29,"style","`%>%` should always have a space before it and a new line after it, unless the full pipeline fits on one line."," group_by(type) %>% summarize(","pipe_continuation_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1,121,"style","Lines should not be more than 120 characters.","structure(list(url = ""/browse-edgar?action=getcompany&CIK=EA&owner=exclude&type=10-&dateb=&start=0&count=100&output=atom"", ","line_length_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1,123,"style","Trailing whitespace is superfluous.","structure(list(url = ""/browse-edgar?action=getcompany&CIK=EA&owner=exclude&type=10-&dateb=&start=0&count=100&output=atom"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2,78,"style","Trailing whitespace is superfluous."," status_code = 200L, headers = structure(list(`content-encoding` = ""gzip"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3,68,"style","Trailing whitespace is superfluous."," `content-type` = ""application/atom+xml"", server = ""Apache"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4,80,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff"", `x-frame-options` = ""SAMEORIGIN"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5,73,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `content-length` = ""8015"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6,78,"style","Trailing whitespace is superfluous."," `cache-control` = ""no-cache"", date = ""Mon, 20 Jan 2020 17:54:21 GMT"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7,61,"style","Trailing whitespace is superfluous."," connection = ""keep-alive"", vary = ""Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8,88,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000 ; includeSubDomains ; preload"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10,69,"style","Trailing whitespace is superfluous."," )), all_headers = list(list(status = 200L, version = ""HTTP/1.1"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11,62,"style","Trailing whitespace is superfluous."," headers = structure(list(`content-encoding` = ""gzip"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12,72,"style","Trailing whitespace is superfluous."," `content-type` = ""application/atom+xml"", server = ""Apache"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13,84,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff"", `x-frame-options` = ""SAMEORIGIN"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",14,77,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `content-length` = ""8015"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",15,82,"style","Trailing whitespace is superfluous."," `cache-control` = ""no-cache"", date = ""Mon, 20 Jan 2020 17:54:21 GMT"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",16,65,"style","Trailing whitespace is superfluous."," connection = ""keep-alive"", vary = ""Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",17,118,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000 ; includeSubDomains ; preload""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",18,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",19,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",20,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",21,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",22,65,"style","Trailing whitespace is superfluous."," content = as.raw(c(0x3c, 0x3f, 0x78, 0x6d, 0x6c, 0x20, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",23,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x73, 0x69, 0x6f, 0x6e, 0x3d, 0x22, 0x31, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",24,64,"style","Trailing whitespace is superfluous."," 0x30, 0x22, 0x20, 0x65, 0x6e, 0x63, 0x6f, 0x64, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",25,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3d, 0x22, 0x49, 0x53, 0x4f, 0x2d, 0x38, 0x38, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",26,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x22, 0x20, 0x3f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",27,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x65, 0x65, 0x64, 0x20, 0x78, 0x6d, 0x6c, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",28,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",29,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x77, 0x33, 0x2e, 0x6f, 0x72, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",30,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x32, 0x30, 0x30, 0x35, 0x2f, 0x41, 0x74, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",31,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",32,64,"style","Trailing whitespace is superfluous."," 0x74, 0x68, 0x6f, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",33,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6d, 0x61, 0x69, 0x6c, 0x3e, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",34,64,"style","Trailing whitespace is superfluous."," 0x65, 0x62, 0x6d, 0x61, 0x73, 0x74, 0x65, 0x72, 0x40, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",35,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x3c, 0x2f, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",36,64,"style","Trailing whitespace is superfluous."," 0x61, 0x69, 0x6c, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",37,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x57, 0x65, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",38,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x73, 0x74, 0x65, 0x72, 0x3c, 0x2f, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",39,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",40,64,"style","Trailing whitespace is superfluous."," 0x61, 0x75, 0x74, 0x68, 0x6f, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",41,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",42,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x66, 0x6f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",43,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",44,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",45,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",46,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",47,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",48,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",49,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x79, 0x3e, 0x52, 0x45, 0x44, 0x57, 0x4f, 0x4f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",50,64,"style","Trailing whitespace is superfluous."," 0x44, 0x20, 0x43, 0x49, 0x54, 0x59, 0x3c, 0x2f, 0x63, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",51,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",52,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x74, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",53,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x43, 0x41, 0x3c, 0x2f, 0x73, 0x74, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",54,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",55,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x74, 0x72, 0x65, 0x65, 0x74, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",56,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x39, 0x20, 0x52, 0x45, 0x44, 0x57, 0x4f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",57,64,"style","Trailing whitespace is superfluous."," 0x4f, 0x44, 0x20, 0x53, 0x48, 0x4f, 0x52, 0x45, 0x53, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",58,64,"style","Trailing whitespace is superfluous."," 0x50, 0x41, 0x52, 0x4b, 0x57, 0x41, 0x59, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",59,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x65, 0x65, 0x74, 0x31, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",60,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",61,64,"style","Trailing whitespace is superfluous."," 0x69, 0x70, 0x3e, 0x39, 0x34, 0x30, 0x36, 0x35, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",62,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x69, 0x70, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",63,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x61, 0x64, 0x64, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",64,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",65,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",66,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x62, 0x75, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",67,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x65, 0x73, 0x73, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",68,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",69,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x79, 0x3e, 0x52, 0x45, 0x44, 0x57, 0x4f, 0x4f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",70,64,"style","Trailing whitespace is superfluous."," 0x44, 0x20, 0x43, 0x49, 0x54, 0x59, 0x3c, 0x2f, 0x63, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",71,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",72,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x70, 0x68, 0x6f, 0x6e, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",73,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x36, 0x35, 0x30, 0x2d, 0x36, 0x32, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",74,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x3c, 0x2f, 0x70, 0x68, 0x6f, 0x6e, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",75,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",76,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x74, 0x61, 0x74, 0x65, 0x3e, 0x43, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",77,64,"style","Trailing whitespace is superfluous."," 0x41, 0x3c, 0x2f, 0x73, 0x74, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",78,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",79,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x74, 0x72, 0x65, 0x65, 0x74, 0x31, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",80,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x20, 0x52, 0x45, 0x44, 0x57, 0x4f, 0x4f, 0x44, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",81,64,"style","Trailing whitespace is superfluous."," 0x20, 0x53, 0x48, 0x4f, 0x52, 0x45, 0x53, 0x20, 0x50, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",82,64,"style","Trailing whitespace is superfluous."," 0x52, 0x4b, 0x57, 0x41, 0x59, 0x3c, 0x2f, 0x73, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",83,64,"style","Trailing whitespace is superfluous."," 0x65, 0x65, 0x74, 0x31, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",84,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x7a, 0x69, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",85,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x39, 0x34, 0x30, 0x36, 0x35, 0x3c, 0x2f, 0x7a, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",86,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",87,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",88,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",89,64,"style","Trailing whitespace is superfluous."," 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, 0x73, 0x65, 0x73, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",90,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",91,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x67, 0x6e, 0x65, 0x64, 0x2d, 0x73, 0x69, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",92,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x37, 0x33, 0x37, 0x32, 0x3c, 0x2f, 0x61, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",93,64,"style","Trailing whitespace is superfluous."," 0x69, 0x67, 0x6e, 0x65, 0x64, 0x2d, 0x73, 0x69, 0x63, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",94,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",95,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x67, 0x6e, 0x65, 0x64, 0x2d, 0x73, 0x69, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",96,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x65, 0x73, 0x63, 0x3e, 0x53, 0x45, 0x52, 0x56, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",97,64,"style","Trailing whitespace is superfluous."," 0x49, 0x43, 0x45, 0x53, 0x2d, 0x50, 0x52, 0x45, 0x50, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",98,64,"style","Trailing whitespace is superfluous."," 0x43, 0x4b, 0x41, 0x47, 0x45, 0x44, 0x20, 0x53, 0x4f, 0x46, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",99,64,"style","Trailing whitespace is superfluous."," 0x54, 0x57, 0x41, 0x52, 0x45, 0x3c, 0x2f, 0x61, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",100,64,"style","Trailing whitespace is superfluous."," 0x69, 0x67, 0x6e, 0x65, 0x64, 0x2d, 0x73, 0x69, 0x63, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",101,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x73, 0x63, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",102,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x73, 0x73, 0x69, 0x67, 0x6e, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",103,64,"style","Trailing whitespace is superfluous."," 0x64, 0x2d, 0x73, 0x69, 0x63, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",104,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",105,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",106,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",107,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",108,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",109,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",110,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x53, 0x49, 0x43, 0x3d, 0x37, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",111,64,"style","Trailing whitespace is superfluous."," 0x37, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",112,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",113,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",114,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x61, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",115,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6e, 0x65, 0x64, 0x2d, 0x73, 0x69, 0x63, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",116,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",117,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x69, 0x6b, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",118,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x3c, 0x2f, 0x63, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",119,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",120,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",121,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",122,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",123,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",124,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",125,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",126,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",127,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x43, 0x49, 0x4b, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",128,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",129,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",130,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",131,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",132,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",133,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",134,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x65, 0x64, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",135,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x45, 0x4c, 0x45, 0x43, 0x54, 0x52, 0x4f, 0x4e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",136,64,"style","Trailing whitespace is superfluous."," 0x49, 0x43, 0x20, 0x41, 0x52, 0x54, 0x53, 0x20, 0x49, 0x4e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",137,64,"style","Trailing whitespace is superfluous."," 0x43, 0x2e, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",138,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x64, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",139,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",140,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x6c, 0x2d, 0x79, 0x65, 0x61, 0x72, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",141,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x3e, 0x30, 0x33, 0x33, 0x31, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",142,64,"style","Trailing whitespace is superfluous."," 0x69, 0x73, 0x63, 0x61, 0x6c, 0x2d, 0x79, 0x65, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",143,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x6e, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",144,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",145,64,"style","Trailing whitespace is superfluous."," 0x79, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x73, 0x20, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",146,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x22, 0x31, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",147,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",148,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",149,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",150,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x30, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",151,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3c, 0x2f, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",152,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",153,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x45, 0x4c, 0x45, 0x43, 0x54, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",154,64,"style","Trailing whitespace is superfluous."," 0x52, 0x4f, 0x4e, 0x49, 0x43, 0x20, 0x41, 0x52, 0x54, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",155,64,"style","Trailing whitespace is superfluous."," 0x20, 0x49, 0x4e, 0x43, 0x3c, 0x2f, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",156,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",157,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x6e, 0x61, 0x6d, 0x65, 0x73, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",158,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",159,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x72, 0x6c, 0x79, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",160,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",161,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x66, 0x66, 0x69, 0x63, 0x65, 0x3e, 0x4f, 0x66, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",162,64,"style","Trailing whitespace is superfluous."," 0x69, 0x63, 0x65, 0x20, 0x6f, 0x66, 0x20, 0x54, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",163,64,"style","Trailing whitespace is superfluous."," 0x68, 0x6e, 0x6f, 0x6c, 0x6f, 0x67, 0x79, 0x3c, 0x2f, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",164,64,"style","Trailing whitespace is superfluous."," 0x66, 0x66, 0x69, 0x63, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",165,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x74, 0x61, 0x74, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",166,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6f, 0x63, 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x3e, 0x43, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",167,64,"style","Trailing whitespace is superfluous."," 0x41, 0x3c, 0x2f, 0x73, 0x74, 0x61, 0x74, 0x65, 0x2d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",168,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x63, 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",169,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x74, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",170,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6c, 0x6f, 0x63, 0x61, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",171,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",172,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",173,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",174,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",175,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",176,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",177,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",178,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x74, 0x65, 0x3d, 0x43, 0x41, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",179,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",180,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",181,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",182,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x74, 0x61, 0x74, 0x65, 0x2d, 0x6c, 0x6f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",183,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",184,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",185,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x74, 0x65, 0x2d, 0x6f, 0x66, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",186,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x72, 0x70, 0x6f, 0x72, 0x61, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",187,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3e, 0x44, 0x45, 0x3c, 0x2f, 0x73, 0x74, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",188,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6f, 0x66, 0x2d, 0x69, 0x6e, 0x63, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",189,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",190,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",191,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x2d, 0x69, 0x6e, 0x66, 0x6f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",192,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",193,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",194,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",195,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",196,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",197,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",198,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",199,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",200,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",201,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",202,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",203,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",204,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",205,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",206,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",207,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",208,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x32, 0x39, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",209,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",210,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",211,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",212,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",213,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",214,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",215,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",216,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",217,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",218,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",219,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",220,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",221,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",222,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",223,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",224,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",225,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",226,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",227,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",228,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",229,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",230,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",231,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",232,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",233,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",234,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",235,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",236,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",237,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",238,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",239,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",240,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",241,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",242,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",243,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",244,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",245,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",246,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x32, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",247,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",248,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x31, 0x32, 0x39, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",249,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",250,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",251,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",252,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",253,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",254,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",255,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",256,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",257,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x39, 0x31, 0x31, 0x39, 0x34, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",258,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",259,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",260,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",261,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",262,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",263,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",264,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",265,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",266,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",267,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",268,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",269,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",270,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",271,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",272,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",273,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",274,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",275,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",276,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",277,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",278,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",279,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",280,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",281,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x31, 0x32, 0x39, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",282,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",283,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",284,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",285,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",286,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",287,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",288,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",289,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",290,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",291,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",292,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",293,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",294,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",295,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",296,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",297,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",298,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",299,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",300,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",301,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x31, 0x39, 0x30, 0x30, 0x30, 0x31, 0x32, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",302,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",303,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",304,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",305,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",306,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",307,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",308,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",309,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",310,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",311,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",312,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",313,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",314,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x39, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",315,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",316,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",317,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",318,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",319,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x32, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",320,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",321,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",322,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x33, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",323,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",324,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",325,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",326,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",327,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",328,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",329,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",330,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",331,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",332,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",333,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x35, 0x54, 0x31, 0x39, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",334,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x3a, 0x32, 0x33, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",335,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",336,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",337,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",338,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",339,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",340,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",341,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",342,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",343,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",344,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",345,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",346,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",347,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",348,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",349,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",350,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",351,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",352,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",353,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",354,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x34, 0x39, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",355,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",356,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",357,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",358,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",359,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",360,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",361,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",362,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",363,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",364,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",365,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",366,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",367,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",368,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",369,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",370,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",371,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",372,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",373,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",374,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",375,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",376,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",377,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",378,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",379,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",380,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",381,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",382,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",383,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",384,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",385,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",386,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",387,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",388,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",389,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",390,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",391,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x31, 0x39, 0x30, 0x30, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",392,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",393,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",394,64,"style","Trailing whitespace is superfluous."," 0x34, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",395,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",396,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",397,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",398,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",399,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",400,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",401,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",402,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",403,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x32, 0x33, 0x31, 0x35, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",404,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",405,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",406,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",407,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",409,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",410,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",411,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",412,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",413,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",414,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",415,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",416,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",417,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",418,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",419,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",420,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",421,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",422,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",423,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",424,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",425,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",426,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",427,64,"style","Trailing whitespace is superfluous."," 0x34, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",428,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",429,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",430,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",431,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",432,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",433,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",434,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",435,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",436,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",437,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",438,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",439,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",440,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",441,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",442,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",443,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",444,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",445,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",446,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x39, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",447,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x34, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",448,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",449,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",450,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",451,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",452,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",453,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",454,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",455,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",456,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",457,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",458,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",459,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",460,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x36, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",461,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",462,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",463,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",464,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",465,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x34, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",466,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",467,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",468,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",469,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",470,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",471,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",472,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",473,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",474,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",475,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",476,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",477,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",478,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",479,64,"style","Trailing whitespace is superfluous."," 0x36, 0x54, 0x31, 0x36, 0x3a, 0x31, 0x38, 0x3a, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",480,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",481,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",482,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",483,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",484,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",485,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",486,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",487,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",488,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",489,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",490,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",491,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",492,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",493,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",494,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",495,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",496,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",497,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",498,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",499,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x39, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",500,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",501,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",502,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",503,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",504,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",505,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",506,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",507,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",508,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",509,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",510,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",511,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",512,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",513,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",514,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",515,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",516,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",517,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",518,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",519,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",520,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",521,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",522,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",523,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",524,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",525,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",526,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",527,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",528,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",529,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",530,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",531,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",532,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",533,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",534,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",535,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",536,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",537,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x31, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",538,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",539,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x39, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",540,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",541,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",542,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",543,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",544,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",545,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",546,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",547,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",548,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x39, 0x38, 0x35, 0x31, 0x38, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",549,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",550,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",551,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",552,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",553,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",554,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",555,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",556,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",557,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",558,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",559,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",560,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x36, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",561,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",562,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",563,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",564,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",565,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",566,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",567,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",568,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",569,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",570,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",571,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",572,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",573,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",574,64,"style","Trailing whitespace is superfluous."," 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",575,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",576,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",577,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",578,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",579,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",580,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",581,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",582,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",583,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",584,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",585,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",586,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",587,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",588,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",589,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",590,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",591,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",592,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",593,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x39, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",594,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",595,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",596,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",597,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",598,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",599,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",600,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",601,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",602,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",603,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",604,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",605,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",606,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",607,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x34, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",608,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",609,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",610,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",611,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",612,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",613,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",614,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",615,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",616,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",617,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",618,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",619,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",620,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",621,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",622,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",623,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",624,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",625,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",626,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",627,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x33, 0x54, 0x32, 0x30, 0x3a, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",628,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x35, 0x34, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",629,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",630,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",631,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",632,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",633,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",634,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",635,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",636,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",637,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",638,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",639,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",640,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",641,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",642,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",643,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",644,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",645,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",646,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",647,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",648,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",649,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",650,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",651,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",652,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",653,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",654,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",655,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",656,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",657,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",658,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",659,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",660,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",661,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",662,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",663,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",664,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",665,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",666,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",667,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",668,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",669,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",670,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",671,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",672,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",673,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",674,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",675,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",676,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",677,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",678,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",679,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",680,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",681,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",682,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",683,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",684,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",685,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x31, 0x39, 0x30, 0x30, 0x30, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",686,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",687,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",688,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",689,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",690,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",691,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",692,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",693,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",694,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",695,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",696,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",697,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x38, 0x32, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",698,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",699,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",700,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",701,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",702,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",703,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",704,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",705,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",706,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",707,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",708,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",709,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",710,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",711,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",712,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",713,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",714,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",715,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",716,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",717,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",718,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",719,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",720,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",721,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",722,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",723,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",724,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",725,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",726,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",727,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",728,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",729,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",730,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",731,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",732,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x34, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",733,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",734,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",735,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",736,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",737,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",738,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",739,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",740,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x39, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",741,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",742,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",743,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",744,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",745,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",746,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",747,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",748,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",749,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",750,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",751,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",752,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",753,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",754,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",755,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",756,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",757,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",758,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",759,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",760,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",761,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",762,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",763,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",764,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",765,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",766,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",767,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",768,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",769,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",770,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",771,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",772,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x54, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",773,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x3a, 0x32, 0x30, 0x3a, 0x32, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",774,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",775,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",776,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",777,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",778,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",779,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",780,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",781,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",782,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",783,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",784,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",785,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",786,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",787,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",788,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",789,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",790,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",791,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",792,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",793,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, 0x39, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",794,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",795,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",796,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",797,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",798,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",799,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",800,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",801,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",802,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",803,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",804,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",805,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",806,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",807,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",808,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",809,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",810,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",811,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",812,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",813,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",814,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",815,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",816,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",817,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",818,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",819,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",820,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",821,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",822,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",823,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",824,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",825,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",826,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",827,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",828,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",829,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",830,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x38, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",831,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",832,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",833,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",834,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",835,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",836,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",837,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",838,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",839,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",840,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",841,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",842,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x38, 0x31, 0x31, 0x36, 0x33, 0x33, 0x33, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",843,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",844,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",845,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",846,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",847,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",848,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",849,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",850,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",851,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",852,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",853,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",854,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",855,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",856,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",857,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",858,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",859,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",860,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",861,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",862,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",863,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",864,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",865,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",866,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",867,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",868,64,"style","Trailing whitespace is superfluous."," 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",869,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",870,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",871,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",872,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",873,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",874,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",875,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",876,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",877,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, 0x39, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",878,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",879,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",880,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",881,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",882,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",883,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",884,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",885,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",886,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x30, 0x30, 0x30, 0x30, 0x35, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",887,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",888,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",889,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",890,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",891,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",892,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",893,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",894,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",895,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",896,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",897,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",898,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",899,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",900,64,"style","Trailing whitespace is superfluous."," 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",901,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",902,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",903,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",904,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, 0x39, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",905,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",906,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",907,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x31, 0x33, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",908,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",909,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",910,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",911,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",912,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",913,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",914,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",915,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",916,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",917,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",918,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x36, 0x54, 0x31, 0x36, 0x3a, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",919,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x32, 0x36, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",920,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",921,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",922,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",923,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",924,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",925,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",926,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",927,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",928,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",929,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",930,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",931,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",932,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",933,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",934,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",935,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",936,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",937,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",938,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",939,64,"style","Trailing whitespace is superfluous."," 0x34, 0x35, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",940,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",941,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",942,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",943,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",944,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",945,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",946,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",947,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",948,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",949,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",950,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",951,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",952,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",953,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",954,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",955,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",956,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",957,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",958,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",959,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",960,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",961,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",962,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",963,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",964,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",965,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",966,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",967,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",968,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",969,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",970,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",971,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",972,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",973,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",974,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",975,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",976,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x38, 0x30, 0x30, 0x30, 0x30, 0x34, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",977,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",978,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",979,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",980,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",981,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",982,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",983,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",984,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",985,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",986,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",987,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x38, 0x39, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",988,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",989,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",990,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",991,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",992,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",993,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",994,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",995,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",996,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",997,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",998,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x32, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",999,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1000,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1001,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1002,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1003,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1004,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1005,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1006,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1007,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1008,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1009,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1010,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1011,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x35, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1012,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1013,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1014,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1015,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1016,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1017,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1018,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1019,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1020,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1021,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1022,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1023,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1024,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1025,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1026,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1027,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1028,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1029,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1030,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1031,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x31, 0x38, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1032,64,"style","Trailing whitespace is superfluous."," 0x34, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1033,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1034,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1035,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1036,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1037,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1038,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1039,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1040,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1041,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1042,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1043,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1044,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1045,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x30, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1046,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1047,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1048,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1049,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1050,64,"style","Trailing whitespace is superfluous."," 0x34, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1051,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1052,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1053,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1054,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1055,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1056,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1057,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1058,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1059,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1060,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1061,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1062,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1063,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x37, 0x54, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1064,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3a, 0x30, 0x33, 0x3a, 0x33, 0x30, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1065,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1066,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1067,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1068,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1069,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1070,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1071,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1072,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1073,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1074,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1075,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1076,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1077,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1078,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1079,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1080,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1081,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1082,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1083,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1084,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x32, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1085,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1086,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1087,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1088,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1089,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1090,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1091,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1092,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1093,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1094,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1095,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1096,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1097,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1098,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1099,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1100,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1101,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1102,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1103,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1104,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1105,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1106,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1107,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1108,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1109,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1110,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1111,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1112,64,"style","Trailing whitespace is superfluous."," 0x32, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1113,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1114,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1115,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1116,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1117,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1118,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1119,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1120,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1121,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x38, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1122,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1123,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1124,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1125,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1126,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1127,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1128,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1129,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1130,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1131,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1132,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1133,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x38, 0x35, 0x35, 0x34, 0x37, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1134,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1135,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1136,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1137,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1138,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1139,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1140,64,"style","Trailing whitespace is superfluous."," 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1141,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1142,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1143,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1144,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1145,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x31, 0x35, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1146,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1147,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1148,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1149,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1150,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1151,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1152,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1153,64,"style","Trailing whitespace is superfluous."," 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1154,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1155,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1156,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1157,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1158,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, 0x34, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1159,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1160,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1161,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1162,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1163,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1164,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1165,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1166,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1167,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1168,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1169,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1170,64,"style","Trailing whitespace is superfluous."," 0x32, 0x34, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1171,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1172,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1173,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1174,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1175,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1176,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1177,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1178,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x31, 0x38, 0x30, 0x30, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1179,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1180,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1181,64,"style","Trailing whitespace is superfluous."," 0x32, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1182,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1183,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1184,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1185,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1186,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1187,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1188,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1189,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1190,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1191,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1192,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x32, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1193,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1194,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1195,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1196,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1197,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1198,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1199,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x35, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1200,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1201,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1202,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1203,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1204,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1205,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1206,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1207,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1208,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1209,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1210,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1211,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1212,64,"style","Trailing whitespace is superfluous."," 0x32, 0x33, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1213,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1214,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1215,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1216,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1217,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1218,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1219,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1220,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1221,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1222,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1223,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1224,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1225,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1226,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1227,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1228,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1229,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1230,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1231,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1232,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1233,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1234,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1235,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1236,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1237,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1238,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1239,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1240,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1241,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1242,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1243,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1244,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1245,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1246,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1247,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1248,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1249,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1250,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1251,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1252,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1253,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1254,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1255,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1256,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1257,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1258,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1259,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1260,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1261,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1262,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1263,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1264,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1265,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1266,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1267,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1268,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1269,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1270,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x30, 0x30, 0x30, 0x30, 0x38, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1271,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1272,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x38, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1273,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1274,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1275,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1276,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1277,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1278,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1279,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1280,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1281,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x31, 0x38, 0x35, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1282,64,"style","Trailing whitespace is superfluous."," 0x36, 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1283,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1284,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1285,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1286,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1287,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1288,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1289,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1290,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1291,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1292,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1293,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1294,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1295,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1296,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1297,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1298,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1299,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1300,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1301,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1302,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1303,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1304,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1305,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1306,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1307,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1308,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1309,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1310,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1311,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1312,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1313,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1314,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1315,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1316,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1317,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1318,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1319,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1320,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1321,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1322,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1323,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1324,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1325,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x31, 0x38, 0x30, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1326,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1327,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1328,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1329,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1330,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1331,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1332,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1333,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1334,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1335,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1336,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1337,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1338,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1339,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1340,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1341,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1342,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1343,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1344,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1345,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1346,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1347,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1348,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1349,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1350,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1351,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1352,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1353,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1354,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1355,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1356,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1357,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1358,64,"style","Trailing whitespace is superfluous."," 0x32, 0x32, 0x3a, 0x32, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1359,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1360,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1361,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1362,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1363,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1364,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1365,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1366,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1367,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1368,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1369,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1370,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1371,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1372,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1373,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1374,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1375,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1376,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1377,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1378,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x38, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1379,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1380,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1381,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1382,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1383,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1384,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1385,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1386,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1387,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1388,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1389,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1390,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1391,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1392,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1393,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1394,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1395,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1396,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1397,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1398,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1399,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1400,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1401,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1402,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1403,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1404,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1405,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x37, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1406,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1407,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1409,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1410,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1411,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1412,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1413,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1414,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1415,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x31, 0x37, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1416,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1417,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1418,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1419,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1420,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1421,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1422,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1423,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1424,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1425,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1426,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1427,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x38, 0x30, 0x35, 0x32, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1428,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1429,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1430,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1431,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1432,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1433,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1434,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1435,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1436,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1437,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x39, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1438,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1439,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1440,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1441,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1442,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1443,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1444,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1445,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1446,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1447,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1448,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1449,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1450,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1451,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1452,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1453,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1454,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1455,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1456,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1457,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1458,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1459,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1460,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1461,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1462,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1463,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1464,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1465,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1466,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1467,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1468,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1469,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1470,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x37, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1471,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1472,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1473,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1474,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1475,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1476,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1477,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1478,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1479,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1480,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1481,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1482,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1483,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1484,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x37, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1485,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1486,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1487,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1488,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1489,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1490,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1491,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1492,64,"style","Trailing whitespace is superfluous."," 0x39, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1493,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1494,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1495,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1496,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1497,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1498,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1499,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1500,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1501,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1502,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x37, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x36, 0x54, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1503,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x3a, 0x35, 0x36, 0x3a, 0x33, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1504,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1505,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1506,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1507,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1508,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1509,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1510,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1511,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1512,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1513,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1514,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1515,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1516,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1517,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1518,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1519,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1520,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1521,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1522,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1523,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1524,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1525,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1526,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1527,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1528,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1529,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1530,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1531,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1532,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1533,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1534,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1535,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1536,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1537,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1538,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1539,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1540,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1541,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1542,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1543,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1544,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1545,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1546,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1547,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1548,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1549,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1550,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1551,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1552,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1553,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1554,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1555,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1556,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1557,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1558,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1559,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1560,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x37, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1561,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x36, 0x33, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1562,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1563,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x36, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1564,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1565,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1566,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1567,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1568,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1569,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1570,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1571,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1572,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x37, 0x31, 0x30, 0x31, 0x35, 0x35, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1573,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1574,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1575,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1576,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1577,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1578,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1579,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1580,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1581,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1582,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1583,64,"style","Trailing whitespace is superfluous."," 0x38, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1584,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1585,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1586,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1587,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1588,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1589,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1590,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1591,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1592,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1593,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1594,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1595,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1596,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x36, 0x33, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1597,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1598,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1599,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1600,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1601,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1602,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1603,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1604,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1605,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1606,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1607,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1608,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1609,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1610,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1611,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1612,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1613,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1614,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1615,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1616,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1617,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1618,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1619,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1620,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1621,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1622,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1623,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1624,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1625,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1626,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1627,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1628,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1629,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1630,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1631,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1632,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1633,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1634,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1635,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1636,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1637,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x38, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1638,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1639,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1640,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1641,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1642,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1643,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1644,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1645,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1646,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1647,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1648,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x54, 0x31, 0x37, 0x3a, 0x30, 0x35, 0x3a, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1649,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1650,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1651,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1652,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1653,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1654,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1655,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1656,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1657,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1658,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1659,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1660,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1661,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1662,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1663,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1664,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1665,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1666,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1667,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1668,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1669,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1670,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1671,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1672,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1673,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1674,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1675,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1676,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1677,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1678,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1679,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1680,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1681,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1682,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1683,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1684,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1685,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1686,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1687,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1688,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1689,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1690,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1691,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1692,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1693,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1694,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1695,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1696,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x34, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1697,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1698,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1699,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1700,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1701,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1702,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1703,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1704,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1705,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1706,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x30, 0x30, 0x30, 0x33, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1707,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1708,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x35, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1709,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1710,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1711,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1712,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1713,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1714,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1715,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1716,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1717,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x31, 0x37, 0x38, 0x36, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1718,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1719,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1720,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1721,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1722,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1723,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1724,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1725,64,"style","Trailing whitespace is superfluous."," 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1726,64,"style","Trailing whitespace is superfluous."," 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1727,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1728,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1729,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1730,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1731,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1732,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1733,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1734,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1735,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1736,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1737,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1738,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1739,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1740,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1741,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1742,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1743,64,"style","Trailing whitespace is superfluous."," 0x33, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1744,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1745,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1746,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1747,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1748,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1749,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1750,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1751,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1752,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1753,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1754,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x33, 0x35, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1755,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1756,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1757,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1758,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1759,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1760,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1761,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1762,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x37, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1763,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x33, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1764,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1765,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x33, 0x35, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1766,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1767,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1768,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1769,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1770,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1771,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1772,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1773,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1774,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1775,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1776,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x34, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1777,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1778,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1779,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1780,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1781,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x33, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1782,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1783,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1784,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1785,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1786,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1787,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1788,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1789,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1790,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1791,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1792,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1793,64,"style","Trailing whitespace is superfluous."," 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1794,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1795,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1796,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x34, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1797,64,"style","Trailing whitespace is superfluous."," 0x34, 0x31, 0x3a, 0x31, 0x32, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1798,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1799,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1800,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1801,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1802,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1803,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1804,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1805,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1806,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1807,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1808,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1809,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1810,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1811,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1812,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1813,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1814,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1815,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1816,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1817,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1818,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1819,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1820,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1821,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1822,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1823,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1824,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1825,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1826,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1827,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1828,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1829,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1830,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1831,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1832,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1833,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1834,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1835,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1836,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1837,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1838,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1839,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1840,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1841,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1842,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1843,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1844,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1845,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1846,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1847,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1848,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1849,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1850,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1851,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1852,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1853,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1854,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x31, 0x37, 0x30, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1855,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1856,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1857,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1858,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1859,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1860,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1861,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1862,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1863,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1864,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1865,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1866,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x39, 0x32, 0x37, 0x36, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1867,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1868,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1869,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1870,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1871,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1872,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1873,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1874,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1875,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1876,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x30, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1877,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1878,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1879,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1880,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1881,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1882,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1883,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1884,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1885,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1886,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1887,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1888,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1889,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1890,64,"style","Trailing whitespace is superfluous."," 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1891,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1892,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1893,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1894,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1895,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1896,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1897,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1898,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1899,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1900,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1901,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1902,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1903,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1904,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1905,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1906,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1907,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1908,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1909,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x37, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1910,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1911,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1912,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1913,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1914,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1915,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1916,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1917,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1918,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1919,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1920,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1921,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1922,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1923,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x37, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1924,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1925,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1926,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1927,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1928,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1929,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1930,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1931,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1932,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1933,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1934,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1935,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1936,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1937,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1938,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1939,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1940,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1941,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1942,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x36, 0x3a, 0x31, 0x38, 0x3a, 0x35, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1943,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1944,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1945,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1946,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1947,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1948,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1949,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1950,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1951,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1952,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1953,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1954,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1955,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1956,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1957,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1958,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1959,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1960,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1961,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1962,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x34, 0x39, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1963,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1964,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1965,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1966,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1967,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1968,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1969,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1970,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1971,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1972,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1973,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1974,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1975,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1976,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1977,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1978,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1979,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1980,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1981,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1982,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1983,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1984,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1985,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1986,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1987,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1988,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1989,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1990,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1991,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1992,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1993,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1994,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1995,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1996,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1997,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1998,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",1999,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x36, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2000,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x34, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2001,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2002,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x34, 0x39, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2003,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2004,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2005,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2006,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2007,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2008,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2009,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2010,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2011,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x31, 0x36, 0x31, 0x39, 0x38, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2012,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2013,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2014,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2015,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2016,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2017,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2018,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2019,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2020,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2021,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2022,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2023,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2024,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2025,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2026,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2027,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2028,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2029,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2030,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2031,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2032,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2033,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2034,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2035,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x34, 0x39, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2036,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2037,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2038,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2039,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2040,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2041,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2042,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2043,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2044,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2045,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2046,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x34, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2047,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2048,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2049,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2050,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2051,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2052,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2053,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2054,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2055,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x36, 0x30, 0x30, 0x30, 0x31, 0x34, 0x39, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2056,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2057,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x34, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2058,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2059,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2060,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2061,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2062,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2063,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2064,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2065,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2066,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2067,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2068,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2069,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2070,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2071,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2072,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2073,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x34, 0x39, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2074,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2075,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2076,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x30, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2077,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2078,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2079,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2080,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2081,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2082,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2083,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2084,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2085,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2086,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2087,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x38, 0x54, 0x31, 0x36, 0x3a, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2088,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3a, 0x34, 0x37, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2089,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2090,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2091,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2092,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2093,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2094,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2095,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2096,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2097,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2098,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2099,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2100,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2101,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2102,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2103,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2104,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2105,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2106,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2107,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2108,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x38, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2109,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2110,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2111,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2112,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2113,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2114,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2115,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2116,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2117,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2118,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2119,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2120,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2121,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2122,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2123,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2124,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2125,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2126,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2127,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2128,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2129,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2130,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2131,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2132,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2133,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2134,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2135,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2136,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2137,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2138,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2139,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2140,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2141,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2142,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2143,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2144,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2145,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x31, 0x36, 0x30, 0x30, 0x30, 0x31, 0x33, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2146,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2147,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2148,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2149,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2150,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2151,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2152,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2153,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2154,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2155,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2156,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2157,64,"style","Trailing whitespace is superfluous."," 0x38, 0x31, 0x38, 0x32, 0x37, 0x39, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2158,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2159,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2160,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2161,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2162,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2163,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2164,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2165,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2166,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2167,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x39, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2168,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2169,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2170,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2171,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2172,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2173,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2174,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2175,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2176,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2177,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2178,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2179,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2180,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x33, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2181,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2182,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2183,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2184,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2185,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2186,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2187,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2188,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2189,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2190,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2191,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2192,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2193,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2194,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2195,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2196,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2197,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2198,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2199,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2200,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x36, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2201,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2202,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2203,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2204,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2205,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2206,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2207,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2208,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2209,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2210,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2211,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2212,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2213,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2214,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2215,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2216,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2217,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2218,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2219,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2220,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2221,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2222,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2223,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2224,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2225,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2226,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2227,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2228,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2229,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2230,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2231,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2232,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, 0x54, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2233,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x32, 0x35, 0x3a, 0x34, 0x37, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2234,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2235,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2236,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2237,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2238,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2239,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2240,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2241,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2242,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2243,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2244,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2245,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2246,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2247,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2248,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2249,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2250,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2251,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2252,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2253,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x31, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2254,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2255,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2256,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2257,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2258,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2259,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2260,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2261,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2262,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2263,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2264,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2265,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2266,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2267,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2268,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2269,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2270,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2271,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2272,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2273,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2274,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2275,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2276,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2277,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2278,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2279,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2280,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2281,64,"style","Trailing whitespace is superfluous."," 0x32, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2282,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2283,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2284,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2285,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2286,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2287,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2288,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2289,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2290,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x36, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2291,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2292,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2293,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2294,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2295,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2296,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2297,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2298,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2299,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2300,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2301,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2302,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x36, 0x37, 0x39, 0x37, 0x33, 0x38, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2303,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2304,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2305,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2306,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2307,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2308,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2309,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2310,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2311,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2312,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2313,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2314,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x35, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2315,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2316,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2317,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2318,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2319,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2320,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2321,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2322,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2323,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2324,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2325,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2326,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2327,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x31, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2328,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2329,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2330,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2331,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2332,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2333,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2334,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2335,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2336,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2337,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2338,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2339,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2340,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2341,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2342,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2343,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2344,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2345,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2346,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2347,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x31, 0x36, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2348,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2349,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2350,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2351,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2352,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2353,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2354,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2355,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2356,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2357,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2358,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2359,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2360,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2361,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2362,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2363,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2364,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2365,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2366,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2367,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2368,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2369,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2370,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2371,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2372,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2373,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2374,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2375,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2376,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2377,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2378,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2379,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2380,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2381,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x36, 0x54, 0x31, 0x39, 0x3a, 0x34, 0x33, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2382,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2383,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2384,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2385,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2386,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2387,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2388,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2389,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2390,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2391,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2392,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2393,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2394,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2395,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2396,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2397,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2398,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2399,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2400,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2401,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2402,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2403,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2404,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2405,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2406,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2407,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2408,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2409,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2410,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2411,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2412,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2413,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2414,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2415,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2416,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2417,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2418,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2419,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2420,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2421,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2422,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2423,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2424,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2425,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2426,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2427,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2428,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2429,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2430,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2431,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2432,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2433,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2434,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2435,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2436,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2437,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2438,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2439,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x30, 0x30, 0x30, 0x30, 0x38, 0x36, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2440,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2441,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2442,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2443,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2444,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2445,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2446,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2447,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2448,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2449,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2450,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x36, 0x31, 0x33, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2451,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x32, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2452,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2453,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2454,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2455,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2456,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2457,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2458,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2459,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2460,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2461,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2462,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2463,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2464,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2465,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2466,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2467,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2468,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2469,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2470,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2471,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2472,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2473,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2474,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x36, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2475,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2476,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2477,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2478,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2479,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2480,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2481,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2482,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2483,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2484,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2485,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2486,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x36, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2487,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2488,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2489,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2490,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2491,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2492,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2493,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2494,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x31, 0x36, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2495,64,"style","Trailing whitespace is superfluous."," 0x38, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2496,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2497,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2498,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2499,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2500,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2501,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2502,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2503,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2504,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2505,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2506,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2507,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2508,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2509,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2510,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2511,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2512,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2513,64,"style","Trailing whitespace is superfluous."," 0x38, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2514,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2515,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2516,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2517,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2518,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2519,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2520,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2521,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2522,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2523,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2524,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2525,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2526,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x38, 0x54, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2527,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x33, 0x33, 0x3a, 0x34, 0x35, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2528,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2529,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2530,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2531,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2532,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2533,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2534,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2535,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2536,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2537,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2538,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2539,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2540,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2541,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2542,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2543,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2544,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2545,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2546,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2547,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x30, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2548,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2549,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2550,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2551,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2552,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2553,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2554,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2555,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2556,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2557,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2558,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2559,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2560,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2561,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2562,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2563,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2564,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2565,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2566,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2567,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2568,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2569,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2570,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2571,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2572,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2573,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2574,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2575,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2576,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2577,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2578,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2579,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2580,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2581,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2582,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2583,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2584,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2585,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x30, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2586,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2587,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2588,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2589,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2590,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2591,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2592,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2593,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2594,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2595,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2596,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x31, 0x32, 0x31, 0x39, 0x33, 0x39, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2597,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2598,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2599,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2600,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2601,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2602,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2603,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2604,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2605,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2606,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2607,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2608,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2609,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2610,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2611,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2612,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2613,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2614,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2615,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2616,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2617,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2618,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2619,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2620,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2621,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2622,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2623,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2624,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2625,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2626,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2627,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2628,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2629,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2630,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2631,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2632,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2633,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2634,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2635,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2636,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2637,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2638,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2639,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2640,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x30, 0x37, 0x30, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2641,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2642,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x30, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2643,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2644,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2645,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2646,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2647,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2648,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2649,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2650,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2651,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2652,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2653,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2654,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2655,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2656,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2657,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2658,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x30, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2659,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2660,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2661,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2662,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2663,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2664,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2665,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2666,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2667,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2668,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2669,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2670,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2671,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2672,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x36, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2673,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2674,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2675,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2676,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2677,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2678,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2679,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2680,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2681,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2682,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2683,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2684,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2685,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2686,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2687,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2688,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2689,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2690,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2691,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2692,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2693,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2694,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2695,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2696,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2697,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2698,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2699,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2700,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2701,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2702,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2703,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2704,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2705,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2706,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2707,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2708,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2709,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2710,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2711,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2712,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2713,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2714,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2715,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2716,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2717,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2718,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2719,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2720,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x31, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2721,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2722,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2723,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2724,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2725,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2726,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2727,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2728,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2729,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2730,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x30, 0x30, 0x30, 0x30, 0x35, 0x33, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2731,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2732,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, 0x33, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2733,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2734,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2735,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2736,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2737,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2738,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2739,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2740,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2741,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x35, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2742,64,"style","Trailing whitespace is superfluous."," 0x34, 0x34, 0x35, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2743,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2744,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2745,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2746,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2747,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2748,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2749,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2750,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2751,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2752,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x39, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2753,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2754,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2755,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2756,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2757,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2758,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2759,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2760,64,"style","Trailing whitespace is superfluous."," 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2761,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2762,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2763,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2764,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2765,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, 0x33, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2766,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2767,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2768,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2769,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2770,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2771,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2772,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2773,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2774,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2775,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2776,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2777,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2778,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2779,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2780,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2781,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2782,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2783,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2784,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2785,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x31, 0x35, 0x30, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2786,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2787,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2788,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2789,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2790,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2791,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2792,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2793,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2794,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2795,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2796,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2797,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2798,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2799,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x31, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2800,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2801,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2802,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2803,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2804,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2805,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2806,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x39, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2807,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2808,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2809,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2810,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2811,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2812,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2813,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2814,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2815,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2816,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2817,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x31, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2818,64,"style","Trailing whitespace is superfluous."," 0x34, 0x34, 0x3a, 0x30, 0x32, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2819,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2820,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2821,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2822,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2823,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2824,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2825,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2826,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2827,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2828,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2829,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2830,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2831,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2832,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2833,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2834,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2835,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2836,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2837,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2838,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x33, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2839,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2840,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2841,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2842,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2843,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2844,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2845,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2846,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2847,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2848,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2849,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2850,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2851,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2852,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2853,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2854,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2855,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2856,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2857,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2858,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2859,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2860,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2861,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2862,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2863,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2864,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2865,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2866,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2867,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2868,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2869,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2870,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2871,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2872,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2873,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2874,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2875,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x31, 0x35, 0x30, 0x30, 0x30, 0x30, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2876,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2877,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2878,64,"style","Trailing whitespace is superfluous."," 0x33, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2879,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2880,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2881,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2882,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2883,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2884,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2885,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2886,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2887,64,"style","Trailing whitespace is superfluous."," 0x38, 0x38, 0x33, 0x33, 0x32, 0x31, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2888,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2889,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2890,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2891,64,"style","Trailing whitespace is superfluous."," 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2892,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2893,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2894,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2895,64,"style","Trailing whitespace is superfluous."," 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2896,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2897,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2898,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2899,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2900,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2901,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2902,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2903,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2904,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2905,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2906,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2907,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2908,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2909,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2910,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2911,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2912,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x33, 0x33, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2913,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2914,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2915,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2916,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2917,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2918,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2919,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2920,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2921,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2922,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2923,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2924,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2925,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2926,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2927,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2928,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2929,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2930,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2931,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2932,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x30, 0x30, 0x30, 0x30, 0x33, 0x33, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2933,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2934,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2935,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2936,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2937,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2938,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2939,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2940,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2941,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2942,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2943,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2944,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2945,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2946,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2947,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2948,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2949,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2950,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2951,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2952,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2953,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x31, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2954,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2955,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2956,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2957,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2958,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2959,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2960,64,"style","Trailing whitespace is superfluous."," 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2961,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2962,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2963,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2964,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2965,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2966,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x36, 0x3a, 0x34, 0x36, 0x3a, 0x32, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2967,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2968,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2969,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2970,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2971,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2972,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2973,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2974,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2975,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2976,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2977,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2978,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2979,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2980,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2981,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2982,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2983,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2984,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2985,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2986,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2987,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2988,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2989,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2990,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2991,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2992,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2993,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2994,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2995,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2996,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2997,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2998,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",2999,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3000,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3001,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3002,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3003,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3004,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3005,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3006,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3007,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3008,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3009,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3010,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3011,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3012,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3013,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3014,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3015,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3016,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3017,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3018,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3019,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3020,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3021,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3022,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3023,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3024,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x32, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3025,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3026,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x31, 0x32, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3027,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3028,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3029,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3030,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3031,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3032,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3033,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3034,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3035,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x31, 0x35, 0x35, 0x37, 0x35, 0x38, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3036,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3037,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3038,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3039,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3040,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3041,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3042,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3043,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3044,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3045,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3046,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3047,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3048,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3049,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3050,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3051,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3052,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3053,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3054,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3055,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3056,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3057,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3058,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3059,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3060,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3061,64,"style","Trailing whitespace is superfluous."," 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3062,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3063,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3064,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3065,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3066,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3067,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3068,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3069,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3070,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x32, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3071,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3072,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3073,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3074,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3075,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3076,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3077,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3078,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3079,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x30, 0x30, 0x30, 0x30, 0x31, 0x32, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3080,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3081,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3082,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3083,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3084,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3085,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3086,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3087,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3088,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3089,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3090,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3091,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3092,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3093,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3094,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3095,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3096,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3097,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x32, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3098,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3099,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3100,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x31, 0x36, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3101,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3102,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3103,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3104,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3105,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3106,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3107,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3108,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3109,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3110,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3111,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x34, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3112,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x35, 0x38, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3113,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3114,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3115,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3116,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3117,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3118,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3119,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3120,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3121,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3122,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3123,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3124,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3125,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3126,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3127,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3128,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3129,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3130,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3131,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3132,64,"style","Trailing whitespace is superfluous."," 0x36, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3133,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3134,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3135,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3136,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3137,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3138,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3139,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3140,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3141,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3142,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3143,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3144,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3145,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3146,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3147,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3148,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3149,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3150,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3151,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3152,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3153,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3154,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3155,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3156,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3157,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3158,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3159,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3160,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3161,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3162,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3163,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3164,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3165,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3166,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3167,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3168,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3169,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x34, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3170,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3171,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3172,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3173,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3174,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3175,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3176,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3177,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3178,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3179,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3180,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x34, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3181,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x37, 0x39, 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3182,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3183,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3184,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3185,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3186,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3187,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3188,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3189,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3190,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3191,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x35, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3192,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3193,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3194,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3195,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3196,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3197,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3198,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3199,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3200,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3201,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3202,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3203,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3204,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x36, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3205,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3206,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3207,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3208,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3209,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3210,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3211,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3212,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3213,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3214,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3215,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3216,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x36, 0x33, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3217,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3218,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3219,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3220,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3221,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3222,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3223,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3224,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x34, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3225,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x33, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3226,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3227,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x36, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3228,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3229,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3230,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3231,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3232,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3233,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3234,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3235,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3236,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3237,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3238,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x34, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3239,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3240,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3241,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3242,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3243,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3244,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3245,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3246,64,"style","Trailing whitespace is superfluous."," 0x35, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3247,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3248,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3249,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3250,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3251,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3252,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3253,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3254,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3255,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3256,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x34, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x34, 0x54, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3257,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x3a, 0x34, 0x34, 0x3a, 0x34, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3258,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3259,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3260,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3261,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3262,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3263,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3264,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3265,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3266,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3267,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3268,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3269,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x4b, 0x2f, 0x41, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3270,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3271,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3272,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3273,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3274,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3275,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3276,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3277,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3278,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3279,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3280,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3281,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3282,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3283,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x6e, 0x64, 0x3e, 0x5b, 0x41, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3284,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x5d, 0x3c, 0x2f, 0x61, 0x6d, 0x65, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3285,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3286,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3287,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3288,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3289,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3290,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3291,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3292,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3293,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3294,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3295,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3296,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3297,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3298,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3299,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3300,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3301,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3302,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3303,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3304,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3305,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3306,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3307,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3308,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3309,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3310,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3311,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3312,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3313,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3314,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3315,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3316,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3317,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3318,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3319,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3320,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3321,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3322,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3323,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3324,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3325,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3326,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3327,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3328,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3329,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x34, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3330,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x31, 0x39, 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3331,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3332,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3333,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3334,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3335,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3336,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3337,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3338,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3339,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3340,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3341,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3342,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x34, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3343,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3344,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3345,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3346,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3347,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3348,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3349,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3350,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3351,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3352,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3353,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3354,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3355,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3356,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3357,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3358,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3359,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3360,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3361,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3362,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3363,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3364,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3365,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3366,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3367,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3368,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3369,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3370,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3371,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3372,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3373,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x31, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3374,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3375,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3376,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3377,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3378,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x39, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3379,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3380,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3381,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x39, 0x33, 0x34, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3382,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3383,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3384,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3385,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x41, 0x6d, 0x65, 0x6e, 0x64, 0x5d, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3386,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3387,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3388,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3389,64,"style","Trailing whitespace is superfluous."," 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3390,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3391,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3392,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3393,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3394,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x34, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3395,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x36, 0x3a, 0x33, 0x36, 0x3a, 0x34, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3396,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3397,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3398,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3399,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3400,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3401,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3402,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3403,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3404,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3405,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3406,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3407,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3409,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3410,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3411,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3412,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3413,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3414,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3415,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x39, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3416,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3417,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3418,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3419,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3420,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3421,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3422,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3423,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3424,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3425,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3426,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3427,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3428,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3429,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3430,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3431,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3432,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3433,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3434,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3435,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3436,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3437,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3438,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3439,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3440,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3441,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3442,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3443,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3444,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3445,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3446,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3447,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3448,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3449,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3450,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3451,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3452,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3453,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x33, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3454,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3455,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x33, 0x39, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3456,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3457,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3458,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3459,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3460,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3461,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3462,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3463,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3464,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x31, 0x34, 0x31, 0x30, 0x31, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3465,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3466,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3467,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3468,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3469,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3470,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3471,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3472,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3473,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3474,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3475,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3476,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3477,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3478,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3479,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3480,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3481,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3482,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3483,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3484,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3485,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3486,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3487,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3488,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x33, 0x39, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3489,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3490,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3491,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3492,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3493,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3494,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3495,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3496,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3497,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3498,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3499,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3500,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3501,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3502,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3503,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3504,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3505,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3506,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3507,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3508,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x34, 0x30, 0x30, 0x30, 0x30, 0x33, 0x39, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3509,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3510,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3511,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3512,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3513,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3514,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3515,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3516,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3517,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3518,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3519,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3520,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3521,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3522,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3523,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3524,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3525,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3526,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x39, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3527,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3528,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3529,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x33, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3530,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3531,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3532,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3533,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3534,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3535,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3536,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3537,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3538,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3539,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3540,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x30, 0x35, 0x54, 0x31, 0x36, 0x3a, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3541,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3a, 0x32, 0x34, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3542,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3543,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3544,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3545,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3546,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3547,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3548,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3549,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3550,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3551,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3552,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3553,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3554,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3555,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3556,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3557,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3558,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3559,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3560,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3561,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3562,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3563,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3564,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3565,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3566,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3567,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3568,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3569,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3570,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3571,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3572,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3573,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3574,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3575,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3576,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3577,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3578,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3579,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3580,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3581,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3582,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3583,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3584,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3585,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3586,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3587,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3588,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x34, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x31, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3589,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3590,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3591,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3592,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3593,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3594,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3595,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3596,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3597,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3598,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x31, 0x34, 0x30, 0x30, 0x30, 0x30, 0x32, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3599,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3600,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3601,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3602,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3603,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3604,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3605,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3606,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3607,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3608,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3609,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3610,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x32, 0x31, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3611,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3612,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3613,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3614,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3615,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3616,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3617,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3618,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3619,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3620,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3621,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3622,64,"style","Trailing whitespace is superfluous."," 0x32, 0x36, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3623,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3624,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3625,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3626,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3627,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3628,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3629,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3630,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3631,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3632,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3633,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3634,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3635,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x32, 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3636,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3637,64,"style","Trailing whitespace is superfluous."," 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3638,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3639,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3640,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3641,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3642,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3643,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3644,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3645,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3646,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3647,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3648,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3649,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3650,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3651,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3652,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3653,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3654,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3655,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x30, 0x30, 0x30, 0x30, 0x32, 0x34, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3656,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3657,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3658,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3659,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3660,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3661,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3662,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3663,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3664,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3665,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3666,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3667,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3668,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, 0x35, 0x2d, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3669,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3670,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3671,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3672,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3673,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, 0x34, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3674,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3675,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3676,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x36, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3677,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3678,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3679,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3680,64,"style","Trailing whitespace is superfluous."," 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3681,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3682,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3683,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3684,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3685,64,"style","Trailing whitespace is superfluous."," 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3686,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3687,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3688,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x34, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x31, 0x54, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3689,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x3a, 0x33, 0x38, 0x3a, 0x34, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3690,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3691,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3692,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3693,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3694,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3695,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3696,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3697,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3698,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3699,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3700,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3701,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3702,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3703,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3704,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3705,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3706,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3707,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3708,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3709,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x39, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3710,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3711,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3712,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3713,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3714,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3715,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3716,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3717,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3718,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3719,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3720,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3721,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3722,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3723,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3724,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3725,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3726,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3727,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3728,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3729,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3730,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3731,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3732,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3733,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3734,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3735,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3736,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3737,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3738,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3739,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3740,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3741,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3742,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3743,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3744,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3745,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3746,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x34, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3747,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3748,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3749,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3750,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3751,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3752,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3753,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3754,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3755,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3756,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3757,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3758,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x34, 0x35, 0x37, 0x32, 0x39, 0x30, 0x35, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3759,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3760,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3761,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3762,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3763,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3764,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3765,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3766,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3767,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3768,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3769,64,"style","Trailing whitespace is superfluous."," 0x35, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3770,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3771,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3772,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3773,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3774,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3775,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3776,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3777,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3778,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3779,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3780,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3781,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3782,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3783,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3784,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3785,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3786,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3787,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3788,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3789,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3790,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3791,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3792,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3793,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x39, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3794,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3795,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3796,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3797,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3798,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3799,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3800,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3801,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3802,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x30, 0x30, 0x30, 0x30, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3803,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3804,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x39, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3805,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3806,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3807,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3808,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3809,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3810,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3811,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3812,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3813,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3814,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3815,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3816,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3817,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3818,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3819,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3820,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x30, 0x39, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3821,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3822,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3823,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x35, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3824,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3825,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3826,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3827,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3828,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3829,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3830,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3831,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3832,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3833,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3834,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x54, 0x31, 0x36, 0x3a, 0x34, 0x38, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3835,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3836,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3837,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3838,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3839,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3840,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3841,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3842,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3843,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3844,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3845,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3846,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3847,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3848,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3849,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3850,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3851,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3852,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3853,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3854,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3855,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3856,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3857,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3858,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3859,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3860,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3861,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3862,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3863,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3864,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3865,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3866,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3867,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3868,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3869,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3870,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3871,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3872,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3873,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3874,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3875,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3876,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3877,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3878,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3879,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3880,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3881,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3882,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x35, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3883,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3884,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3885,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3886,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3887,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3888,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3889,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3890,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3891,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3892,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x30, 0x30, 0x30, 0x30, 0x34, 0x32, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3893,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3894,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3895,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3896,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3897,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3898,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3899,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3900,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3901,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3902,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3903,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x33, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3904,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x38, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3905,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3906,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3907,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3908,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3909,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3910,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3911,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3912,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3913,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3914,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x35, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3915,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3916,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3917,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3918,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3919,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3920,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3921,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3922,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3923,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3924,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3925,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3926,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3927,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x34, 0x32, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3928,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3929,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3930,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3931,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3932,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3933,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3934,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3935,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3936,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3937,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3938,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3939,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x32, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3940,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3941,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3942,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3943,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3944,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3945,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3946,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3947,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x31, 0x33, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3948,64,"style","Trailing whitespace is superfluous."," 0x34, 0x32, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3949,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3950,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3951,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3952,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3953,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3954,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3955,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3956,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3957,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3958,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3959,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3960,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x33, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3961,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3962,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3963,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3964,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3965,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3966,64,"style","Trailing whitespace is superfluous."," 0x34, 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3967,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3968,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3969,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3970,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3971,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3972,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3973,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3974,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3975,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3976,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3977,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3978,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3979,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x35, 0x54, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3980,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x33, 0x36, 0x3a, 0x35, 0x38, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3981,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3982,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3983,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3984,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3985,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3986,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3987,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3988,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3989,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3990,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3991,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3992,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3993,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3994,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3995,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3996,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3997,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3998,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",3999,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4000,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x33, 0x37, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4001,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4002,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4003,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4004,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4005,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4006,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4007,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4008,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4009,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4010,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4011,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4012,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4013,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4014,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4015,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4016,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4017,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4018,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4019,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4020,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4021,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4022,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4023,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4024,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4025,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4026,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4027,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4028,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4029,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4030,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4031,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4032,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4033,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4034,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4035,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4036,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4037,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x33, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4038,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x37, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4039,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4040,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x33, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4041,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4042,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4043,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4044,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4045,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4046,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4047,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4048,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4049,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x31, 0x30, 0x30, 0x36, 0x37, 0x39, 0x39, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4050,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4051,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4052,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4053,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4054,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4055,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4056,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4057,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4058,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4059,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4060,64,"style","Trailing whitespace is superfluous."," 0x39, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4061,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4062,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4063,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4064,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4065,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4066,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4067,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4068,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4069,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4070,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4071,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4072,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4073,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x33, 0x37, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4074,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4075,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4076,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4077,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4078,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4079,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4080,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4081,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4082,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4083,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4084,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x37, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4085,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4086,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4087,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4088,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4089,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4090,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4091,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4092,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4093,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x30, 0x30, 0x30, 0x33, 0x37, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4094,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4095,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x37, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4096,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4097,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4098,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4099,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4100,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4101,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4102,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4103,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4104,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4105,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4106,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4107,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4108,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4109,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4110,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4111,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x33, 0x37, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4112,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4113,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4114,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x39, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4115,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4116,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4117,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4118,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4119,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4120,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4121,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4122,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4123,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4124,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4125,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x30, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4126,64,"style","Trailing whitespace is superfluous."," 0x34, 0x31, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4127,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4128,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4129,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4130,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4131,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4132,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4133,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4134,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4135,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4136,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4137,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4138,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4139,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4140,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4141,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4142,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4143,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4144,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4145,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4146,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4147,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4148,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4149,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4150,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4151,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4152,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4153,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4154,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4155,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4156,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4157,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4158,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4159,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4160,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4161,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4162,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4163,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4164,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4165,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4166,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4167,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4168,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4169,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4170,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4171,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4172,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4173,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x32, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4174,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4175,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4176,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4177,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4178,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4179,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4180,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4181,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4182,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4183,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x30, 0x30, 0x30, 0x30, 0x32, 0x32, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4184,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4185,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4186,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4187,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4188,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4189,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4190,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4191,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4192,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4193,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4194,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x33, 0x38, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4195,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4196,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4197,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4198,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4199,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4200,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4201,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4202,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4203,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4204,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4205,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4206,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x32, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4207,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4208,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4209,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4210,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4211,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4212,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4213,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4214,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4215,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4216,64,"style","Trailing whitespace is superfluous."," 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4217,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4218,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4219,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4220,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4221,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4222,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4223,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4224,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4225,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4226,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4227,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4228,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4229,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4230,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4231,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, 0x32, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4232,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4233,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4234,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4235,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4236,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4237,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4238,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4239,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4240,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x32, 0x32, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4241,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4242,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x32, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4243,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4244,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4245,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4246,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4247,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4248,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4249,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4250,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4251,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4252,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4253,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x32, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4254,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4255,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4256,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4257,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4258,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x32, 0x32, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4259,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4260,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4261,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4262,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4263,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4264,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4265,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4266,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4267,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4268,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4269,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4270,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4271,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4272,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4273,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x32, 0x54, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4274,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x32, 0x31, 0x3a, 0x35, 0x33, 0x2d, 0x30, 0x34, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4275,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4276,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4277,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4278,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4279,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4280,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4281,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4282,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4283,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4284,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4285,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4286,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4287,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4288,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4289,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4290,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4291,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4292,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4293,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4294,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4295,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4296,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4297,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4298,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4299,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4300,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4301,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4302,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4303,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4304,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4305,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4306,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4307,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4308,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4309,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4310,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4311,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4312,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4313,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4314,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4315,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4316,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4317,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4318,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4319,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4320,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4321,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4322,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4323,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4324,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4325,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4326,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4327,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4328,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4329,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4330,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4331,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x31, 0x33, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4332,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4333,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4334,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4335,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4336,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4337,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4338,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4339,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4340,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4341,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4342,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4343,64,"style","Trailing whitespace is superfluous."," 0x33, 0x35, 0x37, 0x34, 0x31, 0x34, 0x34, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4344,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4345,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4346,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4347,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4348,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4349,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4350,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4351,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4352,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4353,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4354,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4355,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4356,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4357,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4358,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4359,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4360,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4361,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4362,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4363,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4364,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4365,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4366,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4367,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4368,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4369,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4370,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4371,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4372,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4373,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4374,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4375,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4376,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4377,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4378,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x30, 0x37, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4379,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4380,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4381,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4382,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4383,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4384,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4385,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4386,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x33, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4387,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4388,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4389,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x30, 0x37, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4390,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4391,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4392,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4393,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4394,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4395,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4396,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4397,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4398,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4399,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4400,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x35, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4401,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4402,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4403,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4404,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4405,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4406,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4407,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4409,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4410,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4411,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4412,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4413,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4414,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4415,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4416,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4417,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4418,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4419,64,"style","Trailing whitespace is superfluous."," 0x35, 0x54, 0x31, 0x36, 0x3a, 0x31, 0x34, 0x3a, 0x33, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4420,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4421,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4422,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4423,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4424,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4425,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4426,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4427,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4428,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4429,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4430,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4431,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4432,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4433,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4434,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4435,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4436,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4437,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4438,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4439,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4440,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4441,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4442,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4443,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4444,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4445,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4446,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4447,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4448,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4449,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4450,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4451,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4452,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4453,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4454,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4455,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4456,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4457,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4458,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4459,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4460,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4461,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4462,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4463,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4464,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4465,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4466,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4467,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4468,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4469,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4470,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4471,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4472,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4473,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4474,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4475,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4476,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4477,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x31, 0x30, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4478,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4479,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x30, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4480,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4481,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4482,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4483,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4484,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4485,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4486,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4487,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4488,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x32, 0x31, 0x31, 0x38, 0x33, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4489,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4490,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4491,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4492,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4493,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4494,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4495,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4496,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4497,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4498,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4499,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4500,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4501,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4502,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4503,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4504,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4505,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4506,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4507,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4508,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4509,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4510,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4511,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4512,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4513,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4514,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4515,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4516,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4517,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4518,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4519,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4520,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4521,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4522,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4523,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4524,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4525,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4526,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4527,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4528,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4529,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4530,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4531,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4532,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x31, 0x32, 0x30, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4533,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4534,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4535,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4536,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4537,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4538,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4539,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4540,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4541,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4542,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4543,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4544,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4545,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x32, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4546,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4547,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4548,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4549,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4550,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4551,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4552,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4553,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x33, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4554,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4555,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4556,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4557,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4558,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4559,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4560,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4561,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4562,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4563,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4564,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x36, 0x54, 0x31, 0x37, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4565,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3a, 0x32, 0x33, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4566,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4567,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4568,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4569,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4570,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4571,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4572,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4573,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4574,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4575,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4576,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4577,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4578,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4579,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4580,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4581,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4582,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4583,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4584,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4585,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4586,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4587,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4588,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4589,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4590,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4591,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4592,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4593,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4594,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4595,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4596,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4597,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4598,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4599,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4600,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4601,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4602,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4603,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4604,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4605,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4606,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4607,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4608,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4609,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4610,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4611,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4612,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x32, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4613,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4614,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4615,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4616,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4617,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4618,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4619,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4620,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4621,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4622,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x31, 0x32, 0x30, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4623,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4624,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4625,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4626,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4627,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4628,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4629,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4630,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4631,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4632,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4633,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4634,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x37, 0x37, 0x38, 0x36, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4635,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4636,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4637,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4638,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4639,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4640,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4641,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4642,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4643,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4644,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4645,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4646,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4647,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4648,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4649,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4650,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4651,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4652,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4653,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4654,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4655,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4656,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4657,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4658,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4659,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4660,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4661,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4662,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4663,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4664,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4665,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4666,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4667,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4668,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4669,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x30, 0x34, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4670,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4671,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4672,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4673,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4674,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4675,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4676,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4677,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x31, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4678,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4679,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4680,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x30, 0x34, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4681,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4682,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4683,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4684,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4685,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4686,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4687,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4688,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4689,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4690,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4691,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x33, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4692,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4693,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4694,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4695,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4696,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4697,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4698,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4699,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4700,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4701,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4702,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4703,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4704,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4705,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4706,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4707,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4708,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4709,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x32, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4710,64,"style","Trailing whitespace is superfluous."," 0x33, 0x54, 0x31, 0x37, 0x3a, 0x32, 0x33, 0x3a, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4711,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4712,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4713,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4714,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4715,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4716,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4717,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4718,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4719,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4720,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4721,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4722,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4723,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4724,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4725,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4726,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4727,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4728,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4729,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4730,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x2d, 0x32, 0x34, 0x39, 0x33, 0x32, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4731,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4732,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4733,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4734,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4735,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4736,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4737,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4738,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4739,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4740,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4741,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4742,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4743,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4744,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4745,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4746,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4747,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4748,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4749,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4750,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4751,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4752,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4753,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4754,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4755,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4756,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4757,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4758,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4759,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4760,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4761,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4762,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4763,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4764,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4765,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4766,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4767,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4768,64,"style","Trailing whitespace is superfluous."," 0x32, 0x34, 0x39, 0x33, 0x32, 0x34, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4769,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4770,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x34, 0x39, 0x33, 0x32, 0x34, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4771,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4772,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4773,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4774,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4775,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4776,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4777,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4778,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4779,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x32, 0x38, 0x37, 0x31, 0x37, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4780,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4781,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4782,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4783,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4784,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4785,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4786,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4787,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4788,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4789,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4790,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4791,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4792,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4793,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4794,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4795,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4796,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4797,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4798,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4799,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4800,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4801,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4802,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4803,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4804,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x32, 0x34, 0x39, 0x33, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4805,64,"style","Trailing whitespace is superfluous."," 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4806,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4807,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4808,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4809,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4810,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4811,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4812,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4813,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4814,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4815,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4816,64,"style","Trailing whitespace is superfluous."," 0x34, 0x39, 0x33, 0x32, 0x34, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4817,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4818,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4819,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4820,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4821,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4822,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4823,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4824,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x32, 0x32, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4825,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x32, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4826,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4827,64,"style","Trailing whitespace is superfluous."," 0x34, 0x39, 0x33, 0x32, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4828,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4829,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4830,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4831,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4832,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4833,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4834,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4835,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4836,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4837,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4838,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x35, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4839,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4840,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4841,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4842,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x32, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4843,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x32, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4844,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4845,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4846,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4847,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4848,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4849,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4850,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4851,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4852,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4853,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4854,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4855,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4856,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4857,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4858,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x35, 0x54, 0x31, 0x36, 0x3a, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4859,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3a, 0x34, 0x35, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4860,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4861,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4862,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4863,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4864,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4865,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4866,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4867,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4868,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4869,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4870,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4871,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4872,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4873,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4874,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4875,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4876,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4877,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4878,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x34, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4879,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4880,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4881,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4882,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4883,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4884,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4885,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4886,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4887,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4888,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4889,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4890,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4891,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4892,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4893,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4894,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4895,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4896,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4897,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4898,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4899,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4900,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4901,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4902,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4903,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4904,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4905,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4906,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x32, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x37, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4907,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4908,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4909,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4910,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4911,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4912,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4913,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4914,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4915,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4916,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x32, 0x30, 0x34, 0x31, 0x36, 0x35, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4917,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4918,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x34, 0x31, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4919,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4920,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4921,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4922,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4923,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4924,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4925,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4926,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4927,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4928,64,"style","Trailing whitespace is superfluous."," 0x37, 0x34, 0x38, 0x38, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4929,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4930,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4931,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4932,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4933,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4934,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4935,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4936,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4937,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4938,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4939,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4940,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4941,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4942,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4943,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4944,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4945,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4946,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4947,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4948,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4949,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4950,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4951,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x2d, 0x30, 0x34, 0x31, 0x36, 0x35, 0x33, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4952,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4953,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4954,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4955,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4956,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4957,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4958,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4959,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4960,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4961,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4962,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x34, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4963,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x33, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4964,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4965,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4966,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4967,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4968,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4969,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4970,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4971,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x31, 0x32, 0x30, 0x34, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4972,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4973,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x34, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4974,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4975,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4976,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4977,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4978,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4979,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4980,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4981,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4982,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4983,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4984,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4985,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4986,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4987,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4988,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4989,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x34, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4990,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4991,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4992,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4993,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4994,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4995,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4996,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4997,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4998,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",4999,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5000,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5001,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5002,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5003,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x54, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5004,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x33, 0x30, 0x3a, 0x32, 0x37, 0x2d, 0x30, 0x35, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5005,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5006,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5007,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5008,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5009,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5010,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5011,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5012,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5013,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5014,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5015,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5016,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5017,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5018,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5019,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5020,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5021,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5022,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5023,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5024,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x32, 0x37, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5025,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5026,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5027,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5028,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5029,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5030,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5031,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5032,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5033,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5034,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5035,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5036,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5037,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5038,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5039,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5040,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5041,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5042,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5043,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5044,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5045,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5046,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5047,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5048,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5049,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5050,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5051,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5052,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5053,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5054,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5055,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5056,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5057,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5058,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5059,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5060,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5061,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x31, 0x31, 0x33, 0x30, 0x32, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5062,64,"style","Trailing whitespace is superfluous."," 0x37, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5063,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x33, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5064,64,"style","Trailing whitespace is superfluous."," 0x32, 0x37, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5065,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5066,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5067,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5068,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5069,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5070,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5071,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5072,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5073,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x31, 0x38, 0x38, 0x32, 0x38, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5074,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5075,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5076,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5077,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5078,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5079,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5080,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5081,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5082,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5083,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5084,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5085,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5086,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5087,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5088,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5089,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5090,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5091,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5092,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5093,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5094,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5095,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5096,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x33, 0x30, 0x32, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5097,64,"style","Trailing whitespace is superfluous."," 0x37, 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5098,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5099,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5100,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5101,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5102,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5103,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5104,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5105,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5106,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5107,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5108,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x32, 0x32, 0x37, 0x34, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5109,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5110,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5111,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5112,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5113,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5114,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5115,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5116,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5117,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x32, 0x37, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5118,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5119,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x32, 0x32, 0x37, 0x34, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5120,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5121,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5122,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5123,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5124,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5125,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5126,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5127,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5128,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5129,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5130,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x38, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5131,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5132,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5133,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5134,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5135,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x32, 0x37, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5136,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5137,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5138,64,"style","Trailing whitespace is superfluous."," 0x20, 0x38, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5139,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5140,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5141,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5142,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5143,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5144,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5145,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5146,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5147,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5148,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x31, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5149,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x36, 0x3a, 0x34, 0x33, 0x3a, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5150,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5151,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5152,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5153,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5154,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5155,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5156,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5157,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5158,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5159,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5160,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5161,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5162,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5163,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5164,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5165,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5166,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5167,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5168,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5169,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x32, 0x31, 0x36, 0x35, 0x33, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5170,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5171,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5172,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5173,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5174,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5175,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5176,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5177,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5178,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5179,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5180,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5181,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5182,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5183,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5184,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5185,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5186,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5187,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5188,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5189,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5190,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5191,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5192,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5193,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5194,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5195,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5196,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5197,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5198,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5199,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5200,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5201,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5202,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5203,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5204,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5205,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5206,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5207,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x35, 0x33, 0x30, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5208,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5209,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x36, 0x35, 0x33, 0x30, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5210,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5211,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5212,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5213,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5214,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5215,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5216,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5217,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5218,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x31, 0x31, 0x31, 0x30, 0x32, 0x31, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5219,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5220,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5221,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5222,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5223,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5224,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5225,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5226,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5227,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5228,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5229,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5230,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5231,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5232,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5233,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5234,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5235,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5236,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5237,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5238,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5239,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5240,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5241,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5242,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x35, 0x33, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5243,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5244,64,"style","Trailing whitespace is superfluous."," 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5245,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5246,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5247,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5248,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5249,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5250,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5251,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5252,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5253,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x32, 0x31, 0x36, 0x35, 0x33, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5254,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5255,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5256,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5257,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5258,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5259,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5260,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5261,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5262,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x32, 0x31, 0x36, 0x35, 0x33, 0x30, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5263,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5264,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x32, 0x31, 0x36, 0x35, 0x33, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5265,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5266,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5267,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5268,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5269,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5270,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5271,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5272,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5273,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5274,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5275,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5276,64,"style","Trailing whitespace is superfluous."," 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5277,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5278,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5279,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5280,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x32, 0x31, 0x36, 0x35, 0x33, 0x30, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5281,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5282,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5283,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5284,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5285,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5286,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5287,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5288,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5289,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5290,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5291,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5292,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5293,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5294,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x39, 0x54, 0x31, 0x36, 0x3a, 0x32, 0x31, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5295,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5296,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5297,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5298,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5299,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5300,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5301,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5302,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5303,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5304,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5305,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5306,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5307,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5308,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5309,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5310,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5311,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5312,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5313,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5314,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x39, 0x32, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5315,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5316,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5317,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5318,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5319,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5320,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5321,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5322,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5323,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5324,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5325,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5326,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5327,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5328,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5329,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5330,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5331,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5332,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5333,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5334,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5335,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5336,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5337,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5338,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5339,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5340,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5341,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5342,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x34, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5343,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5344,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5345,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5346,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5347,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5348,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5349,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5350,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5351,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5352,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x31, 0x34, 0x39, 0x32, 0x36, 0x32, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5353,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5354,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x31, 0x34, 0x39, 0x32, 0x36, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5355,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5356,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5357,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5358,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5359,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5360,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5361,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5362,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5363,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x31, 0x38, 0x36, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5364,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5365,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5366,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5367,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5368,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5369,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5370,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5371,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5372,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5373,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5374,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5375,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5376,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5377,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5378,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5379,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5380,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5381,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5382,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5383,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5384,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5385,64,"style","Trailing whitespace is superfluous."," 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5386,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5387,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5388,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5389,64,"style","Trailing whitespace is superfluous."," 0x32, 0x36, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5390,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5391,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5392,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5393,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5394,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5395,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5396,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5397,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5398,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5399,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5400,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x39, 0x32, 0x36, 0x32, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5401,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5402,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5403,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5404,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5405,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5406,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5407,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5408,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5409,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x39, 0x32, 0x36, 0x32, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5410,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5411,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x39, 0x32, 0x36, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5412,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5413,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5414,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5415,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5416,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5417,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5418,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5419,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5420,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5421,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5422,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x34, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5423,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5424,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5425,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5426,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5427,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x39, 0x32, 0x36, 0x32, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5428,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5429,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5430,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5431,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5432,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5433,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5434,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5435,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5436,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5437,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5438,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5439,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5440,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5441,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5442,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x34, 0x54, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5443,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x35, 0x36, 0x3a, 0x30, 0x32, 0x2d, 0x30, 0x34, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5444,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5445,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5446,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5447,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5448,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5449,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5450,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5451,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5452,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5453,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5454,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5455,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5456,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5457,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5458,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5459,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5460,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5461,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5462,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5463,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x39, 0x35, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5464,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5465,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5466,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5467,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5468,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5469,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5470,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5471,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5472,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5473,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5474,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5475,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5476,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5477,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5478,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5479,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5480,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5481,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5482,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5483,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5484,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5485,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5486,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5487,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5488,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5489,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5490,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5491,64,"style","Trailing whitespace is superfluous."," 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5492,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5493,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5494,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5495,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5496,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5497,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5498,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5499,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5500,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x31, 0x31, 0x30, 0x32, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5501,64,"style","Trailing whitespace is superfluous."," 0x35, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5502,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5503,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5504,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5505,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5506,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5507,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5508,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5509,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5510,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5511,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5512,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x37, 0x39, 0x35, 0x39, 0x31, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5513,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5514,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5515,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5516,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5517,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5518,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5519,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5520,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5521,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5522,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x35, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5523,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5524,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5525,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5526,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5527,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5528,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5529,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5530,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5531,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5532,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5533,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5534,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5535,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5536,64,"style","Trailing whitespace is superfluous."," 0x35, 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5537,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5538,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5539,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5540,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5541,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5542,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5543,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5544,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5545,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5546,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5547,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x35, 0x39, 0x35, 0x34, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5548,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5549,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5550,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5551,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5552,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5553,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5554,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5555,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5556,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x39, 0x35, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5557,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5558,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x35, 0x39, 0x35, 0x34, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5559,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5560,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5561,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5562,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5563,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5564,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5565,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5566,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5567,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5568,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5569,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x37, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5570,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5571,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5572,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5573,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5574,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x39, 0x35, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5575,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5576,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5577,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5578,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5579,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5580,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5581,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5582,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5583,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5584,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5585,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5586,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5587,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5588,64,"style","Trailing whitespace is superfluous."," 0x37, 0x54, 0x31, 0x37, 0x3a, 0x32, 0x35, 0x3a, 0x34, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5589,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5590,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5591,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5592,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5593,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5594,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5595,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5596,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5597,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5598,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5599,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5600,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5601,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5602,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5603,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5604,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5605,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5606,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5607,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5608,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x32, 0x35, 0x32, 0x31, 0x37, 0x31, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5609,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5610,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5611,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5612,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5613,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5614,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5615,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5616,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5617,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5618,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5619,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5620,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5621,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5622,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5623,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5624,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5625,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5626,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5627,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5628,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5629,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5630,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5631,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5632,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5633,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5634,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5635,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5636,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5637,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5638,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5639,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5640,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5641,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5642,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5643,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5644,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5645,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5646,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x32, 0x31, 0x37, 0x31, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5647,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5648,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x35, 0x32, 0x31, 0x37, 0x31, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5649,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5650,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5651,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5652,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5653,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5654,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5655,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5656,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5657,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x30, 0x31, 0x31, 0x37, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5658,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5659,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5660,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5661,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5662,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5663,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5664,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5665,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5666,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5667,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5668,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5669,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5670,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5671,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5672,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5673,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5674,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5675,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5676,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5677,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5678,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5679,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5680,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5681,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x35, 0x32, 0x31, 0x37, 0x31, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5682,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5683,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5684,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5685,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5686,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5687,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5688,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5689,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5690,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5691,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5692,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x35, 0x32, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5693,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5694,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5695,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5696,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5697,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5698,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5699,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5700,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5701,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x30, 0x32, 0x35, 0x32, 0x31, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5702,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5703,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x35, 0x32, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5704,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5705,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5706,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5707,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5708,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5709,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5710,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5711,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5712,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5713,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5714,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5715,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5716,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5717,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5718,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5719,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x35, 0x32, 0x31, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5720,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5721,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5722,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x33, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5723,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5724,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5725,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5726,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5727,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5728,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5729,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5730,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5731,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5732,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5733,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x38, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5734,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x3a, 0x32, 0x36, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5735,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5736,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5737,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5738,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5739,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5740,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5741,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5742,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5743,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5744,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5745,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5746,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5747,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5748,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5749,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5750,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5751,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5752,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5753,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5754,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x34, 0x38, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5755,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5756,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5757,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5758,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5759,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5760,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5761,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5762,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5763,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5764,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5765,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5766,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5767,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5768,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5769,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5770,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5771,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5772,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5773,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5774,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5775,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5776,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5777,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5778,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5779,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5780,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5781,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5782,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5783,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5784,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5785,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5786,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5787,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5788,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5789,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5790,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5791,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x30, 0x31, 0x38, 0x33, 0x34, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5792,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5793,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x31, 0x38, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5794,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5795,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5796,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5797,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5798,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5799,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5800,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5801,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5802,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5803,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x32, 0x30, 0x37, 0x32, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5804,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5805,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5806,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5807,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5808,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5809,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5810,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5811,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5812,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5813,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5814,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5815,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5816,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5817,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5818,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5819,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5820,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5821,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5822,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5823,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5824,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5825,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5826,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x31, 0x38, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5827,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5828,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5829,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5830,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5831,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5832,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5833,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5834,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5835,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5836,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5837,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5838,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x33, 0x34, 0x34, 0x38, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5839,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5840,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5841,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5842,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5843,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5844,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5845,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5846,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5847,64,"style","Trailing whitespace is superfluous."," 0x38, 0x33, 0x34, 0x34, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5848,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5849,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x33, 0x34, 0x34, 0x38, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5850,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5851,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5852,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5853,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5854,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5855,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5856,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5857,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5858,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5859,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5860,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5861,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5862,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5863,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5864,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5865,64,"style","Trailing whitespace is superfluous."," 0x38, 0x33, 0x34, 0x34, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5866,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5867,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5868,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5869,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5870,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5871,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5872,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5873,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5874,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5875,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5876,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5877,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5878,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5879,64,"style","Trailing whitespace is superfluous."," 0x39, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x37, 0x3a, 0x32, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5880,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5881,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5882,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5883,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5884,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5885,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5886,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5887,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5888,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5889,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5890,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5891,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5892,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5893,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5894,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5895,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5896,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5897,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5898,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5899,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x30, 0x30, 0x31, 0x35, 0x37, 0x39, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5900,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5901,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5902,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5903,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5904,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5905,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5906,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5907,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5908,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5909,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5910,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5911,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5912,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5913,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5914,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5915,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5916,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5917,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5918,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5919,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5920,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5921,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5922,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5923,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5924,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5925,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5926,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5927,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5928,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5929,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5930,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5931,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5932,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5933,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5934,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5935,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5936,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5937,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x35, 0x37, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5938,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x30, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5939,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x31, 0x35, 0x37, 0x39, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5940,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5941,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5942,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5943,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5944,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5945,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5946,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5947,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5948,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x30, 0x38, 0x36, 0x37, 0x34, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5949,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5950,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5951,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5952,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5953,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5954,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5955,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5956,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5957,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5958,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5959,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5960,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x35, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5961,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5962,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5963,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5964,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5965,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5966,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5967,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5968,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5969,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5970,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5971,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5972,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5973,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, 0x31, 0x35, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5974,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5975,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5976,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5977,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5978,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5979,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5980,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5981,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5982,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5983,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5984,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x30, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5985,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x37, 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5986,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5987,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5988,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5989,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5990,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5991,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5992,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5993,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x33, 0x30, 0x31, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5994,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5995,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x30, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5996,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x37, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5997,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5998,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",5999,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6000,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6001,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6002,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6003,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6004,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6005,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6006,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6007,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x38, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6008,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6009,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6010,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6011,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x30, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6012,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6013,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6014,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6015,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6016,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6017,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6018,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6019,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6020,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6021,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6022,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6023,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6024,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6025,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6026,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6027,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x38, 0x54, 0x31, 0x37, 0x3a, 0x31, 0x37, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6028,64,"style","Trailing whitespace is superfluous."," 0x33, 0x38, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6029,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6030,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6031,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6032,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6033,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6034,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6035,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6036,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6037,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6038,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6039,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6040,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6041,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6042,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6043,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6044,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6045,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6046,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6047,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x31, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6048,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6049,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6050,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6051,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6052,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6053,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x6d, 0x65, 0x6e, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6054,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x41, 0x6d, 0x65, 0x6e, 0x64, 0x5d, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6055,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x6e, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6056,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6057,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6058,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6059,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6060,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6061,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6062,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6063,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6064,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6065,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6066,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6067,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6068,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6069,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6070,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6071,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6072,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6073,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6074,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6075,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6076,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6077,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6078,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6079,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6080,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6081,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6082,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6083,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6084,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6085,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6086,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6087,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6088,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x30, 0x31, 0x30, 0x32, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6089,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6090,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x31, 0x30, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6091,64,"style","Trailing whitespace is superfluous."," 0x35, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6092,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6093,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6094,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6095,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6096,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x2f, 0x41, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6097,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6098,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6099,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6100,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x37, 0x38, 0x37, 0x39, 0x31, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6101,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6102,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6103,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6104,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6105,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6106,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6107,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6108,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6109,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6110,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6111,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6112,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6113,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6114,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6115,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6116,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6117,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6118,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6119,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6120,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x32, 0x30, 0x35, 0x32, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6121,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6122,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6123,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6124,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6125,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6126,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6127,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6128,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6129,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x32, 0x30, 0x35, 0x32, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6130,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6131,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x32, 0x30, 0x35, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6132,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6133,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6134,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6135,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6136,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6137,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6138,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6139,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6140,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6141,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6142,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6143,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6144,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6145,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6146,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6147,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x32, 0x30, 0x35, 0x32, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6148,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6149,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6150,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x37, 0x32, 0x33, 0x20, 0x4b, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6151,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6152,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6153,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x2f, 0x41, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6154,64,"style","Trailing whitespace is superfluous."," 0x41, 0x6d, 0x65, 0x6e, 0x64, 0x5d, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6155,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6156,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6157,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6158,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6159,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6160,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6161,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6162,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x30, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x31, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6163,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6164,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6165,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6166,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6167,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6168,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6169,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6170,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6171,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6172,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6173,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6174,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6175,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6176,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6177,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6178,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6179,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6180,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6181,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6182,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6183,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6184,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6185,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6186,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6187,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6188,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6189,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6190,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6191,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6192,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6193,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6194,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6195,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6196,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6197,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6198,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6199,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6200,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6201,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6202,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6203,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6204,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6205,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6206,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6207,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6208,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6209,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6210,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x39, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6211,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6212,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6213,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6214,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6215,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6216,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6217,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6218,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6219,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6220,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x32, 0x35, 0x38, 0x35, 0x36, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6221,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6222,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x35, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6223,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6224,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6225,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6226,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6227,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6228,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6229,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6230,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6231,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x30, 0x35, 0x38, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6232,64,"style","Trailing whitespace is superfluous."," 0x36, 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6233,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6234,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6235,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6236,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6237,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6238,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6239,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6240,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6241,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6242,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6243,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6244,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6245,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6246,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6247,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6248,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6249,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6250,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6251,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6252,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6253,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6254,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6255,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x35, 0x38, 0x35, 0x36, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6256,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6257,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6258,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6259,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6260,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6261,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6262,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6263,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6264,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6265,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6266,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6267,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6268,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6269,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6270,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6271,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6272,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6273,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6274,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6275,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x30, 0x30, 0x32, 0x35, 0x38, 0x35, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6276,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6277,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6278,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6279,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6280,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6281,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6282,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6283,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6284,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6285,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6286,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6287,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6288,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6289,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6290,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6291,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6292,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6293,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x35, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6294,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6295,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6296,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x33, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6297,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6298,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6299,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6300,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6301,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6302,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6303,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6304,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6305,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6306,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6307,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x39, 0x54, 0x31, 0x36, 0x3a, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6308,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x35, 0x32, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6309,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6310,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6311,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6312,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6313,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6314,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6315,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6316,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6317,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6318,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6319,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6320,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6321,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6322,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6323,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6324,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6325,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6326,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6327,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x32, 0x33, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6328,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6329,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6330,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6331,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6332,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6333,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6334,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6335,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6336,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6337,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6338,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6339,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6340,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6341,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6342,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6343,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6344,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6345,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6346,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6347,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6348,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6349,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6350,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6351,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6352,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6353,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6354,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6355,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6356,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6357,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6358,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6359,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6360,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6361,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6362,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6363,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6364,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6365,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x30, 0x39, 0x32, 0x33, 0x30, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6366,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6367,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x32, 0x33, 0x30, 0x37, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6368,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6369,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6370,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6371,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6372,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6373,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6374,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6375,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6376,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6377,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x32, 0x35, 0x38, 0x37, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6378,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6379,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6380,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6381,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6382,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6383,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6384,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6385,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6386,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6387,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x33, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6388,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6389,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6390,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6391,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6392,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6393,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6394,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6395,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6396,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6397,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6398,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6399,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6400,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x39, 0x2d, 0x32, 0x33, 0x30, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6401,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6402,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6403,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6404,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6405,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6406,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6407,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6408,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6409,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6410,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6411,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x32, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6412,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x38, 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6413,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6414,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6415,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6416,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6417,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6418,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6419,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6420,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, 0x32, 0x33, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6421,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6422,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x32, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6423,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x38, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6424,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6425,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6426,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6427,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6428,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6429,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6430,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6431,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6432,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6433,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6434,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x30, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6435,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6436,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6437,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6438,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x32, 0x33, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6439,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6440,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6441,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6442,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6443,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6444,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6445,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6446,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6447,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6448,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6449,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6450,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6451,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6452,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x30, 0x54, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6453,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x34, 0x39, 0x3a, 0x33, 0x36, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6454,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6455,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6456,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6457,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6458,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6459,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6460,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6461,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6462,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6463,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6464,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6465,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6466,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6467,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6468,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6469,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6470,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6471,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6472,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6473,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x30, 0x37, 0x35, 0x39, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6474,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6475,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6476,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6477,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6478,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6479,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6480,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6481,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6482,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6483,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6484,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6485,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6486,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6487,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6488,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6489,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6490,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6491,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6492,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6493,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6494,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6495,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6496,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6497,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6498,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6499,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6500,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6501,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6502,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6503,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6504,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6505,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6506,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6507,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6508,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6509,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6510,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, 0x31, 0x37, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6511,64,"style","Trailing whitespace is superfluous."," 0x37, 0x35, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6512,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6513,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x35, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6514,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6515,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6516,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6517,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6518,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6519,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6520,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6521,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6522,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x31, 0x30, 0x30, 0x30, 0x35, 0x35, 0x37, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6523,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6524,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6525,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6526,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6527,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6528,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6529,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6530,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6531,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6532,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6533,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6534,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6535,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6536,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6537,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6538,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6539,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6540,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6541,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6542,64,"style","Trailing whitespace is superfluous."," 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6543,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6544,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6545,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x31, 0x37, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6546,64,"style","Trailing whitespace is superfluous."," 0x37, 0x35, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6547,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6548,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6549,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6550,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6551,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6552,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6553,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6554,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6555,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6556,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6557,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x30, 0x37, 0x35, 0x39, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6558,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6559,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6560,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6561,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6562,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6563,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6564,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6565,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6566,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x30, 0x37, 0x35, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6567,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6568,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x30, 0x37, 0x35, 0x39, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6569,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6570,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6571,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6572,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6573,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6574,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6575,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6576,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6577,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6578,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6579,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x30, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6580,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6581,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6582,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6583,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6584,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x30, 0x37, 0x35, 0x39, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6585,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6586,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6587,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6588,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6589,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6590,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6591,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6592,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6593,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6594,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6595,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6596,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6597,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6598,64,"style","Trailing whitespace is superfluous."," 0x30, 0x54, 0x31, 0x36, 0x3a, 0x35, 0x31, 0x3a, 0x33, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6599,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6600,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6601,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6602,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6603,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6604,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6605,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6606,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6607,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6608,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6609,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6610,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6611,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6612,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6613,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6614,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6615,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6616,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6617,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6618,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x2d, 0x31, 0x31, 0x36, 0x38, 0x39, 0x35, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6619,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6620,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6621,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6622,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6623,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6624,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6625,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6626,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6627,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6628,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6629,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6630,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6631,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6632,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6633,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6634,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6635,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6636,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6637,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6638,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6639,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6640,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6641,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6642,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6643,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6644,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6645,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6646,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6647,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6648,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6649,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6650,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6651,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6652,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6653,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6654,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6655,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6656,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x36, 0x38, 0x39, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6657,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6658,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x36, 0x38, 0x39, 0x35, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6659,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6660,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6661,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6662,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6663,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6664,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6665,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6666,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6667,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x39, 0x38, 0x34, 0x36, 0x36, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6668,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6669,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6670,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6671,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6672,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6673,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6674,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6675,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6676,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6677,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6678,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6679,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x32, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6680,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6681,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6682,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6683,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6684,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6685,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6686,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6687,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6688,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x31, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6689,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6690,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6691,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6692,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6693,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6694,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6695,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6696,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6697,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, 0x31, 0x31, 0x36, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6698,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6699,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x31, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6700,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6701,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6702,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6703,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6704,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6705,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6706,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6707,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6708,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6709,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6710,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6711,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6712,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6713,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6714,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6715,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x31, 0x31, 0x36, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6716,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6717,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6718,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6719,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6720,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6721,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6722,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6723,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6724,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6725,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6726,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6727,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6728,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6729,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6730,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6731,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x54, 0x32, 0x30, 0x3a, 0x35, 0x38, 0x3a, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6732,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6733,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6734,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6735,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6736,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6737,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6738,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6739,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6740,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6741,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6742,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6743,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6744,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6745,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6746,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6747,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6748,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6749,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6750,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6751,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x39, 0x2d, 0x30, 0x31, 0x38, 0x39, 0x32, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6752,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6753,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6754,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6755,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6756,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6757,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6758,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6759,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6760,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6761,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6762,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6763,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6764,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6765,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6766,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6767,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6768,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6769,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6770,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6771,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6772,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6773,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6774,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6775,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6776,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6777,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6778,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6779,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x34, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6780,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6781,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6782,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6783,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6784,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6785,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6786,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6787,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6788,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6789,64,"style","Trailing whitespace is superfluous."," 0x39, 0x30, 0x31, 0x38, 0x39, 0x32, 0x31, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6790,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6791,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x31, 0x38, 0x39, 0x32, 0x31, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6792,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6793,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6794,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6795,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6796,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6797,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6798,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6799,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6800,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x39, 0x35, 0x36, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6801,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6802,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6803,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6804,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6805,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6806,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6807,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6808,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6809,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6810,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6811,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6812,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6813,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6814,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6815,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6816,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6817,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6818,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6819,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6820,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x2d, 0x30, 0x31, 0x38, 0x39, 0x32, 0x31, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6821,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6822,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6823,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6824,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6825,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6826,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6827,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6828,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6829,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x30, 0x31, 0x38, 0x39, 0x32, 0x31, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6830,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6831,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x2d, 0x30, 0x31, 0x38, 0x39, 0x32, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6832,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6833,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6834,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6835,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6836,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6837,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6838,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6839,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6840,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6841,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6842,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6843,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6844,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6845,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6846,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6847,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x31, 0x38, 0x39, 0x32, 0x31, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6848,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6849,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6850,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6851,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6852,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6853,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6854,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6855,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6856,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6857,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6858,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6859,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6860,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6861,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x54, 0x31, 0x37, 0x3a, 0x31, 0x33, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6862,64,"style","Trailing whitespace is superfluous."," 0x32, 0x36, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6863,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6864,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6865,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6866,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6867,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6868,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6869,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6870,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6871,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6872,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6873,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6874,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6875,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6876,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6877,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6878,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6879,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6880,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6881,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x31, 0x39, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6882,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6883,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6884,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6885,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6886,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6887,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6888,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6889,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6890,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6891,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6892,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6893,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6894,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6895,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6896,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6897,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6898,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6899,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6900,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6901,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6902,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6903,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6904,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6905,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6906,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6907,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6908,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6909,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x36, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6910,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6911,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6912,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6913,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6914,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6915,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6916,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6917,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6918,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6919,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x30, 0x31, 0x39, 0x36, 0x35, 0x31, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6920,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6921,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x30, 0x31, 0x39, 0x36, 0x35, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6922,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6923,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6924,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6925,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6926,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6927,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6928,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6929,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6930,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x38, 0x31, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6931,64,"style","Trailing whitespace is superfluous."," 0x36, 0x36, 0x33, 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6932,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6933,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6934,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6935,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6936,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6937,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6938,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6939,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6940,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6941,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x36, 0x30, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6942,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6943,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6944,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6945,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6946,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6947,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6948,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6949,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6950,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6951,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6952,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6953,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6954,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6955,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6956,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6957,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6958,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6959,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x30, 0x38, 0x30, 0x31, 0x39, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6960,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6961,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6962,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6963,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6964,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6965,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6966,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6967,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6968,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6969,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6970,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6971,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6972,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6973,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6974,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6975,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6976,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6977,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x31, 0x39, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6978,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6979,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6980,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6981,64,"style","Trailing whitespace is superfluous."," 0x30, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6982,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6983,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6984,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6985,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6986,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6987,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6988,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6989,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6990,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6991,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x36, 0x54, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6992,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x3a, 0x33, 0x35, 0x3a, 0x30, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6993,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6994,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6995,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6996,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6997,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6998,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",6999,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7000,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7001,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7002,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7003,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7004,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7005,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7006,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7007,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7008,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7009,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7010,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7011,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7012,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x33, 0x39, 0x39, 0x31, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7013,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7014,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7015,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7016,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7017,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7018,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7019,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7020,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7021,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7022,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7023,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7024,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7025,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7026,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7027,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7028,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7029,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7030,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7031,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7032,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7033,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7034,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7035,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7036,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7037,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7038,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7039,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x38, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7040,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7041,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7042,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7043,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7044,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7045,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7046,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7047,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7048,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7049,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x38, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7050,64,"style","Trailing whitespace is superfluous."," 0x33, 0x39, 0x39, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7051,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7052,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x39, 0x39, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7053,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7054,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7055,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7056,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7057,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7058,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7059,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7060,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7061,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x38, 0x39, 0x38, 0x38, 0x38, 0x36, 0x38, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7062,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7063,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7064,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7065,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7066,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7067,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7068,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7069,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7070,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7071,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7072,64,"style","Trailing whitespace is superfluous."," 0x35, 0x35, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7073,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7074,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7075,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7076,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7077,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7078,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7079,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7080,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7081,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x31, 0x33, 0x39, 0x39, 0x31, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7082,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7083,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7084,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7085,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7086,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7087,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7088,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7089,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7090,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x31, 0x33, 0x39, 0x39, 0x31, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7091,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7092,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x31, 0x33, 0x39, 0x39, 0x31, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7093,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7094,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7095,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7096,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7097,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7098,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7099,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7100,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7101,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7102,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7103,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7104,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7105,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7106,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7107,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7108,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x33, 0x39, 0x39, 0x31, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7109,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7110,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7111,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x36, 0x35, 0x35, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7112,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7113,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7114,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7115,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7116,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7117,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7118,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7119,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7120,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7121,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7122,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x34, 0x54, 0x31, 0x37, 0x3a, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7123,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x31, 0x39, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7124,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7125,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7126,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7127,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7128,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7129,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7130,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7131,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7132,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7133,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7134,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7135,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7136,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7137,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7138,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7139,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7140,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7141,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7142,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7143,64,"style","Trailing whitespace is superfluous."," 0x39, 0x30, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7144,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7145,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7146,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7147,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7148,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7149,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7150,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7151,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7152,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7153,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7154,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7155,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7156,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7157,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7158,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7159,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7160,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7161,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7162,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7163,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7164,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7165,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7166,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7167,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7168,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7169,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7170,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7171,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7172,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7173,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7174,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7175,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7176,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7177,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7178,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7179,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7180,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x38, 0x30, 0x30, 0x30, 0x32, 0x39, 0x30, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7181,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7182,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x32, 0x39, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7183,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7184,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7185,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7186,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7187,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7188,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7189,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7190,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7191,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x38, 0x38, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7192,64,"style","Trailing whitespace is superfluous."," 0x39, 0x30, 0x34, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7193,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7194,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7195,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7196,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7197,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7198,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7199,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7200,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7201,64,"style","Trailing whitespace is superfluous."," 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7202,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7203,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7204,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7205,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7206,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7207,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7208,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7209,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7210,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7211,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7212,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7213,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x32, 0x39, 0x30, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7214,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7215,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7216,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7217,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7218,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7219,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7220,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7221,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, 0x38, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7222,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x39, 0x30, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7223,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7224,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x32, 0x39, 0x30, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7225,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7226,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7227,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7228,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7229,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7230,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7231,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7232,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7233,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7234,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7235,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x32, 0x33, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7236,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7237,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7238,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7239,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7240,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x39, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7241,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7242,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7243,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7244,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7245,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7246,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7247,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7248,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7249,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7250,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7251,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7252,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7253,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7254,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7255,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x32, 0x33, 0x54, 0x31, 0x37, 0x3a, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7256,64,"style","Trailing whitespace is superfluous."," 0x37, 0x3a, 0x32, 0x34, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7257,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7258,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7259,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7260,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7261,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7262,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7263,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7264,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7265,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7266,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7267,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7268,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7269,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7270,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7271,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7272,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7273,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7274,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7275,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7276,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7277,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7278,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7279,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7280,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7281,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7282,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7283,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7284,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7285,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7286,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7287,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7288,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7289,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7290,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7291,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7292,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7293,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7294,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7295,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7296,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7297,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7298,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7299,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7300,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7301,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7302,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7303,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x35, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7304,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7305,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7306,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7307,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7308,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7309,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7310,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7311,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7312,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7313,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x30, 0x38, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7314,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7315,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7316,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7317,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7318,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7319,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7320,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7321,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7322,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7323,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7324,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x38, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7325,64,"style","Trailing whitespace is superfluous."," 0x37, 0x33, 0x36, 0x39, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7326,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7327,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7328,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7329,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7330,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7331,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7332,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7333,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7334,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7335,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x36, 0x32, 0x35, 0x20, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7336,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7337,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7338,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7339,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7340,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7341,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7342,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7343,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7344,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7345,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7346,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7347,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7348,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7349,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7350,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7351,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7352,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7353,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, 0x38, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7354,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7355,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7356,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7357,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7358,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7359,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7360,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7361,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7362,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7363,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7364,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7365,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7366,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7367,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x35, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7368,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7369,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7370,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7371,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7372,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7373,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7374,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7375,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7376,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7377,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7378,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7379,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7380,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7381,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7382,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7383,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7384,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7385,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7386,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x38, 0x3a, 0x33, 0x38, 0x3a, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7387,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7388,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7389,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7390,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7391,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7392,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7393,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7394,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7395,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7396,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7397,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7398,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7399,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7400,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7401,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7402,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7403,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7404,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7405,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7406,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x32, 0x33, 0x30, 0x30, 0x35, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7407,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7408,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7409,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7410,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7411,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7412,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7413,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7414,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7415,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7416,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7417,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7418,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7419,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7420,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7421,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7422,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7423,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7424,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7425,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7426,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7427,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7428,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7429,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7430,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7431,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7432,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7433,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7434,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7435,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7436,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7437,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7438,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7439,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7440,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7441,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7442,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7443,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x37, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7444,64,"style","Trailing whitespace is superfluous."," 0x32, 0x33, 0x30, 0x30, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7445,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7446,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x33, 0x30, 0x30, 0x35, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7447,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7448,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7449,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7450,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7451,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7452,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7453,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7454,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7455,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x37, 0x31, 0x32, 0x31, 0x38, 0x34, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7456,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7457,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7458,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7459,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7460,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7461,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7462,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7463,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7464,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7465,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7466,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x36, 0x37, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7467,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7468,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7469,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7470,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7471,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7472,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7473,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7474,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7475,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x32, 0x33, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7476,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7477,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7478,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7479,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7480,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7481,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7482,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7483,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7484,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x37, 0x30, 0x32, 0x33, 0x30, 0x30, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7485,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7486,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x32, 0x33, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7487,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7488,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7489,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7490,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7491,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7492,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7493,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7494,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7495,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7496,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7497,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7498,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7499,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7500,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7501,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7502,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x30, 0x32, 0x33, 0x30, 0x30, 0x35, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7503,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7504,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7505,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x36, 0x37, 0x36, 0x20, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7506,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7507,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7508,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7509,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7510,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7511,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7512,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7513,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7514,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7515,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7516,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x36, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7517,64,"style","Trailing whitespace is superfluous."," 0x34, 0x31, 0x3a, 0x30, 0x38, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7518,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7519,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7520,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7521,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7522,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7523,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7524,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7525,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7526,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7527,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7528,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7529,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7530,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7531,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7532,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7533,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7534,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7535,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7536,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7537,64,"style","Trailing whitespace is superfluous."," 0x36, 0x39, 0x39, 0x35, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7538,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7539,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7540,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7541,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7542,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7543,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7544,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7545,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7546,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7547,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7548,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7549,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7550,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7551,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7552,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7553,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7554,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7555,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7556,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7557,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7558,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7559,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7560,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7561,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7562,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7563,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7564,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x37, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7565,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7566,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7567,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7568,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7569,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7570,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7571,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7572,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7573,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7574,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x30, 0x37, 0x30, 0x31, 0x36, 0x39, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7575,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7576,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x36, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7577,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7578,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7579,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7580,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7581,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7582,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7583,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7584,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7585,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7586,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x32, 0x38, 0x33, 0x39, 0x31, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7587,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7588,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7589,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7590,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7591,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7592,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7593,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7594,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7595,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7596,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x37, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7597,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7598,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7599,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7600,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7601,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7602,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7603,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7604,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7605,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7606,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x39, 0x39, 0x35, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7607,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7608,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7609,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7610,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7611,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7612,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7613,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7614,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x37, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7615,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x39, 0x39, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7616,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7617,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x39, 0x39, 0x35, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7618,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7619,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7620,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7621,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7622,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7623,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7624,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7625,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7626,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7627,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7628,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x36, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7629,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7630,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7631,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7632,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7633,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x39, 0x39, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7634,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7635,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7636,64,"style","Trailing whitespace is superfluous."," 0x20, 0x38, 0x37, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7637,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7638,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7639,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7640,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7641,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7642,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7643,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7644,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7645,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7646,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7647,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x54, 0x31, 0x36, 0x3a, 0x34, 0x37, 0x3a, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7648,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7649,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7650,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7651,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7652,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7653,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7654,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7655,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7656,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7657,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7658,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7659,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7660,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7661,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7662,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7663,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7664,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7665,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7666,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7667,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x32, 0x35, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7668,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7669,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7670,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7671,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7672,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7673,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7674,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7675,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7676,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7677,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7678,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7679,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7680,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7681,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7682,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7683,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7684,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7685,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7686,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7687,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7688,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7689,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7690,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7691,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7692,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7693,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7694,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7695,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x33, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7696,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7697,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7698,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7699,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7700,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7701,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7702,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7703,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7704,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7705,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x31, 0x32, 0x35, 0x32, 0x38, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7706,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7707,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x31, 0x32, 0x35, 0x32, 0x38, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7708,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7709,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7710,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7711,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7712,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7713,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7714,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7715,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7716,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x37, 0x38, 0x38, 0x35, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7717,64,"style","Trailing whitespace is superfluous."," 0x38, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7718,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7719,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7720,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7721,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7722,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7723,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7724,64,"style","Trailing whitespace is superfluous."," 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7725,64,"style","Trailing whitespace is superfluous."," 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7726,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7727,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7728,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7729,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7730,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7731,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7732,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7733,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7734,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7735,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7736,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7737,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7738,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x32, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7739,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7740,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7741,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7742,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7743,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7744,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7745,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7746,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x37, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7747,64,"style","Trailing whitespace is superfluous."," 0x35, 0x32, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7748,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7749,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x32, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7750,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7751,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7752,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7753,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7754,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7755,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7756,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7757,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7758,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7759,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7760,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x33, 0x30, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7761,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7762,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7763,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7764,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7765,64,"style","Trailing whitespace is superfluous."," 0x35, 0x32, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7766,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7767,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7768,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7769,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7770,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7771,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7772,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7773,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7774,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7775,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7776,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7777,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7778,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7779,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7780,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x39, 0x54, 0x32, 0x31, 0x3a, 0x32, 0x36, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7781,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7782,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7783,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7784,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7785,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7786,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7787,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7788,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7789,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7790,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7791,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7792,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7793,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7794,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7795,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7796,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7797,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7798,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7799,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7800,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x30, 0x32, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7801,64,"style","Trailing whitespace is superfluous."," 0x37, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7802,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7803,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7804,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7805,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7806,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7807,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7808,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7809,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7810,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7811,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7812,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7813,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7814,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7815,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7816,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7817,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7818,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7819,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7820,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7821,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7822,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7823,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7824,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7825,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7826,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7827,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7828,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7829,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7830,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7831,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7832,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7833,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7834,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7835,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7836,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7837,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7838,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x30, 0x30, 0x32, 0x31, 0x33, 0x37, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7839,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7840,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x30, 0x30, 0x32, 0x31, 0x33, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7841,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7842,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7843,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7844,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7845,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7846,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7847,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7848,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7849,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x37, 0x35, 0x38, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7850,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7851,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7852,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7853,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7854,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7855,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7856,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7857,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7858,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7859,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7860,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x37, 0x35, 0x34, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7861,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7862,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7863,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7864,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7865,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7866,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7867,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7868,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7869,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x30, 0x32, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7870,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7871,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7872,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7873,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7874,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7875,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7876,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7877,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7878,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x30, 0x37, 0x30, 0x30, 0x32, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7879,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7880,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x30, 0x32, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7881,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7882,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7883,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7884,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7885,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7886,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7887,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7888,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7889,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7890,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7891,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7892,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7893,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7894,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7895,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7896,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x30, 0x32, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7897,64,"style","Trailing whitespace is superfluous."," 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7898,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7899,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, 0x35, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7900,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7901,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7902,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7903,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7904,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7905,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7906,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7907,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7908,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7909,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7910,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x54, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7911,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3a, 0x34, 0x38, 0x3a, 0x32, 0x33, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7912,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7913,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7914,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7915,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7916,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7917,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7918,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7919,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7920,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7921,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7922,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7923,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7924,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7925,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7926,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7927,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7928,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7929,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7930,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7931,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x30, 0x36, 0x32, 0x36, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7932,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7933,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7934,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7935,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7936,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7937,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7938,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7939,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7940,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7941,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7942,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7943,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7944,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7945,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7946,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7947,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7948,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7949,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7950,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7951,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7952,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7953,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7954,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7955,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7956,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7957,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7958,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x30, 0x36, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7959,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7960,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7961,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7962,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7963,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7964,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7965,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7966,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7967,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7968,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x36, 0x30, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7969,64,"style","Trailing whitespace is superfluous."," 0x36, 0x32, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7970,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7971,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x32, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7972,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7973,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7974,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7975,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7976,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7977,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7978,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7979,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7980,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x31, 0x31, 0x39, 0x31, 0x38, 0x39, 0x31, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7981,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7982,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7983,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7984,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7985,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7986,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7987,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7988,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7989,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7990,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7991,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7992,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7993,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7994,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7995,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7996,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7997,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7998,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",7999,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8000,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x32, 0x30, 0x36, 0x32, 0x36, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8001,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8002,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8003,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8004,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8005,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8006,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8007,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8008,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8009,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x32, 0x30, 0x36, 0x32, 0x36, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8010,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8011,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x32, 0x30, 0x36, 0x32, 0x36, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8012,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8013,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8014,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8015,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8016,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8017,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8018,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8019,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8020,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8021,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8022,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x36, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8023,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8024,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8025,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8026,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8027,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x30, 0x36, 0x32, 0x36, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8028,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8029,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8030,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x37, 0x34, 0x36, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8031,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8032,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8033,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8034,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8035,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8036,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8037,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8038,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8039,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8040,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x36, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8041,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x36, 0x54, 0x32, 0x31, 0x3a, 0x34, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8042,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8043,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8044,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8045,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8046,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8047,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8048,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8049,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8050,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8051,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8052,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8053,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8054,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8055,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8056,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8057,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8058,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8059,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8060,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8061,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, 0x35, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8062,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8063,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8064,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8065,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8066,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8067,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8068,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8069,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8070,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8071,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8072,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8073,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8074,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8075,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8076,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8077,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8078,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8079,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8080,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8081,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8082,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8083,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8084,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8085,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8086,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8087,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8088,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8089,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8090,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8091,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8092,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8093,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8094,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8095,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8096,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8097,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8098,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8099,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x36, 0x30, 0x31, 0x35, 0x32, 0x39, 0x31, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8100,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8101,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, 0x35, 0x32, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8102,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8103,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8104,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8105,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8106,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8107,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8108,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8109,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8110,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x36, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8111,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x36, 0x39, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8112,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8113,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8114,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8115,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8116,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8117,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8118,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8119,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8120,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8121,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x35, 0x36, 0x20, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8122,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8123,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8124,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8125,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8126,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8127,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8128,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8129,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8130,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8131,64,"style","Trailing whitespace is superfluous."," 0x35, 0x32, 0x39, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8132,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8133,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8134,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8135,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8136,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8137,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8138,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8139,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x36, 0x30, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8140,64,"style","Trailing whitespace is superfluous."," 0x32, 0x39, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8141,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8142,64,"style","Trailing whitespace is superfluous."," 0x35, 0x32, 0x39, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8143,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8144,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8145,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8146,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8147,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8148,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8149,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8150,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8151,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8152,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8153,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8154,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8155,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8156,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8157,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8158,64,"style","Trailing whitespace is superfluous."," 0x32, 0x39, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8159,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8160,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8161,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8162,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8163,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8164,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8165,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8166,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8167,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8168,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8169,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8170,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8171,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x36, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8172,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x36, 0x3a, 0x34, 0x34, 0x3a, 0x30, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8173,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8174,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8175,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8176,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8177,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8178,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8179,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8180,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8181,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8182,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8183,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8184,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8185,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8186,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8187,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8188,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8189,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8190,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8191,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8192,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x31, 0x31, 0x34, 0x30, 0x31, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8193,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8194,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8195,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8196,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8197,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8198,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8199,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8200,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8201,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8202,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8203,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8204,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8205,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8206,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8207,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8208,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8209,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8210,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8211,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8212,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8213,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8214,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8215,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8216,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8217,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8218,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8219,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x36, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8220,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x31, 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8221,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8222,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8223,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8224,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8225,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8226,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8227,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8228,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8229,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x36, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8230,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x34, 0x30, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8231,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8232,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x34, 0x30, 0x31, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8233,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8234,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8235,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8236,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8237,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8238,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8239,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8240,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8241,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x36, 0x38, 0x39, 0x38, 0x32, 0x38, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8242,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8243,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8244,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8245,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8246,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8247,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8248,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8249,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8250,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8251,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8252,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8253,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8254,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8255,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8256,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8257,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8258,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8259,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8260,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8261,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8262,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8263,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8264,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8265,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8266,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8267,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8268,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8269,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8270,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8271,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x30, 0x36, 0x30, 0x31, 0x31, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8272,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8273,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8274,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8275,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8276,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8277,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8278,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8279,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8280,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8281,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8282,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8283,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8284,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x36, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8285,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x31, 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8286,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8287,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8288,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8289,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x31, 0x31, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8290,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8291,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8292,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8293,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8294,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8295,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8296,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8297,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8298,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8299,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8300,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8301,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8302,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8303,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8304,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x36, 0x2d, 0x30, 0x36, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8305,64,"style","Trailing whitespace is superfluous."," 0x39, 0x54, 0x32, 0x31, 0x3a, 0x34, 0x34, 0x3a, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8306,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8307,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8308,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8309,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8310,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8311,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8312,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8313,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8314,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8315,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8316,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8317,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8318,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8319,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8320,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8321,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8322,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8323,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8324,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8325,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x2d, 0x30, 0x30, 0x32, 0x30, 0x37, 0x39, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8326,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8327,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8328,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8329,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8330,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8331,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8332,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8333,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8334,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8335,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8336,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8337,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8338,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8339,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8340,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8341,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8342,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8343,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8344,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8345,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8346,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8347,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8348,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8349,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8350,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8351,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8352,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8353,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8354,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8355,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8356,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8357,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8358,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8359,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8360,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8361,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8362,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8363,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x30, 0x37, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8364,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8365,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x32, 0x30, 0x37, 0x39, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8366,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8367,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8368,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8369,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8370,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8371,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8372,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8373,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8374,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x36, 0x35, 0x38, 0x36, 0x37, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8375,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8376,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8377,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8378,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8379,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8380,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8381,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8382,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8383,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8384,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8385,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8386,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8387,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8388,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8389,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8390,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8391,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8392,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8393,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8394,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x30, 0x32, 0x30, 0x37, 0x39, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8395,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8396,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8397,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8398,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8399,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8400,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8401,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8402,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8403,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x30, 0x32, 0x30, 0x37, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8404,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8405,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x30, 0x32, 0x30, 0x37, 0x39, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8406,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8407,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8408,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8409,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8410,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8411,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8412,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8413,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8414,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8415,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8416,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x36, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8417,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8418,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8419,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8420,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8421,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x32, 0x30, 0x37, 0x39, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8422,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8423,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8424,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8425,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8426,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8427,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8428,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8429,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8430,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8431,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8432,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8433,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8434,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x30, 0x36, 0x2d, 0x30, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8435,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x54, 0x31, 0x39, 0x3a, 0x30, 0x37, 0x3a, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8436,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8437,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8438,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8439,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8440,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8441,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8442,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8443,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8444,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8445,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8446,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8447,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8448,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8449,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8450,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8451,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8452,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8453,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8454,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8455,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x38, 0x35, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8456,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8457,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8458,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8459,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8460,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8461,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8462,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8463,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8464,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8465,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8466,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8467,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8468,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8469,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8470,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8471,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8472,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8473,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8474,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8475,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8476,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8477,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8478,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8479,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8480,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8481,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8482,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8483,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8484,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8485,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8486,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8487,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8488,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8489,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8490,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8491,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8492,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8493,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x38, 0x35, 0x33, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8494,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8495,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x30, 0x38, 0x35, 0x33, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8496,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8497,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8498,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8499,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8500,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8501,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8502,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8503,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8504,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x35, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8505,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8506,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8507,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8508,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8509,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8510,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8511,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8512,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8513,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8514,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8515,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x36, 0x36, 0x38, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8516,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8517,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8518,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8519,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8520,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8521,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8522,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8523,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8524,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8525,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8526,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8527,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8528,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8529,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8530,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8531,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8532,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8533,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x30, 0x35, 0x30, 0x30, 0x30, 0x38, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8534,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8535,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8536,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8537,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8538,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8539,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8540,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8541,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8542,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8543,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8544,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8545,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8546,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8547,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x31, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8548,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8549,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8550,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8551,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x38, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8552,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8553,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8554,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x36, 0x36, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8555,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8556,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8557,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8558,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8559,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8560,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8561,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8562,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8563,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8564,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8565,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x30, 0x54, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8566,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x34, 0x39, 0x3a, 0x32, 0x30, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8567,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8568,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8569,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8570,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8571,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8572,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8573,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8574,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8575,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8576,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8577,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8578,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8579,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8580,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8581,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8582,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8583,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8584,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8585,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8586,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x34, 0x36, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8587,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8588,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8589,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8590,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8591,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8592,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8593,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8594,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8595,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8596,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8597,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8598,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8599,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8600,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8601,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8602,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8603,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8604,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8605,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8606,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8607,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8608,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8609,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8610,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8611,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8612,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8613,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8614,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8615,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8616,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8617,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8618,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8619,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8620,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8621,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8622,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8623,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8624,64,"style","Trailing whitespace is superfluous."," 0x35, 0x34, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8625,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8626,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x34, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8627,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8628,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8629,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8630,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8631,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8632,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8633,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8634,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8635,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x39, 0x39, 0x36, 0x30, 0x33, 0x36, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8636,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8637,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8638,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8639,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8640,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8641,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8642,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8643,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8644,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8645,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8646,64,"style","Trailing whitespace is superfluous."," 0x38, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8647,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8648,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8649,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8650,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8651,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8652,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8653,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8654,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8655,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x35, 0x34, 0x36, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8656,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8657,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8658,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8659,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8660,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8661,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8662,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8663,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8664,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x34, 0x36, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8665,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8666,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x35, 0x34, 0x36, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8667,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8668,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8669,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8670,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8671,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8672,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8673,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8674,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8675,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8676,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8677,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8678,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8679,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8680,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8681,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8682,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x34, 0x36, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8683,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8684,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8685,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x38, 0x38, 0x38, 0x20, 0x4b, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8686,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8687,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8688,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8689,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8690,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8691,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8692,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8693,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8694,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8695,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8696,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x33, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x31, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8697,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8698,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8699,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8700,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8701,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8702,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8703,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8704,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8705,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8706,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8707,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8708,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8709,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8710,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8711,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8712,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8713,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8714,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8715,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8716,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8717,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8718,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8719,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8720,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8721,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8722,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8723,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8724,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8725,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8726,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8727,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8728,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8729,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8730,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8731,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8732,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8733,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8734,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8735,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8736,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8737,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8738,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8739,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8740,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8741,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8742,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8743,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8744,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x37, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8745,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8746,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8747,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8748,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8749,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8750,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8751,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8752,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8753,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8754,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x30, 0x30, 0x30, 0x34, 0x30, 0x36, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8755,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8756,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x30, 0x30, 0x34, 0x30, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8757,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8758,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8759,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8760,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8761,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8762,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8763,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8764,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8765,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x35, 0x38, 0x38, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8766,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8767,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8768,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8769,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8770,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8771,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8772,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8773,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8774,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8775,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8776,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8777,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8778,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8779,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8780,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8781,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8782,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8783,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8784,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8785,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8786,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8787,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x34, 0x30, 0x36, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8788,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8789,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8790,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8791,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8792,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8793,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8794,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8795,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8796,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x30, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8797,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8798,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x34, 0x30, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8799,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8800,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8801,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8802,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8803,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8804,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8805,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8806,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8807,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8808,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8809,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x37, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8810,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8811,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8812,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8813,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8814,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x30, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8815,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8816,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8817,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8818,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8819,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8820,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8821,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8822,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8823,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8824,64,"style","Trailing whitespace is superfluous."," 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8825,64,"style","Trailing whitespace is superfluous."," 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8826,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8827,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8828,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8829,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x37, 0x54, 0x31, 0x35, 0x3a, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8830,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x32, 0x38, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8831,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8832,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8833,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8834,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8835,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8836,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8837,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8838,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8839,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8840,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8841,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8842,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8843,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8844,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8845,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8846,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8847,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8848,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8849,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8850,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8851,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8852,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8853,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8854,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8855,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8856,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8857,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8858,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8859,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8860,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8861,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8862,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8863,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8864,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8865,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8866,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8867,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8868,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8869,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8870,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8871,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8872,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8873,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8874,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8875,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8876,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8877,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8878,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8879,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8880,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8881,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8882,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8883,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8884,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8885,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8886,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8887,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x35, 0x30, 0x30, 0x31, 0x39, 0x31, 0x33, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8888,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8889,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x31, 0x39, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8890,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8891,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8892,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8893,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8894,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8895,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8896,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8897,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8898,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x35, 0x35, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8899,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x37, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8900,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8901,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8902,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8903,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8904,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8905,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8906,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8907,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8908,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8909,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x35, 0x33, 0x34, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8910,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8911,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8912,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8913,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8914,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8915,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8916,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8917,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8918,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8919,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x33, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8920,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8921,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8922,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8923,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8924,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8925,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8926,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8927,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x34, 0x30, 0x35, 0x30, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8928,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8929,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8930,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8931,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8932,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8933,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8934,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8935,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8936,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8937,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8938,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8939,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8940,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8941,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8942,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8943,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8944,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8945,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8946,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8947,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8948,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x35, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8949,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8950,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8951,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8952,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8953,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8954,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8955,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8956,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8957,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8958,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8959,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x32, 0x54, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8960,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x3a, 0x35, 0x31, 0x3a, 0x31, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8961,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8962,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8963,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8964,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8965,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8966,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8967,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8968,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8969,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8970,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8971,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8972,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8973,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8974,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8975,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8976,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8977,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8978,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8979,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8980,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x36, 0x32, 0x37, 0x30, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8981,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8982,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8983,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8984,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8985,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8986,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8987,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8988,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8989,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8990,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8991,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8992,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8993,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8994,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8995,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8996,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8997,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8998,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",8999,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9000,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9001,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9002,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9003,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9004,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9005,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9006,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9007,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x34, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9008,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9009,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9010,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9011,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9012,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9013,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9014,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9015,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9016,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9017,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x30, 0x34, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9018,64,"style","Trailing whitespace is superfluous."," 0x36, 0x32, 0x37, 0x30, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9019,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9020,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x32, 0x37, 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9021,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9022,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9023,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9024,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9025,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9026,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9027,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9028,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9029,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x34, 0x31, 0x31, 0x31, 0x36, 0x38, 0x33, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9030,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9031,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9032,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9033,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9034,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9035,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9036,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9037,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9038,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9039,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9040,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x39, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9041,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9042,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9043,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9044,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9045,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9046,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9047,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9048,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9049,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x2d, 0x30, 0x31, 0x36, 0x32, 0x37, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9050,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9051,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9052,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9053,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9054,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9055,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9056,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9057,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9058,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x30, 0x31, 0x36, 0x32, 0x37, 0x30, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9059,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9060,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x2d, 0x30, 0x31, 0x36, 0x32, 0x37, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9061,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9062,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9063,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9064,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9065,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9066,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9067,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9068,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9069,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9070,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9071,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x30, 0x34, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9072,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9073,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9074,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9075,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9076,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x31, 0x36, 0x32, 0x37, 0x30, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9077,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9078,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9079,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x35, 0x31, 0x39, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9080,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9081,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9082,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9083,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9084,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9085,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9086,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9087,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9088,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9089,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9090,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x33, 0x54, 0x31, 0x36, 0x3a, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9091,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x31, 0x32, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9092,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9093,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9094,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9095,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9096,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9097,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9098,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9099,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9100,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9101,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9102,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9103,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9104,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9105,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9106,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9107,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9108,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9109,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9110,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x34, 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9111,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9112,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9113,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9114,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9115,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9116,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9117,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9118,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9119,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9120,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9121,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9122,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9123,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9124,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9125,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9126,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9127,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9128,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9129,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9130,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9131,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9132,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9133,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9134,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9135,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9136,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x33, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9137,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9138,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9139,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9140,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9141,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9142,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9143,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9144,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9145,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9146,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x30, 0x31, 0x31, 0x31, 0x32, 0x34, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9147,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9148,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x2d, 0x30, 0x31, 0x31, 0x31, 0x32, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9149,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9150,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9151,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9152,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9153,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9154,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9155,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9156,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9157,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x34, 0x39, 0x34, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9158,64,"style","Trailing whitespace is superfluous."," 0x36, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9159,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9160,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9161,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9162,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9163,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9164,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9165,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9166,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9167,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9168,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9169,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9170,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9171,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9172,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9173,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9174,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9175,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9176,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9177,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x31, 0x31, 0x31, 0x32, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9178,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9179,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9180,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9181,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9182,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9183,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9184,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9185,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9186,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x34, 0x30, 0x31, 0x31, 0x31, 0x32, 0x34, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9187,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9188,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x31, 0x31, 0x31, 0x32, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9189,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9190,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9191,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9192,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9193,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9194,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9195,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9196,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9197,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9198,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9199,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x30, 0x34, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9200,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9201,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9202,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9203,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x31, 0x33, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9204,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x2d, 0x30, 0x31, 0x31, 0x31, 0x32, 0x34, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9205,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9206,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9207,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9208,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9209,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9210,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9211,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9212,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9213,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9214,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9215,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9216,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9217,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9218,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x33, 0x54, 0x31, 0x33, 0x3a, 0x33, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9219,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x31, 0x35, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9220,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9221,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9222,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9223,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9224,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9225,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9226,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9227,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9228,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9229,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9230,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9231,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9232,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9233,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9234,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9235,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9236,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9237,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9238,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9239,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9240,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9241,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9242,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9243,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9244,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9245,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9246,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9247,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9248,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9249,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9250,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9251,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9252,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9253,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9254,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9255,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9256,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9257,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9258,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9259,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9260,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9261,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9262,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9263,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9264,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x34, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9265,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9266,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9267,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9268,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9269,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9270,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9271,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9272,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9273,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9274,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x30, 0x31, 0x30, 0x34, 0x36, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9275,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9276,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x30, 0x31, 0x30, 0x34, 0x36, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9277,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9278,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9279,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9280,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9281,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9282,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9283,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9284,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9285,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x34, 0x38, 0x35, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9286,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9287,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9288,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9289,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9290,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9291,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9292,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9293,64,"style","Trailing whitespace is superfluous."," 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9294,64,"style","Trailing whitespace is superfluous."," 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9295,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9296,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9297,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9298,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9299,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9300,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9301,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9302,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9303,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9304,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9305,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9306,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9307,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9308,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9309,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9310,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9311,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9312,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9313,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9314,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9315,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, 0x34, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9316,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9317,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9318,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9319,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9320,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9321,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9322,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9323,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9324,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9325,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9326,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9327,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9328,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9329,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x2d, 0x30, 0x34, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9330,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9331,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9332,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9333,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9334,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9335,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9336,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9337,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9338,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9339,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9340,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9341,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9342,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9343,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9344,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9345,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9346,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9347,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9348,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x34, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9349,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x54, 0x31, 0x37, 0x3a, 0x32, 0x31, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9350,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9351,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9352,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9353,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9354,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9355,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9356,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9357,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9358,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9359,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9360,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9361,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9362,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9363,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9364,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9365,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9366,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9367,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9368,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9369,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9370,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9371,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9372,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9373,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9374,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9375,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9376,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9377,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9378,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9379,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9380,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9381,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9382,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9383,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9384,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9385,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9386,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9387,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9388,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9389,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9390,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9391,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9392,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9393,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9394,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9395,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x31, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9396,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9397,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9398,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9399,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9400,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9401,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9402,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9403,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9404,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9405,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x32, 0x33, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9406,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9407,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x35, 0x32, 0x33, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9408,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9409,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9410,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9411,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9412,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9413,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9414,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9415,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9416,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x34, 0x35, 0x38, 0x31, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9417,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9418,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9419,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9420,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9421,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9422,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9423,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9424,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9425,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9426,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9427,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x39, 0x34, 0x38, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9428,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9429,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9430,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9431,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9432,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9433,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9434,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9435,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9436,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x32, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9437,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9438,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9439,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9440,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9441,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9442,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9443,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9444,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9445,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x34, 0x30, 0x30, 0x30, 0x35, 0x32, 0x33, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9446,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9447,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x32, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9448,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9449,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9450,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9451,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9452,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9453,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9454,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9455,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9456,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9457,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9458,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x30, 0x34, 0x2d, 0x30, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9459,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9460,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9461,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9462,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9463,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x32, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9464,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9465,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9466,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x39, 0x34, 0x38, 0x20, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9467,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9468,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9469,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9470,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9471,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9472,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9473,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9474,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9475,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9476,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9477,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x30, 0x54, 0x31, 0x33, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9478,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x3a, 0x32, 0x38, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9479,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9480,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9481,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9482,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9483,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9484,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9485,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9486,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9487,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9488,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9489,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9490,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9491,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9492,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9493,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9494,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9495,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9496,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9497,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9498,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x34, 0x35, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9499,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9500,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9501,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9502,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9503,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9504,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9505,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9506,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9507,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9508,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9509,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9510,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9511,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9512,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9513,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9514,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9515,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9516,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9517,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9518,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9519,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9520,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9521,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9522,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9523,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x37, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9524,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9525,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9526,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9527,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9528,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9529,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9530,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9531,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9532,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9533,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x33, 0x30, 0x30, 0x35, 0x37, 0x34, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9534,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9535,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x37, 0x34, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9536,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9537,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9538,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9539,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9540,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9541,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9542,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9543,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9544,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x33, 0x39, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9545,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9546,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9547,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9548,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9549,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9550,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9551,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9552,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9553,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9554,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9555,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9556,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9557,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9558,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9559,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9560,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9561,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9562,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9563,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9564,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x37, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9565,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9566,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9567,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9568,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9569,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9570,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9571,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9572,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9573,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x30, 0x33, 0x30, 0x30, 0x35, 0x37, 0x34, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9574,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9575,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x37, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9576,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9577,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9578,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9579,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9580,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9581,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9582,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9583,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9584,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9585,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9586,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x33, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9587,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9588,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9589,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9590,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9591,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x37, 0x34, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9592,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9593,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9594,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x33, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9595,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9596,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9597,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9598,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9599,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9600,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9601,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9602,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9603,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9604,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x33, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9605,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x37, 0x54, 0x31, 0x35, 0x3a, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9606,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3a, 0x30, 0x35, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9607,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9608,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9609,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9610,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9611,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9612,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9613,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9614,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9615,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9616,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9617,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9618,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9619,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9620,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9621,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9622,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9623,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9624,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9625,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9626,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x37, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9627,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9628,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9629,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9630,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9631,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9632,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9633,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9634,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9635,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9636,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9637,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9638,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9639,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9640,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9641,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9642,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9643,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9644,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9645,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9646,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9647,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9648,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9649,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9650,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9651,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x31, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9652,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9653,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9654,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9655,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9656,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9657,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9658,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9659,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9660,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9661,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x30, 0x30, 0x34, 0x32, 0x35, 0x37, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9662,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9663,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x2d, 0x30, 0x30, 0x34, 0x32, 0x35, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9664,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9665,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9666,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9667,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9668,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9669,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9670,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9671,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9672,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x33, 0x38, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9673,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9674,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9675,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9676,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9677,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9678,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9679,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9680,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9681,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9682,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9683,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x34, 0x39, 0x38, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9684,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9685,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9686,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9687,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9688,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9689,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9690,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9691,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9692,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9693,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9694,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9695,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9696,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9697,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9698,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9699,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9700,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9701,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x30, 0x33, 0x30, 0x30, 0x34, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9702,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9703,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9704,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9705,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9706,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9707,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9708,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9709,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9710,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9711,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9712,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9713,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9714,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9715,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x31, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9716,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9717,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9718,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9719,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x34, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9720,64,"style","Trailing whitespace is superfluous."," 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9721,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9722,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x34, 0x39, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9723,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9724,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9725,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9726,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9727,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9728,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9729,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9730,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9731,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9732,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9733,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x31, 0x54, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9734,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3a, 0x30, 0x36, 0x3a, 0x34, 0x37, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9735,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9736,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9737,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9738,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9739,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9740,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9741,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9742,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9743,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9744,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9745,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9746,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9747,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9748,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9749,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9750,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9751,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9752,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9753,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9754,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x39, 0x33, 0x39, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9755,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9756,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9757,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9758,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9759,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9760,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9761,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9762,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9763,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9764,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9765,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9766,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9767,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9768,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9769,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9770,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9771,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9772,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9773,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9774,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9775,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9776,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9777,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9778,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9779,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x33, 0x2d, 0x30, 0x36, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9780,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9781,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9782,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9783,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9784,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9785,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9786,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9787,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9788,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9789,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x30, 0x33, 0x30, 0x30, 0x32, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9790,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9791,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x32, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9792,64,"style","Trailing whitespace is superfluous."," 0x33, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9793,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9794,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9795,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9796,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9797,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9798,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9799,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9800,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9801,64,"style","Trailing whitespace is superfluous."," 0x37, 0x33, 0x39, 0x35, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9802,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9803,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9804,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9805,64,"style","Trailing whitespace is superfluous."," 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9806,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9807,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9808,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9809,64,"style","Trailing whitespace is superfluous."," 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9810,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9811,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9812,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9813,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9814,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9815,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9816,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9817,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9818,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9819,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9820,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9821,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9822,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x30, 0x32, 0x39, 0x33, 0x39, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9823,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9824,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9825,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9826,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9827,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9828,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9829,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9830,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9831,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x30, 0x32, 0x39, 0x33, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9832,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9833,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x30, 0x32, 0x39, 0x33, 0x39, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9834,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9835,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9836,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9837,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9838,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9839,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9840,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9841,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9842,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9843,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9844,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x33, 0x2d, 0x30, 0x36, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9845,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9846,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9847,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9848,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9849,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x32, 0x39, 0x33, 0x39, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9850,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9851,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9852,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9853,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9854,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9855,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9856,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9857,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9858,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9859,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9860,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9861,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9862,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9863,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9864,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x36, 0x2d, 0x31, 0x30, 0x54, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9865,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x31, 0x35, 0x3a, 0x35, 0x38, 0x2d, 0x30, 0x34, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9866,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9867,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9868,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9869,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9870,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9871,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9872,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9873,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9874,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9875,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9876,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9877,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9878,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9879,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9880,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9881,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9882,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9883,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9884,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9885,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x36, 0x39, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9886,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9887,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9888,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9889,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9890,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9891,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9892,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9893,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9894,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9895,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9896,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9897,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9898,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9899,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9900,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9901,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9902,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9903,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9904,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9905,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9906,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9907,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9908,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9909,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9910,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x33, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x31, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9911,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9912,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9913,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9914,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9915,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9916,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9917,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9918,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9919,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9920,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x30, 0x33, 0x30, 0x30, 0x30, 0x36, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9921,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9922,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9923,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9924,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9925,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9926,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9927,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9928,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9929,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9930,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9931,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x33, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9932,64,"style","Trailing whitespace is superfluous."," 0x34, 0x39, 0x35, 0x39, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9933,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9934,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9935,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9936,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9937,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9938,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9939,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9940,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9941,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9942,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9943,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9944,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9945,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9946,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9947,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9948,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9949,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9950,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9951,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9952,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9953,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9954,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9955,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9956,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9957,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9958,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9959,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9960,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x30, 0x33, 0x30, 0x30, 0x30, 0x36, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9961,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9962,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9963,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9964,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9965,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9966,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9967,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9968,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9969,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9970,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9971,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9972,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9973,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9974,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x31, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9975,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9976,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9977,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9978,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x33, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9979,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9980,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9981,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9982,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9983,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9984,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9985,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9986,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9987,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9988,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9989,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9990,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9991,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9992,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x31, 0x54, 0x31, 0x33, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9993,64,"style","Trailing whitespace is superfluous."," 0x34, 0x33, 0x3a, 0x32, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9994,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9995,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9996,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9997,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9998,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",9999,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10000,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10001,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10002,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10003,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10004,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10005,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10006,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10007,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10008,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10009,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10010,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10011,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10012,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10013,64,"style","Trailing whitespace is superfluous."," 0x34, 0x39, 0x36, 0x30, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10014,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10015,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10016,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10017,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10018,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10019,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10020,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10021,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10022,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10023,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10024,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10025,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10026,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10027,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10028,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10029,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10030,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10031,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10032,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10033,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10034,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10035,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10036,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10037,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10038,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10039,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10040,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10041,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10042,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10043,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10044,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10045,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10046,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10047,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10048,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x32, 0x30, 0x30, 0x34, 0x39, 0x36, 0x30, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10049,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10050,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, 0x34, 0x39, 0x36, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10051,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10052,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10053,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10054,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10055,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10056,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10057,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10058,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10059,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x32, 0x38, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10060,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x34, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10061,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10062,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10063,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10064,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10065,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10066,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10067,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10068,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10069,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10070,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x39, 0x30, 0x32, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10071,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10072,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10073,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10074,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10075,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10076,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10077,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10078,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10079,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10080,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x30, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10081,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10082,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10083,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10084,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10085,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10086,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10087,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10088,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x38, 0x30, 0x32, 0x30, 0x30, 0x34, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10089,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10090,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10091,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10092,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10093,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10094,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10095,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10096,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10097,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10098,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10099,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10100,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10101,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10102,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10103,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10104,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10105,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10106,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, 0x34, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10107,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10108,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10109,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x39, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10110,64,"style","Trailing whitespace is superfluous."," 0x32, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10111,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10112,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10113,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10114,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10115,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10116,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10117,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10118,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10119,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10120,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x38, 0x54, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10121,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x3a, 0x35, 0x31, 0x3a, 0x34, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10122,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10123,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10124,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10125,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10126,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10127,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10128,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10129,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10130,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10131,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10132,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10133,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10134,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10135,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10136,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10137,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10138,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10139,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10140,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x32, 0x31, 0x34, 0x30, 0x38, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10141,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x30, 0x37, 0x32, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10142,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10143,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10144,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10145,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10146,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10147,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10148,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10149,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10150,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10151,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10152,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10153,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10154,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10155,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10156,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10157,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10158,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10159,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10160,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10161,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10162,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10163,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10164,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10165,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10166,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x32, 0x2d, 0x30, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10167,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10168,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10169,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10170,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10171,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10172,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10173,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10174,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10175,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10176,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x30, 0x38, 0x30, 0x32, 0x30, 0x31, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10177,64,"style","Trailing whitespace is superfluous."," 0x32, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x32, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10178,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10179,64,"style","Trailing whitespace is superfluous."," 0x37, 0x32, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10180,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10181,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10182,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10183,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10184,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10185,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10186,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10187,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10188,64,"style","Trailing whitespace is superfluous."," 0x32, 0x37, 0x33, 0x31, 0x32, 0x38, 0x33, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10189,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10190,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10191,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10192,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10193,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10194,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10195,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10196,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10197,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10198,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10199,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10200,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10201,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10202,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10203,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10204,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10205,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10206,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10207,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x30, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10208,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x32, 0x34, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10209,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10210,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10211,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10212,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10213,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10214,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10215,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10216,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x34, 0x30, 0x38, 0x30, 0x32, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10217,64,"style","Trailing whitespace is superfluous."," 0x37, 0x32, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10218,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x30, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10219,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x32, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10220,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10221,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10222,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10223,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10224,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10225,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10226,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10227,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10228,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10229,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10230,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x33, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10231,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10232,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10233,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x30, 0x32, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10234,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10235,64,"style","Trailing whitespace is superfluous."," 0x37, 0x32, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10236,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10237,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10238,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10239,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10240,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10241,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10242,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10243,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10244,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10245,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10246,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10247,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10248,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x33, 0x54, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10249,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3a, 0x32, 0x35, 0x3a, 0x30, 0x38, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10250,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10251,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10252,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10253,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10254,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10255,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10256,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10257,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10258,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10259,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10260,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10261,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10262,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10263,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10264,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10265,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10266,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10267,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10268,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x30, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10269,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x38, 0x37, 0x37, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10270,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10271,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10272,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10273,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10274,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10275,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10276,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10277,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10278,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10279,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10280,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10281,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10282,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10283,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10284,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10285,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10286,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10287,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10288,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10289,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10290,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10291,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10292,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10293,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10294,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10295,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10296,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10297,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10298,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10299,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10300,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10301,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10302,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10303,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10304,64,"style","Trailing whitespace is superfluous."," 0x38, 0x37, 0x30, 0x30, 0x32, 0x30, 0x30, 0x32, 0x38, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10305,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10306,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10307,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10308,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10309,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10310,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10311,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10312,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10313,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10314,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10315,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10316,64,"style","Trailing whitespace is superfluous."," 0x36, 0x39, 0x31, 0x38, 0x32, 0x33, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10317,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10318,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10319,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10320,64,"style","Trailing whitespace is superfluous."," 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10321,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10322,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10323,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10324,64,"style","Trailing whitespace is superfluous."," 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10325,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10326,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10327,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10328,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x39, 0x30, 0x30, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10329,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10330,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10331,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10332,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10333,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10334,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10335,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10336,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10337,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, 0x32, 0x38, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10338,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10339,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10340,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10341,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10342,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10343,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10344,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10345,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10346,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x30, 0x30, 0x32, 0x38, 0x37, 0x37, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10347,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10348,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x30, 0x32, 0x38, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10349,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10350,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10351,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10352,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10353,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10354,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10355,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10356,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10357,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10358,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10359,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10360,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10361,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10362,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10363,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10364,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x30, 0x32, 0x38, 0x37, 0x37, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10365,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10366,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10367,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x39, 0x30, 0x30, 0x20, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10368,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10369,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10370,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10371,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10372,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10373,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10374,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10375,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10376,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10377,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10378,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10379,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x32, 0x2d, 0x30, 0x36, 0x2d, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10380,64,"style","Trailing whitespace is superfluous."," 0x38, 0x54, 0x31, 0x36, 0x3a, 0x33, 0x36, 0x3a, 0x32, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10381,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10382,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10383,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10384,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10385,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10386,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10387,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10388,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10389,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10390,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10391,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10392,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10393,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10394,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10395,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10396,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10397,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10398,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10399,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10400,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x38, 0x39, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10401,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10402,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10403,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10404,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10405,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10406,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10407,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10409,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10410,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10411,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10412,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10413,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10414,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10415,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10416,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10417,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10418,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10419,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10420,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10421,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10422,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10423,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10424,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10425,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x32, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10426,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10427,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10428,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10429,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10430,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10431,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10432,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10433,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10434,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10435,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x30, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10436,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10437,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10438,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x36, 0x38, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10439,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10440,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10441,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10442,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10443,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10444,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10445,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10446,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10447,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x32, 0x35, 0x34, 0x38, 0x38, 0x31, 0x36, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10448,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10449,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10450,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10451,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10452,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10453,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10454,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10455,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10456,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10457,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10458,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10459,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10460,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10461,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10462,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10463,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10464,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10465,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10466,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10467,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x38, 0x39, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10468,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10469,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10470,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10471,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10472,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10473,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10474,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10475,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10476,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x30, 0x36, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10477,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10478,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x38, 0x39, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10479,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10480,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10481,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10482,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10483,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10484,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10485,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10486,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10487,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10488,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10489,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x32, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10490,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10491,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10492,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10493,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10494,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x36, 0x38, 0x39, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10495,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10496,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10497,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x31, 0x35, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10498,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10499,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10500,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10501,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10502,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10503,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10504,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10505,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10506,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10507,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10508,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x31, 0x34, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10509,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10510,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10511,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10512,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10513,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10514,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10515,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10516,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10517,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10518,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10519,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10520,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10521,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10522,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10523,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10524,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10525,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10526,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10527,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10528,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10529,64,"style","Trailing whitespace is superfluous."," 0x32, 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10530,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10531,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10532,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10533,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10534,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10535,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10536,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10537,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10538,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10539,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10540,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10541,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10542,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10543,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10544,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10545,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10546,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10547,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10548,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10549,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10550,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10551,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10552,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10553,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10554,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10555,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10556,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10557,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10558,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10559,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10560,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10561,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10562,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10563,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10564,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x30, 0x32, 0x38, 0x32, 0x32, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10565,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10566,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x35, 0x30, 0x32, 0x38, 0x32, 0x32, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10567,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10568,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10569,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10570,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10571,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10572,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10573,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10574,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10575,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x31, 0x37, 0x38, 0x38, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10576,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10577,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10578,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10579,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10580,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10581,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10582,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10583,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10584,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10585,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10586,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x39, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10587,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10588,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10589,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10590,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10591,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10592,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10593,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10594,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10595,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x32, 0x38, 0x32, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10596,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10597,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10598,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10599,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10600,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10601,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10602,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10603,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10604,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x35, 0x30, 0x32, 0x38, 0x32, 0x32, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10605,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10606,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x32, 0x38, 0x32, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10607,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10608,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10609,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10610,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10611,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10612,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10613,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10614,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10615,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10616,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10617,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x30, 0x31, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10618,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10619,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10620,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10621,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10622,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x35, 0x30, 0x32, 0x38, 0x32, 0x32, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10623,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10624,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10625,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x36, 0x20, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10626,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10627,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10628,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10629,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10630,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10631,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10632,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10633,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10634,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10635,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10636,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x54, 0x30, 0x30, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10637,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10638,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10639,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10640,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10641,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10642,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10643,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10644,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10645,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10646,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10647,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10648,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10649,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10650,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10651,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10652,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10653,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10654,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10655,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10656,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x37, 0x30, 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10657,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10658,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10659,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10660,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10661,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10662,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10663,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10664,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10665,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10666,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10667,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10668,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10669,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10670,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10671,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10672,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10673,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10674,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10675,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10676,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10677,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10678,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10679,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10680,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10681,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10682,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10683,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10684,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10685,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10686,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10687,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10688,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10689,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10690,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10691,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10692,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x35, 0x30, 0x31, 0x36, 0x31, 0x31, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10693,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10694,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x31, 0x36, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10695,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10696,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10697,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10698,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10699,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10700,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10701,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10702,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10703,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x37, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10704,64,"style","Trailing whitespace is superfluous."," 0x34, 0x32, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10705,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10706,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10707,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10708,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10709,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10710,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10711,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10712,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10713,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10714,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x38, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10715,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10716,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10717,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10718,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10719,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10720,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10721,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10722,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10723,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10724,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10725,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10726,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10727,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10728,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10729,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10730,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10731,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10732,64,"style","Trailing whitespace is superfluous."," 0x38, 0x37, 0x30, 0x30, 0x31, 0x35, 0x30, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10733,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10734,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10735,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10736,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10737,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10738,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10739,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10740,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10741,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10742,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10743,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10744,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10745,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10746,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10747,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10748,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10749,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10750,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x31, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10751,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10752,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10753,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10754,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10755,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10756,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10757,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10758,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10759,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10760,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10761,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10762,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10763,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10764,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x34, 0x54, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10765,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10766,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10767,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10768,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10769,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10770,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10771,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10772,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10773,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10774,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10775,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10776,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10777,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10778,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10779,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10780,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10781,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10782,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10783,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10784,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10785,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x32, 0x35, 0x35, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10786,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10787,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10788,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10789,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10790,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10791,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10792,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10793,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10794,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10795,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10796,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10797,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10798,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10799,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10800,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10801,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10802,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10803,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10804,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10805,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10806,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10807,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10808,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10809,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10810,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x31, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10811,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10812,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10813,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10814,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10815,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10816,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10817,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10818,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10819,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10820,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x30, 0x31, 0x35, 0x30, 0x30, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10821,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10822,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x31, 0x2d, 0x35, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10823,64,"style","Trailing whitespace is superfluous."," 0x35, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10824,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10825,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10826,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10827,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10828,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10829,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10830,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10831,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10832,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x36, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10833,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10834,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10835,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10836,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10837,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10838,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10839,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10840,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10841,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10842,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10843,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10844,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10845,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10846,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10847,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10848,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10849,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10850,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10851,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10852,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10853,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x35, 0x30, 0x30, 0x32, 0x35, 0x35, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10854,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10855,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10856,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10857,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10858,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10859,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10860,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10861,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10862,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x32, 0x35, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10863,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10864,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x35, 0x30, 0x30, 0x32, 0x35, 0x35, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10865,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10866,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10867,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10868,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10869,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10870,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10871,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10872,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10873,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10874,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10875,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x39, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10876,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10877,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10878,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10879,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10880,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x32, 0x35, 0x35, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10881,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10882,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10883,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10884,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10885,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10886,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10887,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10888,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10889,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10890,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10891,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10892,64,"style","Trailing whitespace is superfluous."," 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10893,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10894,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10895,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x39, 0x54, 0x30, 0x30, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10896,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10897,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10898,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10899,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10900,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10901,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10902,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10903,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10904,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10905,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10906,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10907,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10908,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10909,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10910,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10911,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10912,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10913,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10914,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10915,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x31, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10916,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x34, 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10917,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10918,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10919,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10920,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10921,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10922,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10923,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10924,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10925,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10926,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10927,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10928,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10929,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10930,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10931,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10932,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10933,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10934,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10935,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10936,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10937,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10938,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10939,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10940,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10941,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10942,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10943,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10944,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10945,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10946,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10947,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10948,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10949,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10950,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10951,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x31, 0x30, 0x30, 0x30, 0x31, 0x34, 0x31, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10952,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10953,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x34, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10954,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10955,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10956,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10957,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10958,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10959,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10960,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10961,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10962,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x35, 0x33, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10963,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10964,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10965,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10966,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10967,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10968,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10969,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10970,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10971,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10972,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10973,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x33, 0x37, 0x35, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10974,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10975,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10976,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10977,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10978,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10979,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10980,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10981,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10982,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x31, 0x2d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10983,64,"style","Trailing whitespace is superfluous."," 0x34, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10984,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10985,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10986,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10987,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10988,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10989,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10990,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10991,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x30, 0x31, 0x30, 0x30, 0x30, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10992,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10993,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x31, 0x2d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10994,64,"style","Trailing whitespace is superfluous."," 0x34, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10995,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10996,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10997,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10998,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",10999,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11000,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11001,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11002,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11003,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11004,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11005,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x31, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11006,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11007,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11008,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11009,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x31, 0x2d, 0x30, 0x30, 0x30, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11010,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11011,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11012,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x33, 0x37, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11013,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11014,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11015,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11016,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11017,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11018,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11019,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11020,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11021,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11022,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11023,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x33, 0x54, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11024,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11025,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11026,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11027,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11028,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11029,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11030,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11031,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11032,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11033,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11034,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11035,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11036,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11037,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11038,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11039,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11040,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11041,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11042,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11043,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11044,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x33, 0x38, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11045,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11046,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11047,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11048,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11049,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11050,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11051,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11052,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11053,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11054,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11055,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11056,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11057,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11058,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11059,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11060,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11061,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11062,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11063,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11064,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11065,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11066,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11067,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11068,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11069,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11070,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11071,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11072,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11073,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11074,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11075,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11076,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11077,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11078,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11079,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x30, 0x30, 0x30, 0x30, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11080,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11081,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11082,64,"style","Trailing whitespace is superfluous."," 0x33, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11083,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11084,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11085,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11086,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11087,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11088,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11089,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11090,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x37, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11091,64,"style","Trailing whitespace is superfluous."," 0x36, 0x33, 0x35, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11092,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11093,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11094,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11095,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11096,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11097,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11098,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11099,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11100,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11101,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x39, 0x33, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11102,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11103,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11104,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11105,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11106,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11107,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11108,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11109,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11110,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11111,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11112,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11113,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11114,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11115,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11116,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11117,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11118,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11119,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x30, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11120,64,"style","Trailing whitespace is superfluous."," 0x33, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11121,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11122,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11123,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11124,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11125,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11126,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11127,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11128,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11129,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11130,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11131,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11132,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11133,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11134,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11135,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11136,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11137,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11138,64,"style","Trailing whitespace is superfluous."," 0x33, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11139,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11140,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11141,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11142,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11143,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11144,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11145,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11146,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11147,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11148,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11149,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11150,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11151,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x54, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11152,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11153,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11154,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11155,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11156,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11157,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11158,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11159,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11160,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11161,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11162,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11163,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11164,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11165,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11166,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11167,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11168,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11169,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11170,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11171,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11172,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x39, 0x31, 0x36, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11173,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11174,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11175,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11176,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11177,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11178,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11179,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11180,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11181,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11182,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11183,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11184,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11185,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11186,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11187,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11188,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11189,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11190,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11191,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11192,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11193,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11194,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11195,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11196,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11197,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x30, 0x2d, 0x30, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11198,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11199,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11200,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11201,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11202,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11203,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11204,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11205,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11206,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11207,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x30, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11208,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11209,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11210,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11211,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11212,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11213,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11214,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11215,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11216,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11217,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11218,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11219,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x32, 0x37, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11220,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11221,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11222,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11223,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11224,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11225,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11226,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11227,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11228,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11229,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x39, 0x20, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11230,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11231,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11232,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11233,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11234,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11235,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11236,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11237,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11238,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11239,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x31, 0x36, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11240,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11241,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11242,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11243,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11244,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11245,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11246,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11247,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x35, 0x30, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11248,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11249,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11250,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x31, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11251,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11252,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11253,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11254,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11255,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11256,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11257,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11258,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11259,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11260,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11261,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11262,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11263,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11264,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11265,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11266,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11267,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11268,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11269,64,"style","Trailing whitespace is superfluous."," 0x34, 0x39, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11270,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11271,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11272,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11273,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11274,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11275,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11276,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11277,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11278,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11279,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x30, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11280,64,"style","Trailing whitespace is superfluous."," 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11281,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11282,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11283,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11284,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11285,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11286,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11287,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11288,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11289,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11290,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11291,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11292,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x2f, 0x41, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11293,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11294,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11295,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11296,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11297,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11298,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11299,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11300,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x38, 0x37, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11301,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11302,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11303,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11304,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x6e, 0x64, 0x3e, 0x5b, 0x41, 0x6d, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11305,64,"style","Trailing whitespace is superfluous."," 0x64, 0x5d, 0x3c, 0x2f, 0x61, 0x6d, 0x65, 0x6e, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11306,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11307,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11308,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11309,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11310,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11311,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11312,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11313,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11314,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11315,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11316,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11317,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11318,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11319,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11320,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11321,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11322,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11323,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11324,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11325,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11326,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11327,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11328,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11329,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x31, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11330,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11331,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11332,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11333,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11334,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11335,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11336,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11337,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11338,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11339,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x38, 0x37, 0x36, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11340,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11341,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x38, 0x37, 0x36, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11342,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11343,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11344,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11345,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11346,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x2f, 0x41, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11347,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11348,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11349,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11350,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x36, 0x39, 0x34, 0x33, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11351,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11352,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11353,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11354,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11355,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11356,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11357,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11358,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11359,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11360,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11361,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11362,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11363,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11364,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11365,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11366,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11367,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11368,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11369,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11370,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11371,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11372,64,"style","Trailing whitespace is superfluous."," 0x38, 0x37, 0x36, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11373,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11374,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11375,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11376,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11377,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11378,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11379,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11380,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x30, 0x30, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11381,64,"style","Trailing whitespace is superfluous."," 0x37, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11382,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11383,64,"style","Trailing whitespace is superfluous."," 0x38, 0x37, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11384,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11385,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11386,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11387,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11388,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11389,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11390,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11391,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11392,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11393,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11394,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x31, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11395,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11396,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11397,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11398,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11399,64,"style","Trailing whitespace is superfluous."," 0x37, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11400,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11401,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11402,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11403,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11404,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11405,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x20, 0x5b, 0x41, 0x6d, 0x65, 0x6e, 0x64, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11406,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11407,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11408,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11409,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11410,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11411,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11412,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11413,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11414,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x30, 0x30, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11415,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11416,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11417,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11418,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11419,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11420,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11421,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11422,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11423,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11424,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11425,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11426,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11427,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11428,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11429,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11430,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11431,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11432,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11433,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11434,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11435,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x37, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11436,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11437,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11438,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11439,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11440,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11441,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11442,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11443,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11444,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11445,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11446,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11447,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11448,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11449,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11450,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11451,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11452,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11453,64,"style","Trailing whitespace is superfluous."," 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11454,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11455,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11456,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11457,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11458,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11459,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11460,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11461,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11462,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11463,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11464,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11465,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11466,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11467,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11468,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11469,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11470,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11471,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x37, 0x37, 0x37, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11472,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11473,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x37, 0x37, 0x37, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11474,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11475,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11476,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11477,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11478,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11479,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11480,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11481,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11482,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x36, 0x36, 0x33, 0x39, 0x32, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11483,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11484,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11485,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11486,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11487,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11488,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11489,64,"style","Trailing whitespace is superfluous."," 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11490,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11491,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11492,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11493,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11494,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x34, 0x31, 0x32, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11495,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11496,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11497,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11498,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11499,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11500,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11501,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11502,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11503,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11504,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11505,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11506,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11507,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11508,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11509,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11510,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11511,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11512,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x30, 0x30, 0x30, 0x30, 0x30, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11513,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11514,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11515,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11516,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11517,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11518,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11519,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11520,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11521,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11522,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11523,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11524,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11525,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11526,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x32, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11527,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11528,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11529,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11530,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11531,64,"style","Trailing whitespace is superfluous."," 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11532,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11533,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x34, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11534,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11535,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11536,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11537,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11538,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11539,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11540,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11541,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11542,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11543,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11544,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11545,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x30, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11546,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x39, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11547,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11548,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11549,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11550,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11551,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11552,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11553,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11554,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11555,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11556,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11557,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11558,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11559,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11560,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11561,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11562,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11563,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11564,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11565,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11566,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11567,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11568,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11569,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11570,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11571,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11572,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11573,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11574,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11575,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11576,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11577,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11578,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11579,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11580,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11581,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11582,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11583,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11584,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11585,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11586,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11587,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11588,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11589,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11590,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11591,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11592,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x31, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11593,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11594,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11595,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11596,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11597,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11598,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11599,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11600,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11601,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11602,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x30, 0x30, 0x33, 0x34, 0x32, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11603,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11604,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11605,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11606,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11607,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11608,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11609,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11610,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11611,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x35, 0x34, 0x31, 0x38, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11612,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11613,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11614,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11615,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11616,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11617,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11618,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11619,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11620,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11621,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11622,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x35, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11623,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11624,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11625,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11626,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11627,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11628,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11629,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11630,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11631,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x33, 0x34, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11632,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11633,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11634,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11635,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11636,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11637,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11638,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11639,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11640,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11641,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11642,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11643,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11644,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11645,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11646,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11647,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11648,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11649,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11650,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11651,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11652,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11653,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11654,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11655,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11656,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x2d, 0x30, 0x30, 0x30, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11657,64,"style","Trailing whitespace is superfluous."," 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11658,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11659,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11660,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11661,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11662,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11663,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11664,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11665,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11666,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11667,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11668,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11669,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11670,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x34, 0x54, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11671,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11672,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11673,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11674,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11675,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11676,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11677,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11678,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11679,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11680,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11681,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11682,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11683,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11684,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11685,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11686,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11687,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11688,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11689,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11690,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11691,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x30, 0x31, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11692,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11693,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11694,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11695,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11696,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11697,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11698,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11699,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11700,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11701,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11702,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11703,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11704,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11705,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11706,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11707,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11708,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11709,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11710,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11711,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11712,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11713,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11714,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11715,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11716,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x39, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11717,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11718,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11719,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11720,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11721,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11722,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11723,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11724,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11725,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11726,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11727,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11728,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11729,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11730,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11731,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11732,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11733,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11734,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11735,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11736,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x37, 0x35, 0x34, 0x31, 0x38, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11737,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11738,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11739,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11740,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11741,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11742,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11743,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11744,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11745,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11746,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x32, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11747,64,"style","Trailing whitespace is superfluous."," 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11748,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11749,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11750,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11751,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11752,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11753,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11754,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11755,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11756,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x31, 0x30, 0x30, 0x31, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11757,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11758,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11759,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11760,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11761,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11762,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11763,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11764,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11765,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x30, 0x31, 0x30, 0x30, 0x31, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11766,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11767,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11768,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11769,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11770,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11771,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11772,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11773,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11774,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11775,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11776,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x39, 0x39, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11777,64,"style","Trailing whitespace is superfluous."," 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11778,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11779,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11780,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11781,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x30, 0x31, 0x30, 0x30, 0x31, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11782,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11783,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11784,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x34, 0x36, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11785,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11786,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11787,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11788,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11789,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11790,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11791,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11792,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11793,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11794,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11795,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x31, 0x35, 0x54, 0x30, 0x30, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11796,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11797,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11798,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11799,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11800,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11801,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11802,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11803,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11804,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11805,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11806,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11807,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11808,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11809,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11810,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11811,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11812,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11813,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11814,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11815,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11816,64,"style","Trailing whitespace is superfluous."," 0x37, 0x34, 0x35, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11817,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11818,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11819,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11820,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11821,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11822,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11823,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11824,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11825,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11826,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11827,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11828,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11829,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11830,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11831,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11832,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11833,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11834,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11835,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11836,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11837,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11838,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11839,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11840,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11841,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x32, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11842,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11843,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11844,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11845,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11846,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11847,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11848,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11849,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11850,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11851,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x37, 0x34, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11852,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11853,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11854,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11855,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11856,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11857,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11858,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11859,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11860,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x39, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11861,64,"style","Trailing whitespace is superfluous."," 0x38, 0x36, 0x33, 0x34, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11862,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11863,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11864,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11865,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11866,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11867,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11868,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11869,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11870,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11871,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x39, 0x31, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11872,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11873,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11874,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11875,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11876,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11877,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11878,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11879,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11880,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11881,64,"style","Trailing whitespace is superfluous."," 0x37, 0x34, 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11882,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11883,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11884,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11885,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11886,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11887,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11888,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11889,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11890,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x34, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11891,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11892,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11893,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11894,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11895,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11896,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11897,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11898,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11899,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11900,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11901,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x32, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11902,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11903,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11904,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11905,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11906,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x34, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11907,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11908,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11909,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11910,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11911,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11912,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11913,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11914,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11915,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11916,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11917,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11918,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11919,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x39, 0x39, 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11920,64,"style","Trailing whitespace is superfluous."," 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11921,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11922,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11923,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11924,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11925,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11926,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11927,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11928,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11929,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11930,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11931,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11932,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11933,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11934,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11935,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11936,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11937,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11938,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11939,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11940,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x39, 0x39, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11941,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11942,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11943,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11944,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11945,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11946,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11947,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11948,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11949,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11950,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11951,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11952,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11953,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11954,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11955,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11956,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11957,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11958,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11959,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11960,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11961,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11962,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11963,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11964,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11965,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x39, 0x39, 0x39, 0x2d, 0x30, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11966,64,"style","Trailing whitespace is superfluous."," 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11967,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11968,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11969,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11970,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11971,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11972,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11973,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11974,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11975,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11976,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x39, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11977,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11978,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11979,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11980,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11981,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11982,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11983,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11984,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11985,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x39, 0x39, 0x36, 0x35, 0x35, 0x30, 0x36, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11986,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11987,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11988,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11989,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11990,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11991,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11992,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11993,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11994,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11995,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11996,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11997,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x31, 0x36, 0x20, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11998,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",11999,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12000,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12001,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12002,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12003,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12004,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12005,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12006,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12007,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x39, 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12008,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12009,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12010,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12011,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12012,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12013,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12014,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12015,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12016,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x39, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12017,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12018,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12019,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12020,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12021,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12022,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12023,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12024,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12025,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12026,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12027,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x39, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12028,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12029,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12030,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12031,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12032,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x39, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12033,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12034,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12035,64,"style","Trailing whitespace is superfluous."," 0x20, 0x37, 0x31, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12036,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12037,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12038,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12039,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12040,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12041,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12042,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12043,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12044,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12045,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12046,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12047,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x39, 0x54, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12048,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x34, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12049,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12050,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12051,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12052,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12053,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12054,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12055,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12056,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12057,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12058,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12059,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12060,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12061,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12062,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12063,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12064,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12065,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12066,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12067,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12068,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x30, 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12069,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12070,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12071,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12072,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12073,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12074,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12075,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12076,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12077,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12078,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12079,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12080,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12081,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12082,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12083,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12084,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12085,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12086,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12087,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12088,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12089,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12090,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12091,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12092,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12093,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x36, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12094,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12095,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12096,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12097,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12098,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12099,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12100,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12101,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12102,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12103,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, 0x30, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12104,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12105,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12106,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12107,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12108,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12109,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12110,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12111,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12112,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12113,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x34, 0x32, 0x38, 0x31, 0x32, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12114,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12115,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12116,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12117,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12118,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12119,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12120,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12121,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12122,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12123,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12124,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12125,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12126,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12127,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12128,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12129,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12130,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12131,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12132,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12133,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x32, 0x30, 0x32, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12134,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12135,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12136,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12137,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12138,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12139,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12140,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12141,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12142,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x32, 0x30, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12143,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12144,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12145,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12146,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12147,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12148,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12149,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12150,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12151,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12152,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12153,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x39, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12154,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12155,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12156,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12157,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12158,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x32, 0x30, 0x32, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12159,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12160,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12161,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x31, 0x31, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12162,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12163,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12164,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12165,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12166,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12167,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12168,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12169,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12170,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12171,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12172,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x31, 0x36, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12173,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12174,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12175,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12176,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12177,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12178,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12179,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12180,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12181,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12182,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12183,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12184,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12185,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12186,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12187,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12188,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12189,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12190,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12191,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12192,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12193,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12194,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12195,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12196,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12197,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12198,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12199,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12200,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12201,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12202,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12203,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12204,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12205,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12206,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12207,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12208,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12209,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12210,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12211,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12212,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12213,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12214,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12215,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12216,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12217,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12218,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x33, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12219,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12220,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12221,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12222,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12223,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12224,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12225,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12226,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12227,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12228,64,"style","Trailing whitespace is superfluous."," 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x38, 0x39, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12229,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12230,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12231,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12232,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12233,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12234,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12235,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12236,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12237,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x38, 0x37, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12238,64,"style","Trailing whitespace is superfluous."," 0x38, 0x37, 0x39, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12239,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12240,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12241,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12242,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12243,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12244,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12245,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12246,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12247,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12248,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x30, 0x32, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12249,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12250,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12251,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12252,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12253,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12254,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12255,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12256,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12257,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12258,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12259,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12260,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12261,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12262,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12263,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12264,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12265,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12266,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12267,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12268,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12269,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12270,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12271,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12272,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12273,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12274,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12275,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12276,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12277,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12278,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x33, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12279,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12280,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12281,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12282,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12283,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x39, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12284,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12285,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12286,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x32, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12287,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12288,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12289,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12290,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12291,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12292,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12293,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12294,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12295,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12296,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x39, 0x39, 0x38, 0x2d, 0x31, 0x31, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12297,64,"style","Trailing whitespace is superfluous."," 0x33, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12298,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12299,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12300,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12301,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12302,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12303,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12304,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12305,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12306,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12307,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12308,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12309,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12310,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12311,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12312,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12313,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12314,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12315,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12316,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12317,64,"style","Trailing whitespace is superfluous."," 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x36, 0x37, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12318,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12319,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12320,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12321,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12322,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12323,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12324,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12325,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12326,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12327,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12328,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12329,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12330,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12331,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12332,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12333,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12334,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12335,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12336,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12337,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12338,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12339,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12340,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12341,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12342,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, 0x38, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12343,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12344,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12345,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12346,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12347,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12348,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12349,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12350,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12351,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12352,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12353,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x36, 0x36, 0x37, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12354,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12355,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12356,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12357,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12358,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12359,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12360,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12361,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12362,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x39, 0x38, 0x36, 0x38, 0x32, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12363,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12364,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12365,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12366,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12367,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12368,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12369,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12370,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12371,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12372,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12373,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x38, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12374,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12375,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12376,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12377,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12378,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12379,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12380,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12381,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12382,64,"style","Trailing whitespace is superfluous."," 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x36, 0x37, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12383,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12384,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12385,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12386,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12387,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12388,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12389,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12390,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12391,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x36, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12392,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12393,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12394,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12395,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12396,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12397,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12398,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12399,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12400,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12401,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12402,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, 0x38, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12403,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12404,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12405,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12406,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12407,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x36, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12409,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12410,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x38, 0x36, 0x20, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12411,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12412,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12413,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12414,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12415,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12416,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12417,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12418,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12419,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12420,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12421,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x38, 0x2d, 0x31, 0x31, 0x54, 0x30, 0x30, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12422,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12423,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12424,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12425,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12426,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12427,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12428,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12429,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12430,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12431,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12432,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12433,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12434,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12435,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12436,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12437,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12438,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12439,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12440,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12441,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12442,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x37, 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12443,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12444,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12445,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12446,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12447,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12448,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12449,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12450,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12451,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12452,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12453,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12454,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12455,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12456,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12457,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12458,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12459,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12460,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12461,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12462,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12463,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12464,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12465,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12466,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12467,64,"style","Trailing whitespace is superfluous."," 0x39, 0x38, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x36, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12468,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12469,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12470,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12471,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12472,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12473,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12474,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12475,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12476,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12477,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12478,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12479,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12480,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12481,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12482,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12483,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12484,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12485,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12486,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12487,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x35, 0x35, 0x31, 0x35, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12488,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12489,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12490,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12491,64,"style","Trailing whitespace is superfluous."," 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12492,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12493,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12494,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12495,64,"style","Trailing whitespace is superfluous."," 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12496,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12497,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12498,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12499,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x32, 0x36, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12500,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12501,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12502,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12503,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12504,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12505,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12506,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12507,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12508,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12509,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12510,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12511,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12512,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12513,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12514,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12515,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12516,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12517,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12518,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12519,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12520,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12521,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12522,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12523,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12524,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12525,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12526,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12527,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12528,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12529,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x32, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12530,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12531,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12532,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12533,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12534,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12535,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12536,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x32, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12537,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12538,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12539,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12540,64,"style","Trailing whitespace is superfluous."," 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12541,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12542,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12543,64,"style","Trailing whitespace is superfluous."," 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12544,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12545,64,"style","Trailing whitespace is superfluous."," 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12546,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12547,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12548,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x38, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12549,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x36, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12550,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12551,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12552,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12553,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12554,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12555,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12556,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12557,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12558,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12559,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12560,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12561,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12562,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12563,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12564,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12565,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12566,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12567,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12568,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x38, 0x34, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12569,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12570,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12571,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12572,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12573,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12574,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12575,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12576,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12577,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12578,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12579,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12580,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12581,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12582,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12583,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12584,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12585,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12586,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12587,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12588,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12589,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12590,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12591,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12592,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12593,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12594,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12595,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x31, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12596,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12597,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12598,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12599,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12600,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12601,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12602,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12603,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12604,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x39, 0x38, 0x34, 0x33, 0x30, 0x2d, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12605,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x31, 0x38, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12606,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12607,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12608,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12609,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12610,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12611,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12612,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12613,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12614,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x38, 0x35, 0x34, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12615,64,"style","Trailing whitespace is superfluous."," 0x38, 0x32, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12616,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12617,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12618,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12619,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12620,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12621,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12622,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12623,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12624,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12625,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x31, 0x33, 0x30, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12626,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12627,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12628,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12629,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12630,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12631,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12632,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12633,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x38, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12634,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12635,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12636,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12637,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12638,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12639,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12640,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12641,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12642,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12643,64,"style","Trailing whitespace is superfluous."," 0x34, 0x33, 0x30, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12644,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12645,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12646,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12647,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12648,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12649,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12650,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12651,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12652,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12653,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12654,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12655,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x37, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12656,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12657,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12658,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x38, 0x39, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12659,64,"style","Trailing whitespace is superfluous."," 0x34, 0x33, 0x30, 0x2d, 0x39, 0x38, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12660,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12661,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12662,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12663,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12664,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12665,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12666,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12667,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12668,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12669,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12670,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12671,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12672,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12673,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x39, 0x38, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12674,64,"style","Trailing whitespace is superfluous."," 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12675,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12676,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12677,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12678,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12679,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12680,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12681,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12682,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12683,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12684,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12685,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12686,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12687,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12688,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12689,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12690,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12691,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12692,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12693,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12694,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x30, 0x32, 0x32, 0x37, 0x36, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12695,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12696,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12697,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12698,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12699,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12700,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12701,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12702,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12703,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12704,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12705,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12706,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12707,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12708,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12709,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12710,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12711,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12712,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12713,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12714,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12715,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12716,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12717,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12718,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12719,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x39, 0x39, 0x37, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12720,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12721,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12722,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12723,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12724,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12725,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12726,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12727,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12728,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12729,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12730,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x32, 0x37, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12731,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12732,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12733,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12734,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12735,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12736,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12737,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12738,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12739,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x39, 0x37, 0x37, 0x32, 0x30, 0x32, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12740,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12741,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12742,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12743,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12744,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12745,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12746,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12747,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12748,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12749,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12750,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12751,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12752,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12753,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12754,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12755,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12756,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12757,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12758,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12759,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x30, 0x32, 0x32, 0x37, 0x36, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12760,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12761,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12762,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12763,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12764,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12765,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12766,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12767,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12768,64,"style","Trailing whitespace is superfluous."," 0x39, 0x37, 0x2d, 0x30, 0x30, 0x32, 0x32, 0x37, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12769,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12770,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12771,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12772,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12773,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12774,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12775,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12776,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12777,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12778,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12779,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x39, 0x39, 0x37, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12780,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12781,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12782,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12783,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12784,64,"style","Trailing whitespace is superfluous."," 0x39, 0x37, 0x2d, 0x30, 0x30, 0x32, 0x32, 0x37, 0x36, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12785,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12786,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12787,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x39, 0x35, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12788,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12789,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12790,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12791,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12792,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12793,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12794,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12795,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12796,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12797,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12798,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x31, 0x34, 0x54, 0x30, 0x30, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12799,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12800,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12801,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12802,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12803,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12804,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12805,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12806,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12807,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12808,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12809,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12810,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12811,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12812,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12813,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12814,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12815,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12816,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12817,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12818,64,"style","Trailing whitespace is superfluous."," 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12819,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x38, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12820,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12821,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12822,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12823,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12824,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12825,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12826,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12827,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12828,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12829,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12830,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12831,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12832,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12833,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12834,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12835,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12836,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12837,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12838,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12839,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12840,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12841,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12842,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12843,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12844,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12845,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12846,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12847,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12848,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12849,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12850,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12851,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12852,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12853,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12854,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x39, 0x37, 0x2d, 0x30, 0x30, 0x31, 0x34, 0x38, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12855,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12856,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12857,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12858,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12859,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12860,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12861,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12862,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12863,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x37, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12864,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x35, 0x35, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12865,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12866,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12867,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12868,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12869,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12870,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12871,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12872,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12873,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12874,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x33, 0x20, 0x4b, 0x42, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12875,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12876,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12877,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12878,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12879,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12880,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12881,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12882,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12883,64,"style","Trailing whitespace is superfluous."," 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12884,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12885,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12886,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12887,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12888,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12889,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12890,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12891,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12892,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12893,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x38, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12894,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12895,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12896,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12897,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12898,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12899,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12900,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12901,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12902,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12903,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12904,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12905,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12906,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12907,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12908,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12909,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x38, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12910,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12911,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12912,64,"style","Trailing whitespace is superfluous."," 0x38, 0x33, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12913,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12914,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12915,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12916,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12917,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12918,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12919,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12920,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12921,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12922,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x39, 0x37, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12923,64,"style","Trailing whitespace is superfluous."," 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12924,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12925,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12926,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12927,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12928,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12929,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12930,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12931,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12932,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12933,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12934,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12935,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12936,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12937,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12938,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12939,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12940,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12941,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12942,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12943,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x30, 0x31, 0x31, 0x39, 0x35, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12944,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12945,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12946,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12947,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12948,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12949,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12950,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12951,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12952,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12953,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12954,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12955,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12956,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12957,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12958,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12959,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12960,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12961,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12962,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12963,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12964,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12965,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12966,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12967,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12968,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x39, 0x39, 0x37, 0x2d, 0x30, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12969,64,"style","Trailing whitespace is superfluous."," 0x32, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12970,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12971,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12972,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12973,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12974,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12975,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12976,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12977,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12978,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12979,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12980,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12981,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12982,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12983,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12984,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12985,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12986,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12987,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12988,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x39, 0x37, 0x36, 0x32, 0x37, 0x38, 0x33, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12989,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12990,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12991,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12992,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12993,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12994,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12995,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12996,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12997,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12998,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",12999,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13000,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x35, 0x36, 0x38, 0x20, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13001,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13002,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13003,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13004,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13005,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13006,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13007,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13008,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13009,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13010,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13011,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13012,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13013,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13014,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13015,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13016,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13017,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13018,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13019,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13020,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13021,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13022,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13023,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13024,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13025,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13026,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13027,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13028,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13029,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13030,64,"style","Trailing whitespace is superfluous."," 0x39, 0x37, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x33, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13031,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13032,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13033,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13034,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x38, 0x37, 0x30, 0x2d, 0x39, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13035,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13036,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13037,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13038,64,"style","Trailing whitespace is superfluous."," 0x20, 0x35, 0x36, 0x38, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13039,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13040,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13041,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, 0x20, 0x2d, 0x20, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13042,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13043,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13044,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13045,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13046,64,"style","Trailing whitespace is superfluous."," 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13047,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13048,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13049,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13050,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x36, 0x2d, 0x32, 0x33, 0x54, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13051,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x34, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13052,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13053,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13054,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13055,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13056,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13057,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13058,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13059,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13060,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13061,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13062,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13063,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13064,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13065,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13066,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13067,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13068,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13069,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13070,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13071,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x37, 0x37, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13072,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13073,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13074,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13075,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13076,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13077,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13078,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13079,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13080,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13081,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13082,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13083,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13084,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13085,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13086,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13087,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13088,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13089,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13090,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13091,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13092,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13093,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13094,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13095,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13096,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13097,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13098,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13099,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13100,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13101,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13102,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13103,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13104,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13105,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13106,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x39, 0x37, 0x2d, 0x30, 0x30, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13107,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13108,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13109,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13110,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13111,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13112,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13113,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13114,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13115,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13116,64,"style","Trailing whitespace is superfluous."," 0x37, 0x35, 0x33, 0x34, 0x37, 0x37, 0x36, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13117,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13118,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13119,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13120,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13121,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13122,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13123,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13124,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13125,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13126,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13127,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13128,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13129,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13130,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13131,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13132,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13133,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13134,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13135,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13136,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x32, 0x37, 0x37, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13137,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13138,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13139,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13140,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13141,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13142,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13143,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13144,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13145,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x32, 0x37, 0x37, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13146,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13147,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13148,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13149,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13150,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13151,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13152,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13153,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13154,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13155,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13156,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x39, 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13157,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13158,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13159,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13160,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13161,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x32, 0x37, 0x37, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13162,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13163,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13164,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x31, 0x38, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13165,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13166,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13167,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13168,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13169,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13170,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13171,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13172,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13173,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13174,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13175,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x31, 0x34, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13176,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13177,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13178,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13179,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13180,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13181,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13182,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13183,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13184,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13185,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13186,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13187,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13188,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13189,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13190,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13191,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13192,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13193,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13194,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13195,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13196,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13197,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13198,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13199,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13200,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13201,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13202,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13203,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13204,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13205,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13206,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13207,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13208,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13209,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13210,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13211,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13212,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13213,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13214,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13215,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13216,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13217,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13218,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13219,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13220,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13221,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13222,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13223,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13224,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13225,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13226,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13227,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13228,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13229,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13230,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13231,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x39, 0x32, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13232,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13233,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13234,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13235,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13236,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13237,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13238,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13239,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13240,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x36, 0x36, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13241,64,"style","Trailing whitespace is superfluous."," 0x34, 0x34, 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13242,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13243,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13244,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13245,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13246,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13247,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13248,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13249,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13250,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13251,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x37, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13252,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13253,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13254,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13255,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13256,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13257,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13258,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13259,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13260,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13261,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13262,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13263,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13264,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13265,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13266,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13267,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13268,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13269,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13270,64,"style","Trailing whitespace is superfluous."," 0x39, 0x32, 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13271,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13272,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13273,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13274,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13275,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13276,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13277,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13278,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13279,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13280,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13281,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13282,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13283,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13284,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13285,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13286,64,"style","Trailing whitespace is superfluous."," 0x39, 0x32, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13287,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13288,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13289,64,"style","Trailing whitespace is superfluous."," 0x37, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13290,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13291,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13292,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13293,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13294,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13295,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13296,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13297,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13298,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13299,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x36, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x54, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13300,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13301,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13302,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13303,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13304,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13305,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13306,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13307,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13308,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13309,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13310,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13311,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13312,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13313,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13314,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13315,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13316,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13317,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13318,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13319,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13320,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x36, 0x31, 0x35, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13321,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13322,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13323,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13324,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13325,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13326,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13327,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13328,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13329,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13330,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13331,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13332,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13333,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13334,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13335,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13336,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13337,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13338,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13339,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13340,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13341,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13342,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13343,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13344,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13345,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x39, 0x39, 0x36, 0x2d, 0x30, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13346,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13347,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13348,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13349,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13350,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13351,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13352,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13353,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13354,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13355,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13356,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x31, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13357,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13358,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13359,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13360,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13361,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13362,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13363,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13364,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13365,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x39, 0x36, 0x36, 0x31, 0x31, 0x39, 0x36, 0x36, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13366,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13367,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13368,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13369,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13370,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13371,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13372,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13373,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13374,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13375,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13376,64,"style","Trailing whitespace is superfluous."," 0x32, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13377,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13378,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13379,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13380,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13381,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13382,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13383,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13384,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13385,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x30, 0x36, 0x31, 0x35, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13386,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13387,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13388,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13389,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13390,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13391,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13392,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13393,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13394,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x31, 0x35, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13395,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13396,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13397,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13398,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13399,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13400,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13401,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13402,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13403,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13404,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13405,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x39, 0x39, 0x36, 0x2d, 0x30, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13406,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13407,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13408,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13409,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x35, 0x30, 0x30, 0x30, 0x35, 0x2d, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13410,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x30, 0x30, 0x36, 0x31, 0x35, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13411,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13412,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13413,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x37, 0x32, 0x20, 0x4b, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13414,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13415,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13416,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13417,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13418,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13419,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13420,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13421,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13422,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13423,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x36, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13424,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x31, 0x34, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13425,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13426,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13427,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13428,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13429,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13430,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13431,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13432,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13433,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13434,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13435,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13436,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x4b, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13437,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13438,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13439,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13440,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13441,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13442,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13443,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13444,64,"style","Trailing whitespace is superfluous."," 0x35, 0x37, 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x31, 0x33, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13445,64,"style","Trailing whitespace is superfluous."," 0x36, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13446,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13447,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13448,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13449,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13450,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13451,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13452,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13453,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13454,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13455,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13456,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13457,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13458,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13459,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13460,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13461,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13462,64,"style","Trailing whitespace is superfluous."," 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13463,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13464,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13465,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13466,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13467,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13468,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13469,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13470,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13471,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13472,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13473,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13474,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13475,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13476,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13477,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13478,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13479,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13480,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x2d, 0x30, 0x31, 0x33, 0x35, 0x36, 0x33, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13481,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13482,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13483,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13484,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13485,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13486,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13487,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13488,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13489,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x36, 0x35, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13490,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x37, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13491,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13492,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13493,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x41, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13494,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x61, 0x6c, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13495,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13496,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x61, 0x6e, 0x64, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13497,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x2c, 0x20, 0x6e, 0x6f, 0x74, 0x20, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13498,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x4b, 0x20, 0x49, 0x74, 0x65, 0x6d, 0x20, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13499,64,"style","Trailing whitespace is superfluous."," 0x35, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13500,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13501,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13502,64,"style","Trailing whitespace is superfluous."," 0x39, 0x37, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13503,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13504,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13505,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13506,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13507,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13508,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13509,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13510,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13511,64,"style","Trailing whitespace is superfluous."," 0x36, 0x2d, 0x30, 0x31, 0x33, 0x35, 0x36, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13512,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13513,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13514,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13515,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13516,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13517,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13518,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13519,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13520,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x2d, 0x30, 0x31, 0x33, 0x35, 0x36, 0x33, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13521,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13522,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13523,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13524,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13525,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13526,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13527,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13528,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13529,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13530,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13531,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x39, 0x39, 0x36, 0x2d, 0x30, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13532,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13533,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13534,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13535,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13536,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x2d, 0x30, 0x31, 0x33, 0x35, 0x36, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13537,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13538,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13539,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, 0x37, 0x20, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13540,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13541,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13542,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x4b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13543,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x41, 0x6e, 0x6e, 0x75, 0x61, 0x6c, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13544,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13545,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x20, 0x31, 0x33, 0x20, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13546,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x2c, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13547,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6f, 0x74, 0x20, 0x53, 0x2d, 0x4b, 0x20, 0x49, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13548,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x20, 0x34, 0x30, 0x35, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13549,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13550,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13551,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x39, 0x39, 0x36, 0x2d, 0x30, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13552,64,"style","Trailing whitespace is superfluous."," 0x31, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13553,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13554,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13555,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13556,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13557,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13558,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13559,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13560,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13561,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13562,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13563,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13564,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13565,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13566,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13567,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13568,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13569,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13570,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13571,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13572,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x2d, 0x30, 0x30, 0x32, 0x35, 0x35, 0x31, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13573,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13574,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13575,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13576,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13577,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13578,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13579,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13580,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13581,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13582,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13583,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13584,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13585,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13586,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13587,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13588,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13589,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x2d, 0x31, 0x37, 0x39, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13590,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13591,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13592,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13593,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13594,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13595,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13596,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13597,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x31, 0x39, 0x39, 0x36, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13598,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13599,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13600,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13601,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13602,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13603,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13604,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13605,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13606,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13607,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, 0x39, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13608,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x35, 0x35, 0x31, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13609,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13610,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13611,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13612,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13613,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13614,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13615,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13616,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13617,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x39, 0x36, 0x35, 0x31, 0x39, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13618,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13619,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13620,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13621,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13622,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13623,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13624,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13625,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13626,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13627,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13628,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x38, 0x35, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13629,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13630,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13631,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13632,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13633,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13634,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13635,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13636,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13637,64,"style","Trailing whitespace is superfluous."," 0x39, 0x36, 0x2d, 0x30, 0x30, 0x32, 0x35, 0x35, 0x31, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13638,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13639,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13640,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13641,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13642,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13643,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13644,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13645,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13646,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x30, 0x32, 0x35, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13647,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13648,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13649,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13650,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13651,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13652,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13653,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13654,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13655,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13656,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13657,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x39, 0x39, 0x36, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13658,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13659,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13660,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13661,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13662,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x39, 0x36, 0x2d, 0x30, 0x30, 0x32, 0x35, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13663,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13664,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13665,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x38, 0x35, 0x20, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13666,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13667,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13668,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13669,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13670,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13671,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13672,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13673,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13674,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13675,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x31, 0x39, 0x39, 0x36, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13676,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x31, 0x34, 0x54, 0x30, 0x30, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13677,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3a, 0x30, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13678,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13679,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13680,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13681,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13682,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13683,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13684,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13685,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13686,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13687,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13688,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13689,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13690,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13691,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13692,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13693,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13694,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13695,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13696,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x35, 0x37, 0x2d, 0x39, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13697,64,"style","Trailing whitespace is superfluous."," 0x39, 0x38, 0x34, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13698,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13699,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13700,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13701,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13702,64,"style","Trailing whitespace is superfluous."," 0x37, 0x39, 0x34, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13703,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13704,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13705,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13706,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13707,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13708,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13709,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13710,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13711,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13712,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13713,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13714,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x39, 0x34, 0x38, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13715,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13716,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13717,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13718,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13719,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13720,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13721,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13722,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13723,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13724,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13725,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13726,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13727,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13728,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13729,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13730,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13731,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, 0x31, 0x32, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13732,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x39, 0x35, 0x2d, 0x30, 0x30, 0x39, 0x38, 0x34, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13733,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13734,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13735,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13736,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13737,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13738,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13739,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13740,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13741,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13742,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x31, 0x32, 0x30, 0x32, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13743,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13744,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13745,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13746,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13747,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13748,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13749,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13750,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13751,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13752,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x33, 0x20, 0x4b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13753,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13754,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13755,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13756,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13757,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13758,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13759,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13760,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13761,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x35, 0x37, 0x2d, 0x39, 0x35, 0x2d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13762,64,"style","Trailing whitespace is superfluous."," 0x39, 0x38, 0x34, 0x33, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13763,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13764,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13765,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13766,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13767,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13768,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13769,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13770,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, 0x39, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13771,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x38, 0x34, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13772,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13773,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13774,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13775,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13776,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13777,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13778,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13779,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13780,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13781,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13782,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x31, 0x34, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13783,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13784,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13785,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13786,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x30, 0x35, 0x37, 0x2d, 0x39, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13787,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x38, 0x34, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13788,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13789,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13790,64,"style","Trailing whitespace is superfluous."," 0x20, 0x38, 0x33, 0x20, 0x4b, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13791,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13792,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13793,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13794,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13795,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13796,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13797,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13798,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13799,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13800,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x39, 0x39, 0x35, 0x2d, 0x31, 0x31, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13801,64,"style","Trailing whitespace is superfluous."," 0x34, 0x54, 0x30, 0x30, 0x3a, 0x30, 0x30, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13802,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13803,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13804,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13805,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13806,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13807,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13808,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13809,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13810,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13811,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13812,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x43, 0x49, 0x4b, 0x3d, 0x30, 0x30, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13813,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13814,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13815,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13816,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13817,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13818,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13819,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13820,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13821,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13822,64,"style","Trailing whitespace is superfluous."," 0x43, 0x49, 0x4b, 0x3d, 0x45, 0x41, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13823,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13824,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13825,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x31, 0x30, 0x2d, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13826,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x73, 0x74, 0x61, 0x72, 0x74, 0x3d, 0x30, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13827,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13828,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13829,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13830,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13831,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13832,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13833,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13834,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13835,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13836,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13837,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13838,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13839,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13840,64,"style","Trailing whitespace is superfluous."," 0x43, 0x49, 0x4b, 0x3d, 0x45, 0x41, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13841,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13842,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13843,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x31, 0x30, 0x2d, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13844,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x73, 0x74, 0x61, 0x72, 0x74, 0x3d, 0x30, 0x26, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13845,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13846,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13847,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x75, 0x74, 0x3d, 0x61, 0x74, 0x6f, 0x6d, 0x22, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13848,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x73, 0x65, 0x6c, 0x66, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13849,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x61, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13850,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6c, 0x69, 0x63, 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13851,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x6f, 0x6d, 0x2b, 0x78, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13852,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13853,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13854,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13855,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13856,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13857,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13858,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13859,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13860,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x43, 0x49, 0x4b, 0x3d, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13861,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x32, 0x35, 0x31, 0x35, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13862,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x31, 0x30, 0x2d, 0x25, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13863,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13864,64,"style","Trailing whitespace is superfluous."," 0x65, 0x61, 0x3d, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13865,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x62, 0x3d, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13866,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13867,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13868,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13869,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x75, 0x74, 0x70, 0x75, 0x74, 0x3d, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13870,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x73, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13871,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x3d, 0x31, 0x30, 0x30, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13872,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x6e, 0x65, 0x78, 0x74, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13873,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x61, 0x70, 0x70, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13874,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x2f, 0x61, 0x74, 0x6f, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13875,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2b, 0x78, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13876,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13877,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x45, 0x4c, 0x45, 0x43, 0x54, 0x52, 0x4f, 0x4e, 0x49, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13878,64,"style","Trailing whitespace is superfluous."," 0x43, 0x20, 0x41, 0x52, 0x54, 0x53, 0x20, 0x49, 0x4e, 0x43, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13879,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x20, 0x20, 0x28, 0x30, 0x30, 0x30, 0x30, 0x37, 0x31, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13880,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x35, 0x29, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13881,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13882,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13883,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x31, 0x2d, 0x32, 0x30, 0x54, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13884,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x35, 0x34, 0x3a, 0x32, 0x31, 0x2d, 0x30, 0x35, 0x3a, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13885,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13886,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x3c, 0x2f, 0x66, 0x65, 0x65, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13887,74,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a)), date = structure(1579542861, class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13888,77,"style","Trailing whitespace is superfluous."," ""POSIXt""), tzone = ""GMT""), times = c(redirect = 0, namelookup = 0.08977, ","trailing_whitespace_linter" -"vignettes/intro/0/browse-edgar-3c23fc.R",13889,73,"style","Trailing whitespace is superfluous."," connect = 0.198839, pretransfer = 0.31077, starttransfer = 0.622565, ","trailing_whitespace_linter" -"vignettes/parsing.Rmd",16,35,"style","Use TRUE instead of the symbol T.","knitr::opts_chunk$set(collapse = T, comment = ""#>"")","T_and_F_symbol_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1,121,"style","Lines should not be more than 120 characters.","structure(list(url = ""/browse-edgar?action=getcompany&CIK=STX&owner=exclude&type=10-Q&dateb=&start=0&count=40&output=atom"", ","line_length_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1,124,"style","Trailing whitespace is superfluous.","structure(list(url = ""/browse-edgar?action=getcompany&CIK=STX&owner=exclude&type=10-Q&dateb=&start=0&count=40&output=atom"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2,78,"style","Trailing whitespace is superfluous."," status_code = 200L, headers = structure(list(`content-encoding` = ""gzip"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3,68,"style","Trailing whitespace is superfluous."," `content-type` = ""application/atom+xml"", server = ""Apache"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4,80,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff"", `x-frame-options` = ""SAMEORIGIN"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5,73,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `content-length` = ""4033"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",6,78,"style","Trailing whitespace is superfluous."," `cache-control` = ""no-cache"", date = ""Mon, 20 Jan 2020 17:54:51 GMT"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",7,61,"style","Trailing whitespace is superfluous."," connection = ""keep-alive"", vary = ""Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",8,88,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000 ; includeSubDomains ; preload"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",10,69,"style","Trailing whitespace is superfluous."," )), all_headers = list(list(status = 200L, version = ""HTTP/1.1"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",11,62,"style","Trailing whitespace is superfluous."," headers = structure(list(`content-encoding` = ""gzip"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",12,72,"style","Trailing whitespace is superfluous."," `content-type` = ""application/atom+xml"", server = ""Apache"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",13,84,"style","Trailing whitespace is superfluous."," `x-content-type-options` = ""nosniff"", `x-frame-options` = ""SAMEORIGIN"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",14,77,"style","Trailing whitespace is superfluous."," `x-xss-protection` = ""1; mode=block"", `content-length` = ""4033"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",15,82,"style","Trailing whitespace is superfluous."," `cache-control` = ""no-cache"", date = ""Mon, 20 Jan 2020 17:54:51 GMT"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",16,65,"style","Trailing whitespace is superfluous."," connection = ""keep-alive"", vary = ""Accept-Encoding"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",17,118,"style","Trailing whitespace is superfluous."," `strict-transport-security` = ""max-age=31536000 ; includeSubDomains ; preload""), class = c(""insensitive"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",18,66,"style","Trailing whitespace is superfluous."," ""list"")))), cookies = structure(list(domain = logical(0), ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",19,67,"style","Trailing whitespace is superfluous."," flag = logical(0), path = logical(0), secure = logical(0), ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",20,64,"style","Trailing whitespace is superfluous."," expiration = structure(numeric(0), class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",21,107,"style","Trailing whitespace is superfluous."," ""POSIXt"")), name = logical(0), value = logical(0)), row.names = integer(0), class = ""data.frame""), ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",22,65,"style","Trailing whitespace is superfluous."," content = as.raw(c(0x3c, 0x3f, 0x78, 0x6d, 0x6c, 0x20, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",23,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x73, 0x69, 0x6f, 0x6e, 0x3d, 0x22, 0x31, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",24,64,"style","Trailing whitespace is superfluous."," 0x30, 0x22, 0x20, 0x65, 0x6e, 0x63, 0x6f, 0x64, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",25,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3d, 0x22, 0x49, 0x53, 0x4f, 0x2d, 0x38, 0x38, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",26,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x22, 0x20, 0x3f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",27,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x65, 0x65, 0x64, 0x20, 0x78, 0x6d, 0x6c, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",28,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",29,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x77, 0x33, 0x2e, 0x6f, 0x72, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",30,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x32, 0x30, 0x30, 0x35, 0x2f, 0x41, 0x74, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",31,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",32,64,"style","Trailing whitespace is superfluous."," 0x74, 0x68, 0x6f, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",33,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6d, 0x61, 0x69, 0x6c, 0x3e, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",34,64,"style","Trailing whitespace is superfluous."," 0x65, 0x62, 0x6d, 0x61, 0x73, 0x74, 0x65, 0x72, 0x40, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",35,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x3c, 0x2f, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",36,64,"style","Trailing whitespace is superfluous."," 0x61, 0x69, 0x6c, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",37,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x57, 0x65, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",38,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x73, 0x74, 0x65, 0x72, 0x3c, 0x2f, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",39,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",40,64,"style","Trailing whitespace is superfluous."," 0x61, 0x75, 0x74, 0x68, 0x6f, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",41,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",42,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x66, 0x6f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",43,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",44,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",45,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",46,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",47,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",48,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",49,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x79, 0x3e, 0x44, 0x55, 0x42, 0x4c, 0x49, 0x4e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",50,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x3c, 0x2f, 0x63, 0x69, 0x74, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",51,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",52,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x74, 0x61, 0x74, 0x65, 0x3e, 0x4c, 0x32, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",53,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x74, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",54,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",55,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x65, 0x65, 0x74, 0x31, 0x3e, 0x33, 0x38, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",56,64,"style","Trailing whitespace is superfluous."," 0x33, 0x39, 0x20, 0x46, 0x49, 0x54, 0x5a, 0x57, 0x49, 0x4c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",57,64,"style","Trailing whitespace is superfluous."," 0x4c, 0x49, 0x41, 0x4d, 0x20, 0x53, 0x51, 0x55, 0x41, 0x52, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",58,64,"style","Trailing whitespace is superfluous."," 0x45, 0x3c, 0x2f, 0x73, 0x74, 0x72, 0x65, 0x65, 0x74, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",59,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",60,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x7a, 0x69, 0x70, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",61,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x7a, 0x69, 0x70, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",62,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",63,64,"style","Trailing whitespace is superfluous."," 0x64, 0x64, 0x72, 0x65, 0x73, 0x73, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",64,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x64, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",65,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x73, 0x73, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",66,64,"style","Trailing whitespace is superfluous."," 0x22, 0x62, 0x75, 0x73, 0x69, 0x6e, 0x65, 0x73, 0x73, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",67,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",68,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x69, 0x74, 0x79, 0x3e, 0x44, 0x55, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",69,64,"style","Trailing whitespace is superfluous."," 0x42, 0x4c, 0x49, 0x4e, 0x20, 0x32, 0x3c, 0x2f, 0x63, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",70,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",71,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x70, 0x68, 0x6f, 0x6e, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",72,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x28, 0x33, 0x35, 0x33, 0x29, 0x20, 0x28, 0x31, 0x29, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",73,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x33, 0x34, 0x2d, 0x33, 0x31, 0x33, 0x36, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",74,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x70, 0x68, 0x6f, 0x6e, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",75,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",76,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x74, 0x65, 0x3e, 0x4c, 0x32, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",77,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",78,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",79,64,"style","Trailing whitespace is superfluous."," 0x65, 0x65, 0x74, 0x31, 0x3e, 0x33, 0x38, 0x2f, 0x33, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",80,64,"style","Trailing whitespace is superfluous."," 0x20, 0x46, 0x49, 0x54, 0x5a, 0x57, 0x49, 0x4c, 0x4c, 0x49, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",81,64,"style","Trailing whitespace is superfluous."," 0x41, 0x4d, 0x20, 0x53, 0x51, 0x55, 0x41, 0x52, 0x45, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",82,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x74, 0x72, 0x65, 0x65, 0x74, 0x31, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",83,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",84,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x7a, 0x69, 0x70, 0x3e, 0x30, 0x30, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",85,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x7a, 0x69, 0x70, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",86,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x61, 0x64, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",87,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x73, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",88,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x61, 0x64, 0x64, 0x72, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",89,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",90,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x73, 0x73, 0x69, 0x67, 0x6e, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",91,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x73, 0x69, 0x63, 0x3e, 0x33, 0x35, 0x37, 0x32, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",92,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x73, 0x73, 0x69, 0x67, 0x6e, 0x65, 0x64, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",93,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x63, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",94,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x73, 0x73, 0x69, 0x67, 0x6e, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",95,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x73, 0x69, 0x63, 0x2d, 0x64, 0x65, 0x73, 0x63, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",96,64,"style","Trailing whitespace is superfluous."," 0x43, 0x4f, 0x4d, 0x50, 0x55, 0x54, 0x45, 0x52, 0x20, 0x53, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",97,64,"style","Trailing whitespace is superfluous."," 0x54, 0x4f, 0x52, 0x41, 0x47, 0x45, 0x20, 0x44, 0x45, 0x56, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",98,64,"style","Trailing whitespace is superfluous."," 0x49, 0x43, 0x45, 0x53, 0x3c, 0x2f, 0x61, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",99,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6e, 0x65, 0x64, 0x2d, 0x73, 0x69, 0x63, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",100,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x63, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",101,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x73, 0x73, 0x69, 0x67, 0x6e, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",102,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x73, 0x69, 0x63, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",103,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",104,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",105,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",106,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",107,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",108,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",109,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x53, 0x49, 0x43, 0x3d, 0x33, 0x35, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",110,64,"style","Trailing whitespace is superfluous."," 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",111,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",112,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",113,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x3c, 0x2f, 0x61, 0x73, 0x73, 0x69, 0x67, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",114,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x2d, 0x73, 0x69, 0x63, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",115,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",116,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",117,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x3c, 0x2f, 0x63, 0x69, 0x6b, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",118,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",119,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",120,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",121,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",122,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",123,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",124,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",125,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",126,64,"style","Trailing whitespace is superfluous."," 0x43, 0x49, 0x4b, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",127,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",128,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",129,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",130,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",131,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",132,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",133,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x64, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x53, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",134,64,"style","Trailing whitespace is superfluous."," 0x65, 0x61, 0x67, 0x61, 0x74, 0x65, 0x20, 0x54, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",135,64,"style","Trailing whitespace is superfluous."," 0x68, 0x6e, 0x6f, 0x6c, 0x6f, 0x67, 0x79, 0x20, 0x70, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",136,64,"style","Trailing whitespace is superfluous."," 0x63, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",137,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",138,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",139,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x2d, 0x79, 0x65, 0x61, 0x72, 0x2d, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",140,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x30, 0x37, 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",141,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x61, 0x6c, 0x2d, 0x79, 0x65, 0x61, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",142,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",143,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",144,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x73, 0x20, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",145,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x22, 0x33, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",146,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",147,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",148,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",149,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",150,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",151,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",152,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x53, 0x45, 0x41, 0x47, 0x41, 0x54, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",153,64,"style","Trailing whitespace is superfluous."," 0x45, 0x20, 0x54, 0x45, 0x43, 0x48, 0x4e, 0x4f, 0x4c, 0x4f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",154,64,"style","Trailing whitespace is superfluous."," 0x47, 0x59, 0x3c, 0x2f, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",155,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",156,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",157,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",158,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",159,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",160,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x36, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",161,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",162,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",163,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x53, 0x65, 0x61, 0x67, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",164,64,"style","Trailing whitespace is superfluous."," 0x20, 0x54, 0x65, 0x63, 0x68, 0x6e, 0x6f, 0x6c, 0x6f, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",165,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3c, 0x2f, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",166,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",167,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",168,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6e, 0x61, 0x6d, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",169,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",170,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",171,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x31, 0x32, 0x2d, 0x31, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",172,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",173,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",174,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x53, 0x45, 0x41, 0x47, 0x41, 0x54, 0x45, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",175,64,"style","Trailing whitespace is superfluous."," 0x54, 0x45, 0x43, 0x48, 0x4e, 0x4f, 0x4c, 0x4f, 0x47, 0x59, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",176,64,"style","Trailing whitespace is superfluous."," 0x20, 0x48, 0x4f, 0x4c, 0x44, 0x49, 0x4e, 0x47, 0x53, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",177,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",178,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",179,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",180,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",181,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x73, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",182,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6f, 0x66, 0x66, 0x69, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",183,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x4f, 0x66, 0x66, 0x69, 0x63, 0x65, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",184,64,"style","Trailing whitespace is superfluous."," 0x66, 0x20, 0x54, 0x65, 0x63, 0x68, 0x6e, 0x6f, 0x6c, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",185,64,"style","Trailing whitespace is superfluous."," 0x67, 0x79, 0x3c, 0x2f, 0x6f, 0x66, 0x66, 0x69, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",186,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",187,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x74, 0x65, 0x2d, 0x6c, 0x6f, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",188,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3e, 0x4c, 0x32, 0x3c, 0x2f, 0x73, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",189,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x2d, 0x6c, 0x6f, 0x63, 0x61, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",190,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",191,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x74, 0x61, 0x74, 0x65, 0x2d, 0x6c, 0x6f, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",192,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",193,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",194,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",195,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",196,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",197,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",198,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",199,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x53, 0x74, 0x61, 0x74, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",200,64,"style","Trailing whitespace is superfluous."," 0x4c, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",201,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",202,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",203,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x73, 0x74, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",204,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6c, 0x6f, 0x63, 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",205,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",206,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x74, 0x61, 0x74, 0x65, 0x2d, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",207,64,"style","Trailing whitespace is superfluous."," 0x66, 0x2d, 0x69, 0x6e, 0x63, 0x6f, 0x72, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",208,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x3e, 0x4c, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",209,64,"style","Trailing whitespace is superfluous."," 0x73, 0x74, 0x61, 0x74, 0x65, 0x2d, 0x6f, 0x66, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",210,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x63, 0x6f, 0x72, 0x70, 0x6f, 0x72, 0x61, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",211,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",212,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",213,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",214,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",215,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",216,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",217,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",218,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",219,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",220,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",221,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",222,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",223,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",224,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",225,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",226,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",227,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",228,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x36, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",229,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x30, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",230,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",231,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",232,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",233,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",234,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",235,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",236,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",237,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",238,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",239,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",240,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",241,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",242,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",243,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",244,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",245,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",246,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",247,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",248,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",249,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",250,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",251,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",252,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",253,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",254,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",255,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",256,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",257,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x31, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",258,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",259,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",260,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",261,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",262,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",263,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",264,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",265,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",266,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x36, 0x32, 0x38, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",267,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x31, 0x39, 0x30, 0x31, 0x33, 0x30, 0x39, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",268,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x36, 0x32, 0x38, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",269,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x31, 0x33, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",270,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",271,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",272,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",273,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",274,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",275,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",276,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",277,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",278,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",279,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x37, 0x36, 0x38, 0x38, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",280,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",281,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",282,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",283,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",284,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",285,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",286,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",287,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",288,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",289,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x30, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",290,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",291,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",292,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",293,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",294,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",295,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",296,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",297,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",298,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",299,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",300,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",301,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x36, 0x32, 0x38, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",302,64,"style","Trailing whitespace is superfluous."," 0x38, 0x30, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x31, 0x33, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",303,64,"style","Trailing whitespace is superfluous."," 0x39, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",304,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",305,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",306,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",307,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",308,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",309,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",310,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",311,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",312,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",313,64,"style","Trailing whitespace is superfluous."," 0x36, 0x32, 0x38, 0x32, 0x38, 0x30, 0x2d, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",314,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x30, 0x39, 0x32, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",315,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",316,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",317,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",318,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",319,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",320,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",321,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",322,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x32, 0x38, 0x32, 0x38, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",323,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x30, 0x39, 0x32, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",324,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x32, 0x38, 0x32, 0x38, 0x30, 0x2d, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",325,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x33, 0x30, 0x39, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",326,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",327,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",328,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",329,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",330,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",331,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",332,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",333,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",334,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",335,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",336,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x31, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",337,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",338,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",339,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",340,64,"style","Trailing whitespace is superfluous."," 0x36, 0x32, 0x38, 0x32, 0x38, 0x30, 0x2d, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",341,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x33, 0x30, 0x39, 0x32, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",342,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",343,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",344,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x30, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",345,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",346,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",347,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",348,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",349,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",350,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",351,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",352,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",353,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",354,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x31, 0x39, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",355,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x54, 0x31, 0x37, 0x3a, 0x32, 0x33, 0x3a, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",356,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",357,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",358,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",359,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",360,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",361,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",362,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",363,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",364,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",365,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",366,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",367,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",368,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",369,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",370,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",371,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",372,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",373,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",374,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",375,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x39, 0x2d, 0x31, 0x32, 0x39, 0x32, 0x38, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",376,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",377,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",378,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",379,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",380,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",381,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",382,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",383,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",384,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",385,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",386,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",387,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",388,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",389,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",390,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",391,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",392,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",393,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",394,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",395,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",396,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",397,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",398,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",399,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",400,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",401,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",402,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",403,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x2d, 0x33, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",404,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",405,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",406,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",407,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",408,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",409,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",410,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",411,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",412,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",413,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x32, 0x39, 0x32, 0x38, 0x34, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",414,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",415,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x32, 0x39, 0x32, 0x38, 0x34, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",416,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",417,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",418,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",419,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",420,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",421,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",422,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",423,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",424,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x31, 0x39, 0x37, 0x38, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",425,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",426,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",427,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",428,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",429,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",430,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",431,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",432,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",433,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",434,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",435,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x39, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",436,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",437,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",438,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",439,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",440,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",441,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",442,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",443,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",444,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",445,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",446,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",447,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",448,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x32, 0x39, 0x32, 0x38, 0x34, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",449,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",450,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",451,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",452,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",453,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",454,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",455,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",456,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",457,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",458,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",459,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x31, 0x32, 0x39, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",460,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",461,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",462,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",463,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",464,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",465,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",466,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",467,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",468,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x39, 0x31, 0x32, 0x39, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",469,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",470,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x31, 0x32, 0x39, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",471,64,"style","Trailing whitespace is superfluous."," 0x38, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",472,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",473,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",474,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",475,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",476,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",477,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",478,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",479,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",480,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",481,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",482,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x33, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",483,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",484,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",485,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",486,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x31, 0x32, 0x39, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",487,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",488,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",489,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x39, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",490,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",491,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",492,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",493,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",494,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",495,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",496,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",497,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",498,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",499,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",500,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",501,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x3a, 0x32, 0x38, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",502,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",503,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",504,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",505,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",506,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",507,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",508,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",509,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",510,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",511,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",512,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",513,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",514,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",515,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",516,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",517,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",518,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",519,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",520,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",521,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x30, 0x37, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",522,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",523,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",524,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",525,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",526,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",527,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",528,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",529,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",530,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",531,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",532,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",533,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",534,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",535,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",536,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",537,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",538,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",539,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",540,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",541,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",542,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",543,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",544,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",545,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",546,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",547,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",548,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",549,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",550,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",551,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",552,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",553,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",554,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",555,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",556,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",557,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",558,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x39, 0x30, 0x32, 0x37, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",559,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",560,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x32, 0x37, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",561,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",562,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",563,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",564,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",565,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",566,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",567,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",568,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",569,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",570,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x33, 0x37, 0x38, 0x33, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",571,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",572,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",573,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",574,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",575,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",576,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",577,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",578,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",579,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",580,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",581,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",582,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",583,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",584,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",585,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",586,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",587,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",588,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",589,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",590,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",591,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",592,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",593,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, 0x32, 0x37, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",594,64,"style","Trailing whitespace is superfluous."," 0x37, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",595,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",596,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",597,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",598,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",599,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",600,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",601,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",602,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",603,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",604,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",605,64,"style","Trailing whitespace is superfluous."," 0x32, 0x37, 0x30, 0x30, 0x37, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",606,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",607,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",608,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",609,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",610,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",611,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",612,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",613,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x39, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",614,64,"style","Trailing whitespace is superfluous."," 0x32, 0x37, 0x30, 0x30, 0x37, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",615,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",616,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x37, 0x30, 0x30, 0x37, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",617,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",618,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",619,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",620,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",621,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",622,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",623,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",624,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",625,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",626,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",627,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x34, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",628,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",629,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",630,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",631,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",632,64,"style","Trailing whitespace is superfluous."," 0x32, 0x37, 0x30, 0x30, 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",633,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",634,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",635,64,"style","Trailing whitespace is superfluous."," 0x20, 0x38, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",636,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",637,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",638,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",639,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",640,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",641,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",642,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",643,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",644,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",645,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",646,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x36, 0x3a, 0x31, 0x30, 0x3a, 0x34, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",647,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",648,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",649,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",650,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",651,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",652,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",653,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",654,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",655,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",656,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",657,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",658,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",659,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",660,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",661,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",662,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",663,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",664,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",665,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",666,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x33, 0x31, 0x37, 0x31, 0x34, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",667,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",668,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",669,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",670,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",671,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",672,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",673,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",674,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",675,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",676,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",677,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",678,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",679,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",680,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",681,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",682,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",683,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",684,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",685,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",686,64,"style","Trailing whitespace is superfluous."," 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",687,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",688,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",689,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",690,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",691,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",692,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",693,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",694,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",695,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",696,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",697,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",698,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",699,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",700,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",701,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",702,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",703,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x38, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",704,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x31, 0x34, 0x33, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",705,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",706,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x37, 0x31, 0x34, 0x33, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",707,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",708,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",709,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",710,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",711,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",712,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",713,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",714,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",715,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x31, 0x38, 0x31, 0x31, 0x35, 0x37, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",716,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",717,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",718,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",719,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",720,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",721,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",722,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",723,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",724,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",725,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",726,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",727,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",728,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",729,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",730,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",731,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",732,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",733,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",734,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",735,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",736,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",737,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",738,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",739,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x37, 0x31, 0x34, 0x33, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",740,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",741,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",742,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",743,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",744,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",745,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",746,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",747,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",748,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",749,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",750,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x38, 0x2d, 0x33, 0x31, 0x37, 0x31, 0x34, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",751,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",752,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",753,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",754,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",755,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",756,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",757,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",758,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",759,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x38, 0x33, 0x31, 0x37, 0x31, 0x34, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",760,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",761,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x33, 0x31, 0x37, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",762,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",763,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",764,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",765,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",766,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",767,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",768,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",769,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",770,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",771,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",772,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",773,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",774,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",775,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",776,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",777,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x38, 0x2d, 0x33, 0x31, 0x37, 0x31, 0x34, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",778,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",779,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",780,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",781,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",782,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",783,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",784,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",785,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",786,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",787,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",788,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",789,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",790,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",791,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x32, 0x54, 0x31, 0x36, 0x3a, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",792,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3a, 0x32, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",793,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",794,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",795,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",796,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",797,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",798,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",799,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",800,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",801,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",802,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",803,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",804,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",805,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",806,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",807,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",808,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",809,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",810,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",811,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x31, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",812,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x38, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",813,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",814,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",815,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",816,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",817,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",818,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",819,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",820,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",821,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",822,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",823,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",824,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",825,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",826,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",827,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",828,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",829,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",830,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",831,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",832,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",833,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",834,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",835,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",836,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",837,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",838,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",839,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x31, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",840,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",841,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",842,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",843,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",844,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",845,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",846,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",847,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",848,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",849,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x31, 0x38, 0x31, 0x34, 0x36, 0x35, 0x39, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",850,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",851,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x31, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",852,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",853,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",854,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",855,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",856,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",857,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",858,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",859,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",860,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x38, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",861,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x37, 0x30, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",862,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",863,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",864,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",865,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",866,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",867,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",868,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",869,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",870,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",871,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",872,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",873,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",874,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",875,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",876,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",877,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",878,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",879,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",880,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",881,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",882,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",883,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",884,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x38, 0x2d, 0x31, 0x34, 0x36, 0x35, 0x39, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",885,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",886,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",887,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",888,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",889,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",890,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",891,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",892,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",893,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",894,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",895,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",896,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",897,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",898,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",899,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",900,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",901,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",902,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",903,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",904,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x38, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",905,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",906,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",907,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",908,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",909,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",910,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",911,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",912,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",913,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",914,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",915,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",916,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",917,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",918,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x31, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",919,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",920,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",921,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",922,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",923,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",924,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",925,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",926,64,"style","Trailing whitespace is superfluous."," 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",927,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",928,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",929,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",930,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",931,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",932,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",933,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",934,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",935,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",936,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x38, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x31, 0x54, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",937,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x3a, 0x31, 0x36, 0x3a, 0x30, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",938,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",939,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",940,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",941,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",942,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",943,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",944,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",945,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",946,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",947,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",948,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",949,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",950,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",951,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",952,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",953,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",954,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",955,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",956,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",957,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x33, 0x35, 0x39, 0x32, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",958,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",959,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",960,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",961,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",962,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",963,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",964,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",965,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",966,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",967,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",968,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",969,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",970,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",971,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",972,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",973,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",974,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",975,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",976,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",977,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",978,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",979,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",980,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",981,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",982,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",983,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",984,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",985,64,"style","Trailing whitespace is superfluous."," 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",986,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",987,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",988,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",989,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",990,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",991,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",992,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",993,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",994,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x38, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",995,64,"style","Trailing whitespace is superfluous."," 0x33, 0x35, 0x39, 0x32, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",996,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",997,64,"style","Trailing whitespace is superfluous."," 0x32, 0x33, 0x35, 0x39, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",998,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",999,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1000,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1001,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1002,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1003,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1004,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1005,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1006,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x38, 0x35, 0x35, 0x35, 0x35, 0x38, 0x35, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1007,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1008,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1009,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1010,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1011,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1012,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1013,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1014,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1015,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1016,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1017,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1018,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1019,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1020,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1021,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1022,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1023,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1024,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1025,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1026,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1027,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1028,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1029,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x38, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1030,64,"style","Trailing whitespace is superfluous."," 0x33, 0x35, 0x39, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1031,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1032,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1033,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1034,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1035,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1036,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1037,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1038,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1039,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1040,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1041,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x32, 0x33, 0x35, 0x39, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1042,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1043,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1044,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1045,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1046,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1047,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1048,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1049,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1050,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x30, 0x32, 0x33, 0x35, 0x39, 0x32, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1051,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1052,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x2d, 0x30, 0x32, 0x33, 0x35, 0x39, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1053,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1054,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1055,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1056,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1057,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1058,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1059,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1060,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1061,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1062,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1063,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x30, 0x31, 0x2d, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1064,64,"style","Trailing whitespace is superfluous."," 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1065,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1066,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1067,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1068,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2d, 0x30, 0x32, 0x33, 0x35, 0x39, 0x32, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1069,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1070,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1071,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1072,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1073,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1074,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1075,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1076,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1077,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1078,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1079,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1080,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1081,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x38, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1082,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x39, 0x54, 0x31, 0x36, 0x3a, 0x30, 0x37, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1083,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1084,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1085,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1086,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1087,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1088,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1089,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1090,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1091,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1092,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1093,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1094,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1095,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1096,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1097,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1098,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1099,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1100,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1101,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1102,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x33, 0x32, 0x33, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1103,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1104,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1105,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1106,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1107,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1108,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1109,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1110,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1111,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1112,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1113,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1114,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1115,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1116,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1117,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1118,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1119,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1120,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1121,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1122,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1123,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1124,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1125,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1126,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1127,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1128,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1129,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1130,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x37, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1131,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1132,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1133,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1134,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1135,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1136,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1137,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1138,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1139,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1140,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x33, 0x32, 0x33, 0x30, 0x34, 0x32, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1141,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1142,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x2d, 0x33, 0x32, 0x33, 0x30, 0x34, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1143,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1144,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1145,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1146,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1147,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1148,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1149,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1150,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1151,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x37, 0x31, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1152,64,"style","Trailing whitespace is superfluous."," 0x39, 0x35, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1153,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1154,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1155,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1156,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1157,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1158,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1159,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1160,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1161,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1162,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x36, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1163,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1164,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1165,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1166,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1167,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1168,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1169,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1170,64,"style","Trailing whitespace is superfluous."," 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1171,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1172,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1173,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1174,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1175,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x2d, 0x33, 0x32, 0x33, 0x30, 0x34, 0x32, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1176,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1177,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1178,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1179,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1180,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1181,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1182,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1183,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1184,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1185,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1186,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x33, 0x32, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1187,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x32, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1188,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1189,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1190,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1191,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1192,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1193,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1194,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1195,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x37, 0x33, 0x32, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1196,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x32, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1197,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x33, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1198,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x34, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1199,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1200,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1201,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1202,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1203,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1204,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1205,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1206,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1207,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1208,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1209,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x37, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1210,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1211,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1212,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1213,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x33, 0x32, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1214,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1215,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1216,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1217,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1218,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1219,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1220,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1221,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1222,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1223,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1224,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1225,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1226,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1227,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x37, 0x54, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1228,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x30, 0x37, 0x3a, 0x30, 0x38, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1229,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1230,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1231,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1232,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1233,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1234,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1235,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1236,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1237,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1238,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1239,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1240,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1241,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1242,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1243,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1244,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1245,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1246,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1247,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1248,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x38, 0x38, 0x35, 0x35, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1249,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1250,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1251,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1252,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1253,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1254,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1255,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1256,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1257,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1258,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1259,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1260,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1261,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1262,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1263,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1264,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1265,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1266,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1267,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1268,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1269,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1270,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1271,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1272,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1273,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1274,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1275,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x34, 0x2d, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1276,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1277,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1278,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1279,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1280,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1281,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1282,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1283,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1284,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1285,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x37, 0x31, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1286,64,"style","Trailing whitespace is superfluous."," 0x38, 0x35, 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1287,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1288,64,"style","Trailing whitespace is superfluous."," 0x38, 0x38, 0x35, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1289,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1290,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1291,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1292,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1293,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1294,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1295,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1296,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1297,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x37, 0x39, 0x37, 0x31, 0x36, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1298,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1299,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1300,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1301,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1302,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1303,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1304,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1305,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1306,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1307,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1308,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1309,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1310,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1311,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1312,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1313,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1314,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1315,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1316,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1317,64,"style","Trailing whitespace is superfluous."," 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1318,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1319,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1320,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x31, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1321,64,"style","Trailing whitespace is superfluous."," 0x38, 0x35, 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1322,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1323,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1324,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1325,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1326,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1327,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1328,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1329,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1330,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1331,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1332,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x38, 0x38, 0x35, 0x35, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1333,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1334,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1335,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1336,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1337,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1338,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1339,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1340,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1341,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x34, 0x38, 0x38, 0x35, 0x35, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1342,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1343,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x31, 0x34, 0x38, 0x38, 0x35, 0x35, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1344,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1345,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1346,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1347,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1348,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1349,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1350,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1351,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1352,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1353,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1354,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x34, 0x2d, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1355,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1356,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1357,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1358,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1359,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x38, 0x38, 0x35, 0x35, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1360,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1361,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1362,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x38, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1363,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1364,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1365,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1366,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1367,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1368,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1369,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1370,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1371,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1372,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1373,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x54, 0x31, 0x37, 0x3a, 0x31, 0x39, 0x3a, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1374,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1375,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1376,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1377,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1378,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1379,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1380,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1381,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1382,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1383,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1384,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1385,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1386,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1387,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1388,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1389,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1390,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1391,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1392,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1393,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x31, 0x39, 0x37, 0x33, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1394,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1395,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1396,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1397,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1398,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1399,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1400,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1401,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1402,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1403,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1404,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1405,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1406,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1407,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1408,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1409,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1410,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1411,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1412,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1413,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1414,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1415,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1416,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1417,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1418,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1419,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1420,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1421,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x32, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1422,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1423,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1424,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1425,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1426,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1427,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1428,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1429,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1430,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1431,64,"style","Trailing whitespace is superfluous."," 0x37, 0x30, 0x31, 0x39, 0x37, 0x33, 0x32, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1432,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1433,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x31, 0x39, 0x37, 0x33, 0x32, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1434,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1435,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1436,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1437,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1438,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1439,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1440,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1441,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1442,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x31, 0x37, 0x35, 0x34, 0x39, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1443,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1444,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1445,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1446,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1447,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1448,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1449,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1450,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1451,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1452,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1453,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1454,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1455,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1456,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1457,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1458,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1459,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1460,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1461,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1462,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1463,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1464,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1465,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1466,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x39, 0x37, 0x33, 0x32, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1467,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1468,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1469,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1470,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1471,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1472,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1473,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1474,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1475,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1476,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1477,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x31, 0x39, 0x37, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1478,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1479,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1480,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1481,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1482,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1483,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1484,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1485,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1486,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x37, 0x30, 0x31, 0x39, 0x37, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1487,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1488,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x31, 0x39, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1489,64,"style","Trailing whitespace is superfluous."," 0x33, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1490,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1491,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1492,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1493,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1494,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1495,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1496,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1497,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1498,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1499,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x37, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1500,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x32, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1501,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1502,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1503,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1504,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x31, 0x37, 0x2d, 0x30, 0x31, 0x39, 0x37, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1505,64,"style","Trailing whitespace is superfluous."," 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1506,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1507,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1508,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1509,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1510,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1511,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1512,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1513,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1514,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1515,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1516,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1517,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1518,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x2d, 0x32, 0x36, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1519,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x3a, 0x31, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1520,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1521,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1522,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1523,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1524,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1525,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1526,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1527,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1528,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1529,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1530,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1531,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1532,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1533,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1534,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1535,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1536,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1537,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1538,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x37, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1539,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x39, 0x33, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1540,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1541,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1542,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1543,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1544,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1545,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1546,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1547,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1548,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1549,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1550,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1551,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1552,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1553,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1554,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1555,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1556,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1557,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1558,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1559,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1560,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1561,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1562,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1563,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1564,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1565,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1566,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x38, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1567,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1568,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1569,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1570,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1571,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1572,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1573,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1574,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1575,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1576,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x31, 0x36, 0x37, 0x35, 0x31, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1577,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1578,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x37, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1579,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1580,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1581,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1582,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1583,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1584,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1585,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1586,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1587,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1588,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x35, 0x38, 0x37, 0x31, 0x31, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1589,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1590,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1591,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1592,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1593,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1594,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1595,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1596,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1597,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1598,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x37, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1599,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1600,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1601,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1602,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1603,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1604,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1605,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1606,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1607,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1608,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1609,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1610,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1611,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x31, 0x36, 0x2d, 0x37, 0x35, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1612,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1613,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1614,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1615,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1616,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1617,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1618,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1619,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1620,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1621,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1622,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1623,64,"style","Trailing whitespace is superfluous."," 0x37, 0x35, 0x31, 0x35, 0x39, 0x33, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1624,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1625,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1626,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1627,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1628,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1629,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1630,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1631,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1632,64,"style","Trailing whitespace is superfluous."," 0x37, 0x35, 0x31, 0x35, 0x39, 0x33, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1633,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1634,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x37, 0x35, 0x31, 0x35, 0x39, 0x33, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1635,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1636,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1637,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1638,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1639,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1640,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1641,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1642,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1643,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1644,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1645,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x38, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1646,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1647,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1648,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1649,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1650,64,"style","Trailing whitespace is superfluous."," 0x37, 0x35, 0x31, 0x35, 0x39, 0x33, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1651,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1652,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1653,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1654,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1655,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1656,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1657,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1658,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1659,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1660,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1661,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1662,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1663,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x31, 0x30, 0x2d, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1664,64,"style","Trailing whitespace is superfluous."," 0x38, 0x54, 0x31, 0x36, 0x3a, 0x31, 0x31, 0x3a, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1665,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1666,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1667,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1668,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1669,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1670,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1671,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1672,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1673,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1674,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1675,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1676,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1677,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1678,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1679,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1680,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1681,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1682,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1683,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1684,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x2d, 0x31, 0x31, 0x36, 0x32, 0x30, 0x31, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1685,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1686,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1687,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1688,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1689,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1690,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1691,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1692,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1693,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1694,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1695,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1696,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1697,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1698,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1699,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1700,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1701,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1702,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1703,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1704,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1705,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1706,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1707,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1708,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1709,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1710,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1711,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1712,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1713,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1714,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1715,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1716,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1717,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1718,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1719,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1720,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1721,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1722,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x36, 0x32, 0x30, 0x31, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1723,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1724,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x36, 0x32, 0x30, 0x31, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1725,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1726,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1727,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1728,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1729,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1730,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1731,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1732,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1733,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x36, 0x31, 0x36, 0x30, 0x36, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1734,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1735,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1736,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1737,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1738,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1739,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1740,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1741,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1742,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1743,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1744,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x38, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1745,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1746,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1747,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1748,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1749,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1750,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1751,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1752,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1753,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1754,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1755,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1756,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1757,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x36, 0x32, 0x30, 0x31, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1758,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1759,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1760,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1761,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1762,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1763,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1764,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1765,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1766,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1767,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1768,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x36, 0x2d, 0x31, 0x31, 0x36, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1769,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1770,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1771,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1772,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1773,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1774,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1775,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1776,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1777,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x36, 0x31, 0x31, 0x36, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1778,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1779,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x36, 0x2d, 0x31, 0x31, 0x36, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1780,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1781,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1782,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1783,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1784,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1785,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1786,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1787,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1788,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1789,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1790,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1791,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x32, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1792,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1793,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1794,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1795,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x36, 0x2d, 0x31, 0x31, 0x36, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1796,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1797,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1798,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x38, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1799,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1800,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1801,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1802,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1803,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1804,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1805,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1806,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1807,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1808,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1809,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x2d, 0x32, 0x39, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1810,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x3a, 0x35, 0x31, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1811,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1812,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1813,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1814,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1815,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1816,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1817,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1818,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1819,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1820,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1821,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1822,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1823,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1824,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1825,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1826,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1827,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1828,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1829,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1830,64,"style","Trailing whitespace is superfluous."," 0x32, 0x34, 0x36, 0x37, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1831,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1832,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1833,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1834,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1835,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1836,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1837,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1838,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1839,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1840,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1841,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1842,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1843,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1844,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1845,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1846,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1847,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1848,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1849,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1850,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1851,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1852,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1853,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1854,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1855,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1856,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1857,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x2d, 0x30, 0x31, 0x2d, 0x32, 0x39, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1858,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1859,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1860,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1861,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1862,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1863,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1864,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1865,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1866,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1867,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x36, 0x30, 0x39, 0x32, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1868,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1869,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x39, 0x32, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1870,64,"style","Trailing whitespace is superfluous."," 0x36, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1871,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1872,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1873,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1874,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1875,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1876,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1877,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1878,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1879,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x33, 0x34, 0x39, 0x32, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1880,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1881,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1882,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1883,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1884,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1885,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1886,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1887,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1888,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1889,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x38, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1890,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1891,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1892,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1893,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1894,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1895,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1896,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1897,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1898,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1899,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1900,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1901,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1902,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x36, 0x2d, 0x30, 0x39, 0x32, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1903,64,"style","Trailing whitespace is superfluous."," 0x36, 0x37, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1904,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1905,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1906,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1907,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1908,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1909,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1910,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1911,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1912,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1913,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1914,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x32, 0x34, 0x36, 0x37, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1915,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1916,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1917,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1918,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1919,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1920,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1921,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1922,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1923,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x32, 0x34, 0x36, 0x37, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1924,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1925,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x39, 0x32, 0x34, 0x36, 0x37, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1926,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1927,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1928,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1929,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1930,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1931,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1932,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1933,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1934,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1935,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1936,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x36, 0x2d, 0x30, 0x31, 0x2d, 0x32, 0x39, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1937,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1938,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1939,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1940,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1941,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x32, 0x34, 0x36, 0x37, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1942,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1943,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1944,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x38, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1945,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1946,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1947,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1948,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1949,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1950,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1951,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1952,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1953,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1954,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x36, 0x2d, 0x30, 0x31, 0x2d, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1955,64,"style","Trailing whitespace is superfluous."," 0x39, 0x54, 0x31, 0x36, 0x3a, 0x31, 0x30, 0x3a, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1956,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1957,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1958,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1959,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1960,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1961,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1962,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1963,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1964,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1965,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1966,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1967,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1968,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1969,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1970,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1971,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1972,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1973,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1974,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1975,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x30, 0x37, 0x34, 0x35, 0x33, 0x39, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1976,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1977,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1978,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1979,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1980,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1981,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1982,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1983,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1984,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1985,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1986,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1987,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1988,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1989,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1990,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1991,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1992,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1993,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1994,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1995,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1996,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1997,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1998,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",1999,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2000,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2001,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2002,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2003,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x33, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2004,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2005,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2006,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2007,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2008,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2009,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2010,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2011,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2012,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2013,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x34, 0x35, 0x33, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2014,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2015,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x34, 0x35, 0x33, 0x39, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2016,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2017,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2018,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2019,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2020,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2021,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2022,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2023,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2024,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x35, 0x31, 0x31, 0x38, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2025,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2026,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2027,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2028,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2029,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2030,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2031,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2032,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2033,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2034,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2035,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x37, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2036,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2037,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2038,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2039,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2040,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2041,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2042,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2043,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2044,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2045,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2046,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2047,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2048,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x34, 0x35, 0x33, 0x39, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2049,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2050,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2051,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2052,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2053,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2054,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2055,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2056,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2057,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2058,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2059,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x37, 0x34, 0x35, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2060,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2061,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2062,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2063,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2064,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2065,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2066,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2067,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2068,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x35, 0x30, 0x37, 0x34, 0x35, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2069,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2070,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x37, 0x34, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2071,64,"style","Trailing whitespace is superfluous."," 0x33, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2072,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2073,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2074,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2075,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2076,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2077,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2078,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2079,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2080,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2081,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2082,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x33, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2083,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2084,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2085,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2086,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x37, 0x34, 0x35, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2087,64,"style","Trailing whitespace is superfluous."," 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2088,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2089,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x37, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2090,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2091,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2092,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2093,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2094,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2095,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2096,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2097,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2098,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2099,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2100,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x33, 0x30, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2101,64,"style","Trailing whitespace is superfluous."," 0x31, 0x37, 0x3a, 0x34, 0x34, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2102,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2103,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2104,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2105,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2106,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2107,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2108,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2109,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2110,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2111,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2112,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2113,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2114,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2115,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2116,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2117,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2118,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2119,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2120,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2121,64,"style","Trailing whitespace is superfluous."," 0x32, 0x36, 0x34, 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2122,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2123,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2124,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2125,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2126,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2127,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2128,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2129,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2130,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2131,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2132,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2133,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2134,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2135,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2136,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2137,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2138,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2139,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2140,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2141,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2142,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2143,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2144,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2145,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2146,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2147,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2148,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x35, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2149,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2150,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2151,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2152,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2153,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2154,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2155,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2156,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2157,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2158,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x35, 0x30, 0x33, 0x32, 0x36, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2159,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2160,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x33, 0x32, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2161,64,"style","Trailing whitespace is superfluous."," 0x34, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2162,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2163,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2164,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2165,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2166,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2167,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2168,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2169,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2170,64,"style","Trailing whitespace is superfluous."," 0x38, 0x31, 0x39, 0x38, 0x32, 0x31, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2171,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2172,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2173,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2174,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2175,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2176,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2177,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2178,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2179,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2180,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2181,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2182,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2183,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2184,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2185,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2186,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2187,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2188,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2189,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2190,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2191,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2192,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2193,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x33, 0x32, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2194,64,"style","Trailing whitespace is superfluous."," 0x34, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2195,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2196,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2197,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2198,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2199,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2200,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2201,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2202,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2203,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2204,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2205,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x32, 0x36, 0x34, 0x32, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2206,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2207,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2208,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2209,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2210,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2211,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2212,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2213,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2214,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x32, 0x36, 0x34, 0x32, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2215,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2216,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x33, 0x32, 0x36, 0x34, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2217,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2218,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2219,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2220,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2221,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2222,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2223,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2224,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2225,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2226,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2227,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x35, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2228,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2229,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2230,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2231,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2232,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x32, 0x36, 0x34, 0x32, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2233,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2234,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2235,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2236,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2237,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2238,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2239,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2240,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2241,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2242,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2243,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2244,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2245,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x31, 0x35, 0x2d, 0x30, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2246,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x54, 0x31, 0x36, 0x3a, 0x35, 0x37, 0x3a, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2247,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2248,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2249,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2250,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2251,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2252,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2253,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2254,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2255,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2256,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2257,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2258,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2259,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2260,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2261,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2262,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2263,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2264,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2265,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2266,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x35, 0x37, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2267,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2268,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2269,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2270,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2271,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2272,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2273,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2274,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2275,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2276,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2277,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2278,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2279,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2280,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2281,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2282,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2283,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2284,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2285,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2286,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2287,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2288,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2289,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2290,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2291,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2292,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2293,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2294,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x33, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2295,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2296,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2297,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2298,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2299,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2300,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2301,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2302,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2303,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2304,64,"style","Trailing whitespace is superfluous."," 0x35, 0x30, 0x30, 0x35, 0x37, 0x31, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2305,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2306,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x35, 0x37, 0x31, 0x39, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2307,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2308,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2309,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2310,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2311,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2312,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2313,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2314,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2315,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x31, 0x35, 0x35, 0x36, 0x33, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2316,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2317,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2318,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2319,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2320,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2321,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2322,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2323,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2324,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2325,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2326,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2327,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2328,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2329,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2330,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2331,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2332,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2333,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2334,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2335,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2336,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2337,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2338,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2339,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x30, 0x35, 0x37, 0x31, 0x39, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2340,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2341,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2342,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2343,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2344,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2345,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2346,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2347,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2348,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2349,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2350,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2351,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2352,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2353,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2354,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2355,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2356,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2357,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2358,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2359,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x31, 0x35, 0x30, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2360,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2361,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2362,64,"style","Trailing whitespace is superfluous."," 0x37, 0x31, 0x39, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2363,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2364,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2365,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2366,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2367,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2368,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2369,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2370,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2371,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2372,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2373,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x33, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2374,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2375,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2376,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2377,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x35, 0x2d, 0x30, 0x30, 0x35, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2378,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2379,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2380,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2381,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2382,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2383,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2384,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2385,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2386,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2387,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2388,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2389,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2390,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2391,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x2d, 0x30, 0x31, 0x2d, 0x33, 0x30, 0x54, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2392,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x34, 0x30, 0x3a, 0x33, 0x39, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2393,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2394,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2395,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2396,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2397,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2398,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2399,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2400,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2401,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2402,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2403,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2404,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2405,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2406,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2407,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2409,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2410,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2411,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2412,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x35, 0x36, 0x36, 0x36, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2413,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2414,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2415,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2416,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2417,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2418,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2419,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2420,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2421,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2422,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2423,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2424,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2425,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2426,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2427,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2428,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2429,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2430,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2431,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2432,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2433,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2434,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2435,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2436,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2437,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2438,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2439,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2440,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2441,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2442,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2443,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2444,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2445,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2446,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2447,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2448,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2449,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x34, 0x30, 0x37, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2450,64,"style","Trailing whitespace is superfluous."," 0x36, 0x36, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2451,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2452,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x36, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2453,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2454,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2455,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2456,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2457,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2458,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2459,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2460,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2461,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x31, 0x31, 0x38, 0x37, 0x36, 0x33, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2462,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2463,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2464,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2465,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2466,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2467,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2468,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2469,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2470,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2471,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2472,64,"style","Trailing whitespace is superfluous."," 0x30, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2473,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2474,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2475,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2476,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2477,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2478,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2479,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2480,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2481,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2482,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2483,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2484,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2485,64,"style","Trailing whitespace is superfluous."," 0x37, 0x35, 0x36, 0x36, 0x36, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2486,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2487,64,"style","Trailing whitespace is superfluous."," 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2488,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2489,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2490,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2491,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2492,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2493,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2494,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2495,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2496,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x37, 0x35, 0x36, 0x36, 0x36, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2497,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2498,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2499,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2500,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2501,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2502,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2503,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2504,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2505,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x34, 0x30, 0x37, 0x35, 0x36, 0x36, 0x36, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2506,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2507,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x37, 0x35, 0x36, 0x36, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2508,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2509,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2510,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2511,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2512,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2513,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2514,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2515,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2516,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2517,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2518,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2519,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2520,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2521,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2522,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2523,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x37, 0x35, 0x36, 0x36, 0x36, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2524,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2525,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2526,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x30, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2527,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2528,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2529,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2530,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2531,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2532,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2533,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2534,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2535,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2536,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2537,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x33, 0x31, 0x54, 0x31, 0x39, 0x3a, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2538,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3a, 0x33, 0x39, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2539,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2540,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2541,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2542,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2543,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2544,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2545,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2546,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2547,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2548,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2549,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2550,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2551,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2552,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2553,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2554,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2555,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2556,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2557,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x33, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2558,64,"style","Trailing whitespace is superfluous."," 0x36, 0x37, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2559,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2560,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2561,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2562,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2563,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2564,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2565,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2566,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2567,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2568,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2569,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2570,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2571,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2572,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2573,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2574,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2575,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2576,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2577,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2578,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2579,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2580,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2581,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2582,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2583,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2584,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2585,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2586,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2587,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2588,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2589,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2590,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2591,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2592,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2593,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2594,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2595,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x31, 0x34, 0x30, 0x33, 0x32, 0x36, 0x37, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2596,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2597,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x33, 0x32, 0x36, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2598,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2599,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2600,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2601,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2602,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2603,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2604,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2605,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2606,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x34, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2607,64,"style","Trailing whitespace is superfluous."," 0x39, 0x39, 0x31, 0x34, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2608,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2609,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2610,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2611,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2612,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2613,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2614,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2615,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2616,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2617,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2618,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2619,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2620,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2621,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2622,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2623,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2624,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2625,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2626,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2627,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2628,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2629,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2630,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x33, 0x32, 0x36, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2631,64,"style","Trailing whitespace is superfluous."," 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2632,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2633,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2634,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2635,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2636,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2637,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2638,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2639,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2640,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2641,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2642,64,"style","Trailing whitespace is superfluous."," 0x33, 0x32, 0x36, 0x37, 0x34, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2643,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2644,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2645,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2646,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2647,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2648,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2649,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2650,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2651,64,"style","Trailing whitespace is superfluous."," 0x33, 0x32, 0x36, 0x37, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2652,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2653,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x32, 0x36, 0x37, 0x34, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2654,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2655,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2656,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2657,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2658,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2659,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2660,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2661,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2662,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2663,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2664,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2665,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2666,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2667,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2668,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2669,64,"style","Trailing whitespace is superfluous."," 0x33, 0x32, 0x36, 0x37, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2670,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2671,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2672,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2673,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2674,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2675,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2676,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2677,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2678,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2679,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2680,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2681,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2682,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, 0x34, 0x2d, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2683,64,"style","Trailing whitespace is superfluous."," 0x30, 0x54, 0x31, 0x36, 0x3a, 0x32, 0x35, 0x3a, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2684,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2685,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2686,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2687,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2688,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2689,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2690,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2691,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2692,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2693,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2694,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2695,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2696,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2697,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2698,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2699,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2700,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2701,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2702,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2703,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x2d, 0x30, 0x30, 0x34, 0x36, 0x31, 0x32, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2704,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2705,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2706,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2707,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2708,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2709,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2710,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2711,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2712,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2713,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2714,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2715,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2716,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2717,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2718,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2719,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2720,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2721,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2722,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2723,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2724,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2725,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2726,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2727,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2728,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2729,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2730,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2731,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x32, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2732,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2733,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2734,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2735,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2736,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2737,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2738,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2739,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2740,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2741,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x34, 0x36, 0x31, 0x32, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2742,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2743,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x34, 0x36, 0x31, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2744,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2745,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2746,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2747,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2748,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2749,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2750,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2751,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2752,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x34, 0x35, 0x35, 0x33, 0x38, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2753,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2754,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2755,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2756,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2757,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2758,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2759,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2760,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2761,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2762,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2763,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x32, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2764,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2765,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2766,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2767,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2768,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2769,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2770,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2771,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2772,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2773,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2774,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2775,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2776,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x34, 0x36, 0x31, 0x32, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2777,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2778,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2779,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2780,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2781,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2782,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2783,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2784,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2785,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2786,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2787,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x34, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2788,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2789,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2790,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2791,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2792,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2793,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2794,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2795,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2796,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x34, 0x30, 0x30, 0x34, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2797,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2798,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2799,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2800,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2801,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2802,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2803,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2804,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2805,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2806,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2807,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2808,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2809,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2810,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x32, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2811,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2812,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2813,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2814,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x34, 0x2d, 0x30, 0x30, 0x34, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2815,64,"style","Trailing whitespace is superfluous."," 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2816,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2817,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x32, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2818,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2819,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2820,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2821,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2822,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2823,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2824,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2825,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2826,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2827,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2828,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2d, 0x30, 0x31, 0x2d, 0x32, 0x38, 0x54, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2829,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x31, 0x36, 0x3a, 0x32, 0x37, 0x2d, 0x30, 0x35, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2830,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2831,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2832,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2833,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2834,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2835,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2836,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2837,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2838,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2839,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2840,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2841,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2842,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2843,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2844,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2845,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2846,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2847,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2848,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2849,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x38, 0x32, 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2850,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2851,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2852,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2853,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2854,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2855,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2856,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2857,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2858,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2859,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2860,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2861,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2862,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2863,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2864,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2865,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2866,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2867,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2868,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2869,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2870,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2871,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2872,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2873,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2874,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2875,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2876,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x33, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2877,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2878,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2879,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2880,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2881,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2882,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2883,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2884,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2885,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2886,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x31, 0x33, 0x30, 0x37, 0x38, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2887,64,"style","Trailing whitespace is superfluous."," 0x32, 0x32, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2888,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x37, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2889,64,"style","Trailing whitespace is superfluous."," 0x38, 0x32, 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2890,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2891,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2892,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2893,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2894,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2895,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2896,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2897,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2898,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x31, 0x37, 0x37, 0x32, 0x34, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2899,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2900,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2901,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2902,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2903,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2904,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2905,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2906,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2907,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2908,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2909,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2910,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2911,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2912,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2913,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2914,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2915,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2916,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2917,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2918,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2919,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2920,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2921,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2922,64,"style","Trailing whitespace is superfluous."," 0x38, 0x38, 0x32, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2923,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2924,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2925,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2926,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2927,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2928,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2929,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2930,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2931,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2932,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2933,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x37, 0x38, 0x38, 0x32, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2934,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2935,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2936,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2937,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2938,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2939,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2940,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2941,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2942,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x30, 0x37, 0x38, 0x38, 0x32, 0x32, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2943,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2944,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x37, 0x38, 0x38, 0x32, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2945,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2946,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2947,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2948,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2949,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2950,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2951,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2952,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2953,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2954,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2955,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x31, 0x30, 0x2d, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2956,64,"style","Trailing whitespace is superfluous."," 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2957,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2958,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2959,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2960,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x37, 0x38, 0x38, 0x32, 0x32, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2961,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2962,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2963,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2964,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2965,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2966,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2967,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2968,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2969,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2970,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2971,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2972,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2973,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2974,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x32, 0x39, 0x54, 0x31, 0x37, 0x3a, 0x32, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2975,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x35, 0x39, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2976,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2977,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2978,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2979,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2980,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2981,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2982,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2983,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2984,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2985,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2986,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2987,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2988,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2989,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2990,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2991,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2992,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2993,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2994,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x33, 0x36, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2995,64,"style","Trailing whitespace is superfluous."," 0x38, 0x36, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2996,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2997,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2998,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",2999,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3000,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3001,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3002,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3003,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3004,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3005,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3006,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3007,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3008,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3009,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3010,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3011,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3012,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3013,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3014,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3015,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3016,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3017,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3018,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3019,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3020,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3021,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3022,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x32, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3023,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3024,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3025,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3026,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3027,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3028,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3029,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3030,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3031,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3032,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x33, 0x30, 0x33, 0x36, 0x30, 0x38, 0x36, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3033,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3034,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x33, 0x36, 0x30, 0x38, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3035,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3036,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3037,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3038,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3039,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3040,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3041,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3042,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3043,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x33, 0x38, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3044,64,"style","Trailing whitespace is superfluous."," 0x34, 0x37, 0x36, 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3045,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3046,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3047,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3048,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3049,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3050,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3051,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3052,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3053,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3054,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x32, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3055,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3056,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3057,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3058,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3059,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3060,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3061,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3062,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3063,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3064,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3065,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3066,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3067,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x33, 0x36, 0x30, 0x38, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3068,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3069,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3070,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3071,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3072,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3073,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3074,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3075,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3076,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3077,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3078,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3079,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x38, 0x36, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3080,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3081,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3082,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3083,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3084,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3085,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3086,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3087,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x33, 0x30, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3088,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x38, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3089,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3090,64,"style","Trailing whitespace is superfluous."," 0x33, 0x36, 0x30, 0x38, 0x36, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3091,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3092,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3093,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3094,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3095,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3096,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3097,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3098,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3099,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3100,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3101,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x32, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3102,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3103,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3104,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3105,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3106,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x38, 0x36, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3107,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3108,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3109,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3110,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3111,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3112,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3113,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3114,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3115,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3116,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3117,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3118,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3119,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3120,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x38, 0x3a, 0x31, 0x36, 0x3a, 0x31, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3121,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3122,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3123,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3124,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3125,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3126,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3127,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3128,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3129,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3130,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3131,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3132,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x2f, 0x41, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3133,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3134,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3135,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3136,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3137,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3138,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3139,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3140,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x36, 0x35, 0x34, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3141,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3142,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3143,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3144,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3145,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3146,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x6d, 0x65, 0x6e, 0x64, 0x3e, 0x5b, 0x41, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3147,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x64, 0x5d, 0x3c, 0x2f, 0x61, 0x6d, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3148,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3149,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3150,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3151,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3152,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3153,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3154,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3155,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3156,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3157,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3158,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3159,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3160,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3161,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3162,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3163,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3164,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3165,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3166,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3167,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3168,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3169,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3170,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3171,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3172,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3173,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3174,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3175,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3176,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3177,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3178,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3179,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3180,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3181,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x30, 0x30, 0x36, 0x35, 0x34, 0x31, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3182,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3183,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x30, 0x36, 0x35, 0x34, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3184,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3185,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3186,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3187,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3188,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3189,64,"style","Trailing whitespace is superfluous."," 0x41, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3190,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3191,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3192,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x33, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3193,64,"style","Trailing whitespace is superfluous."," 0x36, 0x33, 0x36, 0x32, 0x38, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3194,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3195,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3196,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3197,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3198,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3199,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3200,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3201,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3202,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3203,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x30, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3204,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3205,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3206,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3207,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3208,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3209,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3210,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3211,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3212,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3213,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3214,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3215,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3216,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x36, 0x35, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3217,64,"style","Trailing whitespace is superfluous."," 0x31, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3218,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3219,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3220,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3221,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3222,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3223,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3224,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3225,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3226,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3227,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3228,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x35, 0x34, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3229,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3230,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3231,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3232,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3233,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3234,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3235,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3236,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x33, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3237,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x35, 0x34, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3238,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3239,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x36, 0x35, 0x34, 0x31, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3240,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3241,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3242,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3243,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3244,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3245,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3246,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3247,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3248,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3249,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3250,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3251,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3252,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3253,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3254,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3255,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x35, 0x34, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3256,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3257,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3258,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x30, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3259,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3260,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3261,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x2f, 0x41, 0x20, 0x5b, 0x41, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3262,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x64, 0x5d, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3263,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3264,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3265,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3266,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3267,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3268,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3269,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3270,64,"style","Trailing whitespace is superfluous."," 0x31, 0x54, 0x31, 0x37, 0x3a, 0x31, 0x36, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3271,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3272,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3273,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3274,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3275,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3276,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3277,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3278,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3279,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3280,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3281,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3282,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3283,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3284,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3285,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3286,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3287,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3288,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3289,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3290,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x34, 0x39, 0x37, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3291,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3292,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3293,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3294,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3295,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3296,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3297,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3298,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3299,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3300,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3301,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3302,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3303,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3304,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3305,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3306,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3307,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3308,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3309,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3310,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3311,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3312,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3313,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3314,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3315,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3316,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3317,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3318,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3319,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3320,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3321,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3322,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3323,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3324,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3325,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3326,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3327,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3328,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x34, 0x39, 0x37, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3329,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3330,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x35, 0x34, 0x39, 0x37, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3331,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3332,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3333,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3334,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3335,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3336,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3337,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3338,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3339,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x31, 0x33, 0x35, 0x35, 0x34, 0x38, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3340,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3341,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3342,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3343,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3344,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3345,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3346,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3347,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3348,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3349,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3350,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x32, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3351,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3352,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3353,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3354,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3355,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3356,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3357,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3358,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3359,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3360,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3361,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3362,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3363,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x35, 0x34, 0x39, 0x37, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3364,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3365,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3366,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3367,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3368,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3369,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3370,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3371,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3372,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3373,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3374,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x34, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3375,64,"style","Trailing whitespace is superfluous."," 0x37, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3376,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3377,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3378,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3379,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3380,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3381,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3382,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3383,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x33, 0x30, 0x30, 0x35, 0x34, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3384,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3385,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3386,64,"style","Trailing whitespace is superfluous."," 0x39, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3387,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3388,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3389,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3390,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3391,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3392,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3393,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3394,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3395,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3396,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x33, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3397,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x32, 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3398,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3399,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3400,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3401,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x33, 0x2d, 0x30, 0x30, 0x35, 0x34, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3402,64,"style","Trailing whitespace is superfluous."," 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3403,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3404,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x32, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3405,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3406,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3407,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3408,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3409,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3410,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3411,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3412,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3413,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3414,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3415,64,"style","Trailing whitespace is superfluous."," 0x33, 0x2d, 0x30, 0x31, 0x2d, 0x32, 0x39, 0x54, 0x31, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3416,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x34, 0x36, 0x3a, 0x30, 0x35, 0x2d, 0x30, 0x35, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3417,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3418,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3419,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3420,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3421,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3422,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3423,64,"style","Trailing whitespace is superfluous."," 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3424,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3425,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3426,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3427,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3428,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3429,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3430,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3431,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3432,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3433,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3434,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3435,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3436,64,"style","Trailing whitespace is superfluous."," 0x37, 0x32, 0x37, 0x34, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3437,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3438,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3439,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3440,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3441,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3442,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3443,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3444,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3445,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3446,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3447,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3448,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3449,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3450,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3451,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3452,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3453,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3454,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3455,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3456,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3457,64,"style","Trailing whitespace is superfluous."," 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3458,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3459,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3460,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3461,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3462,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3463,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x32, 0x2d, 0x31, 0x30, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3464,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3465,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3466,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3467,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3468,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3469,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3470,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3471,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3472,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3473,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x31, 0x32, 0x30, 0x37, 0x32, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3474,64,"style","Trailing whitespace is superfluous."," 0x34, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3475,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x37, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3476,64,"style","Trailing whitespace is superfluous."," 0x37, 0x34, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3477,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3478,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3479,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3480,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3481,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3482,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3483,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3484,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3485,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x31, 0x37, 0x31, 0x33, 0x39, 0x38, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3486,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3487,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3488,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3489,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3490,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3491,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3492,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3493,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3494,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3495,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3496,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3497,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3498,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3499,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3500,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3501,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3502,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3503,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3504,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3505,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3506,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3507,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3508,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3509,64,"style","Trailing whitespace is superfluous."," 0x32, 0x37, 0x34, 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3510,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3511,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3512,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3513,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3514,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3515,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3516,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3517,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3518,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3519,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3520,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x37, 0x32, 0x37, 0x34, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3521,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3522,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3523,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3524,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3525,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3526,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3527,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3528,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3529,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x30, 0x37, 0x32, 0x37, 0x34, 0x34, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3530,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3531,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x2d, 0x30, 0x37, 0x32, 0x37, 0x34, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3532,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3533,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3534,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3535,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3536,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3537,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3538,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3539,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3540,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3541,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3542,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x31, 0x32, 0x2d, 0x31, 0x30, 0x2d, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3543,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3544,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3545,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3546,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3547,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x37, 0x32, 0x37, 0x34, 0x34, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3548,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3549,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3550,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x31, 0x30, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3551,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3552,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3553,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3554,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3555,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3556,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3557,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3558,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3559,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3560,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x32, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3561,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x33, 0x31, 0x54, 0x31, 0x37, 0x3a, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3562,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x37, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3563,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3564,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3565,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3566,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3567,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3568,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3569,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3570,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3571,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3572,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3573,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3574,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3575,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3576,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3577,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3578,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3579,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3580,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3581,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x33, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3582,64,"style","Trailing whitespace is superfluous."," 0x34, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3583,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3584,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3585,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3586,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3587,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3588,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3589,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3590,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3591,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3592,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3593,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3594,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3595,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3596,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3597,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3598,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3599,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3600,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3601,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3602,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3603,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3604,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3605,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3606,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3607,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3608,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3609,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3610,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3611,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3612,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3613,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3614,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3615,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3616,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3617,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3618,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3619,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x32, 0x30, 0x33, 0x30, 0x37, 0x34, 0x34, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3620,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3621,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x33, 0x30, 0x37, 0x34, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3622,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3623,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3624,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3625,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3626,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3627,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3628,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3629,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3630,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x32, 0x37, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3631,64,"style","Trailing whitespace is superfluous."," 0x36, 0x37, 0x30, 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3632,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3633,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3634,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3635,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3636,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3637,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3638,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3639,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3640,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3641,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3642,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3643,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3644,64,"style","Trailing whitespace is superfluous."," 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3645,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3646,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3647,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3648,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3649,64,"style","Trailing whitespace is superfluous."," 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3650,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3651,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3652,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3653,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3654,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x33, 0x30, 0x37, 0x34, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3655,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3656,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3657,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3658,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3659,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3660,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3661,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3662,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3663,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3664,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3665,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3666,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x34, 0x34, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3667,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3668,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3669,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3670,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3671,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3672,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3673,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3674,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x32, 0x30, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3675,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x34, 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3676,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3677,64,"style","Trailing whitespace is superfluous."," 0x33, 0x30, 0x37, 0x34, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3678,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3679,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3680,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3681,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3682,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3683,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3684,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3685,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3686,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3687,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3688,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3689,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3690,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3691,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3692,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3693,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x34, 0x34, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3694,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3695,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3696,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3697,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3698,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3699,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3700,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3701,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3702,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3703,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3704,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3705,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3706,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x32, 0x2d, 0x30, 0x34, 0x2d, 0x33, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3707,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x37, 0x3a, 0x32, 0x38, 0x3a, 0x30, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3708,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3709,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3710,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3711,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3712,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3713,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3714,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3715,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3716,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3717,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3718,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3719,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3720,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3721,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3722,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3723,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3724,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3725,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3726,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3727,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x30, 0x35, 0x38, 0x36, 0x31, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3728,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3729,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3730,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3731,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3732,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3733,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3734,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3735,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3736,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3737,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3738,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3739,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3740,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3741,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3742,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3743,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3744,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3745,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3746,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3747,64,"style","Trailing whitespace is superfluous."," 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3748,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3749,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3750,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3751,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3752,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3753,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3754,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x32, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3755,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3756,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3757,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3758,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3759,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3760,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3761,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3762,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3763,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3764,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3765,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x38, 0x36, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3766,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3767,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x38, 0x36, 0x31, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3768,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3769,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3770,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3771,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3772,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3773,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3774,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3775,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3776,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x31, 0x32, 0x35, 0x36, 0x32, 0x37, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3777,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3778,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3779,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3780,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3781,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3782,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3783,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3784,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3785,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3786,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3787,64,"style","Trailing whitespace is superfluous."," 0x31, 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3788,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3789,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3790,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3791,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3792,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3793,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3794,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3795,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3796,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3797,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3798,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3799,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3800,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x35, 0x38, 0x36, 0x31, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3801,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3802,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3803,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3804,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3805,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3806,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3807,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3808,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3809,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3810,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3811,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x35, 0x38, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3812,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3813,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3814,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3815,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3816,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3817,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3818,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3819,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3820,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x31, 0x32, 0x30, 0x30, 0x35, 0x38, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3821,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3822,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x35, 0x38, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3823,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3824,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3825,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3826,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3827,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3828,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3829,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3830,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3831,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3832,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3833,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x32, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3834,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3835,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3836,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3837,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3838,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x32, 0x2d, 0x30, 0x30, 0x35, 0x38, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3839,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3840,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3841,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x34, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3842,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3843,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3844,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3845,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3846,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3847,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3848,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3849,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3850,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3851,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3852,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x31, 0x54, 0x31, 0x36, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3853,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x3a, 0x34, 0x30, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3854,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3855,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3856,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3857,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3858,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3859,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3860,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3861,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3862,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3863,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3864,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3865,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3866,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3867,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3868,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3869,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3870,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3871,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3872,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3873,64,"style","Trailing whitespace is superfluous."," 0x38, 0x34, 0x38, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3874,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3875,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3876,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3877,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3878,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3879,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3880,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3881,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3882,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3883,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3884,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3885,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3886,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3887,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3888,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3889,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3890,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3891,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3892,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3893,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3894,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3895,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3896,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3897,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3898,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3899,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3900,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x37, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3901,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3902,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3903,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3904,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3905,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3906,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3907,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3908,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3909,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3910,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x31, 0x30, 0x35, 0x38, 0x34, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3911,64,"style","Trailing whitespace is superfluous."," 0x34, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3912,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x35, 0x38, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3913,64,"style","Trailing whitespace is superfluous."," 0x38, 0x34, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3914,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3915,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3916,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3917,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3918,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3919,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3920,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3921,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3922,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x36, 0x32, 0x34, 0x32, 0x36, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3923,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3924,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3925,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3926,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3927,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3928,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3929,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3930,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3931,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3932,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x31, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3933,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3934,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3935,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3936,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3937,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3938,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3939,64,"style","Trailing whitespace is superfluous."," 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3940,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3941,64,"style","Trailing whitespace is superfluous."," 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3942,64,"style","Trailing whitespace is superfluous."," 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3943,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3944,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3945,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x35, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3946,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x34, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3947,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3948,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3949,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3950,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3951,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3952,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3953,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3954,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3955,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3956,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3957,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x38, 0x34, 0x38, 0x34, 0x3c, 0x2f, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3958,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3959,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3960,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3961,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3962,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3963,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3964,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3965,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3966,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x35, 0x38, 0x34, 0x38, 0x34, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3967,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3968,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x30, 0x35, 0x38, 0x34, 0x38, 0x34, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3969,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3970,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3971,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3972,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3973,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3974,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3975,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3976,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3977,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3978,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3979,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x31, 0x31, 0x2d, 0x31, 0x30, 0x2d, 0x32, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3980,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3981,64,"style","Trailing whitespace is superfluous."," 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3982,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3983,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3984,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x38, 0x34, 0x38, 0x34, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3985,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3986,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3987,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x31, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3988,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3989,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3990,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3991,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3992,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3993,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3994,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3995,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3996,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3997,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3998,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x37, 0x54, 0x31, 0x36, 0x3a, 0x34, 0x33, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",3999,64,"style","Trailing whitespace is superfluous."," 0x34, 0x32, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4000,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4001,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4002,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4003,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4004,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4005,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4006,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4007,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4008,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4009,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4010,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4011,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4012,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4013,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4014,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4015,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4016,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4017,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4018,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x35, 0x33, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4019,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4020,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4021,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4022,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4023,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4024,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4025,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4026,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4027,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4028,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4029,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4030,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4031,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4032,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4033,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4034,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4035,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4036,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4037,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4038,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4039,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4040,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4041,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4042,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4043,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4044,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4045,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4046,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4047,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4048,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4049,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4050,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4051,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4052,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4053,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4054,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4055,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4056,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x32, 0x35, 0x33, 0x33, 0x30, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4057,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4058,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x32, 0x35, 0x33, 0x33, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4059,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4060,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4061,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4062,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4063,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4064,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4065,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4066,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4067,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x31, 0x38, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4068,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x32, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4069,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4070,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4071,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4072,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4073,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4074,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4075,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4076,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4077,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4078,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x31, 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4079,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4080,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4081,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4082,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4083,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4084,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4085,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4086,64,"style","Trailing whitespace is superfluous."," 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4087,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4088,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4089,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4090,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4091,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x32, 0x35, 0x33, 0x33, 0x30, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4092,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4093,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4094,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4095,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4096,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4097,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4098,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4099,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4100,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4101,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4102,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4103,64,"style","Trailing whitespace is superfluous."," 0x33, 0x33, 0x30, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4104,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4105,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4106,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4107,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4108,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4109,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4110,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4111,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x31, 0x30, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4112,64,"style","Trailing whitespace is superfluous."," 0x33, 0x33, 0x30, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4113,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4114,64,"style","Trailing whitespace is superfluous."," 0x35, 0x33, 0x33, 0x30, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4115,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4116,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4117,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4118,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4119,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4120,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4121,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4122,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4123,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4124,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4125,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x33, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4126,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4127,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4128,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4129,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4130,64,"style","Trailing whitespace is superfluous."," 0x33, 0x33, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4131,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4132,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4133,64,"style","Trailing whitespace is superfluous."," 0x34, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4134,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4135,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4136,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4137,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4138,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4139,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4140,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4141,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4142,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4143,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x33, 0x54, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4144,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x3a, 0x35, 0x35, 0x3a, 0x33, 0x34, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4145,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4146,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4147,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4148,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4149,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4150,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4151,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4152,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4153,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4154,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4155,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4156,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4157,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4158,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4159,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4160,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4161,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4162,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4163,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4164,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x30, 0x34, 0x38, 0x34, 0x31, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4165,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4166,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4167,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4168,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4169,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4170,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4171,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4172,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4173,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4174,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4175,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4176,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4177,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4178,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4179,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4180,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4181,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4182,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4183,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4184,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4185,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4186,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4187,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4188,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4189,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4190,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4191,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4192,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4193,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4194,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4195,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4196,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4197,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4198,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4199,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4200,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4201,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x31, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4202,64,"style","Trailing whitespace is superfluous."," 0x34, 0x38, 0x34, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4203,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4204,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x38, 0x34, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4205,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4206,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4207,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4208,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4209,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4210,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4211,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4212,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4213,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x31, 0x35, 0x37, 0x31, 0x35, 0x31, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4214,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4215,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4216,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4217,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4218,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4219,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4220,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4221,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4222,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4223,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4224,64,"style","Trailing whitespace is superfluous."," 0x35, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4225,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4226,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4227,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4228,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4229,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4230,64,"style","Trailing whitespace is superfluous."," 0x69, 0x65, 0x77, 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4231,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4232,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4233,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4234,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4235,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4236,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4237,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x38, 0x34, 0x31, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4238,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4239,64,"style","Trailing whitespace is superfluous."," 0x76, 0x3c, 0x2f, 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4240,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4241,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4242,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4243,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4244,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4245,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4246,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4247,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4248,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x30, 0x34, 0x38, 0x34, 0x31, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4249,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4250,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4251,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4252,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4253,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4254,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4255,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4256,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4257,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x31, 0x30, 0x30, 0x34, 0x38, 0x34, 0x31, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4258,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4259,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x30, 0x34, 0x38, 0x34, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4260,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4261,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4262,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4263,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4264,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4265,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4266,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4267,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4268,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4269,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4270,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x31, 0x31, 0x2d, 0x30, 0x32, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4271,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4272,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4273,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4274,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4275,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x2d, 0x30, 0x30, 0x34, 0x38, 0x34, 0x31, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4276,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4277,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4278,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x35, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4279,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4280,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4281,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4282,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4283,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4284,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4285,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4286,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4287,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4288,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4289,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x33, 0x54, 0x31, 0x37, 0x3a, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4290,64,"style","Trailing whitespace is superfluous."," 0x32, 0x3a, 0x33, 0x31, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4291,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4292,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4293,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4294,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4295,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4296,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4297,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4298,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4299,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4300,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4301,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4302,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4303,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4304,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4305,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4306,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4307,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4308,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4309,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x35, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4310,64,"style","Trailing whitespace is superfluous."," 0x36, 0x31, 0x32, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4311,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4312,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4313,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4314,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4315,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4316,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4317,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4318,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4319,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4320,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4321,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4322,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4323,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4324,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4325,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4326,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4327,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4328,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4329,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4330,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4331,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4332,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4333,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4334,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4335,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4336,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4337,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4338,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4339,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4340,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4341,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4342,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4343,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4344,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4345,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4346,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4347,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x31, 0x30, 0x30, 0x35, 0x35, 0x36, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4348,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4349,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x35, 0x35, 0x36, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4350,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4351,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4352,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4353,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4354,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4355,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4356,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4357,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4358,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4359,64,"style","Trailing whitespace is superfluous."," 0x31, 0x36, 0x31, 0x37, 0x37, 0x39, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4360,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4361,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4362,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4363,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4364,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4365,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4366,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4367,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4368,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4369,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x32, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4370,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4371,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x78, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4372,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4373,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4374,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4375,64,"style","Trailing whitespace is superfluous."," 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x76, 0x69, 0x65, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4376,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4377,64,"style","Trailing whitespace is superfluous."," 0x76, 0x69, 0x65, 0x77, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4378,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6b, 0x3d, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4379,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4380,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x5f, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4381,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4382,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x35, 0x35, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4383,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x78, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4384,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x5f, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x76, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4385,64,"style","Trailing whitespace is superfluous."," 0x78, 0x62, 0x72, 0x6c, 0x5f, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4386,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4387,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4388,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4389,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4390,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4391,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4392,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4393,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4394,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x35, 0x36, 0x31, 0x32, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4395,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4396,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4397,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4398,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4399,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4400,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4401,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4402,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4403,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x35, 0x36, 0x31, 0x32, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4404,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4405,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x35, 0x36, 0x31, 0x32, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4406,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4407,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4408,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4409,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4410,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4411,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4412,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4413,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4414,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4415,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4416,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x30, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4417,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4418,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4419,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4420,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4421,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x35, 0x36, 0x31, 0x32, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4422,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4423,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4424,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x32, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4425,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4426,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4427,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4428,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4429,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4430,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4431,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4432,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4433,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4434,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x31, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4435,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x54, 0x31, 0x36, 0x3a, 0x32, 0x38, 0x3a, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4436,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4437,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4438,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4439,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4440,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4441,64,"style","Trailing whitespace is superfluous."," 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4442,64,"style","Trailing whitespace is superfluous."," 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4443,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4444,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4445,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4446,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4447,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4448,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4449,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4450,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4451,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4452,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4453,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4454,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4455,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x32, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4456,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4457,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4458,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4459,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4460,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4461,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4462,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4463,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4464,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4465,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4466,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4467,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4468,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4469,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4470,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4471,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4472,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4473,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4474,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4475,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4476,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4477,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4478,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4479,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4480,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4481,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4482,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4483,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x35, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4484,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4485,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4486,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4487,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4488,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4489,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4490,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4491,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4492,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4493,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x32, 0x35, 0x38, 0x32, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4494,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4495,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x32, 0x39, 0x2d, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4496,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4497,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4498,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4499,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4500,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4501,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4502,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4503,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4504,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x31, 0x30, 0x38, 0x30, 0x32, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4505,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4506,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4507,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4508,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4509,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4510,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4511,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4512,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4513,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4514,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4515,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4516,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4517,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4518,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4519,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4520,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4521,64,"style","Trailing whitespace is superfluous."," 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4522,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4523,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4524,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x32, 0x39, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4525,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4526,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4527,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4528,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4529,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4530,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4531,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4532,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4533,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x30, 0x30, 0x32, 0x35, 0x38, 0x32, 0x39, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4534,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4535,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x32, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4536,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4537,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4538,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4539,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4540,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4541,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4542,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4543,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4544,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4545,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4546,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4547,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4548,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4549,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4550,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4551,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x30, 0x32, 0x35, 0x38, 0x32, 0x39, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4552,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4553,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4554,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x33, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4555,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4556,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4557,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4558,64,"style","Trailing whitespace is superfluous."," 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4559,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4560,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4561,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4562,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4563,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4564,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4565,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x35, 0x54, 0x31, 0x37, 0x3a, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4566,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x32, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4567,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4568,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4569,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4570,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4571,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4572,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4573,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4574,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4575,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4576,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4577,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4578,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4579,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4580,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4581,64,"style","Trailing whitespace is superfluous."," 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4582,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4583,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4584,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4585,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4586,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4587,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4588,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4589,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4590,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4591,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4592,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4593,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4594,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4595,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4596,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4597,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4598,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4599,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4600,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4601,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4602,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4603,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4604,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4605,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4606,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4607,64,"style","Trailing whitespace is superfluous."," 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4608,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4609,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4610,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4611,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4612,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4613,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x31, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4614,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4615,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4616,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4617,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4618,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4619,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4620,64,"style","Trailing whitespace is superfluous."," 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4621,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4622,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4623,64,"style","Trailing whitespace is superfluous."," 0x39, 0x31, 0x30, 0x30, 0x30, 0x34, 0x32, 0x30, 0x35, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4624,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4625,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, 0x34, 0x32, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4626,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4627,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4628,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4629,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4630,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4631,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4632,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4633,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4634,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x31, 0x30, 0x35, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4635,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x36, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4636,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4637,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4638,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4639,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4640,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4641,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4642,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4643,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4644,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4645,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4646,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4647,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4648,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4649,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4650,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4651,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4652,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4653,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4654,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, 0x34, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4655,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4656,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4657,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4658,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4659,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4660,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4661,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4662,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4663,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x31, 0x30, 0x30, 0x30, 0x34, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4664,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4665,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4666,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4667,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4668,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4669,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4670,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4671,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4672,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4673,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4674,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4675,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4676,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x31, 0x30, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4677,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x30, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4678,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4679,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4680,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4681,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x30, 0x2d, 0x30, 0x30, 0x34, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4682,64,"style","Trailing whitespace is superfluous."," 0x35, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4683,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4684,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x33, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4685,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4686,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4687,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4688,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4689,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4690,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4691,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4692,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4693,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4694,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4695,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x31, 0x54, 0x31, 0x37, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4696,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x3a, 0x33, 0x33, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4697,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4698,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4699,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4700,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4701,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4702,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4703,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4704,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4705,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4706,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4707,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4708,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4709,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4710,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4711,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4712,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4713,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4714,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4715,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x30, 0x39, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4716,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x30, 0x38, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4717,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4718,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4719,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4720,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4721,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4722,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4723,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4724,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4725,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4726,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4727,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4728,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4729,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4730,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4731,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4732,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4733,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4734,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4735,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4736,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4737,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4738,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4739,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4740,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4741,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4742,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4743,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4744,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4745,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4746,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4747,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4748,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4749,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4750,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4751,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4752,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4753,64,"style","Trailing whitespace is superfluous."," 0x36, 0x35, 0x39, 0x30, 0x39, 0x30, 0x36, 0x32, 0x35, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4754,64,"style","Trailing whitespace is superfluous."," 0x38, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4755,64,"style","Trailing whitespace is superfluous."," 0x35, 0x39, 0x2d, 0x30, 0x39, 0x2d, 0x30, 0x36, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4756,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4757,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4758,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4759,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4760,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4761,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4762,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4763,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4764,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4765,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x35, 0x37, 0x37, 0x38, 0x32, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4766,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4767,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4768,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4769,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4770,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4771,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4772,64,"style","Trailing whitespace is superfluous."," 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4773,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4774,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4775,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x33, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4776,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4777,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4778,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4779,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4780,64,"style","Trailing whitespace is superfluous."," 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4781,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4782,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4783,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4784,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x30, 0x39, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4785,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x30, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4786,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4787,64,"style","Trailing whitespace is superfluous."," 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4788,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4789,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4790,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4791,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4792,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4793,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x34, 0x36, 0x35, 0x39, 0x30, 0x39, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4794,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x30, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4795,64,"style","Trailing whitespace is superfluous."," 0x30, 0x34, 0x36, 0x35, 0x39, 0x2d, 0x30, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4796,64,"style","Trailing whitespace is superfluous."," 0x36, 0x32, 0x35, 0x30, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4797,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4798,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4799,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4800,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4801,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4802,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4803,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4804,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4805,64,"style","Trailing whitespace is superfluous."," 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4806,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4807,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x34, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4808,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4809,64,"style","Trailing whitespace is superfluous."," 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4810,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4811,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x35, 0x39, 0x2d, 0x30, 0x39, 0x2d, 0x30, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4812,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x30, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4813,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4814,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4815,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4816,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4817,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4818,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4819,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4820,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4821,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4822,64,"style","Trailing whitespace is superfluous."," 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4823,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4824,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4825,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x2d, 0x31, 0x31, 0x2d, 0x30, 0x34, 0x54, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4826,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x3a, 0x35, 0x39, 0x3a, 0x30, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4827,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4828,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4829,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4830,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4831,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4832,64,"style","Trailing whitespace is superfluous."," 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4833,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4834,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4835,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4836,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4837,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4838,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4839,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4840,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4841,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4842,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4843,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4844,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4845,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4846,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x30, 0x33, 0x35, 0x33, 0x3c, 0x2f, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4847,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4848,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4849,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4850,64,"style","Trailing whitespace is superfluous."," 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4851,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4852,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4853,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4854,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4855,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4856,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4857,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4858,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4859,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4860,64,"style","Trailing whitespace is superfluous."," 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4861,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4862,64,"style","Trailing whitespace is superfluous."," 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4863,64,"style","Trailing whitespace is superfluous."," 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4864,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4865,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4866,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4867,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4868,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4869,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4870,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4871,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4872,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4873,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4874,64,"style","Trailing whitespace is superfluous."," 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4875,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4876,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4877,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4878,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4879,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4880,64,"style","Trailing whitespace is superfluous."," 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4881,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4882,64,"style","Trailing whitespace is superfluous."," 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4883,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4884,64,"style","Trailing whitespace is superfluous."," 0x30, 0x33, 0x35, 0x33, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4885,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4886,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x33, 0x35, 0x33, 0x2d, 0x69, 0x6e, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4887,64,"style","Trailing whitespace is superfluous."," 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4888,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4889,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4890,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4891,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4892,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4893,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4894,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4895,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x39, 0x37, 0x39, 0x39, 0x33, 0x37, 0x31, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4896,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4897,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4898,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4899,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4900,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4901,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4902,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4903,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4904,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4905,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4906,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4907,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4908,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4909,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4910,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4911,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4912,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4913,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4914,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4915,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x33, 0x35, 0x33, 0x3c, 0x2f, 0x69, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4916,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4917,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4918,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4919,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4920,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4921,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4922,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4923,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4924,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x33, 0x35, 0x33, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4925,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4926,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x30, 0x33, 0x35, 0x33, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4927,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4928,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4929,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4930,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4931,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4932,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4933,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4934,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4935,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4936,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4937,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x39, 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x36, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4938,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4939,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4940,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4941,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4942,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x30, 0x33, 0x35, 0x33, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4943,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4944,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4945,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4946,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4947,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4948,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4949,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4950,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4951,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4952,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4953,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4954,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4955,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4956,64,"style","Trailing whitespace is superfluous."," 0x35, 0x54, 0x32, 0x31, 0x3a, 0x34, 0x39, 0x3a, 0x33, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4957,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4958,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4959,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4960,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4961,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4962,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4963,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4964,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4965,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4966,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4967,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4968,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4969,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4970,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4971,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4972,64,"style","Trailing whitespace is superfluous."," 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4973,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4974,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4975,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4976,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x2d, 0x30, 0x32, 0x34, 0x31, 0x35, 0x33, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4977,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4978,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4979,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4980,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4981,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4982,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4983,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4984,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4985,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4986,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4987,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4988,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4989,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4990,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4991,64,"style","Trailing whitespace is superfluous."," 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4992,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4993,64,"style","Trailing whitespace is superfluous."," 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4994,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4995,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4996,64,"style","Trailing whitespace is superfluous."," 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4997,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4998,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",4999,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5000,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5001,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5002,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5003,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5004,64,"style","Trailing whitespace is superfluous."," 0x32, 0x2d, 0x31, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5005,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5006,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5007,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5008,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5009,64,"style","Trailing whitespace is superfluous."," 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5010,64,"style","Trailing whitespace is superfluous."," 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5011,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5012,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5013,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5014,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x34, 0x31, 0x35, 0x33, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5015,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5016,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x32, 0x34, 0x31, 0x35, 0x33, 0x2d, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5017,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5018,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5019,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5020,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5021,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5022,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5023,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5024,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5025,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x39, 0x35, 0x38, 0x36, 0x34, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5026,64,"style","Trailing whitespace is superfluous."," 0x37, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5027,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5028,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5029,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5030,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5031,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5032,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5033,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5034,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5035,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5036,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5037,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5038,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5039,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5040,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5041,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5042,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5043,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5044,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5045,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x32, 0x34, 0x31, 0x35, 0x33, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5046,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5047,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5048,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5049,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5050,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5051,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5052,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5053,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5054,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x30, 0x32, 0x34, 0x31, 0x35, 0x33, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5055,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5056,64,"style","Trailing whitespace is superfluous."," 0x30, 0x39, 0x2d, 0x30, 0x32, 0x34, 0x31, 0x35, 0x33, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5057,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5058,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5059,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5060,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5061,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5062,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5063,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5064,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5065,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5066,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5067,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x32, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5068,64,"style","Trailing whitespace is superfluous."," 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5069,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5070,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5071,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5072,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2d, 0x30, 0x32, 0x34, 0x31, 0x35, 0x33, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5073,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5074,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5075,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5076,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5077,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5078,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5079,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5080,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5081,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5082,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5083,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5084,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5085,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x39, 0x2d, 0x30, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5086,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x54, 0x31, 0x37, 0x3a, 0x30, 0x37, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5087,64,"style","Trailing whitespace is superfluous."," 0x34, 0x36, 0x2d, 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5088,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5089,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5090,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5091,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5092,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5093,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5094,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5095,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5096,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5097,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5098,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5099,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5100,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5101,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5102,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5103,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5104,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5105,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5106,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x32, 0x32, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5107,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5108,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5109,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5110,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5111,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5112,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5113,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5114,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5115,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5116,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5117,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5118,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5119,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5120,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5121,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5122,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5123,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5124,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5125,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5126,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5127,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5128,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5129,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5130,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5131,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5132,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5133,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5134,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x33, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5135,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5136,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5137,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5138,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5139,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5140,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5141,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5142,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5143,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5144,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x32, 0x32, 0x30, 0x34, 0x32, 0x31, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5145,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5146,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x32, 0x32, 0x30, 0x34, 0x32, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5147,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5148,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5149,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5150,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5151,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5152,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5153,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5154,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5155,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x38, 0x31, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5156,64,"style","Trailing whitespace is superfluous."," 0x31, 0x38, 0x30, 0x36, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5157,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5158,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5159,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5160,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5161,64,"style","Trailing whitespace is superfluous."," 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5162,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5163,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5164,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5165,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5166,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5167,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5168,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5169,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5170,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5171,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5172,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5173,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5174,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5175,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x32, 0x32, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5176,64,"style","Trailing whitespace is superfluous."," 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5177,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5178,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5179,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5180,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5181,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5182,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5183,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5184,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x30, 0x38, 0x32, 0x32, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5185,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5186,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x32, 0x32, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5187,64,"style","Trailing whitespace is superfluous."," 0x32, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5188,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5189,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5190,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5191,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5192,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5193,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5194,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5195,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5196,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5197,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x38, 0x2d, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5198,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x33, 0x30, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5199,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5200,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5201,64,"style","Trailing whitespace is superfluous."," 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5202,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x32, 0x32, 0x30, 0x34, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5203,64,"style","Trailing whitespace is superfluous."," 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5204,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5205,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5206,64,"style","Trailing whitespace is superfluous."," 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5207,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5208,64,"style","Trailing whitespace is superfluous."," 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5209,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5210,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5211,64,"style","Trailing whitespace is superfluous."," 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5212,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5213,64,"style","Trailing whitespace is superfluous."," 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5214,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5215,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5216,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x31, 0x30, 0x2d, 0x33, 0x30, 0x54, 0x31, 0x37, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5217,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x3a, 0x33, 0x33, 0x2d, 0x30, 0x34, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5218,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5219,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5220,64,"style","Trailing whitespace is superfluous."," 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5221,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5222,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5223,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5224,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5225,64,"style","Trailing whitespace is superfluous."," 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5226,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5227,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5228,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5229,64,"style","Trailing whitespace is superfluous."," 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5230,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5231,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5232,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5233,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5234,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5235,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5236,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5237,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x39, 0x37, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5238,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5239,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5240,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5241,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5242,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5243,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5244,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5245,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5246,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5247,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5248,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5249,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5250,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5251,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5252,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5253,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5254,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5255,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5256,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5257,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5258,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5259,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5260,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5261,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5262,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5263,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5264,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x38, 0x2d, 0x30, 0x34, 0x2d, 0x32, 0x39, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5265,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5266,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5267,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5268,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5269,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5270,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5271,64,"style","Trailing whitespace is superfluous."," 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5272,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5273,64,"style","Trailing whitespace is superfluous."," 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5274,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x30, 0x38, 0x30, 0x39, 0x35, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5275,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5276,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, 0x35, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5277,64,"style","Trailing whitespace is superfluous."," 0x39, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5278,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5279,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5280,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5281,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5282,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5283,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5284,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5285,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5286,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x36, 0x30, 0x39, 0x37, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5287,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5288,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5289,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5290,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5291,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5292,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5293,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5294,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5295,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5296,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5297,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5298,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5299,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5300,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5301,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5302,64,"style","Trailing whitespace is superfluous."," 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5303,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5304,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5305,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5306,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x37, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5307,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5308,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5309,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5310,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5311,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5312,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5313,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5314,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x38, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5315,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x37, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5316,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5317,64,"style","Trailing whitespace is superfluous."," 0x35, 0x31, 0x39, 0x37, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5318,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5319,64,"style","Trailing whitespace is superfluous."," 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5320,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5321,64,"style","Trailing whitespace is superfluous."," 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5322,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5323,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5324,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5325,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5326,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5327,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5328,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x34, 0x2d, 0x32, 0x39, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5329,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5330,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5331,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5332,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x39, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5333,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x37, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5334,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5335,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5336,64,"style","Trailing whitespace is superfluous."," 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5337,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5338,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5339,64,"style","Trailing whitespace is superfluous."," 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5340,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5341,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5342,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5343,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5344,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5345,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5346,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x30, 0x34, 0x2d, 0x32, 0x39, 0x54, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5347,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x33, 0x39, 0x3a, 0x33, 0x37, 0x2d, 0x30, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5348,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5349,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5350,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5351,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5352,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5353,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5354,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5355,64,"style","Trailing whitespace is superfluous."," 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5356,64,"style","Trailing whitespace is superfluous."," 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5357,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5358,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5359,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5360,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5361,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5362,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5363,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5364,64,"style","Trailing whitespace is superfluous."," 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5365,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5366,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5367,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x35, 0x35, 0x34, 0x38, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5368,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5369,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5370,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5371,64,"style","Trailing whitespace is superfluous."," 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5372,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5373,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5374,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5375,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5376,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5377,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5378,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5379,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5380,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5381,64,"style","Trailing whitespace is superfluous."," 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5382,64,"style","Trailing whitespace is superfluous."," 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5383,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5384,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5385,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5386,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5387,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5388,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5389,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5390,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5391,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5392,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5393,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5394,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x32, 0x30, 0x30, 0x38, 0x2d, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5395,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5396,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5397,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5398,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5399,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5400,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5401,64,"style","Trailing whitespace is superfluous."," 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5402,64,"style","Trailing whitespace is superfluous."," 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5403,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5404,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x38, 0x30, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5405,64,"style","Trailing whitespace is superfluous."," 0x35, 0x34, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5406,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5407,64,"style","Trailing whitespace is superfluous."," 0x35, 0x35, 0x34, 0x38, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5408,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5409,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5410,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5411,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5412,64,"style","Trailing whitespace is superfluous."," 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5413,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5414,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5415,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5416,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x35, 0x36, 0x31, 0x37, 0x32, 0x35, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5417,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5418,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5419,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5420,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5421,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5422,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5423,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5424,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5425,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5426,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5427,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5428,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5429,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5430,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5431,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5432,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5433,64,"style","Trailing whitespace is superfluous."," 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5434,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5435,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5436,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x35, 0x34, 0x38, 0x3c, 0x2f, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5437,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5438,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5439,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5440,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5441,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5442,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5443,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5444,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x38, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5445,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x35, 0x34, 0x38, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5446,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5447,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x35, 0x35, 0x34, 0x38, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5448,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5449,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5450,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5451,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5452,64,"style","Trailing whitespace is superfluous."," 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5453,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5454,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5455,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5456,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5457,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5458,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x2d, 0x30, 0x31, 0x2d, 0x33, 0x30, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5459,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5460,64,"style","Trailing whitespace is superfluous."," 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5461,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5462,64,"style","Trailing whitespace is superfluous."," 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x38, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5463,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x35, 0x34, 0x38, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5464,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5465,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5466,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5467,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5468,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5469,64,"style","Trailing whitespace is superfluous."," 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5470,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5471,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5472,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5473,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5474,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5475,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5476,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x2d, 0x30, 0x31, 0x2d, 0x33, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5477,64,"style","Trailing whitespace is superfluous."," 0x54, 0x31, 0x36, 0x3a, 0x35, 0x38, 0x3a, 0x35, 0x34, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5478,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x3a, 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5479,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5480,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5481,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5482,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5483,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, 0x6c, 0x61, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5484,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, 0x6d, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5485,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, 0x68, 0x65, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5486,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5487,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5488,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, 0x72, 0x6d, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5489,64,"style","Trailing whitespace is superfluous."," 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, 0x2f, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5490,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x63, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5491,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5492,64,"style","Trailing whitespace is superfluous."," 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, 0x6d, 0x6c, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5493,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5494,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5495,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5496,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5497,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x32, 0x32, 0x38, 0x30, 0x35, 0x36, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5498,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5499,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5500,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5501,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5502,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5503,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5504,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5505,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5506,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5507,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5508,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5509,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5510,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5511,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5512,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5513,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5514,64,"style","Trailing whitespace is superfluous."," 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5515,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, 0x65, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5516,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, 0x35, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5517,64,"style","Trailing whitespace is superfluous."," 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, 0x6e, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5518,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, 0x65, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5519,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5520,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5521,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5522,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5523,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5524,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5525,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x39, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5526,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5527,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5528,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5529,64,"style","Trailing whitespace is superfluous."," 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5530,64,"style","Trailing whitespace is superfluous."," 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5531,64,"style","Trailing whitespace is superfluous."," 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5532,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5533,64,"style","Trailing whitespace is superfluous."," 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5534,64,"style","Trailing whitespace is superfluous."," 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x30, 0x37, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5535,64,"style","Trailing whitespace is superfluous."," 0x32, 0x38, 0x30, 0x35, 0x36, 0x2f, 0x30, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5536,64,"style","Trailing whitespace is superfluous."," 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5537,64,"style","Trailing whitespace is superfluous."," 0x32, 0x32, 0x38, 0x30, 0x35, 0x36, 0x2d, 0x69, 0x6e, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5538,64,"style","Trailing whitespace is superfluous."," 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5539,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5540,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5541,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5542,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5543,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5544,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5545,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5546,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x30, 0x37, 0x31, 0x31, 0x39, 0x36, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5547,64,"style","Trailing whitespace is superfluous."," 0x33, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5548,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5549,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5550,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5551,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5552,64,"style","Trailing whitespace is superfluous."," 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5553,64,"style","Trailing whitespace is superfluous."," 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5554,64,"style","Trailing whitespace is superfluous."," 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, 0x72, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5555,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5556,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, 0x7a, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5557,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x69, 0x7a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5558,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5559,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5560,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5561,64,"style","Trailing whitespace is superfluous."," 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5562,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, 0x30, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5563,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5564,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5565,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5566,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x32, 0x32, 0x38, 0x30, 0x35, 0x36, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5567,64,"style","Trailing whitespace is superfluous."," 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5568,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5569,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5570,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5571,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5572,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5573,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5574,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5575,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x32, 0x32, 0x38, 0x30, 0x35, 0x36, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5576,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5577,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x32, 0x32, 0x38, 0x30, 0x35, 0x36, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5578,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5579,64,"style","Trailing whitespace is superfluous."," 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5580,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5581,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5582,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5583,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5584,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5585,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5586,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, 0x64, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5587,64,"style","Trailing whitespace is superfluous."," 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5588,64,"style","Trailing whitespace is superfluous."," 0x20, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x31, 0x30, 0x2d, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5589,64,"style","Trailing whitespace is superfluous."," 0x39, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5590,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5591,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5592,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5593,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x32, 0x32, 0x38, 0x30, 0x35, 0x36, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5594,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x53, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5595,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5596,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5597,64,"style","Trailing whitespace is superfluous."," 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5598,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5599,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, 0x2d, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5600,64,"style","Trailing whitespace is superfluous."," 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5601,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5602,64,"style","Trailing whitespace is superfluous."," 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5603,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5604,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5605,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5606,64,"style","Trailing whitespace is superfluous."," 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x31, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5607,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x32, 0x39, 0x54, 0x31, 0x34, 0x3a, 0x32, 0x37, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5608,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5609,64,"style","Trailing whitespace is superfluous."," 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5610,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, 0x72, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5611,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5612,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5613,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, 0x79, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5614,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5615,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, 0x73, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5616,64,"style","Trailing whitespace is superfluous."," 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5617,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5618,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5619,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5620,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5621,64,"style","Trailing whitespace is superfluous."," 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5622,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5623,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5624,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5625,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5626,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5627,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x37, 0x2d, 0x31, 0x30, 0x31, 0x35, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5628,64,"style","Trailing whitespace is superfluous."," 0x35, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5629,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, 0x72, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5630,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5631,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5632,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5633,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5634,64,"style","Trailing whitespace is superfluous."," 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5635,64,"style","Trailing whitespace is superfluous."," 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x65, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5636,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5637,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5638,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5639,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5640,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5641,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5642,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5643,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5644,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5645,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5646,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, 0x2d, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5647,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5648,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5649,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5650,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5651,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5652,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5653,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5654,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, 0x30, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5655,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x35, 0x2d, 0x30, 0x33, 0x3c, 0x2f, 0x66, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5656,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5657,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5658,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5659,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5660,64,"style","Trailing whitespace is superfluous."," 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5661,64,"style","Trailing whitespace is superfluous."," 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5662,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5663,64,"style","Trailing whitespace is superfluous."," 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, 0x39, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5664,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5665,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x31, 0x30, 0x31, 0x35, 0x34, 0x35, 0x2f, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5666,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5667,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x31, 0x30, 0x31, 0x35, 0x34, 0x35, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5668,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, 0x6d, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5669,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5670,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5671,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5672,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5673,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5674,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5675,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, 0x6e, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5676,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x37, 0x38, 0x31, 0x36, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5677,64,"style","Trailing whitespace is superfluous."," 0x37, 0x34, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5678,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5679,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5680,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, 0x75, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5681,64,"style","Trailing whitespace is superfluous."," 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5682,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5683,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5684,64,"style","Trailing whitespace is superfluous."," 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x66, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5685,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5686,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5687,64,"style","Trailing whitespace is superfluous."," 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, 0x2f, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5688,64,"style","Trailing whitespace is superfluous."," 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5689,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5690,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5691,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, 0x67, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5692,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5693,64,"style","Trailing whitespace is superfluous."," 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, 0x73, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5694,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5695,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5696,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x2d, 0x31, 0x30, 0x31, 0x35, 0x34, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5697,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5698,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5699,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5700,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5701,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5702,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5703,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5704,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5705,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x30, 0x37, 0x31, 0x30, 0x31, 0x35, 0x34, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5706,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5707,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x37, 0x2d, 0x31, 0x30, 0x31, 0x35, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5708,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5709,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5710,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5711,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5712,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5713,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, 0x6d, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5714,64,"style","Trailing whitespace is superfluous."," 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5715,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5716,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5717,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5718,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x37, 0x2d, 0x30, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5719,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x33, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5720,64,"style","Trailing whitespace is superfluous."," 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, 0x3a, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5721,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5722,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5723,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x37, 0x2d, 0x31, 0x30, 0x31, 0x35, 0x34, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5724,64,"style","Trailing whitespace is superfluous."," 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5725,64,"style","Trailing whitespace is superfluous."," 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5726,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, 0x4d, 0x42, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5727,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5728,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x74, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5729,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5730,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5731,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5732,64,"style","Trailing whitespace is superfluous."," 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5733,64,"style","Trailing whitespace is superfluous."," 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5734,64,"style","Trailing whitespace is superfluous."," 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5735,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5736,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5737,64,"style","Trailing whitespace is superfluous."," 0x30, 0x35, 0x2d, 0x30, 0x33, 0x54, 0x31, 0x37, 0x3a, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5738,64,"style","Trailing whitespace is superfluous."," 0x36, 0x3a, 0x33, 0x30, 0x2d, 0x30, 0x34, 0x3a, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5739,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5740,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, 0x6e, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5741,64,"style","Trailing whitespace is superfluous."," 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5742,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5743,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x63, 0x61, 0x74, 0x65, 0x67, 0x6f, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5744,64,"style","Trailing whitespace is superfluous."," 0x79, 0x20, 0x6c, 0x61, 0x62, 0x65, 0x6c, 0x3d, 0x22, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5745,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x20, 0x74, 0x79, 0x70, 0x65, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5746,64,"style","Trailing whitespace is superfluous."," 0x73, 0x63, 0x68, 0x65, 0x6d, 0x65, 0x3d, 0x22, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5747,64,"style","Trailing whitespace is superfluous."," 0x74, 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5748,64,"style","Trailing whitespace is superfluous."," 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5749,64,"style","Trailing whitespace is superfluous."," 0x74, 0x65, 0x72, 0x6d, 0x3d, 0x22, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5750,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5751,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x63, 0x6f, 0x6e, 0x74, 0x65, 0x6e, 0x74, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5752,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5753,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x78, 0x6d, 0x6c, 0x22, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5754,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x61, 0x63, 0x63, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5755,64,"style","Trailing whitespace is superfluous."," 0x73, 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5756,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x3e, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5757,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5758,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x31, 0x3c, 0x2f, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5759,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6e, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5760,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5761,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x61, 0x63, 0x74, 0x3e, 0x33, 0x34, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5762,64,"style","Trailing whitespace is superfluous."," 0x61, 0x63, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5763,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x65, 0x2d, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5764,64,"style","Trailing whitespace is superfluous."," 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x30, 0x31, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5765,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x35, 0x36, 0x30, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5766,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5767,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5768,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5769,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5770,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5771,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5772,64,"style","Trailing whitespace is superfluous."," 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5773,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5774,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5775,64,"style","Trailing whitespace is superfluous."," 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5776,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x6e, 0x75, 0x6d, 0x3d, 0x30, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5777,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x33, 0x31, 0x35, 0x36, 0x30, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5778,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x6f, 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5779,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x75, 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5780,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, 0x3c, 0x2f, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5781,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6c, 0x65, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5782,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5783,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5784,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, 0x65, 0x3e, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5785,64,"style","Trailing whitespace is superfluous."," 0x30, 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x32, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5786,64,"style","Trailing whitespace is superfluous."," 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5787,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5788,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5789,64,"style","Trailing whitespace is superfluous."," 0x72, 0x65, 0x66, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5790,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5791,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, 0x69, 0x76, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5792,64,"style","Trailing whitespace is superfluous."," 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, 0x2f, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5793,64,"style","Trailing whitespace is superfluous."," 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5794,64,"style","Trailing whitespace is superfluous."," 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5795,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x30, 0x37, 0x30, 0x31, 0x39, 0x34, 0x30, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5796,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5797,64,"style","Trailing whitespace is superfluous."," 0x35, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x39, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5798,64,"style","Trailing whitespace is superfluous."," 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, 0x68, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5799,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5800,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5801,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5802,64,"style","Trailing whitespace is superfluous."," 0x67, 0x2d, 0x74, 0x79, 0x70, 0x65, 0x3e, 0x31, 0x30, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5803,64,"style","Trailing whitespace is superfluous."," 0x51, 0x3c, 0x2f, 0x66, 0x69, 0x6c, 0x69, 0x6e, 0x67, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5804,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5805,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, 0x69, 0x6c, 0x6d, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5806,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x30, 0x37, 0x35, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5807,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x36, 0x36, 0x34, 0x3c, 0x2f, 0x66, 0x69, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5808,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, 0x72, 0x3e, 0x0a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5809,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x66, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5810,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5811,64,"style","Trailing whitespace is superfluous."," 0x75, 0x61, 0x72, 0x74, 0x65, 0x72, 0x6c, 0x79, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5812,64,"style","Trailing whitespace is superfluous."," 0x65, 0x70, 0x6f, 0x72, 0x74, 0x20, 0x5b, 0x53, 0x65, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5813,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x73, 0x20, 0x31, 0x33, 0x20, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5814,64,"style","Trailing whitespace is superfluous."," 0x72, 0x20, 0x31, 0x35, 0x28, 0x64, 0x29, 0x5d, 0x3c, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5815,64,"style","Trailing whitespace is superfluous."," 0x66, 0x6f, 0x72, 0x6d, 0x2d, 0x6e, 0x61, 0x6d, 0x65, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5816,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5817,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x31, 0x20, 0x4d, 0x42, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5818,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x73, 0x69, 0x7a, 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5819,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x63, 0x6f, 0x6e, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5820,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5821,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x75, 0x72, 0x6e, 0x3a, 0x74, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5822,64,"style","Trailing whitespace is superfluous."," 0x67, 0x3a, 0x73, 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5823,64,"style","Trailing whitespace is superfluous."," 0x32, 0x30, 0x30, 0x38, 0x3a, 0x61, 0x63, 0x63, 0x65, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5824,64,"style","Trailing whitespace is superfluous."," 0x73, 0x69, 0x6f, 0x6e, 0x2d, 0x6e, 0x75, 0x6d, 0x62, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5825,64,"style","Trailing whitespace is superfluous."," 0x72, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5826,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5827,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5828,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5829,64,"style","Trailing whitespace is superfluous."," 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5830,64,"style","Trailing whitespace is superfluous."," 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5831,64,"style","Trailing whitespace is superfluous."," 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x41, 0x72, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5832,64,"style","Trailing whitespace is superfluous."," 0x69, 0x76, 0x65, 0x73, 0x2f, 0x65, 0x64, 0x67, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5833,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x64, 0x61, 0x74, 0x61, 0x2f, 0x31, 0x31, 0x33, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5834,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5835,64,"style","Trailing whitespace is superfluous."," 0x33, 0x31, 0x32, 0x35, 0x30, 0x37, 0x30, 0x31, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5836,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x2f, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5837,64,"style","Trailing whitespace is superfluous."," 0x31, 0x32, 0x35, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x39, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5838,64,"style","Trailing whitespace is superfluous."," 0x34, 0x30, 0x31, 0x2d, 0x69, 0x6e, 0x64, 0x65, 0x78, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5839,64,"style","Trailing whitespace is superfluous."," 0x68, 0x74, 0x6d, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5840,64,"style","Trailing whitespace is superfluous."," 0x61, 0x6c, 0x74, 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5841,64,"style","Trailing whitespace is superfluous."," 0x20, 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5842,64,"style","Trailing whitespace is superfluous."," 0x74, 0x2f, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5843,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x73, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5844,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6d, 0x61, 0x72, 0x79, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5845,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x68, 0x74, 0x6d, 0x6c, 0x22, 0x3e, 0x20, 0x26, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5846,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x46, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5847,64,"style","Trailing whitespace is superfluous."," 0x6c, 0x65, 0x64, 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5848,64,"style","Trailing whitespace is superfluous."," 0x26, 0x67, 0x74, 0x3b, 0x20, 0x32, 0x30, 0x30, 0x37, 0x2d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5849,64,"style","Trailing whitespace is superfluous."," 0x30, 0x32, 0x2d, 0x30, 0x32, 0x20, 0x26, 0x6c, 0x74, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5850,64,"style","Trailing whitespace is superfluous."," 0x62, 0x26, 0x67, 0x74, 0x3b, 0x41, 0x63, 0x63, 0x4e, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5851,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x26, 0x6c, 0x74, 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5852,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x20, 0x30, 0x30, 0x30, 0x31, 0x31, 0x39, 0x33, 0x31, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5853,64,"style","Trailing whitespace is superfluous."," 0x32, 0x35, 0x2d, 0x30, 0x37, 0x2d, 0x30, 0x31, 0x39, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5854,64,"style","Trailing whitespace is superfluous."," 0x30, 0x31, 0x20, 0x26, 0x6c, 0x74, 0x3b, 0x62, 0x26, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5855,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3b, 0x53, 0x69, 0x7a, 0x65, 0x3a, 0x26, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5856,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x2f, 0x62, 0x26, 0x67, 0x74, 0x3b, 0x20, 0x31, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5857,64,"style","Trailing whitespace is superfluous."," 0x4d, 0x42, 0x3c, 0x2f, 0x73, 0x75, 0x6d, 0x6d, 0x61, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5858,64,"style","Trailing whitespace is superfluous."," 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5859,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x31, 0x30, 0x2d, 0x51, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5860,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x2d, 0x20, 0x51, 0x75, 0x61, 0x72, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5861,64,"style","Trailing whitespace is superfluous."," 0x72, 0x6c, 0x79, 0x20, 0x72, 0x65, 0x70, 0x6f, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5862,64,"style","Trailing whitespace is superfluous."," 0x20, 0x5b, 0x53, 0x65, 0x63, 0x74, 0x69, 0x6f, 0x6e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5863,64,"style","Trailing whitespace is superfluous."," 0x20, 0x31, 0x33, 0x20, 0x6f, 0x72, 0x20, 0x31, 0x35, 0x28, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5864,64,"style","Trailing whitespace is superfluous."," 0x64, 0x29, 0x5d, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5865,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5866,64,"style","Trailing whitespace is superfluous."," 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5867,64,"style","Trailing whitespace is superfluous."," 0x37, 0x2d, 0x30, 0x32, 0x2d, 0x30, 0x32, 0x54, 0x31, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5868,64,"style","Trailing whitespace is superfluous."," 0x3a, 0x33, 0x30, 0x3a, 0x30, 0x33, 0x2d, 0x30, 0x35, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5869,64,"style","Trailing whitespace is superfluous."," 0x30, 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5870,64,"style","Trailing whitespace is superfluous."," 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x2f, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5871,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x74, 0x72, 0x79, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5872,64,"style","Trailing whitespace is superfluous."," 0x3c, 0x69, 0x64, 0x3e, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5873,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5874,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5875,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5876,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5877,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5878,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x43, 0x49, 0x4b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5879,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x33, 0x37, 0x37, 0x38, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5880,64,"style","Trailing whitespace is superfluous."," 0x39, 0x3c, 0x2f, 0x69, 0x64, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5881,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5882,64,"style","Trailing whitespace is superfluous."," 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, 0x2f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5883,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, 0x67, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5884,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5885,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5886,64,"style","Trailing whitespace is superfluous."," 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5887,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5888,64,"style","Trailing whitespace is superfluous."," 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x43, 0x49, 0x4b, 0x3d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5889,64,"style","Trailing whitespace is superfluous."," 0x53, 0x54, 0x58, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5890,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5891,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5892,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x31, 0x30, 0x2d, 0x51, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5893,64,"style","Trailing whitespace is superfluous."," 0x73, 0x74, 0x61, 0x72, 0x74, 0x3d, 0x30, 0x26, 0x61, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5894,64,"style","Trailing whitespace is superfluous."," 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5895,64,"style","Trailing whitespace is superfluous."," 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, 0x61, 0x6c, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5896,64,"style","Trailing whitespace is superfluous."," 0x65, 0x72, 0x6e, 0x61, 0x74, 0x65, 0x22, 0x20, 0x74, 0x79, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5897,64,"style","Trailing whitespace is superfluous."," 0x70, 0x65, 0x3d, 0x22, 0x74, 0x65, 0x78, 0x74, 0x2f, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5898,64,"style","Trailing whitespace is superfluous."," 0x74, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5899,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, 0x20, 0x68, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5900,64,"style","Trailing whitespace is superfluous."," 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, 0x70, 0x73, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5901,64,"style","Trailing whitespace is superfluous."," 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, 0x65, 0x63, 0x2e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5902,64,"style","Trailing whitespace is superfluous."," 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, 0x2d, 0x62, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5903,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, 0x65, 0x2d, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5904,64,"style","Trailing whitespace is superfluous."," 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, 0x74, 0x69, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5905,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, 0x6d, 0x70, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5906,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x43, 0x49, 0x4b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5907,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x53, 0x54, 0x58, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5908,64,"style","Trailing whitespace is superfluous."," 0x77, 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5909,64,"style","Trailing whitespace is superfluous."," 0x64, 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x74, 0x79, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5910,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3d, 0x31, 0x30, 0x2d, 0x51, 0x26, 0x61, 0x6d, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5911,64,"style","Trailing whitespace is superfluous."," 0x3b, 0x73, 0x74, 0x61, 0x72, 0x74, 0x3d, 0x30, 0x26, 0x61, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5912,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, 0x74, 0x3d, 0x34, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5913,64,"style","Trailing whitespace is superfluous."," 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x75, 0x74, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5914,64,"style","Trailing whitespace is superfluous."," 0x75, 0x74, 0x3d, 0x61, 0x74, 0x6f, 0x6d, 0x22, 0x20, 0x72, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5915,64,"style","Trailing whitespace is superfluous."," 0x65, 0x6c, 0x3d, 0x22, 0x73, 0x65, 0x6c, 0x66, 0x22, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5916,64,"style","Trailing whitespace is superfluous."," 0x74, 0x79, 0x70, 0x65, 0x3d, 0x22, 0x61, 0x70, 0x70, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5917,64,"style","Trailing whitespace is superfluous."," 0x69, 0x63, 0x61, 0x74, 0x69, 0x6f, 0x6e, 0x2f, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5918,64,"style","Trailing whitespace is superfluous."," 0x6f, 0x6d, 0x2b, 0x78, 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5919,64,"style","Trailing whitespace is superfluous."," 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x6c, 0x69, 0x6e, 0x6b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5920,64,"style","Trailing whitespace is superfluous."," 0x20, 0x68, 0x72, 0x65, 0x66, 0x3d, 0x22, 0x68, 0x74, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5921,64,"style","Trailing whitespace is superfluous."," 0x70, 0x73, 0x3a, 0x2f, 0x2f, 0x77, 0x77, 0x77, 0x2e, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5922,64,"style","Trailing whitespace is superfluous."," 0x65, 0x63, 0x2e, 0x67, 0x6f, 0x76, 0x2f, 0x63, 0x67, 0x69, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5923,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x62, 0x69, 0x6e, 0x2f, 0x62, 0x72, 0x6f, 0x77, 0x73, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5924,64,"style","Trailing whitespace is superfluous."," 0x65, 0x2d, 0x65, 0x64, 0x67, 0x61, 0x72, 0x3f, 0x61, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5925,64,"style","Trailing whitespace is superfluous."," 0x74, 0x69, 0x6f, 0x6e, 0x3d, 0x67, 0x65, 0x74, 0x63, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5926,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x70, 0x61, 0x6e, 0x79, 0x26, 0x61, 0x6d, 0x70, 0x3b, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5927,64,"style","Trailing whitespace is superfluous."," 0x43, 0x49, 0x4b, 0x3d, 0x30, 0x30, 0x30, 0x31, 0x31, 0x33, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5928,64,"style","Trailing whitespace is superfluous."," 0x37, 0x37, 0x38, 0x39, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5929,64,"style","Trailing whitespace is superfluous."," 0x79, 0x70, 0x65, 0x3d, 0x31, 0x30, 0x2d, 0x51, 0x25, 0x32, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5930,64,"style","Trailing whitespace is superfluous."," 0x35, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x64, 0x61, 0x74, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5931,64,"style","Trailing whitespace is superfluous."," 0x61, 0x3d, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x64, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5932,64,"style","Trailing whitespace is superfluous."," 0x65, 0x62, 0x3d, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, 0x77, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5933,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x72, 0x3d, 0x65, 0x78, 0x63, 0x6c, 0x75, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5934,64,"style","Trailing whitespace is superfluous."," 0x65, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x63, 0x6f, 0x75, 0x6e, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5935,64,"style","Trailing whitespace is superfluous."," 0x74, 0x3d, 0x34, 0x30, 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x6f, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5936,64,"style","Trailing whitespace is superfluous."," 0x75, 0x74, 0x70, 0x75, 0x74, 0x3d, 0x61, 0x74, 0x6f, 0x6d, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5937,64,"style","Trailing whitespace is superfluous."," 0x26, 0x61, 0x6d, 0x70, 0x3b, 0x73, 0x74, 0x61, 0x72, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5938,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x34, 0x30, 0x22, 0x20, 0x72, 0x65, 0x6c, 0x3d, 0x22, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5939,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x65, 0x78, 0x74, 0x22, 0x20, 0x74, 0x79, 0x70, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5940,64,"style","Trailing whitespace is superfluous."," 0x3d, 0x22, 0x61, 0x70, 0x70, 0x6c, 0x69, 0x63, 0x61, 0x74, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5941,64,"style","Trailing whitespace is superfluous."," 0x69, 0x6f, 0x6e, 0x2f, 0x61, 0x74, 0x6f, 0x6d, 0x2b, 0x78, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5942,64,"style","Trailing whitespace is superfluous."," 0x6d, 0x6c, 0x22, 0x20, 0x2f, 0x3e, 0x0a, 0x20, 0x20, 0x20, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5943,64,"style","Trailing whitespace is superfluous."," 0x20, 0x3c, 0x74, 0x69, 0x74, 0x6c, 0x65, 0x3e, 0x53, 0x65, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5944,64,"style","Trailing whitespace is superfluous."," 0x61, 0x67, 0x61, 0x74, 0x65, 0x20, 0x54, 0x65, 0x63, 0x68, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5945,64,"style","Trailing whitespace is superfluous."," 0x6e, 0x6f, 0x6c, 0x6f, 0x67, 0x79, 0x20, 0x70, 0x6c, 0x63, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5946,64,"style","Trailing whitespace is superfluous."," 0x20, 0x20, 0x28, 0x30, 0x30, 0x30, 0x31, 0x31, 0x33, 0x37, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5947,64,"style","Trailing whitespace is superfluous."," 0x37, 0x38, 0x39, 0x29, 0x3c, 0x2f, 0x74, 0x69, 0x74, 0x6c, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5948,64,"style","Trailing whitespace is superfluous."," 0x65, 0x3e, 0x0a, 0x20, 0x20, 0x20, 0x20, 0x3c, 0x75, 0x70, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5949,64,"style","Trailing whitespace is superfluous."," 0x64, 0x61, 0x74, 0x65, 0x64, 0x3e, 0x32, 0x30, 0x32, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5950,64,"style","Trailing whitespace is superfluous."," 0x2d, 0x30, 0x31, 0x2d, 0x32, 0x30, 0x54, 0x31, 0x32, 0x3a, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5951,64,"style","Trailing whitespace is superfluous."," 0x35, 0x34, 0x3a, 0x35, 0x31, 0x2d, 0x30, 0x35, 0x3a, 0x30, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5952,64,"style","Trailing whitespace is superfluous."," 0x30, 0x3c, 0x2f, 0x75, 0x70, 0x64, 0x61, 0x74, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5953,64,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a, 0x20, 0x20, 0x3c, 0x2f, 0x66, 0x65, 0x65, 0x64, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5954,68,"style","Trailing whitespace is superfluous."," 0x3e, 0x0a)), date = structure(1579542891, class = c(""POSIXct"", ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5955,77,"style","Trailing whitespace is superfluous."," ""POSIXt""), tzone = ""GMT""), times = c(redirect = 0, namelookup = 2.7e-05, ","trailing_whitespace_linter" -"vignettes/parsing/0/browse-edgar-073692.R",5956,72,"style","Trailing whitespace is superfluous."," connect = 2.8e-05, pretransfer = 8.2e-05, starttransfer = 0.473137, ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/edgarWebR/email-body b/.dev/revdep_emails/edgarWebR/email-body deleted file mode 100644 index 00f18f6b8..000000000 --- a/.dev/revdep_emails/edgarWebR/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Micah J Waldstein! Thank you for using {lintr} in your package {edgarWebR}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/mwaldstein/edgarWebR (hash: fb9a38e6a57186ffd1c93cc1aa00c4fdf1bc5514) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 28s on CRAN vs. 408s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/emayili/attachments/emayili.warnings b/.dev/revdep_emails/emayili/attachments/emayili.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/emayili/attachments/emayili.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/emayili/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/emayili/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 09eb67e65..000000000 --- a/.dev/revdep_emails/emayili/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,7 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/address.R",273,7,"warning","no visible binding for global variable β€˜.Generic’"," get(.Generic)(raw(e1), raw(e2))","object_usage_linter" -"R/attachment.R",31,56,"style","Use FALSE instead of the symbol F."," stop(""Must be precisely one attachment."", call. = F)","T_and_F_symbol_linter" -"R/encodable.R",52,7,"warning","no visible binding for global variable β€˜.Generic’"," get(.Generic)(as.character(e1), as.character(e2))","object_usage_linter" -"R/render.R",12,7,"warning","local variable β€˜plain’ assigned but may not be used"," if (plain <- attr(markdown, ""plain"")) {","object_usage_linter" -"R/utils.R",88,48,"style","Put spaces around all infix operators.","hexkey <- function(object = runif(1), algorithm=""crc32"") {","infix_spaces_linter" -"R/utils.R",239,41,"warning","Conditional expressions require scalar logical operators (&& and ||)"," inherits(content, ""shiny.tag.list"") |","vector_logic_linter" diff --git a/.dev/revdep_emails/emayili/email-body b/.dev/revdep_emails/emayili/email-body deleted file mode 100644 index ed3325e2d..000000000 --- a/.dev/revdep_emails/emayili/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Andrew B. Collier! Thank you for using {lintr} in your package {emayili}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/datawookie/emayili (hash: d8271d8ef20905cf0689f4dfd94c3c24cc389ed1) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 46s on CRAN vs. 30s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/epigraphdb/attachments/epigraphdb.warnings b/.dev/revdep_emails/epigraphdb/attachments/epigraphdb.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/epigraphdb/attachments/epigraphdb.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/epigraphdb/email-body b/.dev/revdep_emails/epigraphdb/email-body deleted file mode 100644 index 737343bee..000000000 --- a/.dev/revdep_emails/epigraphdb/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Yi Liu! Thank you for using {lintr} in your package {epigraphdb}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/MRCIEU/epigraphdb-r (hash: 3820f10e07fbb4ce170a644d2fc9d7d20dfe84e0) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 16s on CRAN vs. 9s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/fakemake/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/fakemake/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 9da57e81d..000000000 --- a/.dev/revdep_emails/fakemake/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,2 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/makelists.R",16,28,"style","Commas should never have a space before."," testing = ,","commas_linter" diff --git a/.dev/revdep_emails/fakemake/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/fakemake/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 8c8fe2df2..000000000 --- a/.dev/revdep_emails/fakemake/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,2 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/makelists.R",78,31,"style","Any function spanning multiple lines should use curly braces."," index <- which(sapply(ml, function(x) target %in% x[[""prerequisites""]] ||","brace_linter" diff --git a/.dev/revdep_emails/fakemake/email-body b/.dev/revdep_emails/fakemake/email-body deleted file mode 100644 index a03eb8ee7..000000000 --- a/.dev/revdep_emails/fakemake/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Andreas Dominik Cullmann! Thank you for using {lintr} in your package {fakemake}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://gitlab.com/fvafrcu/fakemake (hash: 8e326ab1b3ce987d6905e1b497442654bf1cb6ec) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 14s on CRAN vs. 7s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/fixtuRes/attachments/fixtuRes.warnings b/.dev/revdep_emails/fixtuRes/attachments/fixtuRes.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/fixtuRes/attachments/fixtuRes.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/fixtuRes/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/fixtuRes/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index c7f5c21af..000000000 --- a/.dev/revdep_emails/fixtuRes/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,3 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/vectors.R",202,3,"warning","local variable β€˜differences_conversion_function’ assigned but may not be used"," differences_conversion_function <- switch(","object_usage_linter" -"vignettes/configuration.R",1,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" diff --git a/.dev/revdep_emails/fixtuRes/email-body b/.dev/revdep_emails/fixtuRes/email-body deleted file mode 100644 index 08e62b1a6..000000000 --- a/.dev/revdep_emails/fixtuRes/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Jakub Nowicki! Thank you for using {lintr} in your package {fixtuRes}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/jakubnowicki/fixtuRes (hash: 3abac4c038c5c4c85048d74bc17a9d28ecaeaba7) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 8s on CRAN vs. 5s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/fst/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/fst/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index d86cf0fd7..000000000 --- a/.dev/revdep_emails/fst/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,12 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/fst_table.R",345,13,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!drop | ncol(x) > 1) return(x)","vector_logic_linter" -"R/fst.R",170,1,"style","Variable and function name style should be snake_case or symbols.","write.fst <- function(x, path, compress = 50, uniform_encoding = TRUE) {","object_name_linter" -"R/fst.R",251,21,"style","Variable and function name style should be snake_case or symbols."," attr(res_table, ""row.names"") <- base::.set_row_names(nr_of_rows)","object_name_linter" -"R/hash.R",36,65,"style","Trailing semicolons are not needed."," stop(""Please specify an integer value for the hash seed."");","semicolon_linter" -"R/hash.R",42,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.logical(block_hash) | length(block_hash) != 1) {","vector_logic_linter" -"R/hash.R",43,69,"style","Trailing semicolons are not needed."," stop(""Please specify a logical value for parameter block_hash."");","semicolon_linter" -"R/hash.R",47,62,"style","Trailing semicolons are not needed."," stop(""Please specify a raw vector as input parameter x."");","semicolon_linter" -"tests/testthat/test_factor.R",21,5,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," ) }","brace_linter" -"tests/testthat/test_fst.R",23,5,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," ) }","brace_linter" -"tests/testthat/test_fst.R",30,7,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," ) }","brace_linter" -"tests/testthat/test_meta.R",223,17,"style","Use FALSE instead of the symbol F."," setkey(x, L, F, N)","T_and_F_symbol_linter" diff --git a/.dev/revdep_emails/fst/email-body b/.dev/revdep_emails/fst/email-body deleted file mode 100644 index dced7868c..000000000 --- a/.dev/revdep_emails/fst/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Mark Klik! Thank you for using {lintr} in your package {fst}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/fstpackage/fst (hash: 7952dea1582353f4e18bfc98681a65cb99cbcbfa) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 23s on CRAN vs. 12s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/fstcore/email-body b/.dev/revdep_emails/fstcore/email-body deleted file mode 100644 index 5beafb5d8..000000000 --- a/.dev/revdep_emails/fstcore/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Mark Klik! Thank you for using {lintr} in your package {fstcore}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/fstpackage/fst (hash: 7952dea1582353f4e18bfc98681a65cb99cbcbfa) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 23s on CRAN vs. 12s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/geofacet/email-body b/.dev/revdep_emails/geofacet/email-body deleted file mode 100644 index 149868aef..000000000 --- a/.dev/revdep_emails/geofacet/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Ryan Hafen! Thank you for using {lintr} in your package {geofacet}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/hafen/geofacet (hash: 37be2b8f2bc6477dfaea3cb68898982423cdb2c9) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 0s on CRAN vs. 0s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/geogrid/email-body b/.dev/revdep_emails/geogrid/email-body deleted file mode 100644 index 96684633c..000000000 --- a/.dev/revdep_emails/geogrid/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Joseph Bailey! Thank you for using {lintr} in your package {geogrid}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/jbaileyh/geogrid (hash: 2625053a117d164da7eaa8bc736a6e92c4851b44) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 0s on CRAN vs. 0s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/ggRandomForests/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/ggRandomForests/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 1cfa3f9b3..000000000 --- a/.dev/revdep_emails/ggRandomForests/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,12 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/gg_error.R",233,1,"style","Variable and function name style should be snake_case.","gg_error.randomForest.formula <- gg_error.randomForest","object_name_linter" -"R/kaplan.R",113,31,"style","Place a space before left parenthesis, except in a function call."," lag_s <- c(1, gg_dta$surv)[-(dim(gg_dta)[1] + 1)]","spaces_left_parentheses_linter" -"R/kaplan.R",114,31,"style","Place a space before left parenthesis, except in a function call."," lag_t <- c(0, gg_dta$time)[-(dim(gg_dta)[1] + 1)]","spaces_left_parentheses_linter" -"R/nelson.R",134,36,"style","Place a space before left parenthesis, except in a function call."," lag_surv <- c(1, gg_dta$surv)[-(dim(gg_dta)[1] + 1)]","spaces_left_parentheses_linter" -"R/nelson.R",135,36,"style","Place a space before left parenthesis, except in a function call."," lag_time <- c(0, gg_dta$time)[-(dim(gg_dta)[1] + 1)]","spaces_left_parentheses_linter" -"R/plot.gg_interaction.R",121,56,"style","Trailing whitespace is superfluous."," stop(""gg_interaction expects a rfsrc object, or a ","trailing_whitespace_linter" -"R/plot.gg_variable.R",283,58,"style","Trailing whitespace is superfluous."," ""Mismatched variable types for panel plots... ","trailing_whitespace_linter" -"R/plot.gg_variable.R",360,48,"style","Trailing whitespace is superfluous."," warning(""Mismatched variable types... ","trailing_whitespace_linter" -"tests/testthat/test_gg_error.R",42,14,"style","Variable and function name style should be snake_case."," rfsrc_iris$err.rate <- NULL","object_name_linter" -"tests/testthat/test_gg_error.R",101,11,"style","Variable and function name style should be snake_case."," rf_iris$err.rate <- NULL","object_name_linter" -"tests/testthat/test_gg_partial.R",73,18,"style","Variable and function name style should be snake_case."," partial_boston$xvar.names <- ""lstat""","object_name_linter" diff --git a/.dev/revdep_emails/ggRandomForests/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/ggRandomForests/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index a406c67bc..000000000 --- a/.dev/revdep_emails/ggRandomForests/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,357 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/cache_rfsrc_datasets.R",89,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/cache_rfsrc_datasets.R",92,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/cache_rfsrc_datasets.R",179,5,"style","Either both or neither branch in `if`/`else` should use curly braces."," else{","brace_linter" -"R/cache_rfsrc_datasets.R",179,9,"style","There should be a space before an opening curly brace."," else{","brace_linter" -"R/cache_rfsrc_datasets.R",305,2,"style","Missing terminal newline.","}","trailing_blank_lines_linter" -"R/calc_roc.R",63,12,"style","Variable and function name style should be snake_case or symbols."," which.outcome = ""all"",","object_name_linter" -"R/calc_roc.R",72,32,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(arg_list$oob) & is.logical(arg_list$oob))","vector_logic_linter" -"R/calc_roc.R",89,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/calc_roc.R",91,7,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- 1","object_name_linter" -"R/calc_roc.R",125,22,"style","Variable and function name style should be snake_case or symbols."," which.outcome = ""all"",","object_name_linter" -"R/calc_roc.R",136,12,"style","Variable and function name style should be snake_case or symbols."," which.outcome = 1,","object_name_linter" -"R/calc_roc.R",143,7,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- 1","object_name_linter" -"R/combine.gg_partial.R",95,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((!inherits(x, ""gg_partial_list"") &","vector_logic_linter" -"R/combine.gg_partial.R",96,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," !inherits(x, ""gg_partial"")) &","vector_logic_linter" -"R/combine.gg_partial.R",97,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," (!inherits(y, ""gg_partial_list"") &","vector_logic_linter" -"R/gg_error.R",225,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_minimal_depth.R",135,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_minimal_vimp.R",128,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_minimal_vimp.R",134,34,"warning","1:dim(...)[1] is likely to be wrong in the empty edge case. Use seq_len() instead."," rnk_md$depth <- rnk_vm$vimp <- 1:dim(rnk_md)[1]","seq_linter" -"R/gg_minimal_vimp.R",143,18,"warning","1:dim(...)[1] is likely to be wrong in the empty edge case. Use seq_len() instead."," rnk_vm$vimp <- 1:dim(rnk_vm)[1]","seq_linter" -"R/gg_partial_coplot.R",115,5,"style","Either both or neither branch in `if`/`else` should use curly braces."," else{","brace_linter" -"R/gg_partial_coplot.R",115,9,"style","There should be a space before an opening curly brace."," else{","brace_linter" -"R/gg_partial.R",222,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_partial.R",232,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_partial.R",257,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",152,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",157,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.vector(grp) | is.factor(grp)) {","vector_logic_linter" -"R/gg_rfsrc.R",163,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",184,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",187,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",190,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",203,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",230,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",248,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",255,36,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(arg_list$conf.int) & missing(by)) {","vector_logic_linter" -"R/gg_rfsrc.R",266,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",279,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",285,7,"style","Either both or neither branch in `if`/`else` should use curly braces."," else{","brace_linter" -"R/gg_rfsrc.R",285,11,"style","There should be a space before an opening curly brace."," else{","brace_linter" -"R/gg_rfsrc.R",308,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",317,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",327,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",352,47,"style","Use TRUE instead of the symbol T."," replace = T)","T_and_F_symbol_linter" -"R/gg_rfsrc.R",375,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",413,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",418,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.vector(grp) | is.factor(grp)) {","vector_logic_linter" -"R/gg_rfsrc.R",424,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",451,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",463,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_rfsrc.R",481,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_roc.R",69,34,"style","Variable and function name style should be snake_case or symbols.","gg_roc.rfsrc <- function(object, which.outcome, oob, ...) {","object_name_linter" -"R/gg_roc.R",70,71,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (sum(inherits(object, c(""rfsrc"", ""grow""), TRUE) == c(1, 2)) != 2 &","vector_logic_linter" -"R/gg_roc.R",71,74,"warning","Conditional expressions require scalar logical operators (&& and ||)"," sum(inherits(object, c(""rfsrc"", ""predict""), TRUE) == c(1, 2)) != 2 &","vector_logic_linter" -"R/gg_roc.R",85,5,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- ""all""","object_name_linter" -"R/gg_roc.R",101,28,"style","Variable and function name style should be snake_case or symbols.","gg_roc <- function(object, which.outcome, oob, ...) {","object_name_linter" -"R/gg_roc.R",106,41,"style","Variable and function name style should be snake_case or symbols.","gg_roc.randomForest <- function(object, which.outcome, oob, ...) {","object_name_linter" -"R/gg_roc.R",116,5,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- ""all""","object_name_linter" -"R/gg_variable.R",163,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_variable.R",195,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_variable.R",236,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_variable.R",257,3,"warning","local variable β€˜oob’ assigned but may not be used"," oob <- if (!is.null(arg_list$oob)) {","object_usage_linter" -"R/gg_variable.R",259,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_vimp.R",107,71,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (sum(inherits(object, c(""rfsrc"", ""grow""), TRUE) == c(1, 2)) != 2 &","vector_logic_linter" -"R/gg_vimp.R",119,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_vimp.R",148,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_vimp.R",158,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_vimp.R",165,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_vimp.R",177,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_vimp.R",187,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_vimp.R",223,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_vimp.R",232,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_vimp.R",257,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_vimp.R",267,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_vimp.R",274,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_vimp.R",286,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/gg_vimp.R",295,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/kaplan.R",59,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/kaplan.R",71,3,"warning","local variable β€˜delta_time’ assigned but may not be used"," delta_time <- sapply(2:length(times), function(ind) {","object_usage_linter" -"R/kaplan.R",124,15,"warning","1:dim(...)[1] is likely to be wrong in the empty edge case. Use seq_len() instead."," for (ind in 1:dim(gg_dta)[1]) {","seq_linter" -"R/nelson.R",74,5,"warning","local variable β€˜srv’ assigned but may not be used"," srv <-","object_usage_linter" -"R/nelson.R",78,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/nelson.R",94,5,"warning","local variable β€˜delta_time’ assigned but may not be used"," delta_time <- sapply(2:length(times), function(ind) {","object_usage_linter" -"R/nelson.R",145,17,"warning","1:dim(...)[1] is likely to be wrong in the empty edge case. Use seq_len() instead."," for (ind in 1:dim(gg_dta)[1]) {","seq_linter" -"R/plot.gg_error.R",131,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_interaction.R",145,20,"warning","1:dim(...)[1] is likely to be wrong in the empty edge case. Use seq_len() instead."," gg_dta$rank <- 1:dim(gg_dta)[1]","seq_linter" -"R/plot.gg_interaction.R",184,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/plot.gg_interaction.R",185,39,"warning","1:dim(...)[1] is likely to be wrong in the empty edge case. Use seq_len() instead."," gg_dta <- data.frame(cbind(rank = 1:dim(object)[1],","seq_linter" -"R/plot.gg_minimal_depth.R",128,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.numeric(arg_set$nvar) & arg_set$nvar > 1) {","vector_logic_linter" -"R/plot.gg_minimal_depth.R",179,18,"warning","1:dim(...)[1] is likely to be wrong in the empty edge case. Use seq_len() instead."," vsel$rank <- 1:dim(vsel)[1]","seq_linter" -"R/plot.gg_minimal_depth.R",219,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_minimal_vimp.R",132,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_partial_list.R",194,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_partial_list.R",208,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_partial_list.R",212,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_partial_list.R",220,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_partial.R",182,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_partial.R",202,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_partial.R",205,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_partial.R",255,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_partial.R",259,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_rfsrc.R",116,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (inherits(gg_dta, ""class"") |","vector_logic_linter" -"R/plot.gg_rfsrc.R",135,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_rfsrc.R",152,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_rfsrc.R",174,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_rfsrc.R",184,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_rfsrc.R",200,39,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (inherits(gg_dta, ""regr"") |","vector_logic_linter" -"R/plot.gg_rfsrc.R",204,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_rfsrc.R",216,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_roc.R",67,28,"style","Variable and function name style should be snake_case or symbols.","plot.gg_roc <- function(x, which.outcome = NULL, ...) {","object_name_linter" -"R/plot.gg_roc.R",76,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (crv > 2 & is.null(which.outcome)) {","vector_logic_linter" -"R/plot.gg_roc.R",81,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_roc.R",83,11,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- 2","object_name_linter" -"R/plot.gg_roc.R",86,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_roc.R",93,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (crv > 2 & is.null(which.outcome)) {","vector_logic_linter" -"R/plot.gg_roc.R",98,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_roc.R",100,11,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- 2","object_name_linter" -"R/plot.gg_roc.R",133,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_survival.R",83,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_survival.R",121,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",177,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",217,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",260,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",271,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",279,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",309,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",316,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",330,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",353,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",357,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",372,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",381,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",396,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",423,17,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",431,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",450,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",470,19,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",483,17,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",500,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",511,17,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",531,13,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",539,17,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_variable.R",546,15,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_vimp.R",96,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.numeric(arg_set$nvar) & arg_set$nvar > 1) {","vector_logic_linter" -"R/plot.gg_vimp.R",119,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/plot.gg_vimp.R",143,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(gg_dta$set) | length(unique(gg_dta$set)) < 2) {","vector_logic_linter" -"R/plot.gg_vimp.R",146,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"R/quantile_pts.R",64,9,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"tests/testthat/test_gg_error.R",113,3,"style","Variable and function name style should be snake_case or symbols."," Boston$chas <- as.logical(Boston$chas)","object_name_linter" -"tests/testthat/test_gg_error.R",159,3,"style","Variable and function name style should be snake_case or symbols."," Boston$chas <- as.logical(Boston$chas)","object_name_linter" -"tests/testthat/test_gg_interaction.R",51,3,"style","Variable and function name style should be snake_case or symbols."," Boston$chas <- as.logical(Boston$chas)","object_name_linter" -"tests/testthat/test_gg_roc.R",15,3,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- 1","object_name_linter" -"tests/testthat/test_gg_roc.R",69,3,"style","Variable and function name style should be snake_case or symbols."," which.outcome <- 1","object_name_linter" -"tests/testthat/test_gg_vimp.R",125,15,"warning","1:dim(...)[2] is likely to be wrong in the empty edge case. Use seq_len() instead."," for (ind in 1:dim(pbc)[2]) {","seq_linter" -"tests/testthat/test_gg_vimp.R",132,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"tests/testthat/test_gg_vimp.R",225,3,"style","Variable and function name style should be snake_case or symbols."," Boston$chas <- as.logical(Boston$chas)","object_name_linter" -"tests/testthat/test_surface_matrix.R",17,3,"style","Variable and function name style should be snake_case or symbols."," rm.tmp <- do.call(c, lapply(rm_pts,","object_name_linter" -"tests/testthat/test_survival_datasets.R",21,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"vignettes/ggrfRegression.Rmd",37,81,"style","Lines should not be more than 80 characters.","# set global chunk options for knitr. These can be changed in the header for each individual R code chunk","line_length_linter" -"vignettes/ggrfRegression.Rmd",39,28,"style","Only use double-quotes."," fig.align = 'center',","single_quotes_linter" -"vignettes/ggrfRegression.Rmd",41,27,"style","Only use double-quotes."," fig.show = 'hold',","single_quotes_linter" -"vignettes/ggrfRegression.Rmd",44,23,"style","Only use double-quotes."," size = 'footnotesize',","single_quotes_linter" -"vignettes/ggrfRegression.Rmd",48,81,"style","Lines should not be more than 80 characters."," echo = FALSE, # Change this to TRUE if you want to see all the code examples","line_length_linter" -"vignettes/ggrfRegression.Rmd",55,63,"style","Trailing whitespace is superfluous.","options(object.size = Inf, expressions = 100000, memory = Inf, ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",73,46,"style","Trailing whitespace is superfluous.","library(""plot3D"") # for 3d surfaces. ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",79,73,"style","Trailing whitespace is superfluous.","library(""randomForestSRC"") # random forests for survival, regression and ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",86,50,"style","Trailing whitespace is superfluous.","## Set open circle for censored, and x for events ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",87,1,"style","Variable and function name style should be snake_case or symbols.","event.marks <- c(1, 4)","object_name_linter" -"vignettes/ggrfRegression.Rmd",88,1,"style","Variable and function name style should be snake_case or symbols.","event.labels <- c(FALSE, TRUE)","object_name_linter" -"vignettes/ggrfRegression.Rmd",91,1,"style","Variable and function name style should be snake_case or symbols.","strCol <- brewer.pal(3, ""Set1"")[c(2,1,3)]","object_name_linter" -"vignettes/ggrfRegression.Rmd",91,37,"style","Commas should always have a space after.","strCol <- brewer.pal(3, ""Set1"")[c(2,1,3)]","commas_linter" -"vignettes/ggrfRegression.Rmd",91,39,"style","Commas should always have a space after.","strCol <- brewer.pal(3, ""Set1"")[c(2,1,3)]","commas_linter" -"vignettes/ggrfRegression.Rmd",128,21,"style","Put spaces around all infix operators.","data(Boston, package=""MASS"")","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",131,1,"style","Variable and function name style should be snake_case or symbols.","Boston$chas <- as.logical(Boston$chas)","object_name_linter" -"vignettes/ggrfRegression.Rmd",135,29,"style","Trailing whitespace is superfluous.","cls <- sapply(Boston, class) ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",136,2,"style","Trailing whitespace is superfluous.","# ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",137,8,"style","Trailing whitespace is superfluous.","lbls <- ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",168,1,"style","Variable and function name style should be snake_case or symbols.","dta.labs <- data.frame(cbind(Variable=names(cls), Description=lbls, type=cls))","object_name_linter" -"vignettes/ggrfRegression.Rmd",168,38,"style","Put spaces around all infix operators.","dta.labs <- data.frame(cbind(Variable=names(cls), Description=lbls, type=cls))","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",168,62,"style","Put spaces around all infix operators.","dta.labs <- data.frame(cbind(Variable=names(cls), Description=lbls, type=cls))","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",168,73,"style","Put spaces around all infix operators.","dta.labs <- data.frame(cbind(Variable=names(cls), Description=lbls, type=cls))","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",171,1,"style","Variable and function name style should be snake_case or symbols.","st.labs <- as.character(dta.labs$Description)","object_name_linter" -"vignettes/ggrfRegression.Rmd",172,7,"style","Variable and function name style should be snake_case or symbols.","names(st.labs) <- names(cls)","object_name_linter" -"vignettes/ggrfRegression.Rmd",175,16,"style","Trailing whitespace is superfluous.","kable(dta.labs, ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",176,25,"style","Trailing whitespace is superfluous."," row.names = FALSE, ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",177,14,"style","Put spaces around all infix operators."," caption=""`Boston` housing data dictionary."",","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",194,12,"style","Put spaces around all infix operators.","ggplot(dta)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",195,19,"style","Put spaces around all infix operators."," geom_point(alpha=0.4, aes(x=medv, y=value, color=chas))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",195,30,"style","Put spaces around all infix operators."," geom_point(alpha=0.4, aes(x=medv, y=value, color=chas))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",195,38,"style","Put spaces around all infix operators."," geom_point(alpha=0.4, aes(x=medv, y=value, color=chas))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",195,51,"style","Put spaces around all infix operators."," geom_point(alpha=0.4, aes(x=medv, y=value, color=chas))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",195,58,"style","Put spaces around all infix operators."," geom_point(alpha=0.4, aes(x=medv, y=value, color=chas))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",196,20,"style","Put spaces around all infix operators."," geom_smooth(aes(x=medv, y=value), se=FALSE)+ ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",196,28,"style","Put spaces around all infix operators."," geom_smooth(aes(x=medv, y=value), se=FALSE)+ ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",196,39,"style","Put spaces around all infix operators."," geom_smooth(aes(x=medv, y=value), se=FALSE)+ ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",196,46,"style","Put spaces around all infix operators."," geom_smooth(aes(x=medv, y=value), se=FALSE)+ ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",196,47,"style","Trailing whitespace is superfluous."," geom_smooth(aes(x=medv, y=value), se=FALSE)+ ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",197,9,"style","Put spaces around all infix operators."," labs(y="""", x=st.labs[""medv""]) +","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",197,15,"style","Put spaces around all infix operators."," labs(y="""", x=st.labs[""medv""]) +","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",198,29,"style","Put spaces around all infix operators."," scale_color_brewer(palette=""Set2"")+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",198,37,"style","Put spaces around all infix operators."," scale_color_brewer(palette=""Set2"")+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",199,31,"style","Put spaces around all infix operators."," facet_wrap(~variable, scales=""free_y"", ncol=3)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",199,46,"style","Put spaces around all infix operators."," facet_wrap(~variable, scales=""free_y"", ncol=3)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",216,1,"style","Variable and function name style should be snake_case or symbols.","rfsrc_Boston <- rfsrc(medv~., data=Boston, ","object_name_linter" -"vignettes/ggrfRegression.Rmd",216,27,"style","Put spaces around all infix operators.","rfsrc_Boston <- rfsrc(medv~., data=Boston, ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",216,35,"style","Put spaces around all infix operators.","rfsrc_Boston <- rfsrc(medv~., data=Boston, ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",216,43,"style","Trailing whitespace is superfluous.","rfsrc_Boston <- rfsrc(medv~., data=Boston, ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",235,29,"style","Commas should always have a space after.","class(gg_e) <- c(""gg_error"",class(gg_e))","commas_linter" -"vignettes/ggrfRegression.Rmd",247,35,"style","Put spaces around all infix operators.","plot(gg_rfsrc(rfsrc_Boston), alpha=.5)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",247,39,"style","Put spaces around all infix operators.","plot(gg_rfsrc(rfsrc_Boston), alpha=.5)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",248,23,"style","Put spaces around all infix operators."," coord_cartesian(ylim=c(5,49))","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",248,28,"style","Commas should always have a space after."," coord_cartesian(ylim=c(5,49))","commas_linter" -"vignettes/ggrfRegression.Rmd",267,33,"style","Put spaces around all infix operators.","plot(gg_vimp(rfsrc_Boston), lbls=st.labs)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",288,1,"style","Variable and function name style should be snake_case or symbols.","varsel_Boston <- var.select(rfsrc_Boston)","object_name_linter" -"vignettes/ggrfRegression.Rmd",294,17,"style","Put spaces around all infix operators.","plot(gg_md, lbls=st.labs)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",330,39,"style","Trailing whitespace is superfluous.","# plotted in minimal depth rank order. ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",334,16,"style","Put spaces around all infix operators.","plot(gg_v, xvar=xvar, panel=TRUE, alpha=.5)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",334,28,"style","Put spaces around all infix operators.","plot(gg_v, xvar=xvar, panel=TRUE, alpha=.5)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",334,40,"style","Put spaces around all infix operators.","plot(gg_v, xvar=xvar, panel=TRUE, alpha=.5)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",334,44,"style","Put spaces around all infix operators.","plot(gg_v, xvar=xvar, panel=TRUE, alpha=.5)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",335,9,"style","Put spaces around all infix operators."," labs(y=st.labs[""medv""], x="""")","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",335,28,"style","Put spaces around all infix operators."," labs(y=st.labs[""medv""], x="""")","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",343,16,"style","Put spaces around all infix operators.","plot(gg_v, xvar=""chas"", alpha=.4)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",343,30,"style","Put spaces around all infix operators.","plot(gg_v, xvar=""chas"", alpha=.4)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",343,34,"style","Put spaces around all infix operators.","plot(gg_v, xvar=""chas"", alpha=.4)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",344,9,"style","Put spaces around all infix operators."," labs(y=st.labs[""medv""])","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",362,1,"style","Variable and function name style should be snake_case or symbols.","partial_Boston <- plot.variable(rfsrc_Boston,","object_name_linter" -"vignettes/ggrfRegression.Rmd",363,37,"style","Put spaces around all infix operators."," xvar=gg_md$topvars,","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",364,40,"style","Put spaces around all infix operators."," partial=TRUE, sorted=FALSE,","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",364,53,"style","Put spaces around all infix operators."," partial=TRUE, sorted=FALSE,","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",365,51,"style","Do not place spaces before parentheses."," show.plots = FALSE )","spaces_inside_linter" -"vignettes/ggrfRegression.Rmd",371,17,"style","Put spaces around all infix operators.","plot(gg_p, panel=TRUE) +","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",372,9,"style","Put spaces around all infix operators."," labs(y=st.labs[""medv""], x="""") +","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",372,28,"style","Put spaces around all infix operators."," labs(y=st.labs[""medv""], x="""") +","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",373,24,"style","Only use double-quotes."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)","single_quotes_linter" -"vignettes/ggrfRegression.Rmd",373,40,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",373,41,"style","Only use double-quotes."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)","single_quotes_linter" -"vignettes/ggrfRegression.Rmd",373,52,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",390,1,"style","Variable and function name style should be snake_case or symbols.","interaction_Boston <- find.interaction(rfsrc_Boston)","object_name_linter" -"vignettes/ggrfRegression.Rmd",393,41,"style","Trailing whitespace is superfluous.","plot(gg_interaction(interaction_Boston), ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",394,10,"style","Put spaces around all infix operators."," xvar=gg_md$topvars, panel=TRUE)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",394,31,"style","Put spaces around all infix operators."," xvar=gg_md$topvars, panel=TRUE)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",408,63,"style","Trailing whitespace is superfluous.","# Find the rm variable points to create 6 intervals of roughly ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",410,52,"style","Put spaces around all infix operators.","rm_pts <- quantile_pts(rfsrc_Boston$xvar$rm, groups=6, ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",410,55,"style","Trailing whitespace is superfluous.","rm_pts <- quantile_pts(rfsrc_Boston$xvar$rm, groups=6, ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",411,33,"style","Put spaces around all infix operators."," intervals=TRUE)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",414,43,"style","Put spaces around all infix operators.","rm_grp <- cut(rfsrc_Boston$xvar$rm, breaks=rm_pts)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",419,49,"style","Trailing whitespace is superfluous.","# Modify the labels for descriptive panel titles ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",420,39,"style","Trailing whitespace is superfluous.","levels(gg_v$rm_grp) <- paste(""rm in "", ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",421,54,"style","Put spaces around all infix operators."," levels(gg_v$rm_grp), sep="""")","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",423,41,"style","Trailing whitespace is superfluous.","# Create a variable dependence (co)plot, ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",425,27,"style","Put spaces around all infix operators.","plot(gg_v, xvar = ""lstat"")+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",426,48,"style","Trailing whitespace is superfluous."," # method = ""loess"", span=1.5, se = FALSE) + ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",427,30,"style","Put spaces around all infix operators."," labs(y = st.labs[""medv""], x=st.labs[""lstat""]) + ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",427,50,"style","Trailing whitespace is superfluous."," labs(y = st.labs[""medv""], x=st.labs[""lstat""]) + ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",428,36,"style","Trailing whitespace is superfluous."," theme(legend.position = ""none"") + ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",429,41,"style","Trailing whitespace is superfluous."," scale_color_brewer(palette = ""Set3"") + ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",439,66,"style","Trailing whitespace is superfluous.","# Find the lstat variable points to create 6 intervals of roughly ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",441,58,"style","Put spaces around all infix operators.","lstat_pts <- quantile_pts(rfsrc_Boston$xvar$lstat, groups=6, intervals=TRUE)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",441,71,"style","Put spaces around all infix operators.","lstat_pts <- quantile_pts(rfsrc_Boston$xvar$lstat, groups=6, intervals=TRUE)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",444,49,"style","Put spaces around all infix operators.","lstat_grp <- cut(rfsrc_Boston$xvar$lstat, breaks=lstat_pts)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",449,49,"style","Trailing whitespace is superfluous.","# Modify the labels for descriptive panel titles ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",450,77,"style","Commas should always have a space after.","levels(gg_v$lstat_grp) <- paste(""lstat in "", levels(gg_v$lstat_grp), "" (%)"",sep="""")","commas_linter" -"vignettes/ggrfRegression.Rmd",450,80,"style","Put spaces around all infix operators.","levels(gg_v$lstat_grp) <- paste(""lstat in "", levels(gg_v$lstat_grp), "" (%)"",sep="""")","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",450,81,"style","Lines should not be more than 80 characters.","levels(gg_v$lstat_grp) <- paste(""lstat in "", levels(gg_v$lstat_grp), "" (%)"",sep="""")","line_length_linter" -"vignettes/ggrfRegression.Rmd",453,36,"style","Put spaces around all infix operators.","plot(gg_v, xvar = ""rm"", alpha = .5)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",454,47,"style","Trailing whitespace is superfluous."," #method = ""loess"", span=1.5, , se = FALSE) + ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",455,30,"style","Put spaces around all infix operators."," labs(y = st.labs[""medv""], x=st.labs[""rm""]) + ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",455,47,"style","Trailing whitespace is superfluous."," labs(y = st.labs[""medv""], x=st.labs[""rm""]) + ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",456,36,"style","Trailing whitespace is superfluous."," theme(legend.position = ""none"") + ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",457,41,"style","Trailing whitespace is superfluous."," scale_color_brewer(palette = ""Set3"") + ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",459,68,"style","Trailing whitespace is superfluous."," #scale_shape_manual(values = event.marks, labels = event.labels)+ ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",482,1,"style","Variable and function name style should be snake_case or symbols.","partial_coplot_Boston <- gg_partial_coplot(rfsrc_Boston, xvar=""lstat"", ","object_name_linter" -"vignettes/ggrfRegression.Rmd",482,62,"style","Put spaces around all infix operators.","partial_coplot_Boston <- gg_partial_coplot(rfsrc_Boston, xvar=""lstat"", ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",482,71,"style","Trailing whitespace is superfluous.","partial_coplot_Boston <- gg_partial_coplot(rfsrc_Boston, xvar=""lstat"", ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",483,50,"style","Put spaces around all infix operators."," groups=rm_grp,","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",484,54,"style","Put spaces around all infix operators."," show.plots=FALSE)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",493,36,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston, aes(x=lstat, y=yhat, col=group))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",493,45,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston, aes(x=lstat, y=yhat, col=group))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",493,55,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston, aes(x=lstat, y=yhat, col=group))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",493,63,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston, aes(x=lstat, y=yhat, col=group))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",494,15,"style","Put spaces around all infix operators."," geom_point()+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",495,24,"style","Only use double-quotes."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE, alpha=.25)+","single_quotes_linter" -"vignettes/ggrfRegression.Rmd",495,40,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE, alpha=.25)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",495,41,"style","Only use double-quotes."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE, alpha=.25)+","single_quotes_linter" -"vignettes/ggrfRegression.Rmd",495,52,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE, alpha=.25)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",495,65,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE, alpha=.25)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",495,70,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE, alpha=.25)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",496,9,"style","Put spaces around all infix operators."," labs(x=st.labs[""lstat""], y=st.labs[""medv""],","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",496,29,"style","Put spaces around all infix operators."," labs(x=st.labs[""lstat""], y=st.labs[""medv""],","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",497,13,"style","Put spaces around all infix operators."," color=""Room"", shape=""Room"")+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",497,27,"style","Put spaces around all infix operators."," color=""Room"", shape=""Room"")+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",497,35,"style","Put spaces around all infix operators."," color=""Room"", shape=""Room"")+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",498,29,"style","Put spaces around all infix operators."," scale_color_brewer(palette=""Set1"")","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",508,1,"style","Variable and function name style should be snake_case or symbols.","partial_coplot_Boston2 <- gg_partial_coplot(rfsrc_Boston, xvar=""rm"", ","object_name_linter" -"vignettes/ggrfRegression.Rmd",508,63,"style","Put spaces around all infix operators.","partial_coplot_Boston2 <- gg_partial_coplot(rfsrc_Boston, xvar=""rm"", ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",508,69,"style","Trailing whitespace is superfluous.","partial_coplot_Boston2 <- gg_partial_coplot(rfsrc_Boston, xvar=""rm"", ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",509,51,"style","Put spaces around all infix operators."," groups=lstat_grp,","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",510,55,"style","Put spaces around all infix operators."," show.plots=FALSE)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",516,37,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston2, aes(x=rm, y=yhat, col=group))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",516,43,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston2, aes(x=rm, y=yhat, col=group))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",516,53,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston2, aes(x=rm, y=yhat, col=group))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",516,61,"style","Put spaces around all infix operators.","ggplot(partial_coplot_Boston2, aes(x=rm, y=yhat, col=group))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",517,15,"style","Put spaces around all infix operators."," geom_point()+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",518,24,"style","Only use double-quotes."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)+","single_quotes_linter" -"vignettes/ggrfRegression.Rmd",518,40,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",518,41,"style","Only use double-quotes."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)+","single_quotes_linter" -"vignettes/ggrfRegression.Rmd",518,52,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",518,59,"style","Put spaces around all infix operators."," geom_smooth(method = 'loess', formula='y ~ x', se=FALSE)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",519,9,"style","Put spaces around all infix operators."," labs(x=st.labs[""rm""], y=st.labs[""medv""], ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",519,26,"style","Put spaces around all infix operators."," labs(x=st.labs[""rm""], y=st.labs[""medv""], ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",519,43,"style","Trailing whitespace is superfluous."," labs(x=st.labs[""rm""], y=st.labs[""medv""], ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",520,13,"style","Put spaces around all infix operators."," color=""Lower Status"", shape=""Lower Status"")+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",520,35,"style","Put spaces around all infix operators."," color=""Lower Status"", shape=""Lower Status"")+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",520,51,"style","Put spaces around all infix operators."," color=""Lower Status"", shape=""Lower Status"")+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",521,29,"style","Put spaces around all infix operators."," scale_color_brewer(palette=""Set1"")","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",533,52,"style","Put spaces around all infix operators.","rm_pts <- quantile_pts(rfsrc_Boston$xvar$rm, groups=49, intervals = TRUE)","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",542,13,"style","Variable and function name style should be snake_case or symbols.","system.time(partial_Boston_surf <- lapply(rm_pts, function(ct){","object_name_linter" -"vignettes/ggrfRegression.Rmd",542,63,"style","There should be a space before an opening curly brace.","system.time(partial_Boston_surf <- lapply(rm_pts, function(ct){","brace_linter" -"vignettes/ggrfRegression.Rmd",542,63,"style","There should be a space between a right parenthesis and a body expression.","system.time(partial_Boston_surf <- lapply(rm_pts, function(ct){","paren_body_linter" -"vignettes/ggrfRegression.Rmd",543,3,"style","Variable and function name style should be snake_case or symbols."," rfsrc_Boston$xvar$rm <- ct","object_name_linter" -"vignettes/ggrfRegression.Rmd",545,47,"style","Trailing whitespace is superfluous."," npts = 50, show.plots = FALSE, ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",548,29,"style","Trailing whitespace is superfluous.","# user system elapsed ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",549,29,"style","Trailing whitespace is superfluous.","# 1109.641 76.516 1199.732 ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",557,1,"style","Variable and function name style should be snake_case or symbols.","rm.tmp <- do.call(c,lapply(rm_pts, ","object_name_linter" -"vignettes/ggrfRegression.Rmd",557,21,"style","Commas should always have a space after.","rm.tmp <- do.call(c,lapply(rm_pts, ","commas_linter" -"vignettes/ggrfRegression.Rmd",557,35,"style","Trailing whitespace is superfluous.","rm.tmp <- do.call(c,lapply(rm_pts, ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",558,41,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," function(grp){rep(grp, 50)}))","brace_linter" -"vignettes/ggrfRegression.Rmd",558,41,"style","There should be a space before an opening curly brace."," function(grp){rep(grp, 50)}))","brace_linter" -"vignettes/ggrfRegression.Rmd",558,41,"style","There should be a space between a right parenthesis and a body expression."," function(grp){rep(grp, 50)}))","paren_body_linter" -"vignettes/ggrfRegression.Rmd",560,46,"style","Trailing whitespace is superfluous.","# Convert the list of plot.variable output to ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",561,31,"style","Commas should always have a space after.","partial_surf <- do.call(rbind,lapply(partial_Boston_surf, gg_partial))","commas_linter" -"vignettes/ggrfRegression.Rmd",567,27,"style","Put spaces around all infix operators.","ggplot(partial_surf, aes(x=lstat, y=rm, z=yhat))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",567,36,"style","Put spaces around all infix operators.","ggplot(partial_surf, aes(x=lstat, y=rm, z=yhat))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",567,42,"style","Put spaces around all infix operators.","ggplot(partial_surf, aes(x=lstat, y=rm, z=yhat))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",567,49,"style","Put spaces around all infix operators.","ggplot(partial_surf, aes(x=lstat, y=rm, z=yhat))+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",568,55,"style","Put spaces around all infix operators."," stat_contour(aes(colour = ..level..), binwidth = .5)+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",569,9,"style","Put spaces around all infix operators."," labs(x=st.labs[""lstat""], y=st.labs[""rm""], ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",569,29,"style","Put spaces around all infix operators."," labs(x=st.labs[""lstat""], y=st.labs[""rm""], ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",569,44,"style","Trailing whitespace is superfluous."," labs(x=st.labs[""lstat""], y=st.labs[""rm""], ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",570,13,"style","Put spaces around all infix operators."," color=""Median Home Values"")+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",570,35,"style","Put spaces around all infix operators."," color=""Median Home Values"")+","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",571,33,"style","Put spaces around all infix operators."," scale_colour_gradientn(colours=topo.colors(10))","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",580,15,"style","Commas should always have a space after.","par(mai = c(0,0,0,0))","commas_linter" -"vignettes/ggrfRegression.Rmd",580,17,"style","Commas should always have a space after.","par(mai = c(0,0,0,0))","commas_linter" -"vignettes/ggrfRegression.Rmd",580,19,"style","Commas should always have a space after.","par(mai = c(0,0,0,0))","commas_linter" -"vignettes/ggrfRegression.Rmd",589,9,"style","Put spaces around all infix operators.","surf3D(x=srf$x, y=srf$y, z=srf$z, col=topo.colors(10),","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",589,18,"style","Put spaces around all infix operators.","surf3D(x=srf$x, y=srf$y, z=srf$z, col=topo.colors(10),","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",589,27,"style","Put spaces around all infix operators.","surf3D(x=srf$x, y=srf$y, z=srf$z, col=topo.colors(10),","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",589,38,"style","Put spaces around all infix operators.","surf3D(x=srf$x, y=srf$y, z=srf$z, col=topo.colors(10),","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",590,14,"style","Put spaces around all infix operators."," colkey=FALSE, border = ""black"", bty=""b2"", ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",590,43,"style","Put spaces around all infix operators."," colkey=FALSE, border = ""black"", bty=""b2"", ","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",590,49,"style","Trailing whitespace is superfluous."," colkey=FALSE, border = ""black"", bty=""b2"", ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",591,34,"style","Trailing whitespace is superfluous."," shade = 0.5, expand = 0.5, ","trailing_whitespace_linter" -"vignettes/ggrfRegression.Rmd",593,12,"style","Put spaces around all infix operators."," xlab=""Lower Status"", ylab=""Average Rooms"", zlab=""Median Value""","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",593,33,"style","Put spaces around all infix operators."," xlab=""Lower Status"", ylab=""Average Rooms"", zlab=""Median Value""","infix_spaces_linter" -"vignettes/ggrfRegression.Rmd",593,55,"style","Put spaces around all infix operators."," xlab=""Lower Status"", ylab=""Average Rooms"", zlab=""Median Value""","infix_spaces_linter" diff --git a/.dev/revdep_emails/ggRandomForests/email-body b/.dev/revdep_emails/ggRandomForests/email-body deleted file mode 100644 index 1720de086..000000000 --- a/.dev/revdep_emails/ggRandomForests/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello John Ehrlinger! Thank you for using {lintr} in your package {ggRandomForests}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/ehrlinger/ggRandomForests (hash: d24c83cba61d024f16bc6cf42b3a25da6fb2d9b9) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 93s on CRAN vs. 60s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/ggcharts/attachments/ggcharts.warnings b/.dev/revdep_emails/ggcharts/attachments/ggcharts.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/ggcharts/attachments/ggcharts.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/ggcharts/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/ggcharts/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 652215dab..000000000 --- a/.dev/revdep_emails/ggcharts/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,3 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/zzz.R",1,1,"style","Variable and function name style should be snake_case.",".onLoad <- function(libname, pkgname) {","object_name_linter" -"R/zzz.R",43,1,"style","Variable and function name style should be snake_case.",".onUnload <- function(libpath) {","object_name_linter" diff --git a/.dev/revdep_emails/ggcharts/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/ggcharts/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index d22aa5cde..000000000 --- a/.dev/revdep_emails/ggcharts/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,5 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/bar_chart.R",81,14,"warning","possible error in post_process_plot(plot = p, is_sorted = sort, horizontal = horizontal, facet = !!facet, fill = has_fill, highlight = highlight, color = bar_color, other = other, threshold = threshold): unused arguments (other = other, threshold = threshold)","bar_chart <- function(data, x, y, facet = NULL, ..., bar_color = ""auto"",","object_usage_linter" -"R/lollipop_chart.R",83,19,"warning","possible error in post_process_plot(plot = p, is_sorted = TRUE, horizontal = horizontal, facet = !!facet, fill = FALSE, highlight = highlight, color = line_color, other = other, threshold = threshold): unused arguments (other = other, threshold = threshold)","lollipop_chart <- function(data, x, y, facet = NULL, ..., line_size = 0.75,","object_usage_linter" -"R/post_process_plot.R",47,13,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (other & !is.null(threshold)) {","vector_logic_linter" -"vignettes/customize.Rmd",52,101,"style","Lines should not be more than 100 characters."," y = ""Developers Who are Developing with the Language but\nHave not Expressed Interest in Continuing to Do so"",","line_length_linter" diff --git a/.dev/revdep_emails/ggcharts/email-body b/.dev/revdep_emails/ggcharts/email-body deleted file mode 100644 index 53fc2f7e6..000000000 --- a/.dev/revdep_emails/ggcharts/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Thomas Neitmann! Thank you for using {lintr} in your package {ggcharts}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/thomas-neitmann/ggcharts (hash: fa263d12878ece10d5eadfed26b27e2d233d28b1) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 20s on CRAN vs. 13s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/ggfortify/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/ggfortify/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 172b5ab90..000000000 --- a/.dev/revdep_emails/ggfortify/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,118 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/base_fortify_list.R",7,1,"style","Variable and function name style should be snake_case.","fortify.list <- function(model, data = NULL, ...) {","object_name_linter" -"R/base_fortify_list.R",31,1,"style","Variable and function name style should be snake_case.","autoplot.list <- function(object, data = NULL,","object_name_linter" -"R/base_fortify_ts.R",88,1,"style","Variable and function name style should be snake_case.","fortify.timeSeries <- fortify.ts","object_name_linter" -"R/base_fortify_ts.R",91,1,"style","Variable and function name style should be snake_case.","fortify.irts <- fortify.ts","object_name_linter" -"R/base_fortify_ts.R",269,1,"style","Variable and function name style should be snake_case.","autoplot.zooreg <- autoplot.ts","object_name_linter" -"R/base_fortify_ts.R",272,1,"style","Variable and function name style should be snake_case.","autoplot.xts <- autoplot.ts","object_name_linter" -"R/base_fortify_ts.R",275,1,"style","Variable and function name style should be snake_case.","autoplot.timeSeries <- autoplot.ts","object_name_linter" -"R/base_fortify_ts.R",278,1,"style","Variable and function name style should be snake_case.","autoplot.irts <- autoplot.ts","object_name_linter" -"R/base_fortify_ts.R",391,1,"style","Variable and function name style should be snake_case.","fortify.ar <- fortify.tsmodel","object_name_linter" -"R/base_fortify_ts.R",394,1,"style","Variable and function name style should be snake_case.","fortify.Arima <- fortify.tsmodel","object_name_linter" -"R/base_fortify_ts.R",397,1,"style","Variable and function name style should be snake_case.","fortify.tsmodel <- fortify.tsmodel","object_name_linter" -"R/base_fortify_ts.R",400,1,"style","Variable and function name style should be snake_case.","fortify.HoltWinters <- fortify.tsmodel","object_name_linter" -"R/base_fortify_ts.R",403,1,"style","Variable and function name style should be snake_case.","fortify.fracdiff <- fortify.tsmodel","object_name_linter" -"R/base_fortify_ts.R",406,1,"style","Variable and function name style should be snake_case.","fortify.nnetar <- fortify.tsmodel","object_name_linter" -"R/base_fortify_ts.R",409,1,"style","Variable and function name style should be snake_case.","fortify.fGARCH <- fortify.tsmodel","object_name_linter" -"R/base_fortify_ts.R",412,1,"style","Variable and function name style should be snake_case.","fortify.dlmFiltered <- fortify.tsmodel","object_name_linter" -"R/base_fortify_ts.R",415,1,"style","Variable and function name style should be snake_case.","fortify.KFS <- fortify.tsmodel","object_name_linter" -"R/base_fortify_ts.R",457,1,"style","Variable and function name style should be snake_case.","autoplot.tsmodel <- function(object, data = NULL,","object_name_linter" -"R/base_fortify_ts.R",499,1,"style","Variable and function name style should be snake_case.","autoplot.ar <- autoplot.tsmodel","object_name_linter" -"R/base_fortify_ts.R",502,1,"style","Variable and function name style should be snake_case.","autoplot.Arima <- autoplot.tsmodel","object_name_linter" -"R/base_fortify_ts.R",505,1,"style","Variable and function name style should be snake_case.","autoplot.HoltWinters <- autoplot.tsmodel","object_name_linter" -"R/base_fortify_ts.R",508,1,"style","Variable and function name style should be snake_case.","autoplot.fracdiff <- autoplot.tsmodel","object_name_linter" -"R/base_fortify_ts.R",511,1,"style","Variable and function name style should be snake_case.","autoplot.nnetar <- autoplot.tsmodel","object_name_linter" -"R/base_fortify_ts.R",514,1,"style","Variable and function name style should be snake_case.","autoplot.fGARCH <- autoplot.tsmodel","object_name_linter" -"R/base_fortify_ts.R",517,1,"style","Variable and function name style should be snake_case.","autoplot.dlmFiltered <- autoplot.tsmodel","object_name_linter" -"R/base_fortify_ts.R",520,1,"style","Variable and function name style should be snake_case.","autoplot.KFS <- autoplot.tsmodel","object_name_linter" -"R/fortify_base.R",20,1,"style","Variable and function name style should be snake_case.","fortify.table <- function(model, data, ...) {","object_name_linter" -"R/fortify_base.R",38,1,"style","Variable and function name style should be snake_case.","fortify.matrix <- function(model, data = NULL, compat = FALSE, ...) {","object_name_linter" -"R/fortify_base.R",91,15,"style","Variable and function name style should be snake_case."," fortified$Index <- rownames(fortified)","object_name_linter" -"R/fortify_basis.R",24,1,"style","Variable and function name style should be snake_case.","as_tibble.basis <- function(x, ...) {","object_name_linter" -"R/fortify_changepoint.R",21,1,"style","Variable and function name style should be snake_case.","fortify.cpt <- function(model, data = NULL,","object_name_linter" -"R/fortify_changepoint.R",56,1,"style","Variable and function name style should be snake_case.","fortify.breakpoints <- fortify.cpt","object_name_linter" -"R/fortify_changepoint.R",59,1,"style","Variable and function name style should be snake_case.","fortify.breakpointsfull <- fortify.cpt","object_name_linter" -"R/fortify_changepoint.R",111,1,"style","Variable and function name style should be snake_case.","autoplot.breakpoints <- function(object, data = NULL,","object_name_linter" -"R/fortify_changepoint.R",129,1,"style","Variable and function name style should be snake_case.","fortify.breakpointsfull <- fortify.breakpoints","object_name_linter" -"R/fortify_cluster.R",13,1,"style","Variable and function name style should be snake_case.","fortify.kmeans <- function(model, data = NULL, ...) {","object_name_linter" -"R/fortify_cluster.R",43,1,"style","Variable and function name style should be snake_case.","autoplot.kmeans <- function(object, data = NULL,","object_name_linter" -"R/fortify_cluster.R",67,1,"style","Variable and function name style should be snake_case.","fortify.partition <- fortify.kmeans","object_name_linter" -"R/fortify_cluster.R",70,1,"style","Variable and function name style should be snake_case.","fortify.clara <- fortify.partition","object_name_linter" -"R/fortify_cluster.R",73,1,"style","Variable and function name style should be snake_case.","fortify.fanny <- fortify.partition","object_name_linter" -"R/fortify_cluster.R",76,1,"style","Variable and function name style should be snake_case.","fortify.pam <- fortify.partition","object_name_linter" -"R/fortify_cluster.R",79,1,"style","Variable and function name style should be snake_case.","autoplot.partition <- autoplot.kmeans","object_name_linter" -"R/fortify_cluster.R",82,1,"style","Variable and function name style should be snake_case.","autoplot.clara <- autoplot.partition","object_name_linter" -"R/fortify_cluster.R",85,1,"style","Variable and function name style should be snake_case.","autoplot.fanny <- autoplot.partition","object_name_linter" -"R/fortify_cluster.R",88,1,"style","Variable and function name style should be snake_case.","autoplot.pam <- autoplot.partition","object_name_linter" -"R/fortify_cluster.R",103,1,"style","Variable and function name style should be snake_case.","fortify.silhouette <- function(model, data = NULL, ...) {","object_name_linter" -"R/fortify_cluster.R",138,1,"style","Variable and function name style should be snake_case.","autoplot.silhouette <- function(object, colour = ""red"",","object_name_linter" -"R/fortify_forecast.R",18,14,"style","Variable and function name style should be snake_case."," forecasted$Index <- get.dtindex(model$mean, is.date = is.date)","object_name_linter" -"R/fortify_forecast.R",96,1,"style","Variable and function name style should be snake_case.","fortify.ets <- function(model, data = NULL, ...) {","object_name_linter" -"R/fortify_forecast.R",144,1,"style","Variable and function name style should be snake_case.","fortify.bats <- fortify.ets","object_name_linter" -"R/fortify_forecast.R",147,1,"style","Variable and function name style should be snake_case.","autoplot.ets <- autoplot.ts","object_name_linter" -"R/fortify_forecast.R",150,1,"style","Variable and function name style should be snake_case.","autoplot.bats <- autoplot.ts","object_name_linter" -"R/fortify_glmnet.R",9,1,"style","Variable and function name style should be snake_case.","fortify.glmnet <- function(model, data = NULL, ...) {","object_name_linter" -"R/fortify_glmnet.R",95,1,"style","Variable and function name style should be snake_case.","fortify.cv.glmnet <- function(model, data = NULL, ...) {","object_name_linter" -"R/fortify_MSwM.R",15,1,"style","Variable and function name style should be snake_case.","fortify.MSM.lm <- function(model, data = NULL, melt = FALSE, ...) {","object_name_linter" -"R/fortify_MSwM.R",28,10,"style","Variable and function name style should be snake_case."," md$Index <- factor(md$Index, levels = idx)","object_name_linter" -"R/fortify_MSwM.R",29,10,"style","Variable and function name style should be snake_case."," md$Model <- rep(k, nrow(md))","object_name_linter" -"R/fortify_MSwM.R",30,10,"style","Variable and function name style should be snake_case."," md$ProbableModel <- probable","object_name_linter" -"R/fortify_MSwM.R",34,7,"style","Variable and function name style should be snake_case."," d$Model <- as.factor(d$Model)","object_name_linter" -"R/fortify_performance.R",7,1,"style","Variable and function name style should be snake_case.","fortify.performance <- function(model, data = NULL, ...) {","object_name_linter" -"R/fortify_performance.R",60,1,"style","Variable and function name style should be snake_case.","autoplot.performance <- function(object, p = NULL,","object_name_linter" -"R/fortify_raster.R",9,1,"style","Variable and function name style should be snake_case.","fortify.RasterCommon <- function(model, data = NULL, maxpixels = 100000,","object_name_linter" -"R/fortify_raster.R",49,1,"style","Variable and function name style should be snake_case.","fortify.RasterLayer <- fortify.RasterCommon","object_name_linter" -"R/fortify_raster.R",52,1,"style","Variable and function name style should be snake_case.","fortify.RasterBrick <- fortify.RasterCommon","object_name_linter" -"R/fortify_raster.R",55,1,"style","Variable and function name style should be snake_case.","fortify.RasterStack <- fortify.RasterCommon","object_name_linter" -"R/fortify_raster.R",95,1,"style","Variable and function name style should be snake_case.","autoplot.RasterLayer <- autoplot.RasterCommon","object_name_linter" -"R/fortify_raster.R",98,1,"style","Variable and function name style should be snake_case.","autoplot.RasterBrick <- autoplot.RasterCommon","object_name_linter" -"R/fortify_raster.R",101,1,"style","Variable and function name style should be snake_case.","autoplot.RasterStack <- autoplot.RasterCommon","object_name_linter" -"R/fortify_spatial.R",8,1,"style","Variable and function name style should be snake_case.","fortify.SpatialCommon <- function(model, data = NULL,","object_name_linter" -"R/fortify_spatial.R",39,1,"style","Variable and function name style should be snake_case.","fortify.SpatialPoints <- fortify.SpatialCommon","object_name_linter" -"R/fortify_spatial.R",42,1,"style","Variable and function name style should be snake_case.","fortify.SpatialPointsDataFrame <- fortify.SpatialCommon","object_name_linter" -"R/fortify_spatial.R",45,1,"style","Variable and function name style should be snake_case.","fortify.SpatialLines <- fortify.SpatialCommon","object_name_linter" -"R/fortify_spatial.R",135,1,"style","Variable and function names should not be longer than 30 characters.","autoplot.SpatialPointsDataFrame <- autoplot.SpatialCommon","object_length_linter" -"R/fortify_spatial.R",135,1,"style","Variable and function name style should be snake_case.","autoplot.SpatialPointsDataFrame <- autoplot.SpatialCommon","object_name_linter" -"R/fortify_spatial.R",138,1,"style","Variable and function name style should be snake_case.","autoplot.SpatialPoints <- autoplot.SpatialCommon","object_name_linter" -"R/fortify_spatial.R",141,1,"style","Variable and function name style should be snake_case.","autoplot.Line <- autoplot.SpatialCommon","object_name_linter" -"R/fortify_spatial.R",144,1,"style","Variable and function name style should be snake_case.","autoplot.Lines <- autoplot.SpatialCommon","object_name_linter" -"R/fortify_spatial.R",147,1,"style","Variable and function name style should be snake_case.","autoplot.SpatialLines <- autoplot.SpatialCommon","object_name_linter" -"R/fortify_spatial.R",150,1,"style","Variable and function name style should be snake_case.","autoplot.SpatialLinesDataFrame <- autoplot.SpatialCommon","object_name_linter" -"R/fortify_spatial.R",153,1,"style","Variable and function name style should be snake_case.","autoplot.Polygon <- autoplot.SpatialCommon","object_name_linter" -"R/fortify_spatial.R",156,1,"style","Variable and function name style should be snake_case.","autoplot.Polygons <- autoplot.SpatialCommon","object_name_linter" -"R/fortify_spatial.R",159,1,"style","Variable and function name style should be snake_case.","autoplot.SpatialPolygons <- autoplot.SpatialCommon","object_name_linter" -"R/fortify_spatial.R",162,1,"style","Variable and function names should not be longer than 30 characters.","autoplot.SpatialPolygonsDataFrame <- autoplot.SpatialCommon","object_length_linter" -"R/fortify_spatial.R",162,1,"style","Variable and function name style should be snake_case.","autoplot.SpatialPolygonsDataFrame <- autoplot.SpatialCommon","object_name_linter" -"R/fortify_stats_density.R",9,1,"style","Variable and function name style should be snake_case.","fortify.density <- function(model, data = NULL, ...) {","object_name_linter" -"R/fortify_stats_lm.R",335,1,"style","Variable and function name style should be snake_case.","autoplot.glm <- autoplot.lm","object_name_linter" -"R/fortify_stats.R",2,1,"style","Variable and function name style should be snake_case.","fortify.stl <- fortify.ts","object_name_linter" -"R/fortify_stats.R",5,1,"style","Variable and function name style should be snake_case.","fortify.decomposed.ts <- fortify.ts","object_name_linter" -"R/fortify_stats.R",8,1,"style","Variable and function name style should be snake_case.","autoplot.stl <- autoplot.ts","object_name_linter" -"R/fortify_stats.R",11,1,"style","Variable and function name style should be snake_case.","autoplot.decomposed.ts <- autoplot.ts","object_name_linter" -"R/fortify_stats.R",28,1,"style","Variable and function name style should be snake_case.","fortify.acf <- function(model, data = NULL,","object_name_linter" -"R/fortify_stats.R",57,1,"style","Variable and function name style should be snake_case.","autoplot.acf <- function(object,","object_name_linter" -"R/fortify_stats.R",98,1,"style","Variable and function name style should be snake_case.","fortify.spec <- function(model, data = NULL, ...) {","object_name_linter" -"R/fortify_stats.R",114,1,"style","Variable and function name style should be snake_case.","autoplot.spec <- function(object,","object_name_linter" -"R/fortify_stats.R",140,1,"style","Variable and function name style should be snake_case.","fortify.prcomp <- function(model, data = NULL, ...) {","object_name_linter" -"R/fortify_stats.R",160,1,"style","Variable and function name style should be snake_case.","fortify.princomp <- fortify.prcomp","object_name_linter" -"R/fortify_stats.R",172,1,"style","Variable and function name style should be snake_case.","fortify.factanal <- function(model, data = NULL, ...) {","object_name_linter" -"R/fortify_stats.R",194,1,"style","Variable and function name style should be snake_case.","fortify.lfda <- function(model, data = NULL, ...) {","object_name_linter" -"R/fortify_stats.R",252,1,"style","Variable and function name style should be snake_case.","autoplot.pca_common <- function(object, data = NULL,","object_name_linter" -"R/fortify_stats.R",345,1,"style","Variable and function name style should be snake_case.","autoplot.prcomp <- autoplot.pca_common","object_name_linter" -"R/fortify_stats.R",348,1,"style","Variable and function name style should be snake_case.","autoplot.princomp <- autoplot.pca_common","object_name_linter" -"R/fortify_stats.R",351,1,"style","Variable and function name style should be snake_case.","autoplot.factanal <- autoplot.pca_common","object_name_linter" -"R/fortify_stats.R",354,1,"style","Variable and function name style should be snake_case.","autoplot.lfda <- autoplot.pca_common","object_name_linter" -"R/fortify_stats.R",365,1,"style","Variable and function name style should be snake_case.","fortify.dist <- function(model, data = NULL, ...) {","object_name_linter" -"R/fortify_stats.R",371,1,"style","Variable and function name style should be snake_case.","autoplot.dist <- autoplot.matrix","object_name_linter" -"R/fortify_stats.R",385,1,"style","Variable and function name style should be snake_case.","fortify.stepfun <- function(model, data, ...) {","object_name_linter" -"R/fortify_stats.R",418,1,"style","Variable and function name style should be snake_case.","autoplot.stepfun <- function(object,","object_name_linter" -"R/fortify_surv.R",282,1,"style","Variable and function name style should be snake_case.","fortify.aareg <- function(model, data = NULL,","object_name_linter" -"R/fortify_vars.R",26,21,"style","There should be a space between right parenthesis and an opening curly brace."," for (col in cols){","paren_brace_linter" -"R/fortify_vars.R",28,12,"style","Variable and function name style should be snake_case."," pred$Index <- dtindex.cont","object_name_linter" -"R/fortify_vars.R",37,21,"style","There should be a space between right parenthesis and an opening curly brace."," for (col in cols){","paren_brace_linter" -"R/fortify_vars.R",41,10,"style","Variable and function name style should be snake_case."," pred$Index <- dtindex.cont","object_name_linter" -"R/plotlib.R",457,1,"style","Variable and function name style should be snake_case.","autoplot.ggplot <- function(object, ...) {","object_name_linter" -"R/plotlib.R",468,1,"style","Variable and function name style should be snake_case.","autoplot.ggmultiplot <- function(object, ...) {","object_name_linter" -"R/tslib.R",130,3,"style","Variable and function name style should be snake_case."," with.ci.ma <- with.ci && ci.type == ""ma"" && x$type == ""correlation""","object_name_linter" -"R/tslib.R",134,5,"style","Variable and function name style should be snake_case."," with.ci.ma <- FALSE","object_name_linter" -"tests/testthat/test-raster.R",35,7,"style","Variable and function name style should be snake_case."," exp$layer.2 <- exp$layer","object_name_linter" diff --git a/.dev/revdep_emails/ggfortify/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/ggfortify/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 89239abb7..000000000 --- a/.dev/revdep_emails/ggfortify/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,190 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/base_fortify_list.R",54,25,"style","Any function spanning multiple lines should use curly braces."," p <- lapply(object, function(x) autoplot(x, data = data, nrow = nrow,","brace_linter" -"R/fortify_basis.R",25,13,"style","Variable and function name style should be snake_case or symbols."," attr(x, ""basis.class"") <- attr(x, ""class"")","object_name_linter" -"R/fortify_basis.R",87,5,"style","Variable and function name style should be snake_case or symbols."," all.knots <- c(attr(object, ""Boundary.knots""),","object_name_linter" -"R/fortify_glmnet.R",69,3,"style","Variable and function name style should be snake_case or symbols."," label.data$label_y <- rep(max(plot.data$value), nrow(label.data))","object_name_linter" -"R/fortify_glmnet.R",115,33,"style","Variable and function name style should be snake_case or symbols."," sign.lambda = 1,","object_name_linter" -"R/fortify_stats_lm.R",150,15,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (label & label.n > 0) {","vector_logic_linter" -"R/fortify_stats.R",283,5,"style","Either both or neither branch in `if`/`else` should use curly braces."," if (is.null(attr(object, ""covariance""))) {","brace_linter" -"R/fortify_stats.R",319,5,"style","Variable and function name style should be snake_case or symbols."," loadings.data$rownames <- rownames(loadings.data)","object_name_linter" -"R/fortify_stats.R",328,19,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(ve) | !variance_percentage) {","vector_logic_linter" -"R/fortify_stats.R",433,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nrow(plot.data) >= 3 & !is.null(shape)) {","vector_logic_linter" -"R/fortify_surv.R",99,5,"style","`else` should come on the same line as the previous `}`."," else if (!is.function(fun)) {","brace_linter" -"R/fortify_surv.R",233,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (missing(conf.int.fill) & !is.null(surv.colour)) {","vector_logic_linter" -"R/plotlib.R",350,1,"style","Variable and function name style should be snake_case or symbols.","get.layout <- function(nplots, ncol, nrow) {","object_name_linter" -"R/plotlib.R",592,5,"style","Variable and function name style should be snake_case or symbols."," loadings.data[, 1L:2L] <- loadings.data[, 1L:2L] * scaler * 0.8","object_name_linter" -"R/tslib.R",224,3,"style","Either both or neither branch in `if`/`else` should use curly braces."," if (length(x) %% 2 == 0) {","brace_linter" -"R/tslib.R",229,3,"style","`else` should come on the same line as the previous `}`."," else y <- y[seq_along(x)]","brace_linter" -"tests/testthat/test-stats-lm.R",563,31,"style","Put spaces around all infix operators."," p <- autoplot(lm(Petal.Width~Petal.Length, data = iris), size = 5)","infix_spaces_linter" -"tests/testthat/test-surv.R",166,45,"style","Use TRUE instead of the symbol T."," fortified <- fortify(fit, surv.connect = T)","T_and_F_symbol_linter" -"vignettes/basics.Rmd",8,25,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/basics-', warning=FALSE)","infix_spaces_linter" -"vignettes/basics.Rmd",8,39,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/basics-', warning=FALSE)","infix_spaces_linter" -"vignettes/basics.Rmd",8,51,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/basics-', warning=FALSE)","infix_spaces_linter" -"vignettes/basics.Rmd",8,52,"style","Only use double-quotes.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/basics-', warning=FALSE)","single_quotes_linter" -"vignettes/basics.Rmd",8,78,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/basics-', warning=FALSE)","infix_spaces_linter" -"vignettes/basics.Rmd",8,81,"style","Lines should not be more than 80 characters.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/basics-', warning=FALSE)","line_length_linter" -"vignettes/basics.Rmd",32,37,"style","Only use double-quotes.","autoplot(AirPassengers, ts.colour = 'blue')","single_quotes_linter" -"vignettes/basics.Rmd",46,13,"style","Only use double-quotes.","p + ggtitle('AirPassengers') + xlab('Year') + ylab('Passengers')","single_quotes_linter" -"vignettes/basics.Rmd",46,37,"style","Only use double-quotes.","p + ggtitle('AirPassengers') + xlab('Year') + ylab('Passengers')","single_quotes_linter" -"vignettes/basics.Rmd",46,52,"style","Only use double-quotes.","p + ggtitle('AirPassengers') + xlab('Year') + ylab('Passengers')","single_quotes_linter" -"vignettes/basics.Rmd",50,49,"style","Trailing whitespace is superfluous.","# these common options are supported as keywords ","trailing_whitespace_linter" -"vignettes/basics.Rmd",51,33,"style","Only use double-quotes.","autoplot(AirPassengers, title = 'AirPassengers', xlab = 'Year', ylab = 'Passengers')","single_quotes_linter" -"vignettes/basics.Rmd",51,57,"style","Only use double-quotes.","autoplot(AirPassengers, title = 'AirPassengers', xlab = 'Year', ylab = 'Passengers')","single_quotes_linter" -"vignettes/basics.Rmd",51,72,"style","Only use double-quotes.","autoplot(AirPassengers, title = 'AirPassengers', xlab = 'Year', ylab = 'Passengers')","single_quotes_linter" -"vignettes/basics.Rmd",51,81,"style","Lines should not be more than 80 characters.","autoplot(AirPassengers, title = 'AirPassengers', xlab = 'Year', ylab = 'Passengers')","line_length_linter" -"vignettes/basics.Rmd",74,17,"style","Put spaces around all infix operators.","ggplot(df, aes(x= cluster, fill = cluster)) + geom_bar()","infix_spaces_linter" -"vignettes/basics.Rmd",82,40,"style","Trailing whitespace is superfluous.","res <- lm(Volume ~ Girth, data = trees) ","trailing_whitespace_linter" -"vignettes/basics.Rmd",155,5,"style","Only use double-quotes.","new('ggmultiplot', plots = list(p1, p2))","single_quotes_linter" -"vignettes/basics.Rmd",161,5,"style","Only use double-quotes.","new('ggmultiplot', plots = list(p1, p2), ncol = 1)","single_quotes_linter" -"vignettes/plot_dist.Rmd",8,25,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/dist-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_dist.Rmd",8,39,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/dist-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_dist.Rmd",8,51,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/dist-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_dist.Rmd",8,52,"style","Only use double-quotes.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/dist-', warning=FALSE)","single_quotes_linter" -"vignettes/plot_dist.Rmd",8,76,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/dist-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_dist.Rmd",8,81,"style","Lines should not be more than 80 characters.","opts_chunk$set(fig.width=6, fig.height=4, fig.path='figures/dist-', warning=FALSE)","line_length_linter" -"vignettes/plot_dist.Rmd",27,67,"style","Only use double-quotes.","ggdistribution(pnorm, seq(-3, 3, 0.1), mean = 0, sd = 1, colour = 'red')","single_quotes_linter" -"vignettes/plot_dist.Rmd",28,54,"style","Only use double-quotes.","ggdistribution(dpois, seq(0, 20), lambda = 9, fill = 'blue')","single_quotes_linter" -"vignettes/plot_dist.Rmd",34,63,"style","Only use double-quotes.","p <- ggdistribution(dchisq, seq(0, 20, 0.1), df = 7, colour = 'blue')","single_quotes_linter" -"vignettes/plot_dist.Rmd",35,63,"style","Only use double-quotes.","p <- ggdistribution(dchisq, seq(0, 20, 0.1), df = 9, colour = 'green', p = p)","single_quotes_linter" -"vignettes/plot_dist.Rmd",36,59,"style","Only use double-quotes.","ggdistribution(dchisq, seq(0, 20, 0.1), df = 11, colour = 'red', p = p)","single_quotes_linter" -"vignettes/plot_dist.Rmd",44,39,"style","Only use double-quotes.","autoplot(density(rnorm(1:50)), fill = 'green')","single_quotes_linter" -"vignettes/plot_lm.Rmd",8,25,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=8, fig.height=6, fig.path='figures/lm-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_lm.Rmd",8,39,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=8, fig.height=6, fig.path='figures/lm-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_lm.Rmd",8,51,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=8, fig.height=6, fig.path='figures/lm-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_lm.Rmd",8,52,"style","Only use double-quotes.","opts_chunk$set(fig.width=8, fig.height=6, fig.path='figures/lm-', warning=FALSE)","single_quotes_linter" -"vignettes/plot_lm.Rmd",8,74,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=8, fig.height=6, fig.path='figures/lm-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_lm.Rmd",57,35,"style","Only use double-quotes.","autoplot(m, which = 1:6, colour = 'dodgerblue3',","single_quotes_linter" -"vignettes/plot_lm.Rmd",58,26,"style","Only use double-quotes."," smooth.colour = 'black', smooth.linetype = 'dashed',","single_quotes_linter" -"vignettes/plot_lm.Rmd",58,53,"style","Only use double-quotes."," smooth.colour = 'black', smooth.linetype = 'dashed',","single_quotes_linter" -"vignettes/plot_lm.Rmd",59,22,"style","Only use double-quotes."," ad.colour = 'blue',","single_quotes_linter" -"vignettes/plot_lm.Rmd",60,54,"style","Only use double-quotes."," label.size = 3, label.n = 5, label.colour = 'blue',","single_quotes_linter" -"vignettes/plot_lm.Rmd",68,19,"style","Only use double-quotes."," colour = 'Species', label.size = 3)","single_quotes_linter" -"vignettes/plot_lm.Rmd",83,24,"style","Only use double-quotes.","autoplot(fit, colour = 'blue')","single_quotes_linter" -"vignettes/plot_map.Rmd",8,25,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=3, fig.height=3, fig.path='figures/map-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_map.Rmd",8,39,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=3, fig.height=3, fig.path='figures/map-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_map.Rmd",8,51,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=3, fig.height=3, fig.path='figures/map-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_map.Rmd",8,52,"style","Only use double-quotes.","opts_chunk$set(fig.width=3, fig.height=3, fig.path='figures/map-', warning=FALSE)","single_quotes_linter" -"vignettes/plot_map.Rmd",8,75,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=3, fig.height=3, fig.path='figures/map-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_map.Rmd",8,81,"style","Lines should not be more than 80 characters.","opts_chunk$set(fig.width=3, fig.height=3, fig.path='figures/map-', warning=FALSE)","line_length_linter" -"vignettes/plot_map.Rmd",21,25,"style","Only use double-quotes.","jp <- ggplot2::map_data('world2', 'japan')","single_quotes_linter" -"vignettes/plot_map.Rmd",21,35,"style","Only use double-quotes.","jp <- ggplot2::map_data('world2', 'japan')","single_quotes_linter" -"vignettes/plot_map.Rmd",32,12,"style","Only use double-quotes.","jp <- map('world2', 'japan', plot = FALSE, fill = TRUE)","single_quotes_linter" -"vignettes/plot_map.Rmd",32,22,"style","Only use double-quotes.","jp <- map('world2', 'japan', plot = FALSE, fill = TRUE)","single_quotes_linter" -"vignettes/plot_map.Rmd",36,26,"style","Only use double-quotes.","p <- autoplot(jp, geom = 'polygon', fill = 'subregion') + ","single_quotes_linter" -"vignettes/plot_map.Rmd",36,44,"style","Only use double-quotes.","p <- autoplot(jp, geom = 'polygon', fill = 'subregion') + ","single_quotes_linter" -"vignettes/plot_map.Rmd",36,58,"style","Trailing whitespace is superfluous.","p <- autoplot(jp, geom = 'polygon', fill = 'subregion') + ","trailing_whitespace_linter" -"vignettes/plot_map.Rmd",37,24,"style","Put spaces around all infix operators."," theme(legend.position=""none"")","infix_spaces_linter" -"vignettes/plot_map.Rmd",44,15,"style","Only use double-quotes.","cities <- get('world.cities')","single_quotes_linter" -"vignettes/plot_map.Rmd",45,40,"style","Only use double-quotes.","cities <- cities[cities$country.etc == 'Japan', ]","single_quotes_linter" -"vignettes/plot_map.Rmd",49,25,"style","Only use double-quotes."," colour = 'blue', size = 0.1)","single_quotes_linter" -"vignettes/plot_map.Rmd",55,40,"style","Only use double-quotes.","p + geom_point(data = cities, colour = 'blue', size = 0.1)","single_quotes_linter" -"vignettes/plot_map.Rmd",81,28,"style","Only use double-quotes."," label = c('Tokyo', 'Osaka'),","single_quotes_linter" -"vignettes/plot_map.Rmd",81,37,"style","Only use double-quotes."," label = c('Tokyo', 'Osaka'),","single_quotes_linter" -"vignettes/plot_map.Rmd",85,30,"style","Only use double-quotes.","autoplot(df, p = p, colour = 'red', size = 10)","single_quotes_linter" -"vignettes/plot_map.Rmd",91,30,"style","Only use double-quotes.","autoplot(df, p = p, colour = 'red', size = 'population') +","single_quotes_linter" -"vignettes/plot_map.Rmd",91,44,"style","Only use double-quotes.","autoplot(df, p = p, colour = 'red', size = 'population') +","single_quotes_linter" -"vignettes/plot_map.Rmd",104,30,"style","Only use double-quotes.","autoplot(df, p = p, colour = 'red', size = 'population') + ","single_quotes_linter" -"vignettes/plot_map.Rmd",104,44,"style","Only use double-quotes.","autoplot(df, p = p, colour = 'red', size = 'population') + ","single_quotes_linter" -"vignettes/plot_map.Rmd",104,59,"style","Trailing whitespace is superfluous.","autoplot(df, p = p, colour = 'red', size = 'population') + ","trailing_whitespace_linter" -"vignettes/plot_pca.Rmd",8,25,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/pca-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_pca.Rmd",8,39,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/pca-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_pca.Rmd",8,51,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/pca-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_pca.Rmd",8,52,"style","Only use double-quotes.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/pca-', warning=FALSE)","single_quotes_linter" -"vignettes/plot_pca.Rmd",8,75,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/pca-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_pca.Rmd",8,81,"style","Lines should not be more than 80 characters.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/pca-', warning=FALSE)","line_length_linter" -"vignettes/plot_pca.Rmd",28,41,"style","Only use double-quotes.","autoplot(pca_res, data = iris, colour = 'Species')","single_quotes_linter" -"vignettes/plot_pca.Rmd",34,41,"style","Only use double-quotes.","autoplot(pca_res, data = iris, colour = 'Species', label = TRUE, label.size = 3)","single_quotes_linter" -"vignettes/plot_pca.Rmd",40,41,"style","Only use double-quotes.","autoplot(pca_res, data = iris, colour = 'Species', shape = FALSE, label.size = 3)","single_quotes_linter" -"vignettes/plot_pca.Rmd",40,81,"style","Lines should not be more than 80 characters.","autoplot(pca_res, data = iris, colour = 'Species', shape = FALSE, label.size = 3)","line_length_linter" -"vignettes/plot_pca.Rmd",46,41,"style","Only use double-quotes.","autoplot(pca_res, data = iris, colour = 'Species', loadings = TRUE)","single_quotes_linter" -"vignettes/plot_pca.Rmd",52,41,"style","Only use double-quotes.","autoplot(pca_res, data = iris, colour = 'Species',","single_quotes_linter" -"vignettes/plot_pca.Rmd",53,45,"style","Only use double-quotes."," loadings = TRUE, loadings.colour = 'blue',","single_quotes_linter" -"vignettes/plot_pca.Rmd",70,1,"style","Variable and function name style should be snake_case or symbols.","d.factanal <- factanal(state.x77, factors = 3, scores = 'regression')","object_name_linter" -"vignettes/plot_pca.Rmd",70,57,"style","Only use double-quotes.","d.factanal <- factanal(state.x77, factors = 3, scores = 'regression')","single_quotes_linter" -"vignettes/plot_pca.Rmd",71,49,"style","Only use double-quotes.","autoplot(d.factanal, data = state.x77, colour = 'Income')","single_quotes_linter" -"vignettes/plot_pca.Rmd",106,55,"style","Only use double-quotes.","autoplot(pam(iris[-5], 3), frame = TRUE, frame.type = 'norm')","single_quotes_linter" -"vignettes/plot_pca.Rmd",128,49,"style","Put spaces around all infix operators.","model <- lfda(iris[-5], iris[, 5], r = 3, metric=""plain"")","infix_spaces_linter" -"vignettes/plot_pca.Rmd",129,59,"style","Only use double-quotes.","autoplot(model, data = iris, frame = TRUE, frame.colour = 'Species')","single_quotes_linter" -"vignettes/plot_pca.Rmd",134,61,"style","Put spaces around all infix operators.","model <- self(iris[-5], iris[, 5], beta = 0.1, r = 3, metric=""plain"")","infix_spaces_linter" -"vignettes/plot_pca.Rmd",135,59,"style","Only use double-quotes.","autoplot(model, data = iris, frame = TRUE, frame.colour = 'Species')","single_quotes_linter" -"vignettes/plot_pca.Rmd",175,37,"style","Only use double-quotes.","autoplot(isoMDS(eurodist), colour = 'orange', size = 4, shape = 3)","single_quotes_linter" -"vignettes/plot_pca.Rmd",181,58,"style","Only use double-quotes.","autoplot(sammon(eurodist), shape = FALSE, label.colour = 'blue', label.size = 3)","single_quotes_linter" -"vignettes/plot_surv.Rmd",8,25,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/surv-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_surv.Rmd",8,39,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/surv-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_surv.Rmd",8,51,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/surv-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_surv.Rmd",8,52,"style","Only use double-quotes.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/surv-', warning=FALSE)","single_quotes_linter" -"vignettes/plot_surv.Rmd",8,76,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/surv-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_surv.Rmd",8,81,"style","Lines should not be more than 80 characters.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/surv-', warning=FALSE)","line_length_linter" -"vignettes/plot_surv.Rmd",27,31,"style","Only use double-quotes.","autoplot(fit, surv.linetype = 'dashed', conf.int = FALSE,","single_quotes_linter" -"vignettes/plot_surv.Rmd",28,25,"style","Only use double-quotes."," censor.shape = '*', censor.size = 5, facets = TRUE, ncol = 2)","single_quotes_linter" -"vignettes/plot_surv.Rmd",30,70,"style","Only use double-quotes.","autoplot(survfit(Surv(time, status) ~ 1, data = lung), surv.colour = 'orange', censor.colour = 'red')","single_quotes_linter" -"vignettes/plot_surv.Rmd",30,81,"style","Lines should not be more than 80 characters.","autoplot(survfit(Surv(time, status) ~ 1, data = lung), surv.colour = 'orange', censor.colour = 'red')","line_length_linter" -"vignettes/plot_surv.Rmd",30,96,"style","Only use double-quotes.","autoplot(survfit(Surv(time, status) ~ 1, data = lung), surv.colour = 'orange', censor.colour = 'red')","single_quotes_linter" -"vignettes/plot_surv.Rmd",32,64,"style","Only use double-quotes.","autoplot(survfit(Surv(time, status) ~ sex, data = lung), fun = 'event')","single_quotes_linter" -"vignettes/plot_surv.Rmd",34,1,"style","Variable and function name style should be snake_case or symbols.","d.coxph <- survfit(coxph(Surv(time, status) ~ sex, data = lung))","object_name_linter" -"vignettes/plot_surv.Rmd",35,35,"style","Only use double-quotes.","autoplot(d.coxph, surv.linetype = 'dashed', surv.colour = 'blue',","single_quotes_linter" -"vignettes/plot_surv.Rmd",35,59,"style","Only use double-quotes.","autoplot(d.coxph, surv.linetype = 'dashed', surv.colour = 'blue',","single_quotes_linter" -"vignettes/plot_surv.Rmd",36,26,"style","Only use double-quotes."," conf.int.fill = 'dodgerblue3', conf.int.alpha = 0.5, censor = FALSE)","single_quotes_linter" -"vignettes/plot_ts.Rmd",8,25,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/ts-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_ts.Rmd",8,39,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/ts-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_ts.Rmd",8,51,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/ts-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_ts.Rmd",8,52,"style","Only use double-quotes.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/ts-', warning=FALSE)","single_quotes_linter" -"vignettes/plot_ts.Rmd",8,74,"style","Put spaces around all infix operators.","opts_chunk$set(fig.width=6, fig.height=3, fig.path='figures/ts-', warning=FALSE)","infix_spaces_linter" -"vignettes/plot_ts.Rmd",25,37,"style","Only use double-quotes.","autoplot(AirPassengers, ts.colour = 'red', ts.linetype = 'dashed')","single_quotes_linter" -"vignettes/plot_ts.Rmd",25,58,"style","Only use double-quotes.","autoplot(AirPassengers, ts.colour = 'red', ts.linetype = 'dashed')","single_quotes_linter" -"vignettes/plot_ts.Rmd",51,45,"style","Only use double-quotes.","autoplot(as.xts(AirPassengers), ts.colour = 'green')","single_quotes_linter" -"vignettes/plot_ts.Rmd",54,53,"style","Only use double-quotes.","autoplot(as.timeSeries(AirPassengers), ts.colour = ('dodgerblue3'))","single_quotes_linter" -"vignettes/plot_ts.Rmd",62,35,"style","Only use double-quotes.","autoplot(AirPassengers, ts.geom = 'bar', fill = 'blue')","single_quotes_linter" -"vignettes/plot_ts.Rmd",62,49,"style","Only use double-quotes.","autoplot(AirPassengers, ts.geom = 'bar', fill = 'blue')","single_quotes_linter" -"vignettes/plot_ts.Rmd",66,35,"style","Only use double-quotes.","autoplot(AirPassengers, ts.geom = 'ribbon', fill = 'green')","single_quotes_linter" -"vignettes/plot_ts.Rmd",66,52,"style","Only use double-quotes.","autoplot(AirPassengers, ts.geom = 'ribbon', fill = 'green')","single_quotes_linter" -"vignettes/plot_ts.Rmd",70,35,"style","Only use double-quotes.","autoplot(AirPassengers, ts.geom = 'point', shape = 3)","single_quotes_linter" -"vignettes/plot_ts.Rmd",76,81,"style","Lines should not be more than 80 characters.","mts <- ts(data.frame(a = c(1, 2, 3, 4, 4, 3), b = c(3, 2, 3, 2, 2, 1)), start = 2010)","line_length_linter" -"vignettes/plot_ts.Rmd",77,25,"style","Only use double-quotes.","autoplot(mts, ts.geom = 'bar', facets = FALSE)","single_quotes_linter" -"vignettes/plot_ts.Rmd",81,25,"style","Only use double-quotes.","autoplot(mts, ts.geom = 'bar', facets = FALSE, stacked = TRUE)","single_quotes_linter" -"vignettes/plot_ts.Rmd",85,25,"style","Only use double-quotes.","autoplot(mts, ts.geom = 'ribbon', facets = FALSE)","single_quotes_linter" -"vignettes/plot_ts.Rmd",89,25,"style","Only use double-quotes.","autoplot(mts, ts.geom = 'ribbon', facets = FALSE, stacked = TRUE)","single_quotes_linter" -"vignettes/plot_ts.Rmd",98,1,"style","Variable and function name style should be snake_case or symbols.","d.arima <- auto.arima(AirPassengers)","object_name_linter" -"vignettes/plot_ts.Rmd",99,1,"style","Variable and function name style should be snake_case or symbols.","d.forecast <- forecast(d.arima, level = c(95), h = 50)","object_name_linter" -"vignettes/plot_ts.Rmd",106,34,"style","Only use double-quotes.","autoplot(d.forecast, ts.colour = 'firebrick1', predict.colour = 'red',","single_quotes_linter" -"vignettes/plot_ts.Rmd",106,65,"style","Only use double-quotes.","autoplot(d.forecast, ts.colour = 'firebrick1', predict.colour = 'red',","single_quotes_linter" -"vignettes/plot_ts.Rmd",107,29,"style","Only use double-quotes."," predict.linetype = 'dashed', conf.int = FALSE)","single_quotes_linter" -"vignettes/plot_ts.Rmd",116,1,"style","Variable and function name style should be snake_case or symbols.","d.vselect <- VARselect(Canada, lag.max = 5, type = 'const')$selection[1]","object_name_linter" -"vignettes/plot_ts.Rmd",116,52,"style","Only use double-quotes.","d.vselect <- VARselect(Canada, lag.max = 5, type = 'const')$selection[1]","single_quotes_linter" -"vignettes/plot_ts.Rmd",117,1,"style","Variable and function name style should be snake_case or symbols.","d.var <- VAR(Canada, p = d.vselect, type = 'const')","object_name_linter" -"vignettes/plot_ts.Rmd",117,44,"style","Only use double-quotes.","d.var <- VAR(Canada, p = d.vselect, type = 'const')","single_quotes_linter" -"vignettes/plot_ts.Rmd",123,52,"style","Only use double-quotes.","autoplot(predict(d.var, n.ahead = 50), ts.colour = 'dodgerblue4',","single_quotes_linter" -"vignettes/plot_ts.Rmd",124,27,"style","Only use double-quotes."," predict.colour = 'blue', predict.linetype = 'dashed')","single_quotes_linter" -"vignettes/plot_ts.Rmd",124,54,"style","Only use double-quotes."," predict.colour = 'blue', predict.linetype = 'dashed')","single_quotes_linter" -"vignettes/plot_ts.Rmd",139,51,"style","Only use double-quotes.","autoplot(cpt.meanvar(AirPassengers), cpt.colour = 'blue', cpt.linetype = 'solid')","single_quotes_linter" -"vignettes/plot_ts.Rmd",139,74,"style","Only use double-quotes.","autoplot(cpt.meanvar(AirPassengers), cpt.colour = 'blue', cpt.linetype = 'solid')","single_quotes_linter" -"vignettes/plot_ts.Rmd",139,81,"style","Lines should not be more than 80 characters.","autoplot(cpt.meanvar(AirPassengers), cpt.colour = 'blue', cpt.linetype = 'solid')","line_length_linter" -"vignettes/plot_ts.Rmd",149,45,"style","Only use double-quotes.","autoplot(breakpoints(Nile ~ 1), ts.colour = 'blue', ts.linetype = 'dashed',","single_quotes_linter" -"vignettes/plot_ts.Rmd",149,67,"style","Only use double-quotes.","autoplot(breakpoints(Nile ~ 1), ts.colour = 'blue', ts.linetype = 'dashed',","single_quotes_linter" -"vignettes/plot_ts.Rmd",150,23,"style","Only use double-quotes."," cpt.colour = 'dodgerblue3', cpt.linetype = 'solid')","single_quotes_linter" -"vignettes/plot_ts.Rmd",150,53,"style","Only use double-quotes."," cpt.colour = 'dodgerblue3', cpt.linetype = 'solid')","single_quotes_linter" -"vignettes/plot_ts.Rmd",159,24,"style","There should be a space before an opening curly brace.","form <- function(theta){","brace_linter" -"vignettes/plot_ts.Rmd",159,24,"style","There should be a space between a right parenthesis and a body expression.","form <- function(theta){","paren_body_linter" -"vignettes/plot_ts.Rmd",160,3,"warning","no visible global function definition for β€˜dlmModPoly’"," dlmModPoly(order = 1, dV = exp(theta[1]), dW = exp(theta[2]))","object_usage_linter" -"vignettes/plot_ts.Rmd",172,34,"style","Only use double-quotes.","autoplot(filtered, ts.linetype = 'dashed', fitted.colour = 'blue')","single_quotes_linter" -"vignettes/plot_ts.Rmd",172,60,"style","Only use double-quotes.","autoplot(filtered, ts.linetype = 'dashed', fitted.colour = 'blue')","single_quotes_linter" -"vignettes/plot_ts.Rmd",187,32,"style","Only use double-quotes.","autoplot(smoothed, ts.colour = 'blue', p = p)","single_quotes_linter" -"vignettes/plot_ts.Rmd",197,25,"style","Put spaces around all infix operators."," Nile ~ SSMtrend(degree=1, Q=matrix(NA)), H=matrix(NA)","infix_spaces_linter" -"vignettes/plot_ts.Rmd",197,30,"style","Put spaces around all infix operators."," Nile ~ SSMtrend(degree=1, Q=matrix(NA)), H=matrix(NA)","infix_spaces_linter" -"vignettes/plot_ts.Rmd",197,45,"style","Put spaces around all infix operators."," Nile ~ SSMtrend(degree=1, Q=matrix(NA)), H=matrix(NA)","infix_spaces_linter" -"vignettes/plot_ts.Rmd",199,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/plot_ts.Rmd",200,20,"style","Put spaces around all infix operators.","fit <- fitSSM(model=model, inits=c(log(var(Nile)),log(var(Nile))), method=""BFGS"")","infix_spaces_linter" -"vignettes/plot_ts.Rmd",200,33,"style","Put spaces around all infix operators.","fit <- fitSSM(model=model, inits=c(log(var(Nile)),log(var(Nile))), method=""BFGS"")","infix_spaces_linter" -"vignettes/plot_ts.Rmd",200,51,"style","Commas should always have a space after.","fit <- fitSSM(model=model, inits=c(log(var(Nile)),log(var(Nile))), method=""BFGS"")","commas_linter" -"vignettes/plot_ts.Rmd",200,74,"style","Put spaces around all infix operators.","fit <- fitSSM(model=model, inits=c(log(var(Nile)),log(var(Nile))), method=""BFGS"")","infix_spaces_linter" -"vignettes/plot_ts.Rmd",200,81,"style","Lines should not be more than 80 characters.","fit <- fitSSM(model=model, inits=c(log(var(Nile)),log(var(Nile))), method=""BFGS"")","line_length_linter" -"vignettes/plot_ts.Rmd",208,37,"style","Put spaces around all infix operators.","filtered <- KFS(fit$model, filtering=""mean"", smoothing='none')","infix_spaces_linter" -"vignettes/plot_ts.Rmd",208,55,"style","Put spaces around all infix operators.","filtered <- KFS(fit$model, filtering=""mean"", smoothing='none')","infix_spaces_linter" -"vignettes/plot_ts.Rmd",208,56,"style","Only use double-quotes.","filtered <- KFS(fit$model, filtering=""mean"", smoothing='none')","single_quotes_linter" -"vignettes/plot_ts.Rmd",215,33,"style","Put spaces around all infix operators.","trend <- signal(smoothed, states=""trend"")","infix_spaces_linter" -"vignettes/plot_ts.Rmd",223,29,"style","Only use double-quotes.","autoplot(trend, ts.colour = 'blue', p = p)","single_quotes_linter" -"vignettes/plot_ts.Rmd",237,40,"style","Only use double-quotes.","autoplot(stl(AirPassengers, s.window = 'periodic'), ts.colour = 'blue')","single_quotes_linter" -"vignettes/plot_ts.Rmd",237,65,"style","Only use double-quotes.","autoplot(stl(AirPassengers, s.window = 'periodic'), ts.colour = 'blue')","single_quotes_linter" -"vignettes/plot_ts.Rmd",249,60,"style","Only use double-quotes.","autoplot(acf(AirPassengers, plot = FALSE), conf.int.fill = '#0000FF', conf.int.value = 0.8, conf.int.type = 'ma')","single_quotes_linter" -"vignettes/plot_ts.Rmd",249,81,"style","Lines should not be more than 80 characters.","autoplot(acf(AirPassengers, plot = FALSE), conf.int.fill = '#0000FF', conf.int.value = 0.8, conf.int.type = 'ma')","line_length_linter" -"vignettes/plot_ts.Rmd",249,109,"style","Only use double-quotes.","autoplot(acf(AirPassengers, plot = FALSE), conf.int.fill = '#0000FF', conf.int.value = 0.8, conf.int.type = 'ma')","single_quotes_linter" diff --git a/.dev/revdep_emails/ggfortify/email-body b/.dev/revdep_emails/ggfortify/email-body deleted file mode 100644 index e1dd0cc79..000000000 --- a/.dev/revdep_emails/ggfortify/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Yuan Tang! Thank you for using {lintr} in your package {ggfortify}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/sinhrks/ggfortify (hash: 8e3e7df69554757025825a0844f8e467eaff6748) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 72s on CRAN vs. 38s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/ggthemes/attachments/ggthemes.warnings b/.dev/revdep_emails/ggthemes/attachments/ggthemes.warnings deleted file mode 100644 index 82e46410d..000000000 --- a/.dev/revdep_emails/ggthemes/attachments/ggthemes.warnings +++ /dev/null @@ -1,2 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Trying to remove β€˜snake_case_linter’, β€˜camel_case_linter’ and β€˜multiple_dots_linter’, which are not in `defaults`. diff --git a/.dev/revdep_emails/ggthemes/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/ggthemes/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 63b0ec688..000000000 --- a/.dev/revdep_emails/ggthemes/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,2 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/utils.R",10,1,"style","Variable and function name style should be snake_case.","""%||%"" <- function(a, b) {","object_name_linter" diff --git a/.dev/revdep_emails/ggthemes/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/ggthemes/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 29295fec8..000000000 --- a/.dev/revdep_emails/ggthemes/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,48 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"data-raw/build.R",9,1,"style","Variable and function name style should be snake_case or symbols.","utf8ToPch <- function(x) {","object_name_linter" -"data-raw/build.R",15,20,"warning","no visible global function definition for β€˜map_int’"," as.integer(-1L * map_int(x, ~ utf8ToInt(.x)[[1]]))","object_usage_linter" -"data-raw/build.R",26,7,"warning","no visible global function definition for β€˜tibble’"," tibble(name = out$colors$schemes[[i]]) %>%","object_usage_linter" -"data-raw/build.R",27,7,"warning","no visible global function definition for β€˜left_join’"," left_join(out$colors$names, by = ""name"")","object_usage_linter" -"data-raw/build.R",29,17,"warning","no visible global function definition for β€˜select’"," out$shapes <- select(map_dfr(out$shapes, as_tibble), -comment) %>%","object_usage_linter" -"data-raw/build.R",30,5,"warning","no visible global function definition for β€˜mutate’"," mutate(pch = utf8ToPch(character))","object_usage_linter" -"data-raw/build.R",53,23,"warning","no visible global function definition for β€˜map_chr’"," out$bg <- set_names(map_chr(out$bg, ""value""), map_chr(out$bg, ""name""))","object_usage_linter" -"data-raw/build.R",53,23,"warning","no visible global function definition for β€˜map_chr’"," out$bg <- set_names(map_chr(out$bg, ""value""), map_chr(out$bg, ""name""))","object_usage_linter" -"data-raw/build.R",85,17,"warning","no visible global function definition for β€˜tibble’"," out$colors <- tibble(value = rev(map_chr(xml_children(x), xml_text)))","object_usage_linter" -"data-raw/build.R",85,36,"warning","no visible global function definition for β€˜map_chr’"," out$colors <- tibble(value = rev(map_chr(xml_children(x), xml_text)))","object_usage_linter" -"data-raw/build.R",90,3,"warning","local variable β€˜classic’ assigned but may not be used"," classic <- read_xml(here(""data-raw"", ""theme-data"", ""tableau-classic.xml"")) %>%","object_usage_linter" -"data-raw/build.R",104,7,"warning","no visible global function definition for β€˜mutate’"," mutate(pch = utf8ToPch(character))","object_usage_linter" -"data-raw/build.R",153,5,"warning","no visible global function definition for β€˜mutate’"," mutate(pch = utf8ToPch(character))","object_usage_linter" -"data-raw/build.R",163,17,"warning","no visible global function definition for β€˜mutate’"," out$shapes <- mutate(out$shapes, pch = utf8ToPch(character))","object_usage_linter" -"data-raw/build.R",171,17,"warning","no visible global function definition for β€˜mutate’"," out$shapes <- mutate(out$shapes, pch = utf8ToPch(character))","object_usage_linter" -"data-raw/build.R",178,28,"warning","no visible global function definition for β€˜mutate’"," out$cleveland$default <- mutate(map_dfr(out$cleveland$default, as_tibble),","object_usage_linter" -"data-raw/build.R",182,21,"warning","no visible global function definition for β€˜map_df’"," out$circlefill <- map_df(out$circlefill, as_tibble) %>%","object_usage_linter" -"data-raw/build.R",183,5,"warning","no visible global function definition for β€˜mutate’"," mutate(pch = utf8ToPch(character))","object_usage_linter" -"data-raw/canva_palette.R",3,81,"style","Lines should not be more than 80 characters.","#' #' The color list is from http://makeadifferencewithdata.com/2017/01/150-paletas-colores-tableau/,","line_length_linter" -"data-raw/canva_palette.R",4,81,"style","Lines should not be more than 80 characters.","#' #' and referenced here: https://policyviz.com/2017/01/12/150-color-palettes-for-excel/.","line_length_linter" -"data-raw/canva_palette.R",10,81,"style","Lines should not be more than 80 characters.","#' color_palettes_url <- ""http://makeadifferencewithdata.com/wp-content/uploads/2016/12/color-palettes.txt""","line_length_linter" -"data-raw/canva_palette.R",34,81,"style","Lines should not be more than 80 characters.","#' duplicated(names(canva_palettes))] <- ""Vintage charm 2""","line_length_linter" -"data-raw/clean-colors.R",4,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" -"data-raw/excel_themes.R",8,81,"style","Lines should not be more than 80 characters.","# - https://support.office.com/en-us/article/change-a-theme-and-make-it-the-default-in-word-or-excel-c846f997-968e-4daa-b2d4-42bd2afef904?ui=en-US&rs=en-US&ad=US","line_length_linter" -"data-raw/excel_themes.R",10,81,"style","Lines should not be more than 80 characters.","# - https://support.office.com/en-us/article/open-xml-formats-and-file-name-extensions-5200d93c-3449-4380-8e11-31ef14555b18","line_length_linter" -"data-raw/excel_themes.R",16,81,"style","Lines should not be more than 80 characters.","theme_dir <- ""/Applications/Microsoft Excel.app/Contents/Resources/Office Themes""","line_length_linter" -"data-raw/excel_themes.R",30,3,"warning","no visible global function definition for β€˜set_names’"," set_names(list(val), name)","object_usage_linter" -"data-raw/excel_themes.R",33,1,"style","Variable and function name style should be snake_case or symbols.","process_clrScheme <- function(x) {","object_name_linter" -"data-raw/excel_themes.R",35,13,"warning","no visible global function definition for β€˜flatten_chr’"," colors <- flatten_chr(map(xml_children(x), process_color))","object_usage_linter" -"data-raw/excel_themes.R",39,37,"warning","no visible global function definition for β€˜str_subset’"," unname(colors[str_subset(names(colors), ""^accent"")])),","object_usage_linter" -"data-raw/libreoffice_palettes.R",7,81,"style","Lines should not be more than 80 characters.","# https://design.blog.documentfoundation.org/2016/11/11/additions-to-libreoffice/","line_length_linter" -"data-raw/libreoffice_palettes.R",18,3,"warning","no visible global function definition for β€˜tibble’"," tibble(name = xml_attr(x, ""name""),","object_usage_linter" -"data-raw/libreoffice_palettes.R",23,3,"warning","local variable β€˜name’ assigned but may not be used"," name <- tools::file_path_sans_ext(basename(path))","object_usage_linter" -"data-raw/libreoffice_palettes.R",43,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" -"R/economist.R",11,31,"style","Put spaces around all infix operators.","economist_pal <- function(fill=TRUE) {","infix_spaces_linter" -"R/few.R",87,50,"style","Put spaces around all infix operators.","theme_few <- function(base_size = 12, base_family="""") {","infix_spaces_linter" -"R/gdocs.R",9,52,"style","Put spaces around all infix operators.","theme_gdocs <- function(base_size = 12, base_family=""sans"") {","infix_spaces_linter" -"R/scales.R",31,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/shapes.R",168,40,"style","Put spaces around all infix operators.","scale_shape_tremmel <- function(overlap=FALSE, alt=TRUE, ...) {","infix_spaces_linter" -"R/shapes.R",168,51,"style","Put spaces around all infix operators.","scale_shape_tremmel <- function(overlap=FALSE, alt=TRUE, ...) {","infix_spaces_linter" -"R/stata.R",14,29,"style","Put spaces around all infix operators.","stata_pal <- function(scheme=""s2color"") {","infix_spaces_linter" -"R/stata.R",32,38,"style","Put spaces around all infix operators.","scale_colour_stata <- function(scheme=""s2color"", ...) {","infix_spaces_linter" -"R/stata.R",38,36,"style","Put spaces around all infix operators.","scale_fill_stata <- function(scheme=""s2color"", ...) {","infix_spaces_linter" -"R/stata.R",125,38,"style","Put spaces around all infix operators.","theme_stata_colors <- function(scheme=""s2color"") {","infix_spaces_linter" -"R/stata.R",232,31,"style","Put spaces around all infix operators."," scheme=""s2color"") {","infix_spaces_linter" -"R/theme-foundation.R",21,39,"style","Put spaces around all infix operators.","theme_foundation <- function(base_size=12, base_family="""") {","infix_spaces_linter" -"R/theme-foundation.R",21,55,"style","Put spaces around all infix operators.","theme_foundation <- function(base_size=12, base_family="""") {","infix_spaces_linter" diff --git a/.dev/revdep_emails/ggthemes/email-body b/.dev/revdep_emails/ggthemes/email-body deleted file mode 100644 index 2a2bacb9e..000000000 --- a/.dev/revdep_emails/ggthemes/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Jeffrey B. Arnold! Thank you for using {lintr} in your package {ggthemes}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/jrnold/ggthemes (hash: 4b5e80e25e88b821ab30736a9c3b2ac32e294fc1) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 57s on CRAN vs. 37s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/healthcareai/attachments/healthcareai.warnings b/.dev/revdep_emails/healthcareai/attachments/healthcareai.warnings deleted file mode 100644 index 182961f94..000000000 --- a/.dev/revdep_emails/healthcareai/attachments/healthcareai.warnings +++ /dev/null @@ -1,2 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Trying to remove β€˜camel_case_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/healthcareai/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/healthcareai/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index d1f7b6cc8..000000000 --- a/.dev/revdep_emails/healthcareai/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,149 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/db_connections.R",33,44,"style","Put spaces around all infix operators."," trusted=TRUE,","infix_spaces_linter" -"R/db_connections.R",44,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!missing(user_id) & !missing(password))","vector_logic_linter" -"R/db_connections.R",59,32,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (!missing(user_id) & !missing(password)) {","vector_logic_linter" -"R/find_unique_columns.R",39,22,"style","Any function spanning multiple lines should use curly braces."," dplyr::select_if(function(col)","brace_linter" -"R/missingness.R",32,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.matrix(d) | (is.vector(d) && !is.list(d)))","vector_logic_linter" -"R/pip.R",221,43,"style","Any function spanning multiple lines should use curly braces."," d <- purrr::map_df(names(split_vars), function(v)","brace_linter" -"R/plot_predictions.R",246,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.numeric(text_size) & !is.logical(text_size))","vector_logic_linter" -"R/plot_predictions.R",264,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.numeric(text_angle) & !is.logical(text_angle))","vector_logic_linter" -"R/predict.R",413,12,"style","Either both or neither branch in `if`/`else` should use curly braces."," } else if (mi$m_class == ""Multiclass"") {","brace_linter" -"R/prep_data.R",354,41,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (remove_near_zero_variance < 0 | remove_near_zero_variance > 1)","vector_logic_linter" -"R/save_load.R",55,44,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(attr(x, ""recipe"")$template) | !is.null(attr(x, ""recipe"")$orig_data))","vector_logic_linter" -"R/setup_hyperparameters.R",78,43,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (model_class == ""classification"" | model_class == ""multiclass"") {","vector_logic_linter" -"R/training_setup.R",272,21,"style","Any function spanning multiple lines should use curly braces.","character_in_quo <- function(x)","brace_linter" -"R/utilities.R",31,22,"style","Any function spanning multiple lines should use curly braces."," lapply(names(ref), function(v)","brace_linter" -"R/utilities.R",53,49,"style","Either both or neither branch in `if`/`else` should use curly braces."," if (!length(new_levels[[.x]])) return(NULL) else {","brace_linter" -"tests/testthat/test-hcai-impute.R",9,58,"style","Use TRUE instead of the symbol T."," vendorID = sample(1:9, size = n, replace = T),","T_and_F_symbol_linter" -"tests/testthat/test-hcai-impute.R",12,67,"style","Use TRUE instead of the symbol T."," heat = sample(c(""Cold"", ""Hot""), size = n, replace = T),","T_and_F_symbol_linter" -"tests/testthat/test-hcai-impute.R",14,54,"style","Use TRUE instead of the symbol T."," size = n, replace = T)","T_and_F_symbol_linter" -"tests/testthat/test-impute.r",11,68,"style","Use TRUE instead of the symbol T."," fur = sample(c(""Long"", ""Short""), size = n, replace = T),","T_and_F_symbol_linter" -"tests/testthat/test-impute.r",13,50,"style","Use TRUE instead of the symbol T."," size = n, replace = T)","T_and_F_symbol_linter" -"tests/testthat/test-PCA.R",9,69,"style","Use TRUE instead of the symbol T."," genre = sample(c(""Rock"", ""Jazz"", ""Country""), size = n, replace = T),","T_and_F_symbol_linter" -"tests/testthat/test-PCA.R",11,42,"style","Use TRUE instead of the symbol T."," size = n, replace = T),","T_and_F_symbol_linter" -"tests/testthat/test-PCA.R",12,54,"style","Use TRUE instead of the symbol T."," guitar_flag = sample(c(0, 1), size = n, replace = T),","T_and_F_symbol_linter" -"tests/testthat/test-PCA.R",13,56,"style","Use TRUE instead of the symbol T."," drum_flag = sample(c(0, 1, NA), size = n, replace = T,","T_and_F_symbol_linter" -"tests/testthat/test-PCA.R",21,78,"style","Use TRUE instead of the symbol T."," state = sample(c(""NY"", ""MA"", ""CT"", ""CA"", ""VT"", ""NH""), size = n, replace = T,","T_and_F_symbol_linter" -"tests/testthat/test-pip.R",59,16,"style","Any function spanning multiple lines should use curly braces."," max_count <- function(d)","brace_linter" -"tests/testthat/test-prep_data_utils.R",10,57,"style","Use TRUE instead of the symbol T."," tuba_flag = sample(c(0, 1), size = n, replace = T),","T_and_F_symbol_linter" -"tests/testthat/test-prep_data_utils.R",11,61,"style","Use TRUE instead of the symbol T."," drum_flag = sample(c(0, 1, NA), size = n, replace = T),","T_and_F_symbol_linter" -"tests/testthat/test-prep_data_utils.R",13,47,"style","Use TRUE instead of the symbol T."," size = n, replace = T),","T_and_F_symbol_linter" -"tests/testthat/test-prep_data.R",14,69,"style","Use TRUE instead of the symbol T."," genre = sample(c(""Rock"", ""Jazz"", ""Country""), size = n, replace = T),","T_and_F_symbol_linter" -"tests/testthat/test-prep_data.R",16,42,"style","Use TRUE instead of the symbol T."," size = n, replace = T, prob = c(4, 4, 4, 6)),","T_and_F_symbol_linter" -"tests/testthat/test-prep_data.R",17,54,"style","Use TRUE instead of the symbol T."," guitar_flag = sample(c(0, 1), size = n, replace = T),","T_and_F_symbol_linter" -"tests/testthat/test-prep_data.R",18,56,"style","Use TRUE instead of the symbol T."," drum_flag = sample(c(0, 1, NA), size = n, replace = T,","T_and_F_symbol_linter" -"tests/testthat/test-prep_data.R",26,78,"style","Use TRUE instead of the symbol T."," state = sample(c(""NY"", ""MA"", ""CT"", ""CA"", ""VT"", ""NH""), size = n, replace = T,","T_and_F_symbol_linter" -"tests/testthat/test-tune_models.R",295,18,"style","Any function spanning multiple lines should use curly braces."," phi_present <- function(messages)","brace_linter" -"vignettes/site_only/best_levels.Rmd",41,17,"style","Trailing whitespace is superfluous.","meds <- tribble( ","trailing_whitespace_linter" -"vignettes/site_only/best_levels.Rmd",50,13,"style","Trailing whitespace is superfluous.","pima_meds <- ","trailing_whitespace_linter" -"vignettes/site_only/best_levels.Rmd",54,79,"style","Trailing whitespace is superfluous."," medication = sample(x = meds$name, size = sample(0:4, 1), replace = FALSE, ","trailing_whitespace_linter" -"vignettes/site_only/best_levels.Rmd",72,22,"style","Trailing whitespace is superfluous.","pima_diabetes_meds <- ","trailing_whitespace_linter" -"vignettes/site_only/best_levels.Rmd",76,81,"style","Trailing whitespace is superfluous."," # Data frame with id, the high-cardinality factor, and (optionally) a column ","trailing_whitespace_linter" -"vignettes/site_only/best_levels.Rmd",103,30,"style","Trailing whitespace is superfluous.","pima_diabetes_med_duration <- ","trailing_whitespace_linter" -"vignettes/site_only/best_levels.Rmd",166,28,"style","Trailing whitespace is superfluous.","new_patient_med_duration <- ","trailing_whitespace_linter" -"vignettes/site_only/best_levels.Rmd",167,35,"style","Trailing whitespace is superfluous."," add_best_levels(d = new_patient, ","trailing_whitespace_linter" -"vignettes/site_only/best_levels.Rmd",168,40,"style","Trailing whitespace is superfluous."," longsheet = new_meds, ","trailing_whitespace_linter" -"vignettes/site_only/best_levels.Rmd",186,84,"style","Trailing whitespace is superfluous.","models <- machine_learn(pima_diabetes_med_duration, patient_id, outcome = diabetes, ","trailing_whitespace_linter" -"vignettes/site_only/best_levels.Rmd",188,33,"style","Trailing whitespace is superfluous.","add_best_levels(d = new_patient, ","trailing_whitespace_linter" -"vignettes/site_only/best_levels.Rmd",189,38,"style","Trailing whitespace is superfluous."," longsheet = new_meds, ","trailing_whitespace_linter" -"vignettes/site_only/best_levels.Rmd",196,38,"style","Trailing whitespace is superfluous."," missing_fill = 0) %>% ","trailing_whitespace_linter" -"vignettes/site_only/best_levels.Rmd",241,17,"style","Trailing whitespace is superfluous.","meds <- tribble( ","trailing_whitespace_linter" -"vignettes/site_only/best_levels.Rmd",255,13,"style","Trailing whitespace is superfluous.","pima_meds <- ","trailing_whitespace_linter" -"vignettes/site_only/best_levels.Rmd",259,79,"style","Trailing whitespace is superfluous."," medication = sample(x = meds$name, size = sample(0:4, 1), replace = FALSE, ","trailing_whitespace_linter" -"vignettes/site_only/db_connections.Rmd",12,70,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set(echo = TRUE, results = ""hold"", collapse = TRUE, ","trailing_whitespace_linter" -"vignettes/site_only/db_connections.Rmd",131,44,"style","Commas should always have a space after.","predictions <- data.frame(patient_id = c(1,2,3),","commas_linter" -"vignettes/site_only/db_connections.Rmd",131,46,"style","Commas should always have a space after.","predictions <- data.frame(patient_id = c(1,2,3),","commas_linter" -"vignettes/site_only/db_connections.Rmd",134,34,"style","Trailing whitespace is superfluous.","table_id <- Id(schema = ""Sepsis"", ","trailing_whitespace_linter" -"vignettes/site_only/db_connections.Rmd",155,44,"style","Commas should always have a space after.","predictions <- data.frame(patient_id = c(1,2,3),","commas_linter" -"vignettes/site_only/db_connections.Rmd",155,46,"style","Commas should always have a space after.","predictions <- data.frame(patient_id = c(1,2,3),","commas_linter" -"vignettes/site_only/db_connections.Rmd",159,13,"style","Trailing whitespace is superfluous.","sqlSave(con, ","trailing_whitespace_linter" -"vignettes/site_only/db_connections.Rmd",160,21,"style","Trailing whitespace is superfluous."," predictions, ","trailing_whitespace_linter" -"vignettes/site_only/db_connections.Rmd",161,30,"style","Trailing whitespace is superfluous."," ""Sepsis.Predictions"", ","trailing_whitespace_linter" -"vignettes/site_only/db_connections.Rmd",162,23,"style","Trailing whitespace is superfluous."," append = TRUE, ","trailing_whitespace_linter" -"vignettes/site_only/db_connections.Rmd",192,44,"style","Commas should always have a space after.","predictions <- data.frame(patient_id = c(1,2,3),","commas_linter" -"vignettes/site_only/db_connections.Rmd",192,46,"style","Commas should always have a space after.","predictions <- data.frame(patient_id = c(1,2,3),","commas_linter" -"vignettes/site_only/db_connections.Rmd",197,24,"style","Trailing whitespace is superfluous.","RODBC::sqlSave(con_out, ","trailing_whitespace_linter" -"vignettes/site_only/db_connections.Rmd",198,28,"style","Trailing whitespace is superfluous."," predictions, ","trailing_whitespace_linter" -"vignettes/site_only/db_connections.Rmd",199,37,"style","Trailing whitespace is superfluous."," ""Sepsis.Predictions"", ","trailing_whitespace_linter" -"vignettes/site_only/db_connections.Rmd",200,30,"style","Trailing whitespace is superfluous."," append = TRUE, ","trailing_whitespace_linter" -"vignettes/site_only/deploy_model.Rmd",52,31,"style","Trailing whitespace is superfluous.","models <- machine_learn(d = d, ","trailing_whitespace_linter" -"vignettes/site_only/deploy_model.Rmd",100,31,"style","Trailing whitespace is superfluous.","predictions <- predictions %>% ","trailing_whitespace_linter" -"vignettes/site_only/deploy_model.Rmd",124,12,"style","Trailing whitespace is superfluous."," SELECT ","trailing_whitespace_linter" -"vignettes/site_only/deploy_model.Rmd",125,7,"style","Only use double-quotes."," '' AS FacilityAccountID","single_quotes_linter" -"vignettes/site_only/deploy_model.Rmd",125,10,"error","unexpected symbol"," '' AS FacilityAccountID",NA -"vignettes/site_only/deploy_model.Rmd",141,13,"style","Trailing whitespace is superfluous.","sqlSave(con, ","trailing_whitespace_linter" -"vignettes/site_only/deploy_model.Rmd",142,21,"style","Trailing whitespace is superfluous."," predictions, ","trailing_whitespace_linter" -"vignettes/site_only/deploy_model.Rmd",143,39,"style","Trailing whitespace is superfluous."," ""Schema.ReadmitMLOutputTable"", ","trailing_whitespace_linter" -"vignettes/site_only/deploy_model.Rmd",144,23,"style","Trailing whitespace is superfluous."," append = TRUE, ","trailing_whitespace_linter" -"vignettes/site_only/deploy_model.Rmd",175,22,"style","Trailing whitespace is superfluous.","prod_query <- ""SELECT ","trailing_whitespace_linter" -"vignettes/site_only/deploy_model.Rmd",193,13,"style","Trailing whitespace is superfluous.","sqlSave(con, ","trailing_whitespace_linter" -"vignettes/site_only/deploy_model.Rmd",194,21,"style","Trailing whitespace is superfluous."," predictions, ","trailing_whitespace_linter" -"vignettes/site_only/deploy_model.Rmd",195,43,"style","Trailing whitespace is superfluous."," ""Schema.ReadmitMLOutputTableBASE"", ","trailing_whitespace_linter" -"vignettes/site_only/deploy_model.Rmd",196,23,"style","Trailing whitespace is superfluous."," append = TRUE, ","trailing_whitespace_linter" -"vignettes/site_only/healthcareai.Rmd",12,70,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set(echo = TRUE, results = ""hold"", collapse = TRUE, ","trailing_whitespace_linter" -"vignettes/site_only/healthcareai.Rmd",65,17,"style","Trailing whitespace is superfluous.","quick_models %>% ","trailing_whitespace_linter" -"vignettes/site_only/healthcareai.Rmd",66,34,"style","Trailing whitespace is superfluous."," predict(outcome_groups = 2) %>% ","trailing_whitespace_linter" -"vignettes/site_only/healthcareai.Rmd",76,31,"style","Trailing whitespace is superfluous.","missingness(pima_diabetes) %>% ","trailing_whitespace_linter" -"vignettes/site_only/healthcareai.Rmd",132,28,"style","Trailing whitespace is superfluous.","models[""Random Forest""] %>% ","trailing_whitespace_linter" -"vignettes/site_only/healthcareai.Rmd",158,22,"style","Trailing whitespace is superfluous.","interpret(models) %>% ","trailing_whitespace_linter" -"vignettes/site_only/healthcareai.Rmd",176,20,"style","Trailing whitespace is superfluous.","explore(models) %>% ","trailing_whitespace_linter" -"vignettes/site_only/healthcareai.Rmd",194,20,"style","Trailing whitespace is superfluous.","test_predictions <- ","trailing_whitespace_linter" -"vignettes/site_only/healthcareai.Rmd",195,18,"style","Trailing whitespace is superfluous."," predict(models, ","trailing_whitespace_linter" -"vignettes/site_only/healthcareai.Rmd",196,27,"style","Trailing whitespace is superfluous."," split_data$test, ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",12,70,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set(echo = TRUE, results = ""hold"", collapse = TRUE, ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",83,44,"style","Put spaces around all infix operators.","print(paste(""Data is"", round(as.numeric(os)/1000000, 1), ""mb.""))","infix_spaces_linter" -"vignettes/site_only/performance.Rmd",113,22,"warning","1:nrow(...) is likely to be wrong in the empty edge case. Use seq_len() instead."," flight_id = 1:nrow(d)) %>%","seq_linter" -"vignettes/site_only/performance.Rmd",115,17,"style","Trailing whitespace is superfluous.","d_clean <- d %>% ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",118,43,"style","Trailing whitespace is superfluous."," collapse_rare_factors = FALSE, ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",122,52,"style","Put spaces around all infix operators.","print(paste(""Prepped data is"", round(as.numeric(os)/1000000, 1), ""mb.""))","infix_spaces_linter" -"vignettes/site_only/performance.Rmd",158,50,"style","Commas should never have a space before."," summarize_if(~ is.character(.x) | is.factor(.x) , n_distinct)","commas_linter" -"vignettes/site_only/performance.Rmd",166,83,"style","Trailing whitespace is superfluous."," ggplot(aes(x = reorder(dest, arr_delay, function(x) -sum(x == ""Y"") / length(x)), ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",219,33,"style","Trailing whitespace is superfluous."," prep_data(outcome = arr_delay, ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",231,33,"style","Trailing whitespace is superfluous."," prep_data(outcome = arr_delay, ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",286,6,"style","Trailing whitespace is superfluous.","d %>% ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",290,24,"style","Trailing whitespace is superfluous.","stratified_sample_d %>% ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",300,18,"style","Trailing whitespace is superfluous.","d_recent <- d %>% ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",314,18,"style","Trailing whitespace is superfluous.","downsampled_d %>% ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",361,33,"style","Trailing whitespace is superfluous."," prep_data(outcome = arr_delay, ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",365,32,"style","Trailing whitespace is superfluous.","m_rf_1 <- flash_models(d_clean, ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",366,44,"style","Trailing whitespace is superfluous."," outcome = arr_delay, ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",378,22,"style","Trailing whitespace is superfluous.","m <- machine_learn(d, ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",398,33,"style","Trailing whitespace is superfluous."," prep_data(outcome = arr_delay, ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",402,33,"style","Trailing whitespace is superfluous.","m_glm_1 <- flash_models(d_clean, ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",403,45,"style","Trailing whitespace is superfluous."," outcome = arr_delay, ","trailing_whitespace_linter" -"vignettes/site_only/performance.Rmd",419,33,"style","Trailing whitespace is superfluous."," prep_data(outcome = arr_delay, ","trailing_whitespace_linter" -"vignettes/site_only/transitioning.Rmd",12,70,"style","Trailing whitespace is superfluous.","knitr::opts_chunk$set(echo = TRUE, results = ""hold"", collapse = TRUE, ","trailing_whitespace_linter" -"vignettes/site_only/transitioning.Rmd",34,36,"style","Trailing whitespace is superfluous.","# csvfile <- system.file(""extdata"", ","trailing_whitespace_linter" -"vignettes/site_only/transitioning.Rmd",35,52,"style","Trailing whitespace is superfluous.","# ""HCRDiabetesClinical.csv"", ","trailing_whitespace_linter" -"vignettes/site_only/transitioning.Rmd",37,33,"style","Trailing whitespace is superfluous.","# df <- read.csv(file = csvfile, ","trailing_whitespace_linter" -"vignettes/site_only/transitioning.Rmd",38,32,"style","Trailing whitespace is superfluous.","# header = TRUE, ","trailing_whitespace_linter" -"vignettes/site_only/transitioning.Rmd",40,2,"style","Trailing whitespace is superfluous.","# ","trailing_whitespace_linter" -"vignettes/site_only/transitioning.Rmd",41,3,"style","Commented code should be removed.","# df$PatientID <- NULL # Only one ID column (ie, PatientEncounterID) is needed remove this column","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",62,3,"style","Commented code should be removed.","# dfDeploy <- df[951:1000,]","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",71,3,"style","Commented code should be removed.","# p <- SupervisedModelDevelopmentParams$new()","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",72,3,"style","Commented code should be removed.","# p$df <- df","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",73,3,"style","Commented code should be removed.","# p$type <- ""classification""","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",74,3,"style","Commented code should be removed.","# p$impute <- TRUE","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",75,3,"style","Commented code should be removed.","# p$grainCol <- ""PatientEncounterID""","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",76,3,"style","Commented code should be removed.","# p$predictedCol <- ""ThirtyDayReadmitFLG""","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",77,3,"style","Commented code should be removed.","# p$debug <- FALSE","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",78,3,"style","Commented code should be removed.","# p$cores <- 1","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",79,2,"style","Trailing whitespace is superfluous.","# ","trailing_whitespace_linter" -"vignettes/site_only/transitioning.Rmd",81,3,"style","Commented code should be removed.","# RandomForest <- RandomForestDevelopment$new(p)","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",82,3,"style","Commented code should be removed.","# RandomForest$run()","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",84,33,"style","Trailing whitespace is superfluous.","models <- machine_learn(d$train, ","trailing_whitespace_linter" -"vignettes/site_only/transitioning.Rmd",86,55,"style","Trailing whitespace is superfluous."," outcome = ThirtyDayReadmitFLG, ","trailing_whitespace_linter" -"vignettes/site_only/transitioning.Rmd",113,3,"style","Commented code should be removed.","# p2 <- SupervisedModelDeploymentParams$new()","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",114,3,"style","Commented code should be removed.","# p2$type <- ""classification""","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",115,3,"style","Commented code should be removed.","# p2$df <- dfDeploy","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",116,3,"style","Commented code should be removed.","# p2$grainCol <- ""PatientEncounterID""","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",117,3,"style","Commented code should be removed.","# p2$predictedCol <- ""ThirtyDayReadmitFLG""","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",118,3,"style","Commented code should be removed.","# p2$impute <- TRUE","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",119,3,"style","Commented code should be removed.","# p2$debug <- FALSE","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",120,3,"style","Commented code should be removed.","# p2$cores <- 1","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",121,2,"style","Trailing whitespace is superfluous.","# ","trailing_whitespace_linter" -"vignettes/site_only/transitioning.Rmd",122,3,"style","Commented code should be removed.","# dL <- RandomForestDeployment$new(p2)","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",123,3,"style","Commented code should be removed.","# dL$deploy()","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",124,2,"style","Trailing whitespace is superfluous.","# ","trailing_whitespace_linter" -"vignettes/site_only/transitioning.Rmd",125,3,"style","Commented code should be removed.","# dfOut <- dL$getOutDf()","commented_code_linter" -"vignettes/site_only/transitioning.Rmd",126,3,"style","Commented code should be removed.","# head(dfOut)","commented_code_linter" diff --git a/.dev/revdep_emails/healthcareai/email-body b/.dev/revdep_emails/healthcareai/email-body deleted file mode 100644 index cd4df8083..000000000 --- a/.dev/revdep_emails/healthcareai/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Mike Mastanduno! Thank you for using {lintr} in your package {healthcareai}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/HealthCatalyst/healthcareai-r (hash: 3125ca1e78bd52b9718ef80e0e931c3707f172f6) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 83s on CRAN vs. 31s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/i18n/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/i18n/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 72fed09e9..000000000 --- a/.dev/revdep_emails/i18n/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,345 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"data-raw/01-locales.R",7,15,"style","Trailing whitespace is superfluous.","all_locales <- ","trailing_whitespace_linter" -"data-raw/01-locales.R",10,40,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-core"", ","trailing_whitespace_linter" -"data-raw/02-default_locales.R",7,19,"style","Trailing whitespace is superfluous.","default_content <- ","trailing_whitespace_linter" -"data-raw/02-default_locales.R",10,40,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-core"", ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",15,15,"style","Trailing whitespace is superfluous."," languages <- ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",30,13,"style","Trailing whitespace is superfluous."," scripts <- ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",37,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",44,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",45,17,"style","Trailing whitespace is superfluous."," territories <- ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",52,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",59,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",60,14,"style","Trailing whitespace is superfluous."," variants <- ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",67,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",74,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",77,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",80,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",82,81,"style","Lines should not be more than 80 characters."," territories_values <- territories_data$main[[1]]$localeDisplayNames$territories","line_length_linter" -"data-raw/03-locale_names.R",83,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",86,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",95,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/03-locale_names.R",98,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",15,3,"style","Variable and function names should not be longer than 30 characters."," dates_gregorian_json_url_locale <- ","object_length_linter" -"data-raw/04-dates.R",15,37,"style","Trailing whitespace is superfluous."," dates_gregorian_json_url_locale <- ","trailing_whitespace_linter" -"data-raw/04-dates.R",18,53,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-dates-full/main"", ","trailing_whitespace_linter" -"data-raw/04-dates.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" -"data-raw/04-dates.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",33,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",36,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$months$format$abbreviated","line_length_linter" -"data-raw/04-dates.R",37,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",40,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$months$format$narrow","line_length_linter" -"data-raw/04-dates.R",41,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",45,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",48,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$months$`stand-alone`$abbreviated","line_length_linter" -"data-raw/04-dates.R",49,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",52,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$months$`stand-alone`$narrow","line_length_linter" -"data-raw/04-dates.R",53,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",56,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$months$`stand-alone`$wide","line_length_linter" -"data-raw/04-dates.R",57,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",61,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",64,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$days$format$abbreviated","line_length_linter" -"data-raw/04-dates.R",65,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",69,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",73,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",77,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",80,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$days$`stand-alone`$abbreviated","line_length_linter" -"data-raw/04-dates.R",81,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",84,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$days$`stand-alone`$narrow","line_length_linter" -"data-raw/04-dates.R",85,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",88,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$days$`stand-alone`$short","line_length_linter" -"data-raw/04-dates.R",89,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",92,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$days$`stand-alone`$wide","line_length_linter" -"data-raw/04-dates.R",93,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",97,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",100,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$quarters$format$abbreviated","line_length_linter" -"data-raw/04-dates.R",101,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",104,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$quarters$format$narrow","line_length_linter" -"data-raw/04-dates.R",105,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",108,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$quarters$format$wide","line_length_linter" -"data-raw/04-dates.R",109,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",112,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$quarters$`stand-alone`$abbreviated","line_length_linter" -"data-raw/04-dates.R",113,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",116,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$quarters$`stand-alone`$narrow","line_length_linter" -"data-raw/04-dates.R",117,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",120,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$quarters$`stand-alone`$wide","line_length_linter" -"data-raw/04-dates.R",121,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",125,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",128,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dayPeriods$format$abbreviated","line_length_linter" -"data-raw/04-dates.R",129,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",132,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dayPeriods$format$narrow","line_length_linter" -"data-raw/04-dates.R",133,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",136,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dayPeriods$format$wide","line_length_linter" -"data-raw/04-dates.R",137,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",140,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dayPeriods$`stand-alone`$abbreviated","line_length_linter" -"data-raw/04-dates.R",141,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",144,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dayPeriods$`stand-alone`$narrow","line_length_linter" -"data-raw/04-dates.R",145,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",148,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dayPeriods$`stand-alone`$wide","line_length_linter" -"data-raw/04-dates.R",149,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",153,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",157,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",161,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",165,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",169,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",173,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",177,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",181,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",183,20,"style","Trailing whitespace is superfluous."," time_skeletons <- ","trailing_whitespace_linter" -"data-raw/04-dates.R",185,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",188,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dateTimeFormats[1:4]","line_length_linter" -"data-raw/04-dates.R",189,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",192,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dateTimeFormats[[5]]","line_length_linter" -"data-raw/04-dates.R",193,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",196,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dateTimeFormats$appendItems","line_length_linter" -"data-raw/04-dates.R",197,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",200,81,"style","Lines should not be more than 80 characters."," dates_gregorian_data$main[[1]]$dates$calendars$gregorian$dateTimeFormats$intervalFormats","line_length_linter" -"data-raw/04-dates.R",201,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",244,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",247,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/04-dates.R",259,66,"style","Trailing whitespace is superfluous."," months_format_abbrev, months_format_narrow, months_format_wide, ","trailing_whitespace_linter" -"data-raw/04-dates.R",264,72,"style","Trailing whitespace is superfluous."," quarters_format_abbrev, quarters_format_narrow, quarters_format_wide, ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",15,35,"style","Trailing whitespace is superfluous."," dates_generic_json_url_locale <- ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",18,53,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-dates-full/main"", ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",33,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",36,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$months$format$abbreviated","line_length_linter" -"data-raw/05-dates_generic.R",37,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",41,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",45,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",48,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$months$`stand-alone`$abbreviated","line_length_linter" -"data-raw/05-dates_generic.R",49,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",52,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$months$`stand-alone`$narrow","line_length_linter" -"data-raw/05-dates_generic.R",53,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",56,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$months$`stand-alone`$wide","line_length_linter" -"data-raw/05-dates_generic.R",57,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",61,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",65,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",69,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",73,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",77,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",80,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$days$`stand-alone`$abbreviated","line_length_linter" -"data-raw/05-dates_generic.R",81,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",84,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$days$`stand-alone`$narrow","line_length_linter" -"data-raw/05-dates_generic.R",85,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",88,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$days$`stand-alone`$short","line_length_linter" -"data-raw/05-dates_generic.R",89,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",93,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",97,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",100,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$quarters$format$abbreviated","line_length_linter" -"data-raw/05-dates_generic.R",101,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",105,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",109,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",112,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$quarters$`stand-alone`$abbreviated","line_length_linter" -"data-raw/05-dates_generic.R",113,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",116,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$quarters$`stand-alone`$narrow","line_length_linter" -"data-raw/05-dates_generic.R",117,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",120,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$quarters$`stand-alone`$wide","line_length_linter" -"data-raw/05-dates_generic.R",121,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",125,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",128,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$dayPeriods$format$abbreviated","line_length_linter" -"data-raw/05-dates_generic.R",129,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",132,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$dayPeriods$format$narrow","line_length_linter" -"data-raw/05-dates_generic.R",133,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",137,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",140,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$dayPeriods$`stand-alone`$abbreviated","line_length_linter" -"data-raw/05-dates_generic.R",141,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",144,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$dayPeriods$`stand-alone`$narrow","line_length_linter" -"data-raw/05-dates_generic.R",145,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",148,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$dayPeriods$`stand-alone`$wide","line_length_linter" -"data-raw/05-dates_generic.R",149,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",153,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",157,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",161,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",165,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",169,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",173,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",177,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",181,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",183,20,"style","Trailing whitespace is superfluous."," time_skeletons <- ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",185,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",189,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",193,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",196,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$dateTimeFormats$appendItems","line_length_linter" -"data-raw/05-dates_generic.R",197,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",200,81,"style","Lines should not be more than 80 characters."," dates_generic_data$main[[1]]$dates$calendars$generic$dateTimeFormats$intervalFormats","line_length_linter" -"data-raw/05-dates_generic.R",201,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",244,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/05-dates_generic.R",247,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",15,29,"style","Trailing whitespace is superfluous."," numbers_json_url_locale <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",18,55,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-numbers-full/main"", ","trailing_whitespace_linter" -"data-raw/06-numbers.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" -"data-raw/06-numbers.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",33,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",37,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",41,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",43,13,"style","Trailing whitespace is superfluous."," decimal <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",45,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",47,11,"style","Trailing whitespace is superfluous."," group <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",49,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",51,10,"style","Trailing whitespace is superfluous."," list <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",53,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",55,18,"style","Trailing whitespace is superfluous."," percent_sign <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",57,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",59,15,"style","Trailing whitespace is superfluous."," plus_sign <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",61,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",63,16,"style","Trailing whitespace is superfluous."," minus_sign <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",65,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",67,17,"style","Trailing whitespace is superfluous."," approx_sign <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",69,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",71,14,"style","Trailing whitespace is superfluous."," exp_sign <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",73,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",75,13,"style","Trailing whitespace is superfluous."," sup_exp <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",76,81,"style","Lines should not be more than 80 characters."," numbers_data$main[[1]]$numbers$`symbols-numberSystem-latn`$superscriptingExponent","line_length_linter" -"data-raw/06-numbers.R",77,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",79,15,"style","Trailing whitespace is superfluous."," per_mille <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",81,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",83,14,"style","Trailing whitespace is superfluous."," infinity <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",85,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",87,9,"style","Trailing whitespace is superfluous."," nan <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",89,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",91,14,"style","Trailing whitespace is superfluous."," time_sep <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",93,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",95,20,"style","Trailing whitespace is superfluous."," approx_pattern <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",96,81,"style","Lines should not be more than 80 characters."," numbers_data$main[[1]]$numbers$`miscPatterns-numberSystem-latn`$approximately","line_length_linter" -"data-raw/06-numbers.R",97,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",99,22,"style","Trailing whitespace is superfluous."," at_least_pattern <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",101,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",103,21,"style","Trailing whitespace is superfluous."," at_most_pattern <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",105,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",107,19,"style","Trailing whitespace is superfluous."," range_pattern <- ","trailing_whitespace_linter" -"data-raw/06-numbers.R",109,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",113,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",116,81,"style","Lines should not be more than 80 characters."," numbers_data$main[[1]]$numbers$`scientificFormats-numberSystem-latn`$standard","line_length_linter" -"data-raw/06-numbers.R",117,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",121,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",125,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",128,81,"style","Lines should not be more than 80 characters."," numbers_data$main[[1]]$numbers$`currencyFormats-numberSystem-latn`$accounting","line_length_linter" -"data-raw/06-numbers.R",129,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",141,17,"style","Put spaces around all infix operators."," plus_sign =plus_sign,","infix_spaces_linter" -"data-raw/06-numbers.R",160,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/06-numbers.R",163,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/07-currencies.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/07-currencies.R",15,32,"style","Trailing whitespace is superfluous."," currencies_json_url_locale <- ","trailing_whitespace_linter" -"data-raw/07-currencies.R",18,55,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-numbers-full/main"", ","trailing_whitespace_linter" -"data-raw/07-currencies.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" -"data-raw/07-currencies.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/07-currencies.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/07-currencies.R",31,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/07-currencies.R",41,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/07-currencies.R",49,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/07-currencies.R",63,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/07-currencies.R",77,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/07-currencies.R",78,3,"style","Variable and function names should not be longer than 30 characters."," currency_display_name_count_other <-","object_length_linter" -"data-raw/07-currencies.R",91,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/07-currencies.R",103,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/07-currencies.R",106,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/08-characters.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/08-characters.R",15,16,"style","Trailing whitespace is superfluous."," characters <- ","trailing_whitespace_linter" -"data-raw/08-characters.R",18,52,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-misc-full/main"", ","trailing_whitespace_linter" -"data-raw/08-characters.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" -"data-raw/08-characters.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/08-characters.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/08-characters.R",36,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/08-characters.R",38,81,"style","Lines should not be more than 80 characters."," leninent_scope_general <- characters_data$main[[1]]$characters$`lenient-scope-general`","line_length_linter" -"data-raw/08-characters.R",39,81,"style","Lines should not be more than 80 characters."," leninent_scope_date <- characters_data$main[[1]]$characters$`lenient-scope-date`","line_length_linter" -"data-raw/08-characters.R",40,81,"style","Lines should not be more than 80 characters."," leninent_scope_number <- characters_data$main[[1]]$characters$`lenient-scope-number`","line_length_linter" -"data-raw/08-characters.R",41,81,"style","Lines should not be more than 80 characters."," stricter_scope_number <- characters_data$main[[1]]$characters$`stricter-scope-number`","line_length_linter" -"data-raw/08-characters.R",42,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/08-characters.R",59,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/08-characters.R",62,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/09-character_labels.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/09-character_labels.R",15,17,"style","Trailing whitespace is superfluous."," char_labels <- ","trailing_whitespace_linter" -"data-raw/09-character_labels.R",18,52,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-misc-full/main"", ","trailing_whitespace_linter" -"data-raw/09-character_labels.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" -"data-raw/09-character_labels.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/09-character_labels.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/09-character_labels.R",31,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/09-character_labels.R",33,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/09-character_labels.R",41,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/09-character_labels.R",44,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/10-delimiters.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/10-delimiters.R",15,16,"style","Trailing whitespace is superfluous."," delimiters <- ","trailing_whitespace_linter" -"data-raw/10-delimiters.R",18,52,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-misc-full/main"", ","trailing_whitespace_linter" -"data-raw/10-delimiters.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" -"data-raw/10-delimiters.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/10-delimiters.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/10-delimiters.R",32,81,"style","Lines should not be more than 80 characters."," alt_quotation_start <- delimiters_data$main[[1]]$delimiters$alternateQuotationStart","line_length_linter" -"data-raw/10-delimiters.R",33,81,"style","Lines should not be more than 80 characters."," alt_quotation_end <- delimiters_data$main[[1]]$delimiters$alternateQuotationEnd","line_length_linter" -"data-raw/10-delimiters.R",44,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/10-delimiters.R",47,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/10-delimiters.R",59,74,"style","Trailing whitespace is superfluous."," quotation_start, quotation_end, alt_quotation_start, alt_quotation_end, ","trailing_whitespace_linter" -"data-raw/11-layout.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/11-layout.R",15,12,"style","Trailing whitespace is superfluous."," layout <- ","trailing_whitespace_linter" -"data-raw/11-layout.R",18,52,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-misc-full/main"", ","trailing_whitespace_linter" -"data-raw/11-layout.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" -"data-raw/11-layout.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/11-layout.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/11-layout.R",40,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/11-layout.R",43,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/12-script_metadata.R",8,15,"style","Trailing whitespace is superfluous.","script_meta <- ","trailing_whitespace_linter" -"data-raw/12-script_metadata.R",10,81,"style","Lines should not be more than 80 characters."," ""https://raw.githubusercontent.com/unicode-org/cldr-json/main/cldr-json/cldr-core"", ","line_length_linter" -"data-raw/12-script_metadata.R",10,88,"style","Trailing whitespace is superfluous."," ""https://raw.githubusercontent.com/unicode-org/cldr-json/main/cldr-json/cldr-core"", ","trailing_whitespace_linter" -"data-raw/12-script_metadata.R",30,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/12-script_metadata.R",41,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/12-script_metadata.R",49,31,"style","Trailing whitespace is superfluous."," lb_letters = lb_letters, ","trailing_whitespace_linter" -"data-raw/12-script_metadata.R",57,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/12-script_metadata.R",59,81,"style","Lines should not be more than 80 characters."," script_metadata_tbl <- dplyr::bind_rows(script_metadata_tbl, script_metadata_row_i)","line_length_linter" -"data-raw/12-script_metadata.R",60,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/12-script_metadata.R",63,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/13-units.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/13-units.R",15,11,"style","Trailing whitespace is superfluous."," units <- ","trailing_whitespace_linter" -"data-raw/13-units.R",18,53,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-units-full/main"", ","trailing_whitespace_linter" -"data-raw/13-units.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" -"data-raw/13-units.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/13-units.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/13-units.R",33,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/13-units.R",41,42,"style","Trailing whitespace is superfluous."," dplyr::mutate(unit = names(long)) %>% ","trailing_whitespace_linter" -"data-raw/13-units.R",45,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/13-units.R",53,43,"style","Trailing whitespace is superfluous."," dplyr::mutate(unit = names(short)) %>% ","trailing_whitespace_linter" -"data-raw/13-units.R",57,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/13-units.R",65,44,"style","Trailing whitespace is superfluous."," dplyr::mutate(unit = names(narrow)) %>% ","trailing_whitespace_linter" -"data-raw/13-units.R",81,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/13-units.R",84,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/13-units.R",91,19,"style","Trailing whitespace is superfluous.","colnames_sorted <- ","trailing_whitespace_linter" -"data-raw/13-units.R",118,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/14-tz_exemplar.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/14-tz_exemplar.R",15,17,"style","Trailing whitespace is superfluous."," tz_exemplar <- ","trailing_whitespace_linter" -"data-raw/14-tz_exemplar.R",18,53,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-dates-full/main"", ","trailing_whitespace_linter" -"data-raw/14-tz_exemplar.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" -"data-raw/14-tz_exemplar.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/14-tz_exemplar.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/14-tz_exemplar.R",31,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/14-tz_exemplar.R",33,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/14-tz_exemplar.R",35,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/14-tz_exemplar.R",39,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/14-tz_exemplar.R",40,28,"style","Trailing whitespace is superfluous."," names(exemplar_cities) <- ","trailing_whitespace_linter" -"data-raw/14-tz_exemplar.R",42,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/14-tz_exemplar.R",43,27,"style","Trailing whitespace is superfluous."," tz_exemplar_tbl_row_i <- ","trailing_whitespace_linter" -"data-raw/14-tz_exemplar.R",48,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/14-tz_exemplar.R",51,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/15-tz_map.R",8,10,"style","Trailing whitespace is superfluous.","tz_map <- ","trailing_whitespace_linter" -"data-raw/15-tz_map.R",11,54,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-core/supplemental/"", ","trailing_whitespace_linter" -"data-raw/15-tz_map.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/15-tz_map.R",21,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/15-tz_map.R",24,26,"style","Trailing whitespace is superfluous.","colnames(map_data_all) <- ","trailing_whitespace_linter" -"data-raw/16-tz_formats.R",14,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/16-tz_formats.R",15,16,"style","Trailing whitespace is superfluous."," tz_formats <- ","trailing_whitespace_linter" -"data-raw/16-tz_formats.R",18,53,"style","Trailing whitespace is superfluous."," version_tag, ""cldr-json/cldr-dates-full/main"", ","trailing_whitespace_linter" -"data-raw/16-tz_formats.R",19,22,"style","Trailing whitespace is superfluous."," all_locales[i], ","trailing_whitespace_linter" -"data-raw/16-tz_formats.R",22,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/16-tz_formats.R",29,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/16-tz_formats.R",31,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/16-tz_formats.R",39,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/16-tz_formats.R",51,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"data-raw/16-tz_formats.R",54,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/i18n/email-body b/.dev/revdep_emails/i18n/email-body deleted file mode 100644 index 0c4af3e5e..000000000 --- a/.dev/revdep_emails/i18n/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Richard Iannone! Thank you for using {lintr} in your package {i18n}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/rich-iannone/i18n (hash: 071bc900ca7e59e6ac3181be9e9b923deb6280a2) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 1s on CRAN vs. 5s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/jpmesh/attachments/jpmesh.warnings b/.dev/revdep_emails/jpmesh/attachments/jpmesh.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/jpmesh/attachments/jpmesh.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/jpmesh/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/jpmesh/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 25badc69e..000000000 --- a/.dev/revdep_emails/jpmesh/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,3 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/administration_mesh.R",54,44,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (to_mesh_size <= mesh_units[5] & to_mesh_size >= mesh_units[7]) {","vector_logic_linter" -"R/coords_to_mesh.R",48,39,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!rlang::is_missing(longitude) | !rlang::is_missing(latitude))","vector_logic_linter" diff --git a/.dev/revdep_emails/jpmesh/email-body b/.dev/revdep_emails/jpmesh/email-body deleted file mode 100644 index 8222a02ad..000000000 --- a/.dev/revdep_emails/jpmesh/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Shinya Uryu! Thank you for using {lintr} in your package {jpmesh}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/uribo/jpmesh (hash: 15cb73e710d23ca5dc7a671377b08b98bebb9a10) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 15s on CRAN vs. 9s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/languageserver/attachments/languageserver.warnings b/.dev/revdep_emails/languageserver/attachments/languageserver.warnings deleted file mode 100644 index 182961f94..000000000 --- a/.dev/revdep_emails/languageserver/attachments/languageserver.warnings +++ /dev/null @@ -1,2 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Trying to remove β€˜camel_case_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/languageserver/email-body b/.dev/revdep_emails/languageserver/email-body deleted file mode 100644 index 55be8b259..000000000 --- a/.dev/revdep_emails/languageserver/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Randy Lai! Thank you for using {lintr} in your package {languageserver}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/REditorSupport/languageserver (hash: 7398fea984792864433a901ee18d3d6f719468e2) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 35s on CRAN vs. 11s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/latrend/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/latrend/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 6cf6f9344..000000000 --- a/.dev/revdep_emails/latrend/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,35 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/test-cases/data-na.R",50,13,"style","Variable and function name style should be snake_case.","testData2[, Value := replace(Value, .GRP %% M + 1L, NA), by = Id]","object_name_linter" -"R/data.R",168,13,"style","Variable and function name style should be snake_case."," alldata[, Mu.class := rowSums(Xc * t(clusterCoefs)[Class, ])]","object_name_linter" -"R/data.R",191,15,"style","Variable and function name style should be snake_case."," alldata[, Mu.random := rowSums(Xr * idCoefs[Id, ])]","object_name_linter" -"R/data.R",193,15,"style","Variable and function name style should be snake_case."," alldata[, Mu := Mu.fixed + Mu.class + Mu.random]","object_name_linter" -"R/data.R",195,15,"style","Variable and function name style should be snake_case."," alldata[, Mu := Mu.fixed + Mu.class]","object_name_linter" -"R/data.R",205,13,"style","Variable and function name style should be snake_case."," alldata[, Value := Mu + rnoise(.N, 0, noiseScales[Class])]","object_name_linter" -"R/data.R",215,13,"style","Variable and function name style should be snake_case."," alldata[, Class := factor(clusterNames[Class], levels = clusterNames)]","object_name_linter" -"R/matrix.R",161,10,"style","Variable and function name style should be snake_case."," dt[, .Fill := FALSE]","object_name_linter" -"R/matrix.R",166,10,"style","Variable and function name style should be snake_case."," dt[, .Fill := NULL]","object_name_linter" -"R/methodStratify.R",216,11,"style","Variable and function name style should be snake_case."," out[, Cluster := as.integer(Cluster) + 1L]","object_name_linter" -"R/model.R",948,15,"style","Variable and function name style should be snake_case."," newdata[, Cluster := factor(Cluster, levels = clusterNames(object))]","object_name_linter" -"R/model.R",961,38,"style","Variable and function name style should be snake_case."," lapply(function(cdata) cdata[, Cluster := NULL])","object_name_linter" -"R/model.R",1289,15,"style","Variable and function name style should be snake_case."," rawdata[, Cluster := trajAssignments[make.idRowIndices(object)]]","object_name_linter" -"R/modelCustom.R",197,19,"style","Place a space before left parenthesis, except in a function call."," object@predict(object, newdata, what, ...)","spaces_left_parentheses_linter" -"R/modelCustom.R",228,11,"style","Variable and function name style should be snake_case."," .[, Cluster := factor(Cluster,","object_name_linter" -"R/modelLcmmGMM.R",22,37,"style","Variable and function name style should be snake_case."," dataIndex[object@model$na.action, Include := FALSE]","object_name_linter" -"R/modelMixtoolsRM.R",57,11,"style","Variable and function name style should be snake_case."," .[, Time := times[.Block]] %>%","object_name_linter" -"R/modelMixtoolsRM.R",59,11,"style","Variable and function name style should be snake_case."," .[, .Component := NULL] %>%","object_name_linter" -"R/modelMixtoolsRM.R",60,11,"style","Variable and function name style should be snake_case."," .[, .Block := NULL] %>%","object_name_linter" -"R/models.R",515,9,"style","Variable and function name style should be snake_case."," .[, .ROW_INDEX := .I] %>%","object_name_linter" -"R/test.R",74,10,"style","Variable and function name style should be snake_case."," data[, Id := as.character(Id)]","object_name_linter" -"R/test.R",75,10,"style","Variable and function name style should be snake_case."," data[, Cluster := as.character(Cluster)]","object_name_linter" -"tests/testthat/setup-data.R",22,7,"style","Variable and function name style should be snake_case."," .[, Constant := 1] %>%","object_name_linter" -"tests/testthat/setup-data.R",23,7,"style","Variable and function name style should be snake_case."," .[, Cluster := Class]","object_name_linter" -"tests/testthat/test-akmedoids.R",24,12,"style","Variable and function name style should be snake_case.","trajData[, Cluster := LETTERS[as.integer(Id) %% 3 + 1]]","object_name_linter" -"tests/testthat/test-assert.R",197,32,"style","Variable and function name style should be snake_case."," .[Traj == unique(Traj)[2], Value := NA]","object_name_linter" -"tests/testthat/test-cluslong.R",111,23,"style","Variable and function name style should be snake_case."," .[sample(.N, 10), Traj := NA]","object_name_linter" -"tests/testthat/test-cluslong.R",118,9,"style","Variable and function name style should be snake_case."," .[, Traj := factor(Traj)]","object_name_linter" -"tests/testthat/test-cluslong.R",128,9,"style","Variable and function name style should be snake_case."," .[, Traj := factor(Traj, levels = rev(unique(Traj)))]","object_name_linter" -"tests/testthat/test-cluslong.R",138,9,"style","Variable and function name style should be snake_case."," .[, Traj := factor(Traj, levels = seq(0, uniqueN(Traj) + 1))]","object_name_linter" -"tests/testthat/test-cluslong.R",147,18,"style","Variable and function name style should be snake_case."," .[Traj == 1, Traj := NA]","object_name_linter" -"tests/testthat/test-cluslong.R",165,23,"style","Variable and function name style should be snake_case."," .[sample(.N, 10), Value := NA]","object_name_linter" -"tests/testthat/test-cluslong.R",175,23,"style","Variable and function name style should be snake_case."," .[sample(.N, 10), Value := Inf]","object_name_linter" -"tests/testthat/test-crimcv.R",32,7,"style","Variable and function name style should be snake_case."," .[, Cluster := rep(LETTERS[1:3], each = 33 * ncol(subTO1adj))]","object_name_linter" diff --git a/.dev/revdep_emails/latrend/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/latrend/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index c3fd426a9..000000000 --- a/.dev/revdep_emails/latrend/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,331 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"data-raw/latrendData.R",6,1,"style","Variable and function name style should be snake_case or symbols.","latrendData = generateLongData(","object_name_linter" -"data-raw/latrendData.R",6,13,"style","Use <-, not =, for assignment.","latrendData = generateLongData(","assignment_linter" -"data-raw/latrendData.R",11,8,"style","Only use double-quotes."," id = 'Id',","single_quotes_linter" -"data-raw/latrendData.R",17,24,"style","Only use double-quotes."," clusterNames = paste('Class', 1:3),","single_quotes_linter" -"data-raw/latrendData.R",22,42,"style","Only use double-quotes.","plotTrajectories(latrendData, response = 'Y')","single_quotes_linter" -"data-raw/latrendData.R",23,42,"style","Only use double-quotes.","plotTrajectories(latrendData, response = 'Y', cluster = 'Class', facet = FALSE)","single_quotes_linter" -"data-raw/latrendData.R",23,57,"style","Only use double-quotes.","plotTrajectories(latrendData, response = 'Y', cluster = 'Class', facet = FALSE)","single_quotes_linter" -"data-raw/latrendData.R",24,42,"style","Only use double-quotes.","plotTrajectories(latrendData, response = 'Y', cluster = 'Class', facet = TRUE)","single_quotes_linter" -"data-raw/latrendData.R",24,57,"style","Only use double-quotes.","plotTrajectories(latrendData, response = 'Y', cluster = 'Class', facet = TRUE)","single_quotes_linter" -"data-raw/osa-adherence-data.R",6,81,"style","Lines should not be more than 80 characters.","#' @description Generates data from the group definitions provided by M. Aloia et al. (2008).","line_length_linter" -"data-raw/osa-adherence-data.R",16,81,"style","Lines should not be more than 80 characters.","#' @param missing Whether to simulate measurements being missing (including drop-out)","line_length_linter" -"data-raw/osa-adherence-data.R",19,81,"style","Lines should not be more than 80 characters.","#' Mark S. Aloia, Matthew S. Goodwin, Wayne F. Velicer, J. Todd Arnedt, Molly Zimmerman, Jaime Skrekas, Sarah Harris, Richard P. Millman,","line_length_linter" -"data-raw/osa-adherence-data.R",20,81,"style","Lines should not be more than 80 characters.","#' Time Series Analysis of Treatment Adherence Patterns in Individuals with Obstructive Sleep Apnea, Annals of Behavioral Medicine,","line_length_linter" -"data-raw/osa-adherence-data.R",21,81,"style","Lines should not be more than 80 characters.","#' Volume 36, Issue 1, August 2008, Pages 44–53, https://doi.org/10.1007/s12160-008-9052-9","line_length_linter" -"data-raw/osa-adherence-data.R",22,19,"style","Use <-, not =, for assignment.","generate_osa_data = function(","assignment_linter" -"data-raw/osa-adherence-data.R",25,3,"style","Variable and function name style should be snake_case or symbols."," nAggr = 14,","object_name_linter" -"data-raw/osa-adherence-data.R",37,3,"style","Variable and function name style should be snake_case or symbols."," dropoutTimes = c(Inf, Inf, Inf, Inf, Inf, 90, 30),","object_name_linter" -"data-raw/osa-adherence-data.R",38,3,"style","Variable and function name style should be snake_case or symbols."," sd.dropoutTimes = c(0, 0, 0, 0, 0, 30, 10),","object_name_linter" -"data-raw/osa-adherence-data.R",39,3,"style","Variable and function name style should be snake_case or symbols."," attemptProbs = c(354, 344, 280, 299, 106, 55, 14) / pmin(dropoutTimes, 365),","object_name_linter" -"data-raw/osa-adherence-data.R",50,3,"style","Variable and function name style should be snake_case or symbols."," sd.intercepts = c(","object_name_linter" -"data-raw/osa-adherence-data.R",68,3,"style","Variable and function name style should be snake_case or symbols."," sd.slopes = c(","object_name_linter" -"data-raw/osa-adherence-data.R",86,3,"style","Variable and function name style should be snake_case or symbols."," sd.quads = c(","object_name_linter" -"data-raw/osa-adherence-data.R",104,3,"style","Variable and function name style should be snake_case or symbols."," sd.vars = c(","object_name_linter" -"data-raw/osa-adherence-data.R",122,3,"style","Variable and function name style should be snake_case or symbols."," groupNames = c(","object_name_linter" -"data-raw/osa-adherence-data.R",123,5,"style","Only use double-quotes."," 'Good users',","single_quotes_linter" -"data-raw/osa-adherence-data.R",124,5,"style","Only use double-quotes."," 'Slow improvers',","single_quotes_linter" -"data-raw/osa-adherence-data.R",125,5,"style","Only use double-quotes."," 'Slow decliners',","single_quotes_linter" -"data-raw/osa-adherence-data.R",126,5,"style","Only use double-quotes."," 'Variable users',","single_quotes_linter" -"data-raw/osa-adherence-data.R",127,5,"style","Only use double-quotes."," 'Occasional attempters',","single_quotes_linter" -"data-raw/osa-adherence-data.R",128,5,"style","Only use double-quotes."," 'Early drop-outs',","single_quotes_linter" -"data-raw/osa-adherence-data.R",129,5,"style","Only use double-quotes."," 'Non-users'","single_quotes_linter" -"data-raw/osa-adherence-data.R",134,3,"style","Variable and function name style should be snake_case or symbols."," groupCounts = floor(patients * props)","object_name_linter" -"data-raw/osa-adherence-data.R",134,15,"style","Use <-, not =, for assignment."," groupCounts = floor(patients * props)","assignment_linter" -"data-raw/osa-adherence-data.R",135,3,"style","Variable and function name style should be snake_case or symbols."," incrIdx = order((patients * props) %% 1) %>%","object_name_linter" -"data-raw/osa-adherence-data.R",135,11,"style","Use <-, not =, for assignment."," incrIdx = order((patients * props) %% 1) %>%","assignment_linter" -"data-raw/osa-adherence-data.R",137,3,"style","Variable and function name style should be snake_case or symbols."," groupCounts[incrIdx] = groupCounts[incrIdx] + 1 # increment the groups that were closest to receiving another patient","object_name_linter" -"data-raw/osa-adherence-data.R",137,24,"style","Use <-, not =, for assignment."," groupCounts[incrIdx] = groupCounts[incrIdx] + 1 # increment the groups that were closest to receiving another patient","assignment_linter" -"data-raw/osa-adherence-data.R",137,81,"style","Lines should not be more than 80 characters."," groupCounts[incrIdx] = groupCounts[incrIdx] + 1 # increment the groups that were closest to receiving another patient","line_length_linter" -"data-raw/osa-adherence-data.R",139,3,"style","Variable and function name style should be snake_case or symbols."," groupNames = factor(groupNames, levels = groupNames)","object_name_linter" -"data-raw/osa-adherence-data.R",139,14,"style","Use <-, not =, for assignment."," groupNames = factor(groupNames, levels = groupNames)","assignment_linter" -"data-raw/osa-adherence-data.R",142,3,"style","Variable and function name style should be snake_case or symbols."," groupCoefs = data.table(","object_name_linter" -"data-raw/osa-adherence-data.R",142,14,"style","Use <-, not =, for assignment."," groupCoefs = data.table(","assignment_linter" -"data-raw/osa-adherence-data.R",159,3,"style","Variable and function name style should be snake_case or symbols."," patCoefs = groupCoefs[, .(","object_name_linter" -"data-raw/osa-adherence-data.R",159,12,"style","Use <-, not =, for assignment."," patCoefs = groupCoefs[, .(","assignment_linter" -"data-raw/osa-adherence-data.R",160,19,"warning","no visible binding for global variable β€˜Patients’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" -"data-raw/osa-adherence-data.R",160,19,"warning","no visible binding for global variable β€˜Patients’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" -"data-raw/osa-adherence-data.R",160,19,"warning","no visible binding for global variable β€˜Patients’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" -"data-raw/osa-adherence-data.R",160,19,"warning","no visible binding for global variable β€˜Patients’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" -"data-raw/osa-adherence-data.R",160,19,"warning","no visible binding for global variable β€˜Patients’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" -"data-raw/osa-adherence-data.R",160,19,"warning","no visible binding for global variable β€˜Patients’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" -"data-raw/osa-adherence-data.R",160,29,"warning","no visible binding for global variable β€˜TDrop’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" -"data-raw/osa-adherence-data.R",160,36,"warning","no visible binding for global variable β€˜Sd.TDrop’"," TDrop = rnorm(Patients, TDrop, Sd.TDrop) %>% round %>% pmax(7),","object_usage_linter" -"data-raw/osa-adherence-data.R",161,13,"warning","no visible binding for global variable β€˜AProb’"," AProb = AProb,","object_usage_linter" -"data-raw/osa-adherence-data.R",162,33,"warning","no visible binding for global variable β€˜Int’"," Intercept = rnorm(Patients, Int, Sd.Int) %>% pmax(0),","object_usage_linter" -"data-raw/osa-adherence-data.R",162,38,"warning","no visible binding for global variable β€˜Sd.Int’"," Intercept = rnorm(Patients, Int, Sd.Int) %>% pmax(0),","object_usage_linter" -"data-raw/osa-adherence-data.R",163,29,"warning","no visible binding for global variable β€˜Slope’"," Slope = rnorm(Patients, Slope, Sd.Slope),","object_usage_linter" -"data-raw/osa-adherence-data.R",163,36,"warning","no visible binding for global variable β€˜Sd.Slope’"," Slope = rnorm(Patients, Slope, Sd.Slope),","object_usage_linter" -"data-raw/osa-adherence-data.R",164,28,"warning","no visible binding for global variable β€˜Quad’"," Quad = rnorm(Patients, Quad, Sd.Quad),","object_usage_linter" -"data-raw/osa-adherence-data.R",164,34,"warning","no visible binding for global variable β€˜Sd.Quad’"," Quad = rnorm(Patients, Quad, Sd.Quad),","object_usage_linter" -"data-raw/osa-adherence-data.R",165,32,"warning","no visible binding for global variable β€˜Var’"," Variance = rnorm(Patients, Var, Sd.Var) %>% pmax(.75),","object_usage_linter" -"data-raw/osa-adherence-data.R",165,37,"warning","no visible binding for global variable β€˜Sd.Var’"," Variance = rnorm(Patients, Var, Sd.Var) %>% pmax(.75),","object_usage_linter" -"data-raw/osa-adherence-data.R",166,13,"warning","no visible binding for global variable β€˜R’"," R = rep(R, Patients)","object_usage_linter" -"data-raw/osa-adherence-data.R",167,11,"warning","no visible binding for global variable β€˜Group’"," ), by = Group]","object_usage_linter" -"data-raw/osa-adherence-data.R",170,3,"style","Variable and function name style should be snake_case or symbols."," genTs = function(N,","object_name_linter" -"data-raw/osa-adherence-data.R",170,9,"style","Use <-, not =, for assignment."," genTs = function(N,","assignment_linter" -"data-raw/osa-adherence-data.R",170,20,"style","Variable and function name style should be snake_case or symbols."," genTs = function(N,","object_name_linter" -"data-raw/osa-adherence-data.R",171,5,"style","Variable and function name style should be snake_case or symbols."," Intercept,","object_name_linter" -"data-raw/osa-adherence-data.R",172,5,"style","Variable and function name style should be snake_case or symbols."," Slope,","object_name_linter" -"data-raw/osa-adherence-data.R",173,5,"style","Variable and function name style should be snake_case or symbols."," Quad,","object_name_linter" -"data-raw/osa-adherence-data.R",174,5,"style","Variable and function name style should be snake_case or symbols."," Variance,","object_name_linter" -"data-raw/osa-adherence-data.R",175,5,"style","Variable and function name style should be snake_case or symbols."," R,","object_name_linter" -"data-raw/osa-adherence-data.R",176,5,"style","Variable and function name style should be snake_case or symbols."," AProb,","object_name_linter" -"data-raw/osa-adherence-data.R",177,5,"style","Variable and function name style should be snake_case or symbols."," TDrop,","object_name_linter" -"data-raw/osa-adherence-data.R",179,7,"style","Use <-, not =, for assignment."," y = as.numeric(Intercept + times * Slope + times ^ 2 * Quad + arima.sim(list(ar = R),","assignment_linter" -"data-raw/osa-adherence-data.R",179,81,"style","Lines should not be more than 80 characters."," y = as.numeric(Intercept + times * Slope + times ^ 2 * Quad + arima.sim(list(ar = R),","line_length_linter" -"data-raw/osa-adherence-data.R",183,5,"style","Variable and function name style should be snake_case or symbols."," skipMask = !rbinom(length(times), size = 1, prob = AProb)","object_name_linter" -"data-raw/osa-adherence-data.R",183,14,"style","Use <-, not =, for assignment."," skipMask = !rbinom(length(times), size = 1, prob = AProb)","assignment_linter" -"data-raw/osa-adherence-data.R",184,17,"style","Use <-, not =, for assignment."," y[skipMask] = 0","assignment_linter" -"data-raw/osa-adherence-data.R",187,7,"style","Variable and function name style should be snake_case or symbols."," obsMask = times <= TDrop","object_name_linter" -"data-raw/osa-adherence-data.R",187,15,"style","Use <-, not =, for assignment."," obsMask = times <= TDrop","assignment_linter" -"data-raw/osa-adherence-data.R",190,24,"style","Use <-, not =, for assignment."," y[times > TDrop] = 0","assignment_linter" -"data-raw/osa-adherence-data.R",195,3,"style","Variable and function name style should be snake_case or symbols."," patNames = paste0('P', 1:patients)","object_name_linter" -"data-raw/osa-adherence-data.R",195,12,"style","Use <-, not =, for assignment."," patNames = paste0('P', 1:patients)","assignment_linter" -"data-raw/osa-adherence-data.R",195,21,"style","Only use double-quotes."," patNames = paste0('P', 1:patients)","single_quotes_linter" -"data-raw/osa-adherence-data.R",196,11,"style","Use <-, not =, for assignment."," alldata = patCoefs[, do.call(genTs, .SD), by = .(Group, Id = factor(patNames, levels = patNames))] %>%","assignment_linter" -"data-raw/osa-adherence-data.R",196,52,"warning","no visible binding for global variable β€˜Group’"," alldata = patCoefs[, do.call(genTs, .SD), by = .(Group, Id = factor(patNames, levels = patNames))] %>%","object_usage_linter" -"data-raw/osa-adherence-data.R",196,81,"style","Lines should not be more than 80 characters."," alldata = patCoefs[, do.call(genTs, .SD), by = .(Group, Id = factor(patNames, levels = patNames))] %>%","line_length_linter" -"data-raw/osa-adherence-data.R",200,3,"style","Variable and function name style should be snake_case or symbols."," groupTrajs = groupCoefs[, .(","object_name_linter" -"data-raw/osa-adherence-data.R",200,14,"style","Use <-, not =, for assignment."," groupTrajs = groupCoefs[, .(","assignment_linter" -"data-raw/osa-adherence-data.R",202,19,"warning","no visible binding for global variable β€˜Int’"," Usage = (pmax(Int + times * Slope + times ^ 2 * Quad, 0) * AProb) %>% ifelse(times > TDrop, 0, .)","object_usage_linter" -"data-raw/osa-adherence-data.R",202,33,"warning","no visible binding for global variable β€˜Slope’"," Usage = (pmax(Int + times * Slope + times ^ 2 * Quad, 0) * AProb) %>% ifelse(times > TDrop, 0, .)","object_usage_linter" -"data-raw/osa-adherence-data.R",202,53,"warning","no visible binding for global variable β€˜Quad’"," Usage = (pmax(Int + times * Slope + times ^ 2 * Quad, 0) * AProb) %>% ifelse(times > TDrop, 0, .)","object_usage_linter" -"data-raw/osa-adherence-data.R",202,64,"warning","no visible binding for global variable β€˜AProb’"," Usage = (pmax(Int + times * Slope + times ^ 2 * Quad, 0) * AProb) %>% ifelse(times > TDrop, 0, .)","object_usage_linter" -"data-raw/osa-adherence-data.R",202,81,"style","Lines should not be more than 80 characters."," Usage = (pmax(Int + times * Slope + times ^ 2 * Quad, 0) * AProb) %>% ifelse(times > TDrop, 0, .)","line_length_linter" -"data-raw/osa-adherence-data.R",202,90,"warning","no visible binding for global variable β€˜TDrop’"," Usage = (pmax(Int + times * Slope + times ^ 2 * Quad, 0) * AProb) %>% ifelse(times > TDrop, 0, .)","object_usage_linter" -"data-raw/osa-adherence-data.R",203,13,"warning","no visible binding for global variable β€˜Group’"," ), by = Group]","object_usage_linter" -"data-raw/osa-adherence-data.R",205,20,"style","Only use double-quotes."," setattr(alldata, 'patCoefs', patCoefs)","single_quotes_linter" -"data-raw/osa-adherence-data.R",206,20,"style","Only use double-quotes."," setattr(alldata, 'groupCoefs', groupCoefs)","single_quotes_linter" -"data-raw/osa-adherence-data.R",207,20,"style","Only use double-quotes."," setattr(alldata, 'groupTrajs', groupTrajs)","single_quotes_linter" -"data-raw/osa-adherence-data.R",211,13,"style","Use <-, not =, for assignment."," alldata = transformToAverage(alldata, binSize = nAggr)","assignment_linter" -"data-raw/osa-adherence-data.R",211,15,"warning","no visible global function definition for β€˜transformToAverage’"," alldata = transformToAverage(alldata, binSize = nAggr)","object_usage_linter" -"data-raw/osa-adherence-data.R",217,1,"style","Variable and function name style should be snake_case or symbols.","transformToAverage = function(data, binSize = 14) {","object_name_linter" -"data-raw/osa-adherence-data.R",217,20,"style","Use <-, not =, for assignment.","transformToAverage = function(data, binSize = 14) {","assignment_linter" -"data-raw/osa-adherence-data.R",217,37,"style","Variable and function name style should be snake_case or symbols.","transformToAverage = function(data, binSize = 14) {","object_name_linter" -"data-raw/osa-adherence-data.R",218,8,"style","Use <-, not =, for assignment."," bins = seq(min(data$Time), max(data$Time), by = binSize)","assignment_linter" -"data-raw/osa-adherence-data.R",219,11,"style","Use <-, not =, for assignment."," bindata = data[, .(Usage = mean(Usage), Time = max(Time)),","assignment_linter" -"data-raw/osa-adherence-data.R",219,35,"warning","no visible binding for global variable β€˜Usage’"," bindata = data[, .(Usage = mean(Usage), Time = max(Time)),","object_usage_linter" -"data-raw/osa-adherence-data.R",221,7,"warning","no visible binding for global variable β€˜Group’"," Group,","object_usage_linter" -"data-raw/osa-adherence-data.R",226,3,"style","Variable and function name style should be snake_case or symbols."," groupTrajs = attr(data, 'groupTrajs')","object_name_linter" -"data-raw/osa-adherence-data.R",226,14,"style","Use <-, not =, for assignment."," groupTrajs = attr(data, 'groupTrajs')","assignment_linter" -"data-raw/osa-adherence-data.R",226,27,"style","Only use double-quotes."," groupTrajs = attr(data, 'groupTrajs')","single_quotes_linter" -"data-raw/osa-adherence-data.R",227,3,"style","Variable and function name style should be snake_case or symbols."," bingroupTrajs = groupTrajs[, .(Usage = mean(Usage)),","object_name_linter" -"data-raw/osa-adherence-data.R",227,17,"style","Use <-, not =, for assignment."," bingroupTrajs = groupTrajs[, .(Usage = mean(Usage)),","assignment_linter" -"data-raw/osa-adherence-data.R",227,47,"warning","no visible binding for global variable β€˜Usage’"," bingroupTrajs = groupTrajs[, .(Usage = mean(Usage)),","object_usage_linter" -"data-raw/osa-adherence-data.R",229,7,"warning","no visible binding for global variable β€˜Group’"," Group,","object_usage_linter" -"data-raw/osa-adherence-data.R",232,22,"warning","no visible binding for global variable β€˜Bin’"," .[, Time := bins[Bin]]","object_usage_linter" -"data-raw/osa-adherence-data.R",234,20,"style","Only use double-quotes."," setattr(bindata, 'groupTrajs', bingroupTrajs)","single_quotes_linter" -"data-raw/osa-adherence-data.R",239,9,"style","Use <-, not =, for assignment.","dataset = generate_osa_data(patients = 500, seed = 1)","assignment_linter" -"data-raw/osa-adherence-data.R",240,21,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" -"data-raw/osa-adherence-data.R",240,27,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" -"data-raw/osa-adherence-data.R",240,35,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" -"data-raw/osa-adherence-data.R",240,42,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" -"data-raw/osa-adherence-data.R",240,54,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" -"data-raw/osa-adherence-data.R",240,65,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" -"data-raw/osa-adherence-data.R",240,75,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" -"data-raw/osa-adherence-data.R",240,81,"style","Lines should not be more than 80 characters.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","line_length_linter" -"data-raw/osa-adherence-data.R",240,85,"style","Only use double-quotes.","setnames(dataset, c('Id', 'Time', 'Bin', 'Usage'), c('Patient', 'MaxDay', 'Biweek', 'UsageHours'))","single_quotes_linter" -"data-raw/osa-adherence-data.R",241,24,"style","Only use double-quotes.","setcolorder(dataset, c('Patient', 'Biweek', 'MaxDay', 'UsageHours', 'Group'))","single_quotes_linter" -"data-raw/osa-adherence-data.R",241,35,"style","Only use double-quotes.","setcolorder(dataset, c('Patient', 'Biweek', 'MaxDay', 'UsageHours', 'Group'))","single_quotes_linter" -"data-raw/osa-adherence-data.R",241,45,"style","Only use double-quotes.","setcolorder(dataset, c('Patient', 'Biweek', 'MaxDay', 'UsageHours', 'Group'))","single_quotes_linter" -"data-raw/osa-adherence-data.R",241,55,"style","Only use double-quotes.","setcolorder(dataset, c('Patient', 'Biweek', 'MaxDay', 'UsageHours', 'Group'))","single_quotes_linter" -"data-raw/osa-adherence-data.R",241,69,"style","Only use double-quotes.","setcolorder(dataset, c('Patient', 'Biweek', 'MaxDay', 'UsageHours', 'Group'))","single_quotes_linter" -"data-raw/osa-adherence-data.R",244,32,"style","Only use double-quotes.","plotTrajectories(dataset, id = 'Patient', time = 'Biweek', response = 'UsageHours', cluster = 'Group', facet = TRUE)","single_quotes_linter" -"data-raw/osa-adherence-data.R",244,50,"style","Only use double-quotes.","plotTrajectories(dataset, id = 'Patient', time = 'Biweek', response = 'UsageHours', cluster = 'Group', facet = TRUE)","single_quotes_linter" -"data-raw/osa-adherence-data.R",244,71,"style","Only use double-quotes.","plotTrajectories(dataset, id = 'Patient', time = 'Biweek', response = 'UsageHours', cluster = 'Group', facet = TRUE)","single_quotes_linter" -"data-raw/osa-adherence-data.R",244,81,"style","Lines should not be more than 80 characters.","plotTrajectories(dataset, id = 'Patient', time = 'Biweek', response = 'UsageHours', cluster = 'Group', facet = TRUE)","line_length_linter" -"data-raw/osa-adherence-data.R",244,95,"style","Only use double-quotes.","plotTrajectories(dataset, id = 'Patient', time = 'Biweek', response = 'UsageHours', cluster = 'Group', facet = TRUE)","single_quotes_linter" -"data-raw/osa-adherence-data.R",248,1,"style","Variable and function name style should be snake_case or symbols.","OSA.adherence = as.data.frame(dataset)","object_name_linter" -"data-raw/osa-adherence-data.R",248,15,"style","Use <-, not =, for assignment.","OSA.adherence = as.data.frame(dataset)","assignment_linter" -"R/assert.R",109,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/assert.R",341,7,"warning","no visible binding for global variable β€˜Dupe’"," .[Dupe == TRUE]","object_usage_linter" -"R/assert.R",371,7,"warning","no visible binding for global variable β€˜Moments’"," .[Moments < min]","object_usage_linter" -"R/assert.R",402,7,"warning","no visible binding for global variable β€˜HasMult’"," .[HasMult == TRUE]","object_usage_linter" -"R/assert.R",407,7,"warning","no visible global function definition for β€˜nroW’"," nroW(dtMult),","object_usage_linter" -"R/assert.R",413,9,"warning","no visible binding for global variable β€˜IsEqualLen’"," .[IsEqualLen == FALSE]","object_usage_linter" -"R/assert.R",438,7,"warning","no visible binding for global variable β€˜NaCount’"," .[NaCount > 0]","object_usage_linter" -"R/formula.R",31,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/generics.R",467,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/matrix.R",85,3,"style","`else` should come on the same line as the previous `}`."," else if (is.factor(times)) {","brace_linter" -"R/matrix.R",90,3,"style","`else` should come on the same line as the previous `}`."," else if (is.character(times)) {","brace_linter" -"R/method.R",364,3,"style","`else` should come on the same line as the previous `}`."," else if (is.list(args)) {","brace_linter" -"R/method.R",671,12,"warning","no visible binding for global variable β€˜label’"," object$label","object_usage_linter" -"R/method.R",1088,12,"warning","no visible binding for global variable β€˜response’"," object$response","object_usage_linter" -"R/method.R",1154,3,"style","`else` should come on the same line as the previous `}`."," else if (inherits(object, what = classes)) {","brace_linter" -"R/methods.R",123,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/model-transform.R",367,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/model-transform.R",388,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/model-transform.R",405,7,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/model.R",438,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/model.R",938,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/model.R",963,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/model.R",991,3,"style","`else` should come on the same line as the previous `}`."," else if (is.numeric(predList[[1]])) {","brace_linter" -"R/model.R",1004,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/model.R",1106,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/model.R",1381,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/modelKML.R",48,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/modelLMKM.R",59,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/models.R",53,3,"style","`else` should come on the same line as the previous `}`."," else if (is.lcModels(x)) {","brace_linter" -"R/models.R",56,3,"style","`else` should come on the same line as the previous `}`."," else if (is.lcModel(x)) {","brace_linter" -"R/models.R",59,3,"style","`else` should come on the same line as the previous `}`."," else if (is.list(x)) {","brace_linter" -"R/models.R",63,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/models.R",156,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/models.R",247,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/modelWeightedPartition.R",42,3,"style","`else` should come on the same line as the previous `}`."," else if (is.function(clusterNames)) {","brace_linter" -"R/random.R",12,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/test.R",410,3,"style","`else` should come on the same line as the previous `}`."," else if (!isFALSE(error)) {","brace_linter" -"tests/testthat/setup-init.R",160,17,"warning","no visible global function definition for β€˜is.ggplot’"," expect_true(is.ggplot(plot(object)))","object_usage_linter" -"tests/testthat/test-formula.R",9,28,"style","Put spaces around all infix operators."," expect_true(hasResponse(A~0))","infix_spaces_linter" -"tests/testthat/test-formula.R",10,36,"style","Put spaces around all infix operators."," expect_true(hasResponse(I(log(A))~B))","infix_spaces_linter" -"tests/testthat/test-formula.R",17,29,"style","Put spaces around all infix operators."," expect_true(hasIntercept(A~1))","infix_spaces_linter" -"tests/testthat/test-formula.R",18,30,"style","Put spaces around all infix operators."," expect_false(hasIntercept(A~-1))","infix_spaces_linter" -"tests/testthat/test-formula.R",25,34,"style","Put spaces around all infix operators."," expect_true(hasSingleResponse(A~0))","infix_spaces_linter" -"tests/testthat/test-formula.R",26,34,"style","Put spaces around all infix operators."," expect_true(hasSingleResponse(A~B))","infix_spaces_linter" -"tests/testthat/test-formula.R",43,27,"style","Put spaces around all infix operators."," expect_null(getREterms(A~B))","infix_spaces_linter" -"tests/testthat/test-formula.R",44,29,"style","Put spaces around all infix operators."," expect_length(getREterms(A~B + (1 | C)), 1)","infix_spaces_linter" -"tests/testthat/test-formula.R",45,29,"style","Put spaces around all infix operators."," expect_length(getREterms(A~B + (1 | C) + (1 | D)), 2)","infix_spaces_linter" -"tests/testthat/test-formula.R",62,28,"style","Put spaces around all infix operators."," expect_equal(getREterms(A~B + (1 | C))[[1]] %>% REtermAsFormula, ~1)","infix_spaces_linter" -"tests/testthat/test-formula.R",63,28,"style","Put spaces around all infix operators."," expect_equal(getREterms(A~B + (D | C))[[1]] %>% REtermAsFormula, ~D)","infix_spaces_linter" -"tests/testthat/test-formula.R",64,28,"style","Put spaces around all infix operators."," expect_equal(getREterms(A~B + (-1 + D | C))[[1]] %>% REtermAsFormula, ~-1 + D)","infix_spaces_linter" -"tests/testthat/test-formula.R",74,30,"style","Put spaces around all infix operators."," expect_true(hasCovariates(A~B))","infix_spaces_linter" -"tests/testthat/test-formula.R",76,30,"style","Put spaces around all infix operators."," expect_true(hasCovariates(A~poly(A, 2)))","infix_spaces_linter" -"tests/testthat/test-formula.R",77,31,"style","Put spaces around all infix operators."," expect_false(hasCovariates(A~0))","infix_spaces_linter" -"tests/testthat/test-formula.R",78,31,"style","Put spaces around all infix operators."," expect_false(hasCovariates(A~1))","infix_spaces_linter" -"tests/testthat/test-formula.R",84,32,"style","Put spaces around all infix operators."," expect_length(getCovariates(A~0), 0)","infix_spaces_linter" -"tests/testthat/test-formula.R",85,32,"style","Put spaces around all infix operators."," expect_length(getCovariates(A~1), 0)","infix_spaces_linter" -"tests/testthat/test-formula.R",101,31,"style","Put spaces around all infix operators."," expect_equal(merge.formula(Z~A, ~B), Z~A + B)","infix_spaces_linter" -"tests/testthat/test-formula.R",101,41,"style","Put spaces around all infix operators."," expect_equal(merge.formula(Z~A, ~B), Z~A + B)","infix_spaces_linter" -"tests/testthat/test-formula.R",102,31,"style","Put spaces around all infix operators."," expect_equal(merge.formula(Z~A + B, ~B), Z~A + B)","infix_spaces_linter" -"tests/testthat/test-formula.R",102,45,"style","Put spaces around all infix operators."," expect_equal(merge.formula(Z~A + B, ~B), Z~A + B)","infix_spaces_linter" -"tests/testthat/test-formula.R",103,31,"style","Put spaces around all infix operators."," expect_equal(merge.formula(Z~A + C, ~B), Z~A + C + B)","infix_spaces_linter" -"tests/testthat/test-formula.R",103,45,"style","Put spaces around all infix operators."," expect_equal(merge.formula(Z~A + C, ~B), Z~A + C + B)","infix_spaces_linter" -"tests/testthat/test-formula.R",104,35,"style","Put spaces around all infix operators."," expect_error(merge.formula(~A, Z~B))","infix_spaces_linter" -"tests/testthat/test-formula.R",111,42,"style","Put spaces around all infix operators."," expect_false(hasResponse(dropResponse(A~0)))","infix_spaces_linter" -"tests/testthat/test-formula.R",112,43,"style","Put spaces around all infix operators."," expect_false(hasIntercept(dropResponse(A~0)))","infix_spaces_linter" -"tests/testthat/test-formula.R",113,30,"style","Put spaces around all infix operators."," expect_equal(dropResponse(A~1), ~1)","infix_spaces_linter" -"tests/testthat/test-formula.R",114,30,"style","Put spaces around all infix operators."," expect_equal(dropResponse(A~B), ~B)","infix_spaces_linter" -"tests/testthat/test-formula.R",115,35,"style","Put spaces around all infix operators."," expect_equal(dropResponse(A + B ~C), ~C)","infix_spaces_linter" -"tests/testthat/test-formula.R",120,44,"style","Put spaces around all infix operators."," expect_false(hasIntercept(dropIntercept(A~0)))","infix_spaces_linter" -"tests/testthat/test-formula.R",121,44,"style","Put spaces around all infix operators."," expect_false(hasIntercept(dropIntercept(A~B)))","infix_spaces_linter" -"tests/testthat/test-method.R",15,11,"style","Put spaces around all infix operators."," form = A~B,","infix_spaces_linter" -"vignettes/demo.Rmd",28,23,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" -"vignettes/demo.Rmd",28,34,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" -"vignettes/demo.Rmd",28,41,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" -"vignettes/demo.Rmd",28,49,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" -"vignettes/demo.Rmd",28,81,"style","Lines should not be more than 80 characters."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","line_length_linter" -"vignettes/demo.Rmd",64,1,"style","Variable and function name style should be snake_case or symbols.","kmlMethod <- lcMethodKML(response = ""Y"", nClusters = 2, nbRedrawing = 1)","object_name_linter" -"vignettes/demo.Rmd",74,1,"style","Variable and function name style should be snake_case or symbols.","kmlModel <- latrend(kmlMethod, data = latrendData)","object_name_linter" -"vignettes/demo.Rmd",86,1,"style","Variable and function name style should be snake_case or symbols.","kmlMethods <- lcMethods(kmlMethod, nClusters = 1:8)","object_name_linter" -"vignettes/demo.Rmd",94,1,"style","Variable and function name style should be snake_case or symbols.","kmlModels <- latrendBatch(kmlMethods, data = latrendData, verbose = FALSE)","object_name_linter" -"vignettes/demo.Rmd",107,1,"style","Variable and function name style should be snake_case or symbols.","kmlModel4 <- subset(kmlModels, nClusters == 4, drop = TRUE)","object_name_linter" -"vignettes/demo.Rmd",144,1,"style","Variable and function name style should be snake_case or symbols.","gbtmMethod <- lcMethodLcmmGBTM(fixed = Y ~ bs(Time), mixture = fixed)","object_name_linter" -"vignettes/demo.Rmd",151,1,"style","Variable and function name style should be snake_case or symbols.","gbtmMethods <- lcMethods(gbtmMethod, nClusters = 1:5)","object_name_linter" -"vignettes/demo.Rmd",153,1,"style","Variable and function name style should be snake_case or symbols.","gbtmModels <- latrendBatch(gbtmMethods, data = latrendData, verbose = FALSE)","object_name_linter" -"vignettes/demo.Rmd",162,1,"style","Variable and function name style should be snake_case or symbols.","bestGbtmModel <- subset(gbtmModels, nClusters == 3, drop=TRUE)","object_name_linter" -"vignettes/demo.Rmd",162,57,"style","Put spaces around all infix operators.","bestGbtmModel <- subset(gbtmModels, nClusters == 3, drop=TRUE)","infix_spaces_linter" -"vignettes/demo.Rmd",170,1,"style","Variable and function name style should be snake_case or symbols.","gmmMethod <- lcMethodLcmmGMM(fixed = Y ~ poly(Time, 2, raw = TRUE), mixture = fixed, idiag = TRUE)","object_name_linter" -"vignettes/demo.Rmd",170,81,"style","Lines should not be more than 80 characters.","gmmMethod <- lcMethodLcmmGMM(fixed = Y ~ poly(Time, 2, raw = TRUE), mixture = fixed, idiag = TRUE)","line_length_linter" -"vignettes/demo.Rmd",176,1,"style","Variable and function name style should be snake_case or symbols.","gmmMethods <- lcMethods(gmmMethod, nClusters = 1:5)","object_name_linter" -"vignettes/demo.Rmd",178,1,"style","Variable and function name style should be snake_case or symbols.","gmmModels <- latrendBatch(gmmMethods, latrendData, verbose = FALSE)","object_name_linter" -"vignettes/demo.Rmd",186,1,"style","Variable and function name style should be snake_case or symbols.","bestGmmModel <- subset(gmmModels, nClusters == 3, drop=TRUE)","object_name_linter" -"vignettes/demo.Rmd",186,55,"style","Put spaces around all infix operators.","bestGmmModel <- subset(gmmModels, nClusters == 3, drop=TRUE)","infix_spaces_linter" -"vignettes/demo.Rmd",207,43,"style","Only use double-quotes.","metric(list(bestGbtmModel, bestGmmModel), 'WMAE')","single_quotes_linter" -"vignettes/demo.Rmd",211,45,"style","Only use double-quotes.","externalMetric(bestGbtmModel, bestGmmModel, 'WMMAE')","single_quotes_linter" -"vignettes/demo.Rmd",216,45,"style","Only use double-quotes.","externalMetric(bestGbtmModel, bestGmmModel, 'adjustedRand')","single_quotes_linter" -"vignettes/demo.Rmd",230,1,"style","Variable and function name style should be snake_case or symbols.","refTrajAssigns <- aggregate(Class ~ Id, data = latrendData, FUN = data.table::first)","object_name_linter" -"vignettes/demo.Rmd",230,81,"style","Lines should not be more than 80 characters.","refTrajAssigns <- aggregate(Class ~ Id, data = latrendData, FUN = data.table::first)","line_length_linter" -"vignettes/demo.Rmd",231,1,"style","Variable and function name style should be snake_case or symbols.","refModel <- lcModelPartition(data = latrendData, response = ""Y"", trajectoryAssignments = refTrajAssigns$Class)","object_name_linter" -"vignettes/demo.Rmd",231,81,"style","Lines should not be more than 80 characters.","refModel <- lcModelPartition(data = latrendData, response = ""Y"", trajectoryAssignments = refTrajAssigns$Class)","line_length_linter" -"vignettes/implement.Rmd",22,23,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" -"vignettes/implement.Rmd",22,34,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" -"vignettes/implement.Rmd",22,41,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" -"vignettes/implement.Rmd",22,81,"style","Lines should not be more than 80 characters."," eval = all(vapply(c('ggplot2', 'kml', 'lcmm'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","line_length_linter" -"vignettes/implement.Rmd",47,23,"style","Trailing whitespace is superfluous."," latrend.id = ""Traj"", ","trailing_whitespace_linter" -"vignettes/implement.Rmd",57,21,"style","Trailing whitespace is superfluous."," sizes = c(40, 60), ","trailing_whitespace_linter" -"vignettes/implement.Rmd",61,20,"style","Trailing whitespace is superfluous."," cluster = ~ Time, ","trailing_whitespace_linter" -"vignettes/implement.Rmd",66,6,"style","Trailing whitespace is superfluous.",") %>% ","trailing_whitespace_linter" -"vignettes/implement.Rmd",107,20,"style","Trailing whitespace is superfluous."," factor(int > 1.7, ","trailing_whitespace_linter" -"vignettes/implement.Rmd",108,34,"style","Trailing whitespace is superfluous."," levels = c(FALSE, TRUE), ","trailing_whitespace_linter" -"vignettes/implement.Rmd",122,18,"style","Trailing whitespace is superfluous."," response = ""Y"", ","trailing_whitespace_linter" -"vignettes/implement.Rmd",123,33,"style","Trailing whitespace is superfluous."," stratify = Intercept[1] > 1.7, ","trailing_whitespace_linter" -"vignettes/implement.Rmd",135,1,"style","Variable and function name style should be snake_case or symbols.","repStep <- function(method, data, verbose) {","object_name_linter" -"vignettes/implement.Rmd",137,72,"warning","no visible binding for global variable β€˜Traj’"," coefdata <- dt[, lm(Y ~ Time, .SD) %>% coef() %>% as.list(), keyby = Traj]","object_usage_linter" -"vignettes/implement.Rmd",148,1,"style","Variable and function name style should be snake_case or symbols.","clusStep <- function(method, data, repMat, envir, verbose) {","object_name_linter" -"vignettes/implement.Rmd",148,36,"style","Variable and function name style should be snake_case or symbols.","clusStep <- function(method, data, repMat, envir, verbose) {","object_name_linter" -"vignettes/implement.Rmd",152,32,"style","Trailing whitespace is superfluous."," response = method$response, ","trailing_whitespace_linter" -"vignettes/implement.Rmd",154,17,"style","Trailing whitespace is superfluous."," data = data, ","trailing_whitespace_linter" -"vignettes/implement.Rmd",164,1,"style","Variable and function name style should be snake_case or symbols.","m.twostep <- lcMethodFeature(","object_name_linter" -"vignettes/implement.Rmd",165,18,"style","Trailing whitespace is superfluous."," response = ""Y"", ","trailing_whitespace_linter" -"vignettes/implement.Rmd",166,32,"style","Trailing whitespace is superfluous."," representationStep = repStep, ","trailing_whitespace_linter" -"vignettes/implement.Rmd",172,1,"style","Variable and function name style should be snake_case or symbols.","model.twostep <- latrend(m.twostep, data = casedata)","object_name_linter" -"vignettes/implement.Rmd",183,1,"style","Variable and function name style should be snake_case or symbols.","repStep.gen <- function(method, data, verbose) {","object_name_linter" -"vignettes/implement.Rmd",185,81,"style","Lines should not be more than 80 characters."," coefdata <- dt[, lm(method$formula, .SD) %>% coef() %>% as.list(), keyby = c(method$id)]","line_length_linter" -"vignettes/implement.Rmd",192,1,"style","Variable and function name style should be snake_case or symbols.","clusStep.gen <- function(method, data, repMat, envir, verbose) {","object_name_linter" -"vignettes/implement.Rmd",192,40,"style","Variable and function name style should be snake_case or symbols.","clusStep.gen <- function(method, data, repMat, envir, verbose) {","object_name_linter" -"vignettes/implement.Rmd",198,17,"style","Trailing whitespace is superfluous."," data = data, ","trailing_whitespace_linter" -"vignettes/implement.Rmd",208,1,"style","Variable and function name style should be snake_case or symbols.","m.twostepgen <- lcMethodFeature(","object_name_linter" -"vignettes/implement.Rmd",210,36,"style","Trailing whitespace is superfluous."," representationStep = repStep.gen, ","trailing_whitespace_linter" -"vignettes/implement.Rmd",217,1,"style","Variable and function name style should be snake_case or symbols.","model.twostepgen <- latrend(m.twostepgen, formula = Y ~ Time, nClusters = 2, casedata)","object_name_linter" -"vignettes/implement.Rmd",217,81,"style","Lines should not be more than 80 characters.","model.twostepgen <- latrend(m.twostepgen, formula = Y ~ Time, nClusters = 2, casedata)","line_length_linter" -"vignettes/implement.Rmd",235,1,"style","Variable and function name style should be snake_case or symbols.","lcMethodSimpleGBTM <- function(...) {","object_name_linter" -"vignettes/implement.Rmd",236,6,"style","Use <-, not =, for assignment."," mc = match.call()","assignment_linter" -"vignettes/implement.Rmd",237,12,"style","Use <-, not =, for assignment."," mc$Class = 'lcMethodSimpleGBTM'","assignment_linter" -"vignettes/implement.Rmd",237,14,"style","Only use double-quotes."," mc$Class = 'lcMethodSimpleGBTM'","single_quotes_linter" -"vignettes/implement.Rmd",254,43,"style","Trailing whitespace is superfluous.","setMethod(""getName"", ""lcMethodSimpleGBTM"", ","trailing_whitespace_linter" -"vignettes/implement.Rmd",264,81,"style","Lines should not be more than 80 characters.","setMethod(""prepareData"", ""lcMethodSimpleGBTM"", function(method, data, verbose, ...) {","line_length_linter" -"vignettes/implement.Rmd",274,81,"style","Lines should not be more than 80 characters.","setMethod(""fit"", ""lcMethodSimpleGBTM"", function(method, data, envir, verbose, ...) {","line_length_linter" -"vignettes/implement.Rmd",286,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/implement.Rmd",288,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/implement.Rmd",290,25,"style","Trailing whitespace is superfluous."," ""lcModelSimpleGBTM"", ","trailing_whitespace_linter" -"vignettes/implement.Rmd",315,81,"style","Lines should not be more than 80 characters.","fitted.lcModelSimpleGBTM <- function(object, clusters = trajectoryAssignments(object)) {","line_length_linter" -"vignettes/implement.Rmd",316,3,"style","Variable and function name style should be snake_case or symbols."," predNames <- paste0(""pred_m"", 1:nClusters(object))","object_name_linter" -"vignettes/implement.Rmd",317,3,"style","Variable and function name style should be snake_case or symbols."," predMat <- as.matrix(object@model$pred[predNames])","object_name_linter" -"vignettes/implement.Rmd",318,12,"style","Variable and function name style should be snake_case or symbols."," colnames(predMat) <- clusterNames(object)","object_name_linter" -"vignettes/implement.Rmd",326,38,"style","Only use double-quotes."," object, newdata, cluster, what = 'mu', ...)","single_quotes_linter" -"vignettes/implement.Rmd",327,1,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","{","brace_linter" -"vignettes/implement.Rmd",328,3,"style","Variable and function name style should be snake_case or symbols."," predMat = lcmm::predictY(object@model, newdata = newdata)$pred %>%","object_name_linter" -"vignettes/implement.Rmd",328,11,"style","Use <-, not =, for assignment."," predMat = lcmm::predictY(object@model, newdata = newdata)$pred %>%","assignment_linter" -"vignettes/implement.Rmd",331,3,"style","Variable and function name style should be snake_case or symbols."," clusIdx = match(cluster, clusterNames(object))","object_name_linter" -"vignettes/implement.Rmd",331,11,"style","Use <-, not =, for assignment."," clusIdx = match(cluster, clusterNames(object))","assignment_linter" -"vignettes/simulation.Rmd",23,23,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'simTool', 'dplyr', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" -"vignettes/simulation.Rmd",23,34,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'simTool', 'dplyr', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" -"vignettes/simulation.Rmd",23,45,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'simTool', 'dplyr', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" -"vignettes/simulation.Rmd",23,54,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'simTool', 'dplyr', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" -"vignettes/simulation.Rmd",23,81,"style","Lines should not be more than 80 characters."," eval = all(vapply(c('ggplot2', 'simTool', 'dplyr', 'mclustcomp'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","line_length_linter" -"vignettes/simulation.Rmd",66,1,"style","Variable and function name style should be snake_case or symbols.","dataGen <- function(numTraj, ..., data.seed) {","object_name_linter" -"vignettes/simulation.Rmd",66,21,"style","Variable and function name style should be snake_case or symbols.","dataGen <- function(numTraj, ..., data.seed) {","object_name_linter" -"vignettes/simulation.Rmd",66,35,"style","Variable and function name style should be snake_case or symbols.","dataGen <- function(numTraj, ..., data.seed) {","object_name_linter" -"vignettes/simulation.Rmd",91,1,"style","Variable and function name style should be snake_case or symbols.","exampleData <- dataGen(numTraj = 200, randomScale = .1, data.seed = 1)","object_name_linter" -"vignettes/simulation.Rmd",101,1,"style","Variable and function name style should be snake_case or symbols.","dataGrid <- simTool::expand_tibble(","object_name_linter" -"vignettes/simulation.Rmd",118,1,"style","Variable and function name style should be snake_case or symbols.","kmlMethodGrid <- simTool::expand_tibble(","object_name_linter" -"vignettes/simulation.Rmd",134,1,"style","Variable and function name style should be snake_case or symbols.","fitGCKM <- function(type, ...) {","object_name_linter" -"vignettes/simulation.Rmd",139,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/simulation.Rmd",146,1,"style","Variable and function name style should be snake_case or symbols.","gckmMethodGrid <- simTool::expand_tibble(","object_name_linter" -"vignettes/simulation.Rmd",157,1,"style","Variable and function name style should be snake_case or symbols.","methodGrid <- dplyr::bind_rows(kmlMethodGrid, gckmMethodGrid)","object_name_linter" -"vignettes/simulation.Rmd",166,1,"style","Variable and function name style should be snake_case or symbols.","analyzeModel <- function(model) {","object_name_linter" -"vignettes/simulation.Rmd",168,3,"style","Variable and function name style should be snake_case or symbols."," refModel <- lcModelPartition(data, response = ""Y"", trajectoryAssignments = ""Class"")","object_name_linter" -"vignettes/simulation.Rmd",168,81,"style","Lines should not be more than 80 characters."," refModel <- lcModelPartition(data, response = ""Y"", trajectoryAssignments = ""Class"")","line_length_linter" -"vignettes/simulation.Rmd",169,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/simulation.Rmd",182,24,"style","Trailing whitespace is superfluous."," data_grid = dataGrid, ","trailing_whitespace_linter" -"vignettes/simulation.Rmd",196,1,"style","Variable and function name style should be snake_case or symbols.","resultsTable <- as.data.table(result$simulation)","object_name_linter" -"vignettes/simulation.Rmd",204,81,"style","Lines should not be more than 80 characters.","resultsTable[, .(K = nClusters[which.min(BIC)]), keyby = .(numTraj, randomScales, data.seed, method)]","line_length_linter" -"vignettes/simulation.Rmd",213,81,"style","Lines should not be more than 80 characters.","resultsTable[nClusters > 1, .(ARI = mean(ARI)), keyby = .(nClusters, numTraj, randomScales, method)]","line_length_linter" -"vignettes/simulation.Rmd",217,81,"style","Lines should not be more than 80 characters.","resultsTable[nClusters > 1, .(ARI = mean(ARI)), keyby = .(randomScales, nClusters, method)]","line_length_linter" -"vignettes/simulation.Rmd",225,81,"style","Lines should not be more than 80 characters.","resultsTable[randomScales == .1, .(WMAE = mean(WMAE)), keyby = .(nClusters, method)]","line_length_linter" -"vignettes/validation.Rmd",29,23,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'mclustcomp', 'caret'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" -"vignettes/validation.Rmd",29,34,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'mclustcomp', 'caret'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" -"vignettes/validation.Rmd",29,41,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'mclustcomp', 'caret'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" -"vignettes/validation.Rmd",29,55,"style","Only use double-quotes."," eval = all(vapply(c('ggplot2', 'kml', 'mclustcomp', 'caret'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","single_quotes_linter" -"vignettes/validation.Rmd",29,81,"style","Lines should not be more than 80 characters."," eval = all(vapply(c('ggplot2', 'kml', 'mclustcomp', 'caret'), requireNamespace, FUN.VALUE = TRUE, quietly = TRUE)) # needed to prevent errors for _R_CHECK_DEPENDS_ONLY_=true despite VignetteDepends declaration","line_length_linter" -"vignettes/validation.Rmd",64,1,"style","Variable and function name style should be snake_case or symbols.","repModels <- latrendRep(kml, data = latrendData, .rep=10)","object_name_linter" -"vignettes/validation.Rmd",64,54,"style","Put spaces around all infix operators.","repModels <- latrendRep(kml, data = latrendData, .rep=10)","infix_spaces_linter" -"vignettes/validation.Rmd",69,1,"style","Variable and function name style should be snake_case or symbols.","repSelfMetrics <- metric(repModels, name = c(""BIC"", ""WMAE"", ""APPA""))","object_name_linter" -"vignettes/validation.Rmd",81,1,"style","Variable and function name style should be snake_case or symbols.","bestRepModel <- min(repModels, ""BIC"")","object_name_linter" -"vignettes/validation.Rmd",88,1,"style","Variable and function name style should be snake_case or symbols.","simMat <- externalMetric(repModels, name = ""adjustedRand"")","object_name_linter" -"vignettes/validation.Rmd",98,1,"style","Variable and function name style should be snake_case or symbols.","bootModels <- latrendBoot(kml, data = latrendData, samples = 10)","object_name_linter" -"vignettes/validation.Rmd",103,1,"style","Variable and function name style should be snake_case or symbols.","bootMetrics <- metric(bootModels, name = c(""BIC"", ""WMAE"", ""APPA""))","object_name_linter" -"vignettes/validation.Rmd",119,1,"style","Variable and function name style should be snake_case or symbols.","trainModels <- latrendCV(kml, data = latrendData, folds = 10, seed = 1)","object_name_linter" -"vignettes/validation.Rmd",127,1,"style","Variable and function name style should be snake_case or symbols.","dataFolds <- createTrainDataFolds(latrendData, folds = 10)","object_name_linter" -"vignettes/validation.Rmd",128,1,"style","Variable and function name style should be snake_case or symbols.","foldModels <- latrendBatch(kml, data = dataFolds)","object_name_linter" -"vignettes/validation.Rmd",133,1,"style","Variable and function name style should be snake_case or symbols.","testDataFolds <- createTestDataFolds(latrendData, dataFolds)","object_name_linter" diff --git a/.dev/revdep_emails/latrend/email-body b/.dev/revdep_emails/latrend/email-body deleted file mode 100644 index 0e5b7a363..000000000 --- a/.dev/revdep_emails/latrend/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Niek Den Teuling! Thank you for using {lintr} in your package {latrend}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/philips-software/latrend (hash: 30f1fd7ce93bbc63a321dbf7d92347555ad522c2) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 149s on CRAN vs. 93s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/lifecycle/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/lifecycle/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 7733b67eb..000000000 --- a/.dev/revdep_emails/lifecycle/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,5 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/aaa.R",6,6,"style","Variable and function name style should be snake_case."," ns$.__rlang_hook__. <- c(ns$.__rlang_hook__., list(callback))","object_name_linter" -"R/aaa.R",21,6,"style","Variable and function name style should be snake_case."," ns$.__rlang_hook__. <- NULL","object_name_linter" -"R/lifecycle-package.R",11,1,"style","Variable and function name style should be snake_case.",".onLoad <- function(lib, pkg) {","object_name_linter" -"R/warning.R",48,1,"style","Variable and function names should not be longer than 30 characters.","conditionMessage.lifecycle_warning_deprecated <- function(c) {","object_length_linter" diff --git a/.dev/revdep_emails/lifecycle/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/lifecycle/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 080c856e1..000000000 --- a/.dev/revdep_emails/lifecycle/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,24 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"vignettes/communicate.Rmd",70,3,"style","Trailing whitespace is superfluous.","#' ","trailing_whitespace_linter" -"vignettes/communicate.Rmd",73,3,"style","Trailing whitespace is superfluous.","#' ","trailing_whitespace_linter" -"vignettes/communicate.Rmd",81,13,"style","Trailing whitespace is superfluous.","#' @examples ","trailing_whitespace_linter" -"vignettes/communicate.Rmd",118,13,"style","Trailing whitespace is superfluous."," ""1.0.0"", ","trailing_whitespace_linter" -"vignettes/communicate.Rmd",119,17,"style","Trailing whitespace is superfluous."," ""add_two()"", ","trailing_whitespace_linter" -"vignettes/communicate.Rmd",186,3,"style","Trailing whitespace is superfluous.","#' ","trailing_whitespace_linter" -"vignettes/communicate.Rmd",187,16,"style","Trailing whitespace is superfluous.","#' @description ","trailing_whitespace_linter" -"vignettes/communicate.Rmd",189,3,"style","Trailing whitespace is superfluous.","#' ","trailing_whitespace_linter" -"vignettes/communicate.Rmd",227,3,"style","Trailing whitespace is superfluous.","#' ","trailing_whitespace_linter" -"vignettes/communicate.Rmd",274,27,"style","Variable and function name style should be snake_case or symbols.","add_two <- function(x, y, na.rm = TRUE) {","object_name_linter" -"vignettes/communicate.Rmd",290,27,"style","Variable and function name style should be snake_case or symbols.","add_two <- function(x, y, na.rm = TRUE) {","object_name_linter" -"vignettes/communicate.Rmd",293,22,"style","Trailing whitespace is superfluous."," when = ""1.0.0"", ","trailing_whitespace_linter" -"vignettes/communicate.Rmd",295,81,"style","Lines should not be more than 80 characters."," details = ""Ability to retain missing values will be dropped in next release.""","line_length_linter" -"vignettes/communicate.Rmd",298,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/communicate.Rmd",313,27,"style","Variable and function name style should be snake_case or symbols.","add_two <- function(x, y, na.rm = deprecated()) {","object_name_linter" -"vignettes/communicate.Rmd",316,22,"style","Trailing whitespace is superfluous."," when = ""1.0.0"", ","trailing_whitespace_linter" -"vignettes/communicate.Rmd",318,81,"style","Lines should not be more than 80 characters."," details = ""Ability to retain missing values will be dropped in next release.""","line_length_linter" -"vignettes/communicate.Rmd",321,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/communicate.Rmd",340,41,"style","Variable and function name style should be snake_case or symbols.","add_two <- function(x, y, na_rm = TRUE, na.rm = deprecated()) {","object_name_linter" -"vignettes/communicate.Rmd",345,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/manage.Rmd",36,81,"style","Lines should not be more than 80 characters.","#> Call `lifecycle::last_lifecycle_warnings()` to see where this warning was generated.","line_length_linter" -"vignettes/stages.Rmd",57,81,"style","Lines should not be more than 80 characters.","#> Call `lifecycle::last_lifecycle_warnings()` to see where this warning was generated. ","line_length_linter" -"vignettes/stages.Rmd",57,88,"style","Trailing whitespace is superfluous.","#> Call `lifecycle::last_lifecycle_warnings()` to see where this warning was generated. ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/lifecycle/email-body b/.dev/revdep_emails/lifecycle/email-body deleted file mode 100644 index 0ca6fceca..000000000 --- a/.dev/revdep_emails/lifecycle/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Lionel Henry! Thank you for using {lintr} in your package {lifecycle}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/r-lib/lifecycle (hash: 5e11675148a58af68fda4588cf933c655daff62c) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 12s on CRAN vs. 8s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/lightgbm/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/lightgbm/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 9ad81cde0..000000000 --- a/.dev/revdep_emails/lightgbm/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,14 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/callback.R",27,1,"style","Variable and function name style should be snake_case.","format.eval.string <- function(eval_res, eval_err) {","object_name_linter" -"R/callback.R",43,1,"style","Variable and function name style should be snake_case.","merge.eval.string <- function(env) {","object_name_linter" -"R/lgb.Booster.R",805,1,"style","Variable and function name style should be snake_case.","predict.lgb.Booster <- function(object,","object_name_linter" -"R/lgb.Booster.R",853,1,"style","Variable and function name style should be snake_case.","print.lgb.Booster <- function(x, ...) {","object_name_linter" -"R/lgb.Booster.R",902,1,"style","Variable and function name style should be snake_case.","summary.lgb.Booster <- function(object, ...) {","object_name_linter" -"R/lgb.Dataset.R",956,1,"style","Variable and function name style should be snake_case.","dim.lgb.Dataset <- function(x) {","object_name_linter" -"R/lgb.Dataset.R",991,1,"style","Variable and function name style should be snake_case.","dimnames.lgb.Dataset <- function(x) {","object_name_linter" -"R/lgb.Dataset.R",1004,1,"style","Variable and function name style should be snake_case.","`dimnames<-.lgb.Dataset` <- function(x, value) {","object_name_linter" -"R/lgb.Dataset.R",1064,1,"style","Variable and function name style should be snake_case.","slice.lgb.Dataset <- function(dataset, idxset) {","object_name_linter" -"R/lgb.Dataset.R",1111,1,"style","Variable and function name style should be snake_case.","get_field.lgb.Dataset <- function(dataset, field_name) {","object_name_linter" -"R/lgb.Dataset.R",1160,1,"style","Variable and function name style should be snake_case.","set_field.lgb.Dataset <- function(dataset, field_name, data) {","object_name_linter" -"tests/testthat/test_lgb.interprete.R",71,10,"style","Variable and function name style should be snake_case."," iris$Species <- as.numeric(as.factor(iris$Species)) - 1L","object_name_linter" -"tests/testthat/test_lgb.plot.interpretation.R",69,10,"style","Variable and function name style should be snake_case."," iris$Species <- as.numeric(as.factor(iris$Species)) - 1L","object_name_linter" diff --git a/.dev/revdep_emails/lightgbm/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/lightgbm/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 1111460de..000000000 --- a/.dev/revdep_emails/lightgbm/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,67 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"demo/basic_walkthrough.R",11,81,"style","Lines should not be more than 80 characters.","# The loaded data is stored in sparseMatrix, and label is a numeric vector in {0,1}","line_length_linter" -"demo/basic_walkthrough.R",25,81,"style","Lines should not be more than 80 characters.","# Note: we are putting in sparse matrix here, lightgbm naturally handles sparse input","line_length_linter" -"demo/basic_walkthrough.R",26,81,"style","Lines should not be more than 80 characters.","# Use sparse matrix when your feature is sparse (e.g. when you are using one-hot encoding vector)","line_length_linter" -"demo/basic_walkthrough.R",44,81,"style","Lines should not be more than 80 characters.","# You can also put in lgb.Dataset object, which stores label, data and other meta datas needed for advanced features","line_length_linter" -"demo/basic_walkthrough.R",82,81,"style","Lines should not be more than 80 characters.","# Since we do not have this file with us, the following line is just for illustration","line_length_linter" -"demo/basic_walkthrough.R",84,7,"style","Commented code should be removed.","# data = ""agaricus.train.svm""","commented_code_linter" -"demo/basic_walkthrough.R",111,81,"style","Lines should not be more than 80 characters.","dtrain <- lgb.Dataset(data = train$data, label = train$label, free_raw_data = FALSE)","line_length_linter" -"demo/boost_from_prediction.R",8,81,"style","Lines should not be more than 80 characters.","dtest <- lgb.Dataset.create.valid(dtrain, data = agaricus.test$data, label = agaricus.test$label)","line_length_linter" -"demo/boost_from_prediction.R",24,81,"style","Lines should not be more than 80 characters.","# Note: we need the margin value instead of transformed prediction in set_init_score","line_length_linter" -"demo/categorical_features_rules.R",58,81,"style","Lines should not be more than 80 characters.","bank_test <- lgb.convert_with_rules(data = bank_test, rules = bank_rules$rules)$data","line_length_linter" -"demo/categorical_features_rules.R",70,81,"style","Lines should not be more than 80 characters.","# The categorical features can be passed to lgb.train to not copy and paste a lot","line_length_linter" -"demo/cross_validation.R",7,81,"style","Lines should not be more than 80 characters.","dtest <- lgb.Dataset.create.valid(dtrain, data = agaricus.test$data, label = agaricus.test$label)","line_length_linter" -"demo/cross_validation.R",52,81,"style","Lines should not be more than 80 characters.","# User-defined evaluation function returns a pair (metric_name, result, higher_better)","line_length_linter" -"demo/cross_validation.R",53,81,"style","Lines should not be more than 80 characters.","# NOTE: when you do customized loss function, the default prediction value is margin","line_length_linter" -"demo/cross_validation.R",55,81,"style","Lines should not be more than 80 characters.","# For example, we are doing logistic loss, the prediction is score before logistic transformation","line_length_linter" -"demo/cross_validation.R",56,81,"style","Lines should not be more than 80 characters.","# Keep this in mind when you use the customization, and maybe you need write customized evaluation function","line_length_linter" -"demo/early_stopping.R",9,81,"style","Lines should not be more than 80 characters.","dtest <- lgb.Dataset.create.valid(dtrain, data = agaricus.test$data, label = agaricus.test$label)","line_length_linter" -"demo/early_stopping.R",21,81,"style","Lines should not be more than 80 characters.","# User define objective function, given prediction, return gradient and second order gradient","line_length_linter" -"demo/early_stopping.R",31,81,"style","Lines should not be more than 80 characters.","# User-defined evaluation function returns a pair (metric_name, result, higher_better)","line_length_linter" -"demo/early_stopping.R",32,81,"style","Lines should not be more than 80 characters.","# NOTE: when you do customized loss function, the default prediction value is margin","line_length_linter" -"demo/early_stopping.R",34,81,"style","Lines should not be more than 80 characters.","# For example, we are doing logistic loss, the prediction is score before logistic transformation","line_length_linter" -"demo/early_stopping.R",36,81,"style","Lines should not be more than 80 characters.","# Keep this in mind when you use the customization, and maybe you need write customized evaluation function","line_length_linter" -"demo/efficient_many_training.R",2,81,"style","Lines should not be more than 80 characters.","# In the case of many trainings (like 100+ models), RAM will be eaten very quickly","line_length_linter" -"demo/efficient_many_training.R",5,81,"style","Lines should not be more than 80 characters.","# More results can be found here: https://github.com/microsoft/LightGBM/issues/879#issuecomment-326656580","line_length_linter" -"demo/efficient_many_training.R",7,81,"style","Lines should not be more than 80 characters.","# With reset=FALSE you get after 500 iterations (not 1000): OS reports 27GB usage, while R gc() reports 1.5GB.","line_length_linter" -"demo/efficient_many_training.R",9,81,"style","Lines should not be more than 80 characters.","# Doing reset=TRUE and calling gc() in the loop will have OS 1.3GB. Thanks for the latest tip.""","line_length_linter" -"demo/efficient_many_training.R",16,81,"style","Lines should not be more than 80 characters.","x_data <- matrix(rnorm(n = 100000000L, mean = 0.0, sd = 100.0), nrow = 1000000L, ncol = 100L)","line_length_linter" -"demo/efficient_many_training.R",23,81,"style","Lines should not be more than 80 characters.","# Loop through a training of 1000 models, please check your RAM on your task manager","line_length_linter" -"demo/leaf_stability.R",1,81,"style","Lines should not be more than 80 characters.","# We are going to look at how iterating too much might generate observation instability.","line_length_linter" -"demo/leaf_stability.R",9,81,"style","Lines should not be more than 80 characters.","# output of `RColorBrewer::brewer.pal(10, ""RdYlGn"")`, hardcooded here to avoid a dependency","line_length_linter" -"demo/leaf_stability.R",108,3,"style","Commented code should be removed.","# Z = logloss","commented_code_linter" -"demo/leaf_stability.R",124,81,"style","Lines should not be more than 80 characters.","new_data$Z <- -1.0 * (agaricus.test$label * log(new_data$Y) + (1L - agaricus.test$label) * log(1L - new_data$Y))","line_length_linter" -"demo/leaf_stability.R",140,81,"style","Lines should not be more than 80 characters.","# On the second plot, we clearly notice the lower the bin (the lower the leaf value), the higher the loss","line_length_linter" -"demo/leaf_stability.R",178,81,"style","Lines should not be more than 80 characters.","new_data2$Z <- -1.0 * (agaricus.test$label * log(new_data2$Y) + (1L - agaricus.test$label) * log(1L - new_data2$Y))","line_length_linter" -"demo/leaf_stability.R",194,81,"style","Lines should not be more than 80 characters.","# On the second plot, we clearly notice the lower the bin (the lower the leaf value), the higher the loss","line_length_linter" -"demo/leaf_stability.R",195,81,"style","Lines should not be more than 80 characters.","# On the third plot, it is clearly not smooth! We are severely overfitting the data, but the rules are","line_length_linter" -"demo/leaf_stability.R",234,81,"style","Lines should not be more than 80 characters.","new_data3$Z <- -1.0 * (agaricus.test$label * log(new_data3$Y) + (1L - agaricus.test$label) * log(1L - new_data3$Y))","line_length_linter" -"demo/leaf_stability.R",250,81,"style","Lines should not be more than 80 characters.","# On the third plot, it is clearly not smooth! We are severely overfitting the data, but the rules","line_length_linter" -"demo/leaf_stability.R",252,81,"style","Lines should not be more than 80 characters.","# However, if the rules were not true, the loss would explode. See the sudden spikes?","line_length_linter" -"demo/multiclass_custom_objective.R",17,81,"style","Lines should not be more than 80 characters.","dtest <- lgb.Dataset.create.valid(dtrain, data = test[, 1L:4L], label = test[, 5L])","line_length_linter" -"demo/multiclass_custom_objective.R",44,81,"style","Lines should not be more than 80 characters.","# User defined objective function, given prediction, return gradient and second order gradient","line_length_linter" -"demo/multiclass_custom_objective.R",48,81,"style","Lines should not be more than 80 characters."," # preds is a matrix with rows corresponding to samples and columns corresponding to choices","line_length_linter" -"demo/multiclass.R",17,81,"style","Lines should not be more than 80 characters.","dtest <- lgb.Dataset.create.valid(dtrain, data = test[, 1L:4L], label = test[, 5L])","line_length_linter" -"demo/multiclass.R",37,81,"style","Lines should not be more than 80 characters.","# Order: obs1 class1, obs1 class2, obs1 class3, obs2 class1, obs2 class2, obs2 class3...","line_length_linter" -"demo/weight_param.R",9,81,"style","Lines should not be more than 80 characters.","# - Run 1: sum of weights equal to 6513 (x 1e-5) without adjusted regularization (not learning)","line_length_linter" -"demo/weight_param.R",10,81,"style","Lines should not be more than 80 characters.","# - Run 2: sum of weights equal to 6513 (x 1e-5) adjusted regularization (learning)","line_length_linter" -"demo/weight_param.R",23,81,"style","Lines should not be more than 80 characters.","dtest <- lgb.Dataset.create.valid(dtrain, test$data, label = test$label, weight = weights2)","line_length_linter" -"demo/weight_param.R",26,81,"style","Lines should not be more than 80 characters.","# Run 1: sum of weights equal to 6513 (x 1e-5) without adjusted regularization (not learning)","line_length_linter" -"demo/weight_param.R",28,81,"style","Lines should not be more than 80 characters.","# min_sum_hessian alone is bigger than the sum of weights, thus you will never learn anything","line_length_linter" -"demo/weight_param.R",50,81,"style","Lines should not be more than 80 characters.","# Run 2: sum of weights equal to 6513 (x 1e-5) with adjusted regularization (learning)","line_length_linter" -"demo/weight_param.R",51,81,"style","Lines should not be more than 80 characters.","# Adjusted regularization just consisting in multiplicating results by 1e4 (x10000)","line_length_linter" -"demo/weight_param.R",52,81,"style","Lines should not be more than 80 characters.","# Notice how it learns, there is no issue as we adjusted regularization ourselves","line_length_linter" -"inst/make-r-def.R",49,22,"warning","no visible global function definition for β€˜shoQuote’"," , args = shoQuote(args)","object_usage_linter" -"R/aliases.R",50,13,"warning","no visible binding for global variable β€˜LGBM_DumpParamAliases_R’"," LGBM_DumpParamAliases_R","object_usage_linter" -"R/lgb.cv.R",288,14,"warning","no visible global function definition for β€˜cb_early_stop’"," , cb = cb_early_stop(","object_usage_linter" -"R/lgb.cv.R",583,7,"style","Variable and function name style should be snake_case or symbols."," foldVector[y == dimnames(numInClass)$y[i]] <- sample(seqVector)","object_name_linter" -"R/lgb.train.R",253,14,"warning","no visible global function definition for β€˜cb_early_stop’"," , cb = cb_early_stop(","object_usage_linter" -"tests/testthat/test_basic.R",1758,10,"style","Variable and function name style should be snake_case or symbols."," mode(X) <- data_mode","object_name_linter" -"tests/testthat/test_basic.R",2591,5,"style","Variable and function name style should be snake_case or symbols."," X[, 1L] <- rnorm(100L)","object_name_linter" -"tests/testthat/test_basic.R",2592,5,"style","Variable and function name style should be snake_case or symbols."," X[, 2L] <- sample(seq_len(4L), size = 100L, replace = TRUE)","object_name_linter" -"tests/testthat/test_Predictor.R",51,18,"style","Variable and function name style should be snake_case or symbols."," storage.mode(X_double) <- ""double""","object_name_linter" -"tests/testthat/test_Predictor.R",310,15,"style","Variable and function name style should be snake_case or symbols."," row.names(Xcopy) <- NULL","object_name_linter" -"tests/testthat/test_Predictor.R",327,15,"style","Variable and function name style should be snake_case or symbols."," row.names(Xcopy) <- NULL","object_name_linter" -"tests/testthat/test_Predictor.R",358,15,"style","Variable and function name style should be snake_case or symbols."," row.names(X) <- paste(""rname"", seq(1L, nrow(X)), sep = """")","object_name_linter" -"tests/testthat/test_Predictor.R",373,15,"style","Variable and function name style should be snake_case or symbols."," row.names(X) <- paste(""rname"", seq(1L, nrow(X)), sep = """")","object_name_linter" -"vignettes/basic_walkthrough.Rmd",59,1,"style","Variable and function name style should be snake_case or symbols.","X <- data.matrix(bank[, c(""age"", ""balance"")])","object_name_linter" diff --git a/.dev/revdep_emails/lightgbm/email-body b/.dev/revdep_emails/lightgbm/email-body deleted file mode 100644 index 0421723fa..000000000 --- a/.dev/revdep_emails/lightgbm/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Yu Shi! Thank you for using {lintr} in your package {lightgbm}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/microsoft/LightGBM (hash: 27d9ad2e8e7ea2d00dbab7b17b0a34b5d9184fe0) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 78s on CRAN vs. 40s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/mlflow/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/mlflow/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 9386eedd9..000000000 --- a/.dev/revdep_emails/mlflow/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,3 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/tracking-rest.R",34,13,"style","Variable and function name style should be snake_case."," headers$Authorization <- auth_header","object_name_linter" -"R/tracking-rest.R",36,11,"style","Variable and function name style should be snake_case."," headers$`User-Agent` <- paste(""mlflow-r-client"", utils::packageVersion(""mlflow""), sep = ""/"")","object_name_linter" diff --git a/.dev/revdep_emails/mlflow/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/mlflow/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 6262bcd68..000000000 --- a/.dev/revdep_emails/mlflow/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,12 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/model.R",39,12,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," tryCatch({ mlflow_record_logged_model(model_spec) }, error = function(e) {","brace_linter" -"R/model.R",198,47,"style","Put spaces around all infix operators.","parse_json <- function(input_path, json_format=""split"") {","infix_spaces_linter" -"R/project-param.R",54,13,"style","Any function spanning multiple lines should use curly braces."," error = function(e) stop(""`default` value for `"", name, ""` cannot be casted to type "",","brace_linter" -"R/project-param.R",60,13,"style","Any function spanning multiple lines should use curly braces."," error = function(e) stop(""Provided value for `"", name,","brace_linter" -"R/project-param.R",76,9,"style","Compound semicolons are discouraged. Replace them by a newline."," i <- 0; n <- length(arguments)","semicolon_linter" -"R/tracking-observer.R",41,31,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," error = function(e) { }","brace_linter" -"R/tracking-observer.R",41,33,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," error = function(e) { }","brace_linter" -"R/tracking-rest.R",50,49,"style","Put spaces around all infix operators."," max_rate_limit_interval=60) {","infix_spaces_linter" -"tests/testthat/test-databricks-utils.R",35,66,"style","Any function spanning multiple lines should use curly braces."," with_mock(.env = ""mlflow"", get_databricks_config_for_profile = function(profile) list(","brace_linter" -"tests/testthat/test-databricks-utils.R",187,42,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," assign("".get_job_info"", function() { job_info }, envir = databricks_internal_env)","brace_linter" -"tests/testthat/test-ui.R",12,3,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","brace_linter" diff --git a/.dev/revdep_emails/mlflow/attachments/mlflow.warnings b/.dev/revdep_emails/mlflow/attachments/mlflow.warnings deleted file mode 100644 index e85af501f..000000000 --- a/.dev/revdep_emails/mlflow/attachments/mlflow.warnings +++ /dev/null @@ -1,2 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Trying to remove β€˜closed_curly_linter’, β€˜open_curly_linter’ and β€˜absolute_paths_linter’, which are not in `defaults`. diff --git a/.dev/revdep_emails/mlflow/email-body b/.dev/revdep_emails/mlflow/email-body deleted file mode 100644 index 2bd9dbe8c..000000000 --- a/.dev/revdep_emails/mlflow/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Matei Zaharia! Thank you for using {lintr} in your package {mlflow}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/mlflow/mlflow (hash: f5d38bd934cf63c16cf10d8ff5bcebcd3b72aec3) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 31s on CRAN vs. 19s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/mlr/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/mlr/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 52bb8b49d..000000000 --- a/.dev/revdep_emails/mlr/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,152 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/analyzeFeatSelResult.R",49,6,"style","Variable and function name style should be snake_case or CamelCase."," df$n.feats = rowSums(df[, features, drop = FALSE])","object_name_linter" -"R/BaggingWrapper.R",50,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$bw.iters = bw.iters","object_name_linter" -"R/BaggingWrapper.R",54,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$bw.replace = bw.replace","object_name_linter" -"R/BaggingWrapper.R",58,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$bw.size = bw.size","object_name_linter" -"R/BaggingWrapper.R",62,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$bw.feats = bw.feats","object_name_linter" -"R/BaseEnsemble_operators.R",69,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$base.learners = lapply(lrn$base.learners, setPredictType, predict.type = predict.type)","object_name_linter" -"R/BaseEnsemble.R",66,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$base.learners = setNames(base.learners, ids)","object_name_linter" -"R/BaseEnsemble.R",67,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$par.set.bls = par.set.bls","object_name_linter" -"R/BaseEnsemble.R",68,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$par.set.ens = par.set","object_name_linter" -"R/BaseWrapper_operators.R",2,1,"style","Variable and function name style should be snake_case or CamelCase.","getParamSet.BaseWrapper = function(x) {","object_name_linter" -"R/BaseWrapper.R",41,11,"style","Variable and function name style should be snake_case or CamelCase."," learner$fix.factors.prediction = FALSE","object_name_linter" -"R/BaseWrapper.R",43,11,"style","Variable and function name style should be snake_case or CamelCase."," learner$model.subclass = model.subclass","object_name_linter" -"R/BenchmarkResultOrderLevels.R",11,8,"style","Variable and function name style should be snake_case or CamelCase."," df$task.id = factor(df$task.id, order.tsks)","object_name_linter" -"R/BenchmarkResultOrderLevels.R",26,8,"style","Variable and function name style should be snake_case or CamelCase."," df$learner.id = factor(df$learner.id, order.lrns)","object_name_linter" -"R/calculateConfusionMatrix.R",118,12,"style","Variable and function name style should be snake_case or CamelCase."," result$relative.row = result.rel.row","object_name_linter" -"R/calculateConfusionMatrix.R",119,12,"style","Variable and function name style should be snake_case or CamelCase."," result$relative.col = result.rel.col","object_name_linter" -"R/calculateConfusionMatrix.R",120,12,"style","Variable and function name style should be snake_case or CamelCase."," result$relative.error = result$result[k + 1, k + 1] / n.pred","object_name_linter" -"R/ClassifTask.R",36,8,"style","Variable and function name style should be snake_case or CamelCase."," task$task.desc = makeClassifTaskDesc(id, data, target, weights, blocking, positive, coordinates)","object_name_linter" -"R/ClusterTask.R",16,8,"style","Variable and function name style should be snake_case or CamelCase."," task$task.desc = makeClusterTaskDesc(id, data, weights, blocking, coordinates)","object_name_linter" -"R/CostSensTask.R",45,8,"style","Variable and function name style should be snake_case or CamelCase."," task$task.desc = makeCostSensTaskDesc(id, data, target, blocking, costs, coordinates)","object_name_linter" -"R/CostSensWeightedPairsWrapper.R",61,15,"style","Variable and function name style should be snake_case or CamelCase."," feats$..y.. = y","object_name_linter" -"R/createSpatialResamplingPlots.R",153,5,"style","Variable and function name style should be snake_case or CamelCase."," length.n.resamp = length(resample)","object_name_linter" -"R/createSpatialResamplingPlots.R",160,3,"style","Variable and function name style should be snake_case or CamelCase."," plot.list.out.all = lapply(resample, function(r) {","object_name_linter" -"R/createSpatialResamplingPlots.R",171,5,"style","Variable and function name style should be snake_case or CamelCase."," plot.list.out = imap(plot.list, function(.x, .y) {","object_name_linter" -"R/downsample.R",37,7,"style","Variable and function name style should be snake_case or CamelCase."," obj$train.inds = lapply(obj$train.inds, function(x) sample(x, size = length(x) * perc))","object_name_linter" -"R/DownsampleWrapper.R",26,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$dw.perc = dw.perc","object_name_linter" -"R/DownsampleWrapper.R",30,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$dw.stratify = dw.stratify","object_name_linter" -"R/DownsampleWrapper.R",55,5,"style","Variable and function name style should be snake_case or CamelCase."," m$train.task = .task","object_name_linter" -"R/extractFDAFeatures.R",89,8,"style","Variable and function name style should be snake_case or CamelCase."," desc$extractFDAFeat = Map(function(x) {","object_name_linter" -"R/extractFDAFeatures.R",102,8,"style","Variable and function name style should be snake_case or CamelCase."," desc$fd.cols = names(desc$extractFDAFeat)","object_name_linter" -"R/extractFDAFeatures.R",115,8,"style","Variable and function name style should be snake_case or CamelCase."," desc$extractFDAFeat = extracts","object_name_linter" -"R/FeatSelWrapper.R",71,5,"style","Variable and function name style should be snake_case or CamelCase."," x$opt.result = or","object_name_linter" -"R/FilterWrapper.R",168,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$more.args = ddd","object_name_linter" -"R/getHyperPars.R",43,26,"style","Variable and function name style should be snake_case or CamelCase."," learner$par.set$pars$fw.base.methods = NULL","object_name_linter" -"R/getHyperPars.R",44,26,"style","Variable and function name style should be snake_case or CamelCase."," learner$par.set$pars$fw.method = NULL","object_name_linter" -"R/getHyperPars.R",45,22,"style","Variable and function name style should be snake_case or CamelCase."," learner$par.vals$fw.method = NULL","object_name_linter" -"R/getHyperPars.R",46,22,"style","Variable and function name style should be snake_case or CamelCase."," learner$par.vals$fw.base.methods = NULL","object_name_linter" -"R/getHyperPars.R",49,39,"style","Variable and function name style should be snake_case or CamelCase."," learner$next.learner$par.set$pars$fw.base.methods = NULL","object_name_linter" -"R/getHyperPars.R",50,39,"style","Variable and function name style should be snake_case or CamelCase."," learner$next.learner$par.set$pars$fw.method = NULL","object_name_linter" -"R/getHyperPars.R",51,35,"style","Variable and function name style should be snake_case or CamelCase."," learner$next.learner$par.vals$fw.method = NULL","object_name_linter" -"R/getHyperPars.R",52,35,"style","Variable and function name style should be snake_case or CamelCase."," learner$next.learner$par.vals$fw.base.methods = NULL","object_name_linter" -"R/getMultilabelBinaryPerformances.R",39,20,"style","Variable and function name style should be snake_case or CamelCase."," predi$data$prob.TRUE = probs[, label]","object_name_linter" -"R/getParamSet.R",13,1,"style","Variable and function name style should be snake_case or CamelCase.","getParamSet.Learner = function(x) {","object_name_linter" -"R/getParamSet.R",18,1,"style","Variable and function name style should be snake_case or CamelCase.","getParamSet.character = function(x) {","object_name_linter" -"R/Impute.R",179,8,"style","Variable and function name style should be snake_case or CamelCase."," desc$recode.factor.levels = recode.factor.levels","object_name_linter" -"R/Impute.R",180,8,"style","Variable and function name style should be snake_case or CamelCase."," desc$impute.new.levels = impute.new.levels","object_name_linter" -"R/logFunOpt.R",9,5,"style","Variable and function name style should be snake_case or CamelCase."," start.time = Sys.time()","object_name_linter" -"R/logFunOpt.R",13,5,"style","Variable and function name style should be snake_case or CamelCase."," end.time = Sys.time()","object_name_linter" -"R/logFunOpt.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," start.time = Sys.time()","object_name_linter" -"R/logFunOpt.R",35,5,"style","Variable and function name style should be snake_case or CamelCase."," end.time = Sys.time()","object_name_linter" -"R/makeLearner.R",173,6,"style","Variable and function name style should be snake_case or CamelCase."," wl$fix.factors.prediction = fix.factors.prediction","object_name_linter" -"R/Measure_operators.R",22,11,"style","Variable and function name style should be snake_case or CamelCase."," measure$extra.args = insert(measure$extra.args, insert(par.vals, args))","object_name_linter" -"R/ModelMultiplexer.R",93,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$par.set = c(lrn$par.set, ps)","object_name_linter" -"R/ModelMultiplexer.R",94,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$par.set.ens = ps","object_name_linter" -"R/ModelMultiplexer.R",95,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$fix.factors.prediction = TRUE","object_name_linter" -"R/MultilabelNestedStackingWrapper.R",37,5,"style","Variable and function name style should be snake_case or CamelCase."," x$cv.folds = cv.folds","object_name_linter" -"R/MultilabelStackingWrapper.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," x$cv.folds = cv.folds","object_name_linter" -"R/MultilabelTask.R",34,8,"style","Variable and function name style should be snake_case or CamelCase."," task$task.desc = makeMultilabelTaskDesc(id, data, target, weights, blocking, coordinates)","object_name_linter" -"R/OptWrapper.R",8,5,"style","Variable and function name style should be snake_case or CamelCase."," x$opt.pars = par.set","object_name_linter" -"R/OptWrapper.R",9,5,"style","Variable and function name style should be snake_case or CamelCase."," x$bit.names = bit.names","object_name_linter" -"R/OptWrapper.R",10,5,"style","Variable and function name style should be snake_case or CamelCase."," x$bits.to.features = bits.to.features","object_name_linter" -"R/OptWrapper.R",11,5,"style","Variable and function name style should be snake_case or CamelCase."," x$opt.pars = par.set","object_name_linter" -"R/OptWrapper.R",13,5,"style","Variable and function name style should be snake_case or CamelCase."," x$show.info = show.info","object_name_linter" -"R/OverBaggingWrapper.R",48,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$obw.iters = obw.iters","object_name_linter" -"R/OverBaggingWrapper.R",52,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$obw.rate = obw.rate","object_name_linter" -"R/OverBaggingWrapper.R",56,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$obw.maxcl = obw.maxcl","object_name_linter" -"R/OverBaggingWrapper.R",60,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$obw.cl = obw.cl","object_name_linter" -"R/OverUndersampleWrapper.R",36,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$usw.rate = usw.rate","object_name_linter" -"R/OverUndersampleWrapper.R",40,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$usw.cl = usw.cl","object_name_linter" -"R/OverUndersampleWrapper.R",58,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$osw.rate = osw.rate","object_name_linter" -"R/OverUndersampleWrapper.R",62,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$osw.cl = osw.cl","object_name_linter" -"R/OverUndersampleWrapper.R",86,5,"style","Variable and function name style should be snake_case or CamelCase."," m$train.task = .task","object_name_linter" -"R/OverUndersampleWrapper.R",103,5,"style","Variable and function name style should be snake_case or CamelCase."," m$train.task = .task","object_name_linter" -"R/plotBMRRanksAsBarChart.R",39,6,"style","Variable and function name style should be snake_case or CamelCase."," df$learner.id = factor(rownames(df))","object_name_linter" -"R/plotCritDifferences.R",83,6,"style","Variable and function name style should be snake_case or CamelCase."," df$short.name = getBMRLearnerShortNames(bmr)","object_name_linter" -"R/plotLearnerPrediction.R",182,14,"style","Variable and function name style should be snake_case or CamelCase."," grid$.prob.pred.class = prob","object_name_linter" -"R/predict.R",101,5,"style","Variable and function name style should be snake_case or CamelCase."," time.predict = NA_real_","object_name_linter" -"R/predict.R",131,5,"style","Variable and function name style should be snake_case or CamelCase."," time.predict = measureTime(fun1({","object_name_linter" -"R/predict.R",142,7,"style","Variable and function name style should be snake_case or CamelCase."," time.predict = NA_real_","object_name_linter" -"R/Prediction.R",142,8,"style","Variable and function name style should be snake_case or CamelCase."," data$truth.time = truth[, 1L]","object_name_linter" -"R/Prediction.R",143,8,"style","Variable and function name style should be snake_case or CamelCase."," data$truth.event = truth[, 2L]","object_name_linter" -"R/RegrTask.R",27,8,"style","Variable and function name style should be snake_case or CamelCase."," task$task.desc = makeRegrTaskDesc(id, data, target, weights, blocking, coordinates)","object_name_linter" -"R/RemoveConstantFeaturesWrapper.R",18,10,"style","Variable and function name style should be snake_case or CamelCase."," args$dont.rm = union(args$dont.rm, target)","object_name_linter" -"R/ResampleDesc.R",123,5,"style","Variable and function name style should be snake_case or CamelCase."," d$stratify.cols = stratify.cols","object_name_linter" -"R/ResampleDesc.R",125,5,"style","Variable and function name style should be snake_case or CamelCase."," d$blocking.cv = blocking.cv","object_name_linter" -"R/ResampleInstance.R",92,10,"style","Variable and function name style should be snake_case or CamelCase."," inst$train.inds = lapply(inst$train.inds, function(i) sample(which(blocking %in% levs[i])))","object_name_linter" -"R/ResampleInstance.R",94,10,"style","Variable and function name style should be snake_case or CamelCase."," inst$test.inds = lapply(inst$train.inds, function(x) setdiff(ti, x))","object_name_linter" -"R/ResampleInstance.R",136,10,"style","Variable and function name style should be snake_case or CamelCase."," inst$train.inds = Reduce(function(i1, i2) Map(c, i1, i2), train.inds)","object_name_linter" -"R/ResampleInstance.R",137,10,"style","Variable and function name style should be snake_case or CamelCase."," inst$test.inds = Reduce(function(i1, i2) Map(c, i1, i2), test.inds)","object_name_linter" -"R/ResampleInstances.R",50,5,"style","Variable and function name style should be snake_case or CamelCase."," length.test.inds = unlist(lapply(test.inds, function(x) length(x)))","object_name_linter" -"R/ResampleResult_operators.R",149,11,"style","Variable and function name style should be snake_case or CamelCase."," res$measures.train = cbind(res$measures.train, perf$train[, missing.measures, drop = FALSE])","object_name_linter" -"R/ResampleResult_operators.R",154,11,"style","Variable and function name style should be snake_case or CamelCase."," res$measures.test = cbind(res$measures.test, perf$test[, missing.measures, drop = FALSE])","object_name_linter" -"R/RLearner_classif_h2odeeplearning.R",252,7,"style","Variable and function name style should be snake_case or CamelCase."," d$.mlr.weights = .weights","object_name_linter" -"R/RLearner_classif_h2oglm.R",47,7,"style","Variable and function name style should be snake_case or CamelCase."," d$.mlr.weights = .weights","object_name_linter" -"R/RLearner_regr_h2odeeplearning.R",253,7,"style","Variable and function name style should be snake_case or CamelCase."," d$.mlr.weights = .weights","object_name_linter" -"R/RLearner_regr_h2oglm.R",45,7,"style","Variable and function name style should be snake_case or CamelCase."," d$.mlr.weights = .weights","object_name_linter" -"R/RLearner_regr_km.R",54,10,"style","Variable and function name style should be snake_case or CamelCase."," args$nugget.stability = NULL","object_name_linter" -"R/RLearner.R",92,11,"style","Variable and function name style should be snake_case or CamelCase."," learner$short.name = short.name","object_name_linter" -"R/RLearner.R",95,11,"style","Variable and function name style should be snake_case or CamelCase."," learner$help.list = makeParamHelpList(callees, package, par.set)","object_name_linter" -"R/RLearner.R",113,11,"style","Variable and function name style should be snake_case or CamelCase."," lrn$class.weights.param = class.weights.param","object_name_linter" -"R/SMOTEWrapper.R",42,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$sw.rate = sw.rate","object_name_linter" -"R/SMOTEWrapper.R",46,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$sw.nn = sw.nn","object_name_linter" -"R/SMOTEWrapper.R",49,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$sw.standardize = sw.standardize","object_name_linter" -"R/SMOTEWrapper.R",52,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$sw.alt.logic = sw.alt.logic","object_name_linter" -"R/StackedLearner.R",153,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$fix.factors.prediction = TRUE","object_name_linter" -"R/StackedLearner.R",154,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$use.feat = use.feat","object_name_linter" -"R/StackedLearner.R",157,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$super.learner = super.learner","object_name_linter" -"R/SurvTask.R",48,8,"style","Variable and function name style should be snake_case or CamelCase."," task$task.desc = makeSurvTaskDesc(id, data, target, weights, blocking, coordinates)","object_name_linter" -"R/Task_operators.R",460,8,"style","Variable and function name style should be snake_case or CamelCase."," task$task.desc = switch(td$type,","object_name_linter" -"R/train.R",81,5,"style","Variable and function name style should be snake_case or CamelCase."," time.train = 0","object_name_linter" -"R/train.R",105,5,"style","Variable and function name style should be snake_case or CamelCase."," time.train = measureTime(fun1({","object_name_linter" -"R/TuneControlIrace.R",45,18,"style","Variable and function name style should be snake_case or CamelCase."," x$extra.args$maxExperiments = asCount(x$extra.args$maxExperiments)","object_name_linter" -"R/TuneControlIrace.R",55,18,"style","Variable and function name style should be snake_case or CamelCase."," x$extra.args$maxExperiments = x$budget","object_name_linter" -"R/TuneControlMBO.R",58,5,"style","Variable and function name style should be snake_case or CamelCase."," x$mbo.control = mbo.control","object_name_linter" -"R/TuneControlMBO.R",60,5,"style","Variable and function name style should be snake_case or CamelCase."," x$mbo.design = mbo.design","object_name_linter" -"R/tuneIrace.R",26,22,"style","Variable and function name style should be snake_case or CamelCase."," control$extra.args$n.instances = NULL","object_name_linter" -"R/tuneIrace.R",28,22,"style","Variable and function name style should be snake_case or CamelCase."," control$extra.args$show.irace.output = NULL","object_name_linter" -"R/TuneMultiCritControlMBO.R",37,5,"style","Variable and function name style should be snake_case or CamelCase."," x$mbo.control = mbo.control","object_name_linter" -"R/TuneMultiCritControlMBO.R",39,5,"style","Variable and function name style should be snake_case or CamelCase."," x$mbo.design = mbo.design","object_name_linter" -"R/TuneWrapper.R",72,5,"style","Variable and function name style should be snake_case or CamelCase."," x$opt.result = or","object_name_linter" -"R/utils_opt.R",11,13,"style","Variable and function name style should be snake_case or CamelCase."," control$impute.val = vnapply(measures, getDefVal)","object_name_linter" -"R/utils.R",35,1,"style","Variable and function name style should be snake_case or CamelCase.","print.mlr.dump = function(x, ...) {","object_name_linter" -"R/WeightedClassesWrapper.R",92,8,"style","Variable and function name style should be snake_case or CamelCase."," pv$wcw.weight = wcw.weight","object_name_linter" -"R/WeightedClassesWrapper.R",100,5,"style","Variable and function name style should be snake_case or CamelCase."," x$wcw.param = wcw.param","object_name_linter" -"R/zzz.R",15,1,"style","Variable and function name style should be snake_case or CamelCase.",".onLoad = function(libname, pkgname) {","object_name_linter" -"R/zzz.R",20,1,"style","Variable and function name style should be snake_case or CamelCase.",".onAttach = function(libname, pkgname) {","object_name_linter" -"R/zzz.R",34,5,"style","Variable and function name style should be snake_case or CamelCase.","mlr$learner.properties = list(","object_name_linter" -"tests/testthat/helper_lint.R",279,13,"style","Variable and function name style should be snake_case or CamelCase."," linters$T.and.F.symbol = lintr::T_and_F_symbol_linter","object_name_linter" -"tests/testthat/helper_lint.R",282,13,"style","Variable and function name style should be snake_case or CamelCase."," linters$semicolon.terminator = lintr::semicolon_terminator_linter","object_name_linter" -"tests/testthat/helper_lint.R",288,13,"style","Variable and function name style should be snake_case or CamelCase."," linters$unneeded.concatenation = lintr::unneeded_concatenation_linter","object_name_linter" -"tests/testthat/test_base_BaseWrapper.R",34,41,"style","Place a space before left parenthesis, except in a function call."," makeDiscreteParam(""C"", values = 2^(-2:2)),","spaces_left_parentheses_linter" -"tests/testthat/test_base_BaseWrapper.R",35,45,"style","Place a space before left parenthesis, except in a function call."," makeDiscreteParam(""sigma"", values = 2^(-2:2))","spaces_left_parentheses_linter" -"tests/testthat/test_base_BaseWrapper.R",63,43,"style","Place a space before left parenthesis, except in a function call."," makeDiscreteParam(""C"", values = 2^(-2:2)),","spaces_left_parentheses_linter" -"tests/testthat/test_base_BaseWrapper.R",64,47,"style","Place a space before left parenthesis, except in a function call."," makeDiscreteParam(""sigma"", values = 2^(-2:2))","spaces_left_parentheses_linter" -"tests/testthat/test_base_generateHyperParsEffect.R",35,55,"style","Place a space before left parenthesis, except in a function call."," ps = makeParamSet(makeDiscreteParam(""C"", values = 2^(-2:2)))","spaces_left_parentheses_linter" -"tests/testthat/test_base_measures.R",202,3,"style","Variable and function name style should be snake_case or CamelCase."," time.surv = c(5, 10, 5, 10)","object_name_linter" -"tests/testthat/test_base_MulticlassWrapper.R",46,6,"style","Variable and function name style should be snake_case or CamelCase."," df$Sepal.Length = factor(df$Sepal.Length)","object_name_linter" -"tests/testthat/test_base_plotCritDifferences.R",33,5,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" -"tests/testthat/test_base_selectFeatures.R",17,8,"style","Variable and function name style should be snake_case or CamelCase."," ctrl$impute.val = 10","object_name_linter" -"tests/testthat/test_base_tuning.R",34,8,"style","Variable and function name style should be snake_case or CamelCase."," ctrl$impute.val = 10","object_name_linter" -"tests/testthat/test_base_tuning.R",192,7,"style","Variable and function name style should be snake_case or CamelCase."," lrn$par.set = c(lrn$par.set, long.learner.params)","object_name_linter" -"tests/testthat/test_classif_ksvm.R",26,10,"style","Variable and function name style should be snake_case or CamelCase."," pars$prob.model = TRUE","object_name_linter" -"tests/testthat/test_classif_pamr.R",20,14,"style","Variable and function name style should be snake_case or CamelCase."," parset$threshold.predict = NULL","object_name_linter" -"tests/testthat/test_regr_frbs.R",20,10,"style","Variable and function name style should be snake_case or CamelCase."," pars$data.train = regr.num.train","object_name_linter" -"tests/testthat/test_regr_mob.R",33,12,"style","Variable and function name style should be snake_case or CamelCase."," parset$term.feats = parset$part.feats = NULL","object_name_linter" -"tests/testthat/test_regr_mob.R",33,32,"style","Variable and function name style should be snake_case or CamelCase."," parset$term.feats = parset$part.feats = NULL","object_name_linter" -"tests/testthat/test_tune_tuneDesign.R",6,3,"style","Variable and function name style should be snake_case or CamelCase."," sigma.seq = 2^seq(-2, 2, length.out = reso)","object_name_linter" -"tests/testthat/test_tune_tuneGrid.R",6,3,"style","Variable and function name style should be snake_case or CamelCase."," sigma.seq = 2^seq(-2, 2, length.out = reso)","object_name_linter" -"tests/testthat/test_tune_tuneGrid.R",7,3,"style","Variable and function name style should be snake_case or CamelCase."," sigma.seq.2 = 2^seq(-2, 2, length.out = reso * 2)","object_name_linter" -"tests/testthat/test_tune_tuneGrid.R",41,7,"style","Variable and function name style should be snake_case or CamelCase."," op1$exec.time = op2$exec.time = NULL","object_name_linter" -"tests/testthat/test_tune_tuneGrid.R",41,23,"style","Variable and function name style should be snake_case or CamelCase."," op1$exec.time = op2$exec.time = NULL","object_name_linter" diff --git a/.dev/revdep_emails/mlr/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/mlr/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 819f871a1..000000000 --- a/.dev/revdep_emails/mlr/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,791 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/makeData.R",96,1,"style","Variable and function name style should be snake_case or CamelCase.","fuelSubset$UVVIS = scale(fuelSubset$UVVIS, scale = FALSE)","object_name_linter" -"inst/makeData.R",97,1,"style","Variable and function name style should be snake_case or CamelCase.","fuelSubset$NIR = scale(fuelSubset$NIR, scale = FALSE)","object_name_linter" -"R/analyzeFeatSelResult.R",95,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.na(ctrl$max.features) & (length(x) == ctrl$max.features)) {","vector_logic_linter" -"R/batchmark.R",59,5,"style","Variable and function name style should be snake_case or CamelCase."," apply.fun = getAlgoFun(learner, measures, models, keep.extract)","object_name_linter" -"R/benchmark.R",67,11,"style","Variable and function name style should be snake_case or CamelCase."," names(results.by.task[[taskname]]) = grid$learner[grid$task == taskname]","object_name_linter" -"R/BenchmarkResult_operators.R",125,7,"style","Variable and function name style should be snake_case or CamelCase."," drop.tasks = length(task.ids) == 1L","object_name_linter" -"R/BenchmarkResult_operators.R",126,7,"style","Variable and function name style should be snake_case or CamelCase."," drop.learners = length(learner.ids) == 1L","object_name_linter" -"R/BenchmarkResult_operators.R",127,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (drop.tasks | drop.learners) {","vector_logic_linter" -"R/BenchmarkResult_operators.R",129,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (drop.tasks & drop.learners) {","vector_logic_linter" -"R/BenchmarkResult_operators.R",132,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (drop.tasks & !drop.learners) {","vector_logic_linter" -"R/BenchmarkResult_operators.R",135,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!drop.tasks & drop.learners) {","vector_logic_linter" -"R/calculateConfusionMatrix.R",83,3,"style","Variable and function name style should be snake_case or CamelCase."," row.err = rowSums(mt)","object_name_linter" -"R/calculateConfusionMatrix.R",84,3,"style","Variable and function name style should be snake_case or CamelCase."," col.err = colSums(mt)","object_name_linter" -"R/calculateConfusionMatrix.R",158,5,"style","Variable and function name style should be snake_case or CamelCase."," col.err = x$relative.col[k + 1, ]","object_name_linter" -"R/calculateConfusionMatrix.R",159,5,"style","Variable and function name style should be snake_case or CamelCase."," row.err = x$relative.row[, k + 1]","object_name_linter" -"R/calculateConfusionMatrix.R",183,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/checkLearner.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," missing.props = setdiff(props, learner.props)","object_name_linter" -"R/configureMlr.R",74,3,"style","Variable and function name style should be snake_case or CamelCase."," any.change = FALSE","object_name_linter" -"R/configureMlr.R",78,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" -"R/configureMlr.R",83,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" -"R/configureMlr.R",88,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" -"R/configureMlr.R",93,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" -"R/configureMlr.R",98,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" -"R/configureMlr.R",103,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" -"R/configureMlr.R",108,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" -"R/configureMlr.R",113,5,"style","Variable and function name style should be snake_case or CamelCase."," any.change = TRUE","object_name_linter" -"R/evalOptimizationState.R",15,3,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = control$log.fun","object_name_linter" -"R/evalOptimizationState.R",50,7,"style","Variable and function name style should be snake_case or CamelCase."," th.args$pred = r$pred","object_name_linter" -"R/evalOptimizationState.R",51,7,"style","Variable and function name style should be snake_case or CamelCase."," th.args$measure = measures[[1L]]","object_name_linter" -"R/extractFDAFeatures.R",68,3,"style","Variable and function name style should be snake_case or CamelCase."," all.fds = which(names(feat.methods) == ""all"")","object_name_linter" -"R/extractFDAFeatures.R",71,5,"style","Variable and function name style should be snake_case or CamelCase."," feat.methods[all.fds] = NULL","object_name_linter" -"R/extractFDAFeaturesMethods.R",389,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(refs) | is.integer(refs)) {","vector_logic_linter" -"R/extractFDAFeaturesMethods.R",526,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(dim(df)) | vals$res.level == 1L) {","vector_logic_linter" -"R/FeatSelControl.R",106,3,"style","Variable and function name style should be snake_case or CamelCase."," max.features = asCount(max.features, na.ok = TRUE, positive = TRUE)","object_name_linter" -"R/FeatSelControl.R",108,5,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = logFunFeatSel","object_name_linter" -"R/FeatSelControl.R",110,5,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = logFunTuneMemory","object_name_linter" -"R/FeatSelControlExhaustive.R",5,3,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = ""default"") {","object_name_linter" -"R/FeatSelControlGA.R",4,24,"style","Variable and function name style should be snake_case or CamelCase."," maxit = NA_integer_, max.features = NA_integer_, comma = FALSE, mu = 10L, lambda,","object_name_linter" -"R/FeatSelControlGA.R",6,3,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = ""default"") {","object_name_linter" -"R/FeatSelControlSequential.R",4,53,"style","Variable and function name style should be snake_case or CamelCase."," alpha = 0.01, beta = -0.001, maxit = NA_integer_, max.features = NA_integer_,","object_name_linter" -"R/FilterEnsemble.R",56,3,"warning","local variable β€˜tag2df’ assigned but may not be used"," tag2df = function(tags, prefix = """") {","object_usage_linter" -"R/FilterEnsemble.R",113,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(fval.ens) = c(""name"", ""value"")","object_name_linter" -"R/FilterEnsemble.R",117,5,"style","Variable and function name style should be snake_case or CamelCase."," fval.ens$filter = ""E-min""","object_name_linter" -"R/FilterEnsemble.R",146,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(fval.ens) = c(""name"", ""value"")","object_name_linter" -"R/FilterEnsemble.R",150,5,"style","Variable and function name style should be snake_case or CamelCase."," fval.ens$filter = ""E-mean""","object_name_linter" -"R/FilterEnsemble.R",180,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(fval.ens) = c(""name"", ""value"")","object_name_linter" -"R/FilterEnsemble.R",184,5,"style","Variable and function name style should be snake_case or CamelCase."," fval.ens$filter = ""E-max""","object_name_linter" -"R/FilterEnsemble.R",213,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(fval.ens) = c(""name"", ""value"")","object_name_linter" -"R/FilterEnsemble.R",217,5,"style","Variable and function name style should be snake_case or CamelCase."," fval.ens$filter = ""E-median""","object_name_linter" -"R/FilterEnsemble.R",250,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(fval.ens) = c(""name"", ""value"")","object_name_linter" -"R/FilterEnsemble.R",254,5,"style","Variable and function name style should be snake_case or CamelCase."," fval.ens$filter = ""E-Borda""","object_name_linter" -"R/FilterEnsemble.R",290,3,"style","Variable and function name style should be snake_case or CamelCase."," all.filters = rbind(simple_filters, ensemble_filters)","object_name_linter" -"R/filterFeatures.R",170,22,"warning","no visible binding for global variable β€˜value’"," order(filter, -value)), ][[""value""]]), fun.args))","object_usage_linter" -"R/filterFeatures.R",191,47,"warning","no visible binding for global variable β€˜value’"," features = fval[with(fval, order(filter, -value)), ]","object_usage_linter" -"R/filterFeatures.R",206,3,"style","Variable and function name style should be snake_case or CamelCase."," sum.null = sum(!is.null(perc), !is.null(abs), !is.null(threshold), !is.null(fun))","object_name_linter" -"R/friedmanPostHocTestBMR.R",74,3,"style","Variable and function name style should be snake_case or CamelCase."," q.nemenyi = qtukey(1 - p.value, n.learners, 1e+06) / sqrt(2L)","object_name_linter" -"R/friedmanPostHocTestBMR.R",76,3,"style","Variable and function name style should be snake_case or CamelCase."," q.bd = qtukey(1L - (p.value / (n.learners - 1L)), 2L, 1e+06) / sqrt(2L)","object_name_linter" -"R/generateCalibration.R",101,7,"style","Variable and function name style should be snake_case or CamelCase."," break.points = hist(df$Probability, breaks = breaks, plot = FALSE)$breaks","object_name_linter" -"R/generateCalibration.R",121,3,"style","Variable and function name style should be snake_case or CamelCase."," max.bin = sapply(stri_split(levels(proportion$bin), regex = "",|]|\\)""),","object_name_linter" -"R/generateCalibration.R",201,5,"style","Variable and function name style should be snake_case or CamelCase."," top.data$x = jitter(as.numeric(top.data$bin))","object_name_linter" -"R/generateCalibration.R",204,5,"style","Variable and function name style should be snake_case or CamelCase."," bottom.data$x = jitter(as.numeric(bottom.data$bin))","object_name_linter" -"R/generateFilterValues.R",141,7,"style","Variable and function name style should be snake_case or CamelCase."," missing.score = setdiff(fn, names(x))","object_name_linter" -"R/generateFilterValues.R",165,44,"warning","no visible binding for global variable β€˜value’"," print(x$data[with(x$data, order(filter, -value)), ])","object_usage_linter" -"R/generateHyperParsEffect.R",304,7,"style","Variable and function name style should be snake_case or CamelCase."," col.name = stri_split_fixed(col, "".test.mean"", omit_empty = TRUE)[[1]]","object_name_linter" -"R/generateHyperParsEffect.R",353,9,"style","Variable and function name style should be snake_case or CamelCase."," col.name = stri_split_fixed(col, "".test.mean"", omit_empty = TRUE)[[1]]","object_name_linter" -"R/generateLearningCurve.R",135,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((color == ""learner"" & nlearn == 1L) | (color == ""measure"" & nmeas == 1L)) {","vector_logic_linter" -"R/generateLearningCurve.R",135,43,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((color == ""learner"" & nlearn == 1L) | (color == ""measure"" & nmeas == 1L)) {","vector_logic_linter" -"R/generateLearningCurve.R",135,65,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((color == ""learner"" & nlearn == 1L) | (color == ""measure"" & nmeas == 1L)) {","vector_logic_linter" -"R/generateLearningCurve.R",138,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((facet == ""learner"" & nlearn == 1L) | (facet == ""measure"" & nmeas == 1L)) {","vector_logic_linter" -"R/generateLearningCurve.R",138,43,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((facet == ""learner"" & nlearn == 1L) | (facet == ""measure"" & nmeas == 1L)) {","vector_logic_linter" -"R/generateLearningCurve.R",138,65,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((facet == ""learner"" & nlearn == 1L) | (facet == ""measure"" & nmeas == 1L)) {","vector_logic_linter" -"R/generatePartialDependence.R",113,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (obj$learner$predict.type == ""se"" & individual) {","vector_logic_linter" -"R/generatePartialDependence.R",116,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (obj$learner$predict.type == ""se"" & derivative) {","vector_logic_linter" -"R/generatePartialDependence.R",144,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (derivative & interaction) {","vector_logic_linter" -"R/generatePartialDependence.R",166,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(names(test.fun)) & !individual) {","vector_logic_linter" -"R/generatePartialDependence.R",406,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (obj$interaction & length(obj$features) > 2L & geom != ""tile"") {","vector_logic_linter" -"R/generatePartialDependence.R",406,51,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (obj$interaction & length(obj$features) > 2L & geom != ""tile"") {","vector_logic_linter" -"R/generatePartialDependence.R",444,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(features) > 1L & !(length(features) == 2L & geom == ""tile"")) {","vector_logic_linter" -"R/generatePartialDependence.R",444,58,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(features) > 1L & !(length(features) == 2L & geom == ""tile"")) {","vector_logic_linter" -"R/generatePartialDependence.R",497,53,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (obj$task.desc$type %in% c(""regr"", ""surv"") |","vector_logic_linter" -"R/generatePartialDependence.R",498,42,"warning","Conditional expressions require scalar logical operators (&& and ||)"," (obj$task.desc$type == ""classif"" & length(obj$task.desc$class.levels) <= 2L)) {","vector_logic_linter" -"R/generatePartialDependence.R",506,53,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (obj$task.desc$type %in% c(""regr"", ""surv"") |","vector_logic_linter" -"R/generatePartialDependence.R",507,42,"warning","Conditional expressions require scalar logical operators (&& and ||)"," (obj$task.desc$type == ""classif"" & length(obj$task.desc$class.levels) <= 2L)) {","vector_logic_linter" -"R/generateThreshVsPerf.R",203,3,"style","`else` should come on the same line as the previous `}`."," else if (length(obj$measures) == 1L) {","brace_linter" -"R/getCaretParamSet.R",95,5,"style","Variable and function name style should be snake_case or CamelCase."," par.vals[vlapply(par.vals, testIntegerish)] =","object_name_linter" -"R/getNestedTuneResults.R",53,5,"style","Variable and function name style should be snake_case or CamelCase."," op.dfs[[i]][, ""iter""] = i","object_name_linter" -"R/getResamplingIndices.R",42,5,"style","Variable and function name style should be snake_case or CamelCase."," outer.inds = object$pred$instance[c(""train.inds"", ""test.inds"")]","object_name_linter" -"R/helpers_FDGAMBoost.R",46,11,"style","Variable and function name style should be snake_case or CamelCase."," names(fd.grids) = fdns","object_name_linter" -"R/helpers_FDGAMBoost.R",55,7,"warning","local variable β€˜gn’ assigned but may not be used"," gn = stri_paste(fdn, "".grid"")","object_usage_linter" -"R/helpers_FDGAMBoost.R",57,7,"style","Variable and function name style should be snake_case or CamelCase."," mat.list[[fdn]] = mdata[, fdn]","object_name_linter" -"R/helpers_FDGAMBoost.R",81,3,"style","Variable and function name style should be snake_case or CamelCase."," mat.list[[targetname]] = mdata[, targetname]","object_name_linter" -"R/helpers_FDGAMBoost.R",112,11,"style","Variable and function name style should be snake_case or CamelCase."," names(fd.grids) = fdns","object_name_linter" -"R/helpers_FDGAMBoost.R",123,7,"style","Variable and function name style should be snake_case or CamelCase."," mat.list[[fdn]] = tdata[, fdn]","object_name_linter" -"R/helpers_FDGAMBoost.R",137,5,"style","Variable and function name style should be snake_case or CamelCase."," mat.list[[fsn]] = as.vector(as.matrix(tdata[, fsn, drop = FALSE]))","object_name_linter" -"R/helpers_FDGAMBoost.R",143,3,"style","Variable and function name style should be snake_case or CamelCase."," mat.list[[tn]] = tdata[, tn]","object_name_linter" -"R/helpers.R",59,11,"style","Variable and function name style should be snake_case or CamelCase."," attr(x, ""mlr.train.info"") = info","object_name_linter" -"R/helpers.R",113,3,"style","Variable and function name style should be snake_case or CamelCase."," meas.names[dupes] = new.names","object_name_linter" -"R/helpLearner.R",70,7,"style","Variable and function name style should be snake_case or CamelCase."," next.learner = current.learner$next.learner","object_name_linter" -"R/helpLearner.R",99,3,"style","Variable and function name style should be snake_case or CamelCase."," all.param = getParamIds(learner$par.set)","object_name_linter" -"R/helpLearner.R",217,11,"style","Variable and function name style should be snake_case or CamelCase."," help.list[[par.name]] = stri_join(""Argument of: "",","object_name_linter" -"R/Impute.R",257,9,"style","Variable and function name style should be snake_case or CamelCase."," names(dummy.cols) = sprintf(""%s.dummy"", desc$dummies)","object_name_linter" -"R/Learner_properties.R",86,3,"style","Variable and function name style should be snake_case or CamelCase."," all.props = c(listTaskTypes(), ""any"")","object_name_linter" -"R/Learner.R",7,11,"style","Variable and function name style should be snake_case or CamelCase."," names(par.vals) = character(0L)","object_name_linter" -"R/listLearners.R",6,3,"warning","local variable β€˜slots’ assigned but may not be used"," slots = c(""cl"", ""name"", ""short.name"", ""package"", ""properties"", ""note"")","object_usage_linter" -"R/Measure_colAUC.R",42,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (n1 > 0 & n2 > 0) {","vector_logic_linter" -"R/measures.R",808,3,"style","Variable and function name style should be snake_case or CamelCase."," class.values = seq_along(levels(truth)) - 1L","object_name_linter" -"R/measures.R",1450,5,"style","Variable and function name style should be snake_case or CamelCase."," max.time = assertNumber(extra.args$max.time, null.ok = TRUE) %??% max(getTaskTargets(task)[, 1L])","object_name_linter" -"R/measures.R",1471,5,"style","Variable and function name style should be snake_case or CamelCase."," max.time = assertNumber(extra.args$max.time, null.ok = TRUE) %??% max(getTaskTargets(task)[, 1L])","object_name_linter" -"R/measures.R",1499,5,"style","Variable and function name style should be snake_case or CamelCase."," max.time = extra.args$max.time %??% max(newdata[[tn[1L]]])","object_name_linter" -"R/mergeBenchmarkResults.R",40,3,"style","Variable and function name style should be snake_case or CamelCase."," all.combos = expand.grid(task.id = task.ids, learner.id = learner.ids)","object_name_linter" -"R/mergeBenchmarkResults.R",41,3,"style","Variable and function name style should be snake_case or CamelCase."," all.combos = stri_paste(all.combos$task.id, all.combos$learner.id, sep = "" - "")","object_name_linter" -"R/mergeBenchmarkResults.R",67,7,"style","Variable and function name style should be snake_case or CamelCase."," res.merged[[i]][[j]] = addRRMeasure(res.merged[[i]][[j]], measures.merged)","object_name_linter" -"R/ModelMultiplexerParamSet.R",69,7,"style","Variable and function name style should be snake_case or CamelCase."," for.learner = stri_replace(found, """", regex = long.pid.end)","object_name_linter" -"R/ModelMultiplexerParamSet.R",70,7,"style","Variable and function name style should be snake_case or CamelCase."," for.pars = pss[[for.learner]]$pars","object_name_linter" -"R/ModelMultiplexerParamSet.R",71,7,"style","Variable and function name style should be snake_case or CamelCase."," for.pars[[pid]] = p","object_name_linter" -"R/MulticlassWrapper.R",148,3,"style","Variable and function name style should be snake_case or CamelCase."," row.inds = lapply(binary.targets, function(v) which(v != 0))","object_name_linter" -"R/MulticlassWrapper.R",149,9,"style","Variable and function name style should be snake_case or CamelCase."," names(row.inds) = NULL","object_name_linter" -"R/MultilabelDBRWrapper.R",48,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(true.label.data) = setdiff(targets, tn)","object_name_linter" -"R/MultilabelDBRWrapper.R",51,5,"style","Variable and function name style should be snake_case or CamelCase."," models.meta[[tn]] = train(.learner$next.learner, ctask, weights = .weights)","object_name_linter" -"R/MultilabelNestedStackingWrapper.R",67,7,"style","Variable and function name style should be snake_case or CamelCase."," data.nst[[tnprevious]] = predlabel","object_name_linter" -"R/MultilabelStackingWrapper.R",77,12,"style","Variable and function name style should be snake_case or CamelCase."," colnames(pred.lvl1) = paste(.model$task.desc$target, "".1"", sep = """")","object_name_linter" -"R/options.R",11,9,"style","Variable and function name style should be snake_case or CamelCase."," names(mlr.options) = stri_sub(names(mlr.options), from = 5L)","object_name_linter" -"R/plotBMRBoxplots.R",41,13,"style","Variable and function name style should be snake_case or CamelCase."," names(learner.short.names) = learner.ids","object_name_linter" -"R/plotBMRRanksAsBarChart.R",33,18,"style","Variable and function name style should be snake_case or CamelCase."," pos = ""stack"", order.lrns = NULL, order.tsks = NULL, pretty.names = TRUE) {","object_name_linter" -"R/plotBMRRanksAsBarChart.R",33,37,"style","Variable and function name style should be snake_case or CamelCase."," pos = ""stack"", order.lrns = NULL, order.tsks = NULL, pretty.names = TRUE) {","object_name_linter" -"R/plotBMRRanksAsBarChart.R",50,11,"style","Variable and function name style should be snake_case or CamelCase."," names(learner.short.names) = learner.ids","object_name_linter" -"R/plotCritDifferences.R",117,5,"style","Variable and function name style should be snake_case or CamelCase."," nem.df$y = seq(from = 0.1, to = 0.35, length.out = dim(nem.df)[1])","object_name_linter" -"R/predict.R",111,5,"style","Variable and function name style should be snake_case or CamelCase."," debug.seed = getMlrOption(""debug.seed"", NULL)","object_name_linter" -"R/Prediction_operators.R",2,40,"style","Variable and function name style should be snake_case or CamelCase.","as.data.frame.Prediction = function(x, row.names = NULL, optional = FALSE, ...) {","object_name_linter" -"R/PreprocWrapperCaret.R",54,5,"style","Variable and function name style should be snake_case or CamelCase."," all.methods = c(","object_name_linter" -"R/PreprocWrapperCaret.R",102,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (par.vals$ppc.bagImpute | par.vals$ppc.knnImpute | par.vals$ppc.medianImpute) {","vector_logic_linter" -"R/PreprocWrapperCaret.R",102,55,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (par.vals$ppc.bagImpute | par.vals$ppc.knnImpute | par.vals$ppc.medianImpute) {","vector_logic_linter" -"R/relativeOverfitting.R",49,3,"warning","local variable β€˜mids’ assigned but may not be used"," mids = vcapply(measures, function(m) m$id)","object_usage_linter" -"R/relativeOverfitting.R",76,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.permuted$data = data.frame(truth = rep(c(predish$data$truth, pred.train$data$truth), each = nrows),","object_name_linter" -"R/resample.R",112,5,"style","Variable and function name style should be snake_case or CamelCase."," more.args$weights = weights","object_name_linter" -"R/resample.R",114,5,"style","Variable and function name style should be snake_case or CamelCase."," more.args$weights = getTaskWeights(task)","object_name_linter" -"R/resample.R",163,5,"style","Variable and function name style should be snake_case or CamelCase."," err.msgs[1L] = getFailureModelMsg(m)","object_name_linter" -"R/resample.R",164,5,"style","Variable and function name style should be snake_case or CamelCase."," err.dumps$train = getFailureModelDump(m)","object_name_linter" -"R/resample.R",182,35,"style","Variable and function name style should be snake_case or CamelCase."," if (!is.na(pred.train$error)) err.msgs[2L] = pred.train$error","object_name_linter" -"R/resample.R",184,11,"style","Variable and function name style should be snake_case or CamelCase."," names(ms.train) = vcapply(measures, measureAggrName)","object_name_linter" -"R/resample.R",185,5,"style","Variable and function name style should be snake_case or CamelCase."," err.dumps$predict.train = getPredictionDump(pred.train)","object_name_linter" -"R/resample.R",188,34,"style","Variable and function name style should be snake_case or CamelCase."," if (!is.na(pred.test$error)) err.msgs[2L] = pred.test$error","object_name_linter" -"R/resample.R",190,11,"style","Variable and function name style should be snake_case or CamelCase."," names(ms.test) = vcapply(measures, measureAggrName)","object_name_linter" -"R/resample.R",191,5,"style","Variable and function name style should be snake_case or CamelCase."," err.dumps$predict.test = getPredictionDump(pred.test)","object_name_linter" -"R/resample.R",200,35,"style","Variable and function name style should be snake_case or CamelCase."," if (!is.na(pred.train$error)) err.msgs[2L] = pred.train$error","object_name_linter" -"R/resample.R",202,11,"style","Variable and function name style should be snake_case or CamelCase."," names(ms.train) = vcapply(measures, measureAggrName)","object_name_linter" -"R/resample.R",203,5,"style","Variable and function name style should be snake_case or CamelCase."," err.dumps$predict.train = getPredictionDump(pred.train)","object_name_linter" -"R/resample.R",206,34,"style","Variable and function name style should be snake_case or CamelCase."," if (!is.na(pred.test$error)) err.msgs[2L] = paste(err.msgs[2L], pred.test$error)","object_name_linter" -"R/resample.R",208,11,"style","Variable and function name style should be snake_case or CamelCase."," names(ms.test) = vcapply(measures, measureAggrName)","object_name_linter" -"R/resample.R",209,5,"style","Variable and function name style should be snake_case or CamelCase."," err.dumps$predict.test = getPredictionDump(pred.test)","object_name_linter" -"R/resample.R",214,5,"style","Variable and function name style should be snake_case or CamelCase."," err.dumps$predict.train = NULL","object_name_linter" -"R/resample.R",215,5,"style","Variable and function name style should be snake_case or CamelCase."," err.dumps$predict.test = NULL","object_name_linter" -"R/resample.R",274,12,"style","Variable and function name style should be snake_case or CamelCase."," colnames(ms.test) = mids","object_name_linter" -"R/resample.R",275,12,"style","Variable and function name style should be snake_case or CamelCase."," rownames(ms.test) = NULL","object_name_linter" -"R/resample.R",277,12,"style","Variable and function name style should be snake_case or CamelCase."," colnames(ms.train) = mids","object_name_linter" -"R/resample.R",278,12,"style","Variable and function name style should be snake_case or CamelCase."," rownames(ms.train) = NULL","object_name_linter" -"R/resample.R",282,12,"style","Variable and function name style should be snake_case or CamelCase."," rownames(err.msgs) = NULL","object_name_linter" -"R/resample.R",283,12,"style","Variable and function name style should be snake_case or CamelCase."," colnames(err.msgs) = c(""train"", ""predict"")","object_name_linter" -"R/ResampleInstance.R",129,9,"style","Variable and function name style should be snake_case or CamelCase."," train.inds[[i]] = lapply(inst$train.inds, function(j) ci[j])","object_name_linter" -"R/ResampleInstance.R",130,9,"style","Variable and function name style should be snake_case or CamelCase."," test.inds[[i]] = lapply(inst$test.inds, function(j) ci[j])","object_name_linter" -"R/ResampleInstance.R",132,9,"style","Variable and function name style should be snake_case or CamelCase."," train.inds[[i]] = test.inds[[i]] = replicate(desc$iters, integer(0L), simplify = FALSE)","object_name_linter" -"R/ResampleInstance.R",132,27,"style","Variable and function name style should be snake_case or CamelCase."," train.inds[[i]] = test.inds[[i]] = replicate(desc$iters, integer(0L), simplify = FALSE)","object_name_linter" -"R/ResampleInstances.R",53,7,"style","Variable and function name style should be snake_case or CamelCase."," test.inds[[index]] = NULL","object_name_linter" -"R/ResampleResult_operators.R",102,7,"style","Variable and function name style should be snake_case or CamelCase."," p.split[[i]]$time = time[i]","object_name_linter" -"R/ResampleResult_operators.R",129,3,"style","Variable and function name style should be snake_case or CamelCase."," missing.measures = setdiff(measures.id, colnames(res$measures.test))","object_name_linter" -"R/RLearner_classif_dcSVM.R",44,5,"style","Variable and function name style should be snake_case or CamelCase."," max.levels = 1","object_name_linter" -"R/RLearner_classif_dcSVM.R",47,5,"style","Variable and function name style should be snake_case or CamelCase."," max.levels = pars$max.levels","object_name_linter" -"R/RLearner_classif_dcSVM.R",55,3,"style","Variable and function name style should be snake_case or CamelCase."," min.cluster = ceiling(5 * m / (k^max.levels))","object_name_linter" -"R/RLearner_classif_evtree.R",52,5,"warning","local variable β€˜p’ assigned but may not be used"," p = predict(.model$learner.model, newdata = .newdata, type = ""prob"", ...)","object_usage_linter" -"R/RLearner_classif_fdausc.kernel.R",43,3,"warning","local variable β€˜trainfun’ assigned but may not be used"," trainfun = getFromNamespace(""classif.kernel"", ""fda.usc"")","object_usage_linter" -"R/RLearner_classif_fdausc.kernel.R",44,3,"warning","local variable β€˜mod’ assigned but may not be used"," mod = do.call(""trainfun"",","object_usage_linter" -"R/RLearner_classif_fdausc.knn.R",37,3,"warning","local variable β€˜trainfun’ assigned but may not be used"," trainfun = getFromNamespace(""classif.knn"", ""fda.usc"")","object_usage_linter" -"R/RLearner_classif_fdausc.knn.R",39,3,"warning","local variable β€˜mod’ assigned but may not be used"," mod = suppressAll(do.call(""trainfun"",","object_usage_linter" -"R/RLearner_classif_fdausc.np.R",42,3,"warning","local variable β€˜trainfun’ assigned but may not be used"," trainfun = getFromNamespace(""classif.np"", ""fda.usc"")","object_usage_linter" -"R/RLearner_classif_featureless.R",22,3,"warning","local variable β€˜lvls’ assigned but may not be used"," lvls = getTaskClassLevels(.task)","object_usage_linter" -"R/RLearner_classif_fnn.R",32,11,"style","Variable and function name style should be snake_case or CamelCase."," attr(p, ""nn.index"") = NULL","object_name_linter" -"R/RLearner_classif_fnn.R",33,11,"style","Variable and function name style should be snake_case or CamelCase."," attr(p, ""nn.dist"") = NULL","object_name_linter" -"R/RLearner_classif_h2odeeplearning.R",271,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(p.df)[pcol] = stri_sub(colnames(p.df)[pcol], 2L)","object_name_linter" -"R/RLearner_classif_h2odeeplearning.R",277,5,"style","Variable and function name style should be snake_case or CamelCase."," p.df$predict = NULL","object_name_linter" -"R/RLearner_classif_h2ogbm.R",63,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(p.df)[pcol] = stri_sub(colnames(p.df)[pcol], 2L)","object_name_linter" -"R/RLearner_classif_h2ogbm.R",69,5,"style","Variable and function name style should be snake_case or CamelCase."," p.df$predict = NULL","object_name_linter" -"R/RLearner_classif_h2oglm.R",66,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(p.df)[pcol] = stri_sub(colnames(p.df)[pcol], 2L)","object_name_linter" -"R/RLearner_classif_h2oglm.R",72,5,"style","Variable and function name style should be snake_case or CamelCase."," p.df$predict = NULL","object_name_linter" -"R/RLearner_classif_h2orandomForest.R",55,14,"style","Variable and function name style should be snake_case or CamelCase."," colnames(p.df)[pcol] = stri_sub(colnames(p.df)[pcol], 2L)","object_name_linter" -"R/RLearner_classif_h2orandomForest.R",61,5,"style","Variable and function name style should be snake_case or CamelCase."," p.df$predict = NULL","object_name_linter" -"R/RLearner_classif_lvq1.R",20,3,"style","Variable and function name style should be snake_case or CamelCase."," cdbk.args$x = d$data","object_name_linter" -"R/RLearner_classif_lvq1.R",21,3,"style","Variable and function name style should be snake_case or CamelCase."," cdbk.args$cl = d$target","object_name_linter" -"R/RLearner_classif_lvq1.R",25,3,"style","Variable and function name style should be snake_case or CamelCase."," lvq.args$x = d$data","object_name_linter" -"R/RLearner_classif_lvq1.R",26,3,"style","Variable and function name style should be snake_case or CamelCase."," lvq.args$cl = d$target","object_name_linter" -"R/RLearner_classif_lvq1.R",27,3,"style","Variable and function name style should be snake_case or CamelCase."," lvq.args$codebk = codebk","object_name_linter" -"R/RLearner_regr_bcart.R",34,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(d$data, function(x) class(x))","object_name_linter" -"R/RLearner_regr_bcart.R",35,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" -"R/RLearner_regr_bcart.R",51,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(.newdata, function(x) class(x))","object_name_linter" -"R/RLearner_regr_bcart.R",52,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" -"R/RLearner_regr_btgp.R",42,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(d$data, function(x) class(x))","object_name_linter" -"R/RLearner_regr_btgp.R",43,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" -"R/RLearner_regr_btgp.R",59,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(.newdata, function(x) class(x))","object_name_linter" -"R/RLearner_regr_btgp.R",60,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" -"R/RLearner_regr_btgpllm.R",44,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(d$data, function(x) class(x))","object_name_linter" -"R/RLearner_regr_btgpllm.R",45,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" -"R/RLearner_regr_btgpllm.R",61,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(.newdata, function(x) class(x))","object_name_linter" -"R/RLearner_regr_btgpllm.R",62,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" -"R/RLearner_regr_btlm.R",36,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(d$data, function(x) class(x))","object_name_linter" -"R/RLearner_regr_btlm.R",37,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" -"R/RLearner_regr_btlm.R",53,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(.newdata, function(x) class(x))","object_name_linter" -"R/RLearner_regr_btlm.R",54,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" -"R/RLearner_regr_evtree.R",51,3,"warning","local variable β€˜p’ assigned but may not be used"," p = predict(.model$learner.model, newdata = .newdata, ...)","object_usage_linter" -"R/RLearner_regr_randomForest.R",88,3,"style","Variable and function name style should be snake_case or CamelCase."," single.model = getLearnerModel(.model)$single.model # get raw RF model","object_name_linter" -"R/RLearner_surv_gamboost.R",47,5,"warning","local variable β€˜model’ assigned but may not be used"," model = mboost::gamboost(f, data = data, control = ctrl, family = family, ...)","object_usage_linter" -"R/selectFeaturesGA.R",24,10,"style","Variable and function name style should be snake_case or CamelCase."," mode(pop.featmat) = ""integer""","object_name_linter" -"R/smote.R",79,9,"style","Variable and function name style should be snake_case or CamelCase."," x.min.matrix[, i] = as.numeric(as.integer(x.min.matrix[, i]))","object_name_linter" -"R/smote.R",85,16,"style","Variable and function name style should be snake_case or CamelCase."," storage.mode(x.min.matrix) = ""numeric""","object_name_linter" -"R/smote.R",100,13,"style","Variable and function name style should be snake_case or CamelCase."," x.scaled[, j] = (x.scaled[, j] != 0)","object_name_linter" -"R/smote.R",128,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/smote.R",131,10,"style","Variable and function name style should be snake_case or CamelCase."," diag(minclass.dist) = NA","object_name_linter" -"R/StackedLearner.R",106,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(resampling) & method != ""stack.cv"") {","vector_logic_linter" -"R/StackedLearner.R",124,55,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((method == ""average"" || method == ""hill.climb"") & (!is.null(super.learner) || is.null(predict.type))) {","vector_logic_linter" -"R/StackedLearner.R",127,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (method != ""average"" & method != ""hill.climb"" & is.null(super.learner)) {","vector_logic_linter" -"R/StackedLearner.R",127,52,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (method != ""average"" & method != ""hill.climb"" & is.null(super.learner)) {","vector_logic_linter" -"R/StackedLearner.R",132,55,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if ((method == ""average"" || method == ""hill.climb"") & use.feat) {","vector_logic_linter" -"R/StackedLearner.R",327,5,"style","Variable and function name style should be snake_case or CamelCase."," base.models[[i]] = model","object_name_linter" -"R/StackedLearner.R",349,5,"style","Variable and function name style should be snake_case or CamelCase."," base.models[[i]] = model","object_name_linter" -"R/StackedLearner.R",396,5,"style","Variable and function name style should be snake_case or CamelCase."," base.models[[i]] = train(bl, task)","object_name_linter" -"R/StackedLearner.R",475,5,"style","Variable and function name style should be snake_case or CamelCase."," base.models[[i]] = train(bl, task)","object_name_linter" -"R/StackedLearner.R",599,16,"style","Variable and function name style should be snake_case or CamelCase."," colnames(pred.return) = td$class.levels","object_name_linter" -"R/train.R",44,5,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," } # I believe this is a bug, see #2098","brace_linter" -"R/train.R",45,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/train.R",85,5,"style","Variable and function name style should be snake_case or CamelCase."," debug.seed = getMlrOption(""debug.seed"", NULL)","object_name_linter" -"R/train.R",113,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.levels = getTaskFactorLevels(task)","object_name_linter" -"R/tuneCMAES.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," ctrl.cmaes$lambda = 4 + floor(3 * log(N))","object_name_linter" -"R/tuneCMAES.R",42,3,"style","Variable and function name style should be snake_case or CamelCase."," ctrl.cmaes$maxit = maxit","object_name_linter" -"R/TuneControl.R",39,5,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = logFunTune","object_name_linter" -"R/TuneControl.R",41,5,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = logFunTuneMemory","object_name_linter" -"R/tuneIrace.R",37,3,"style","Variable and function name style should be snake_case or CamelCase."," log.file = tempfile()","object_name_linter" -"R/TuneMultiCritControl.R",47,5,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = logFunTune","object_name_linter" -"R/TuneMultiCritControl.R",49,5,"style","Variable and function name style should be snake_case or CamelCase."," log.fun = logFunTuneMemory","object_name_linter" -"R/utils_imbalancy.R",7,3,"style","Variable and function name style should be snake_case or CamelCase."," min.name = ns[j.small]","object_name_linter" -"R/utils_imbalancy.R",8,3,"style","Variable and function name style should be snake_case or CamelCase."," max.name = ns[-j.small]","object_name_linter" -"R/WeightedClassesWrapper.R",113,11,"style","Variable and function name style should be snake_case or CamelCase."," names(wcw.weight) = c(td$positive, td$negative)","object_name_linter" -"R/WeightedClassesWrapper.R",116,11,"style","Variable and function name style should be snake_case or CamelCase."," names(wcw.weight) = levs","object_name_linter" -"tests/testthat/helper_helpers.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," cv.instance$train.inds[[i]] = inds[[i]]","object_name_linter" -"tests/testthat/helper_helpers.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," cv.instance$test.inds[[i]] = setdiff(1:size, inds[[i]])","object_name_linter" -"tests/testthat/helper_helpers.R",39,5,"style","Variable and function name style should be snake_case or CamelCase."," bs.instance$train.inds[[i]] = inds[[i]]","object_name_linter" -"tests/testthat/helper_helpers.R",40,5,"style","Variable and function name style should be snake_case or CamelCase."," bs.instance$test.inds[[i]] = setdiff(1:size, inds[[i]])","object_name_linter" -"tests/testthat/helper_helpers.R",96,3,"warning","local variable β€˜train’ assigned but may not be used"," train = df[inds, ]","object_usage_linter" -"tests/testthat/helper_helpers.R",97,3,"warning","local variable β€˜test’ assigned but may not be used"," test = df[-inds, ]","object_usage_linter" -"tests/testthat/helper_helpers.R",102,5,"warning","no visible global function definition for β€˜testSimple’"," testSimple(t.name, df, target, train.inds, old.predicts, parset)","object_usage_linter" -"tests/testthat/helper_helpers.R",123,21,"warning","no visible binding for global variable β€˜old.predicts’"," expect_s3_class(old.predicts, ""try-error"")","object_usage_linter" -"tests/testthat/helper_helpers.R",128,13,"style","Variable and function name style should be snake_case or CamelCase."," names(old.probs) = NULL","object_name_linter" -"tests/testthat/helper_helpers.R",138,28,"style","Variable and function name style should be snake_case or CamelCase."," colnames(p) = colnames(old.probs) = NULL","object_name_linter" -"tests/testthat/helper_helpers.R",139,28,"style","Variable and function name style should be snake_case or CamelCase."," rownames(p) = rownames(old.probs) = NULL","object_name_linter" -"tests/testthat/helper_helpers.R",140,11,"style","Variable and function name style should be snake_case or CamelCase."," class(old.probs) = NULL","object_name_linter" -"tests/testthat/helper_helpers.R",162,21,"warning","no visible binding for global variable β€˜old.predicts’"," expect_s3_class(old.predicts, ""try-error"")","object_usage_linter" -"tests/testthat/helper_helpers.R",167,13,"style","Variable and function name style should be snake_case or CamelCase."," names(old.probs) = NULL","object_name_linter" -"tests/testthat/helper_helpers.R",177,28,"style","Variable and function name style should be snake_case or CamelCase."," colnames(p) = colnames(old.probs) = NULL","object_name_linter" -"tests/testthat/helper_helpers.R",178,28,"style","Variable and function name style should be snake_case or CamelCase."," rownames(p) = rownames(old.probs) = NULL","object_name_linter" -"tests/testthat/helper_helpers.R",179,11,"style","Variable and function name style should be snake_case or CamelCase."," class(old.probs) = NULL","object_name_linter" -"tests/testthat/helper_helpers.R",180,44,"warning","no visible binding for global variable β€˜tol’"," expect_equal(p, old.probs, tolerance = tol)","object_usage_linter" -"tests/testthat/helper_helpers.R",187,3,"warning","local variable β€˜train’ assigned but may not be used"," train = df[inds, ]","object_usage_linter" -"tests/testthat/helper_helpers.R",188,3,"warning","local variable β€˜test’ assigned but may not be used"," test = df[-inds, ]","object_usage_linter" -"tests/testthat/helper_helpers.R",193,5,"warning","no visible global function definition for β€˜testProb’"," testProb(t.name, df, target, train.inds, old.probs, parset)","object_usage_linter" -"tests/testthat/helper_helpers.R",201,3,"warning","local variable β€˜train’ assigned but may not be used"," train = df[inds, ]","object_usage_linter" -"tests/testthat/helper_helpers.R",202,3,"warning","local variable β€˜test’ assigned but may not be used"," test = df[-inds, ]","object_usage_linter" -"tests/testthat/helper_helpers.R",207,5,"warning","no visible global function definition for β€˜testProbWithTol’"," testProbWithTol(t.name, df, target, train.inds, old.probs, parset, tolerance = tol)","object_usage_linter" -"tests/testthat/helper_helpers.R",207,84,"warning","no visible binding for global variable β€˜tol’"," testProbWithTol(t.name, df, target, train.inds, old.probs, parset, tolerance = tol)","object_usage_linter" -"tests/testthat/helper_helpers.R",261,5,"warning","no visible global function definition for β€˜testCV’"," testCV(t.name, df, target, folds, parset, tune.train, tune.predict)","object_usage_linter" -"tests/testthat/helper_helpers.R",313,44,"warning","no visible binding for global variable β€˜ns.svg’"," nodes = XML::getNodeSet(doc, text.paths, ns.svg)","object_usage_linter" -"tests/testthat/helper_learners_all.R",24,3,"warning","local variable β€˜rin’ assigned but may not be used"," rin = makeResampleInstance(""Holdout"", task = task)","object_usage_linter" -"tests/testthat/helper_learners_all.R",128,3,"warning","no visible global function definition for β€˜testBasicLearnerProperties’"," testBasicLearnerProperties(lrn = lrn, task = task, hyperpars = hyperpars)","object_usage_linter" -"tests/testthat/helper_learners_all.R",145,3,"warning","no visible global function definition for β€˜testBasicLearnerProperties’"," testBasicLearnerProperties(lrn = lrn, task = task, hyperpars = hyperpars)","object_usage_linter" -"tests/testthat/helper_learners_all.R",163,3,"warning","no visible global function definition for β€˜testBasicLearnerProperties’"," testBasicLearnerProperties(lrn = lrn, task = task, hyperpars = hyperpars)","object_usage_linter" -"tests/testthat/helper_learners_all.R",236,3,"warning","local variable β€˜ses’ assigned but may not be used"," ses = getPredictionSE(res$pred)","object_usage_linter" -"tests/testthat/helper_objects.R",50,1,"style","Variable and function name style should be snake_case or CamelCase.","multilabel.df[, ""y1""] = rep(c(TRUE, FALSE), 75L)","object_name_linter" -"tests/testthat/helper_objects.R",51,1,"style","Variable and function name style should be snake_case or CamelCase.","multilabel.df[, ""y2""] = rep(c(FALSE, TRUE), 75L)","object_name_linter" -"tests/testthat/helper_objects.R",101,1,"style","Variable and function name style should be snake_case or CamelCase.","regr.na.num.df[1, 1] = NA","object_name_linter" -"tests/testthat/helper_objects.R",125,3,"style","Variable and function name style should be snake_case or CamelCase."," obs.time[i] = q","object_name_linter" -"tests/testthat/helper_objects.R",126,3,"style","Variable and function name style should be snake_case or CamelCase."," cens.time[i] = FALSE","object_name_linter" -"tests/testthat/helper_objects.R",222,1,"style","Variable and function name style should be snake_case or CamelCase.","task.filters.rank$env$data = structure(list(trt = c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1,","object_name_linter" -"tests/testthat/test_base_benchmark.R",358,3,"style","Variable and function name style should be snake_case or CamelCase."," stop.learner = makeLearner(""classif.__mlrmocklearners__3"",","object_name_linter" -"tests/testthat/test_base_benchmark.R",360,3,"style","Variable and function name style should be snake_case or CamelCase."," stop.learner = makeFilterWrapper(stop.learner,","object_name_linter" -"tests/testthat/test_base_benchmark.R",363,3,"style","Variable and function name style should be snake_case or CamelCase."," stop.learner = makeTuneWrapper(stop.learner,","object_name_linter" -"tests/testthat/test_base_createDummyFeatures.R",22,3,"style","Variable and function name style should be snake_case or CamelCase."," dummy.task$env = NULL","object_name_linter" -"tests/testthat/test_base_createDummyFeatures.R",23,3,"style","Variable and function name style should be snake_case or CamelCase."," iris.task$env = NULL","object_name_linter" -"tests/testthat/test_base_getHyperPars.R",8,9,"style","Variable and function name style should be snake_case or CamelCase."," names(named.list) = character(0)","object_name_linter" -"tests/testthat/test_base_measures.R",167,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.regr$data$response = pred.art.regr","object_name_linter" -"tests/testthat/test_base_measures.R",177,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.classif$data$response = pred.art.classif","object_name_linter" -"tests/testthat/test_base_measures.R",187,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.bin$data$response = pred.art.bin","object_name_linter" -"tests/testthat/test_base_measures.R",199,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.multilabel$data[, 4:5] = pred.art.multilabel","object_name_linter" -"tests/testthat/test_base_measures.R",214,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.surv$data[, ""response""] = pred.art.surv","object_name_linter" -"tests/testthat/test_base_measures.R",228,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.costsens$data$response = pred.art.costsens","object_name_linter" -"tests/testthat/test_base_measures.R",237,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.cluster$data$response = pred.art.cluster","object_name_linter" -"tests/testthat/test_base_measures.R",267,3,"style","Variable and function name style should be snake_case or CamelCase."," abs.errs = abs(c(5 - 4, 10 - 11, 0 - 0, 5 - 4))","object_name_linter" -"tests/testthat/test_base_measures.R",347,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.regr.mape$data$truth = c(5, 10, 1, 5) # we change the 0 target because mape is undefined","object_name_linter" -"tests/testthat/test_base_measures.R",365,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.art.regr.neg[[1L]] = -3","object_name_linter" -"tests/testthat/test_base_measures.R",488,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.probs[pred.probs > 1 - 1e-15] = 1 - 1e-15","object_name_linter" -"tests/testthat/test_base_measures.R",489,3,"style","Variable and function name style should be snake_case or CamelCase."," pred.probs[pred.probs < 1e-15] = 1e-15","object_name_linter" -"tests/testthat/test_base_measures.R",549,10,"style","Variable and function name style should be snake_case or CamelCase."," levels(tar.classif2) = as.numeric(levels(tar.classif))^2","object_name_linter" -"tests/testthat/test_base_measures.R",550,10,"style","Variable and function name style should be snake_case or CamelCase."," levels(pred.art.classif2) = as.numeric(levels(pred.art.classif))^2","object_name_linter" -"tests/testthat/test_base_measures.R",744,3,"style","Variable and function name style should be snake_case or CamelCase."," f1.test[is.na(f1.test)] = 1","object_name_linter" -"tests/testthat/test_base_measures.R",767,3,"style","Variable and function name style should be snake_case or CamelCase."," acc.test[is.na(acc.test)] = 1","object_name_linter" -"tests/testthat/test_base_multilabel.R",40,3,"style","Variable and function name style should be snake_case or CamelCase."," multilabel.df2[c(2, 10, 14), c(1, 5)] = NA","object_name_linter" -"tests/testthat/test_base_multilabel.R",71,23,"warning","no visible binding for global variable β€˜multilabel.task’"," mod = train(lrn2, multilabel.task)","object_usage_linter" -"tests/testthat/test_base_multilabel.R",72,25,"warning","no visible binding for global variable β€˜multilabel.task’"," pred = predict(mod, multilabel.task)","object_usage_linter" -"tests/testthat/test_base_multilabel.R",79,35,"warning","no visible binding for global variable β€˜multilabel.df’"," pred = predict(mod, newdata = multilabel.df)","object_usage_linter" -"tests/testthat/test_base_multilabel.R",85,55,"warning","no visible binding for global variable β€˜multilabel.task’"," expect_equal(rownames(pmulti), getTaskTargetNames(multilabel.task))","object_usage_linter" -"tests/testthat/test_base_multilabel.R",88,23,"warning","no visible binding for global variable β€˜multilabel.task’"," r = holdout(lrn2, multilabel.task)","object_usage_linter" -"tests/testthat/test_base_multilabel.R",93,55,"warning","no visible binding for global variable β€˜multilabel.task’"," expect_equal(rownames(pmulti), getTaskTargetNames(multilabel.task))","object_usage_linter" -"tests/testthat/test_base_multilabel.R",97,23,"warning","no visible binding for global variable β€˜multilabel.task’"," r = holdout(lrn2, multilabel.task)","object_usage_linter" -"tests/testthat/test_base_multilabel.R",101,63,"warning","no visible binding for global variable β€˜multilabel.task’"," p = getPredictionProbabilities(r$pred, getTaskClassLevels(multilabel.task))","object_usage_linter" -"tests/testthat/test_base_multilabel.R",107,23,"warning","no visible binding for global variable β€˜multilabel.task’"," r = holdout(lrn2, multilabel.task)","object_usage_linter" -"tests/testthat/test_base_multilabel.R",110,30,"warning","no visible binding for global variable β€˜multilabel.task’"," cls = getTaskClassLevels(multilabel.task)","object_usage_linter" -"tests/testthat/test_base_multilabel.R",122,59,"warning","no visible binding for global variable β€˜multilabel.task’"," expect_equal(length(tr$th), length(getTaskClassLevels(multilabel.task)))","object_usage_linter" -"tests/testthat/test_base_multilabel.R",128,5,"style","Variable and function name style should be snake_case or CamelCase."," multilabel.df2[c(2, 10, 14), c(1, 5)] = NA","object_name_linter" -"tests/testthat/test_base_multilabel.R",137,23,"warning","no visible binding for global variable β€˜multilabel.task’"," mod = train(lrn2, multilabel.task)","object_usage_linter" -"tests/testthat/test_base_multilabel.R",138,25,"warning","no visible binding for global variable β€˜multilabel.task’"," pred = predict(mod, multilabel.task)","object_usage_linter" -"tests/testthat/test_base_multilabel.R",143,5,"style","Variable and function name style should be snake_case or CamelCase."," three.target.df$y3 = three.target.df$y2","object_name_linter" -"tests/testthat/test_base_resample_operators.R",46,21,"style","Variable and function name style should be snake_case or CamelCase."," attr(ptrain$data, ""row.names"") = as.integer(row.names(ptrain$data))","object_name_linter" -"tests/testthat/test_base_resample_operators.R",49,20,"style","Variable and function name style should be snake_case or CamelCase."," attr(ptest$data, ""row.names"") = as.integer(row.names(ptest$data))","object_name_linter" -"tests/testthat/test_base_UnsupervisedTask.R",11,3,"style","Variable and function name style should be snake_case or CamelCase."," sub.task = subsetTask(noclass.task, features = 1:2)","object_name_linter" -"tests/testthat/test_classif_ada.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p[, 1]","object_name_linter" -"tests/testthat/test_classif_ada.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(binaryclass.class.levs[ifelse(p[, 2] > 0.5, 2, 1)])","object_name_linter" -"tests/testthat/test_classif_adaboostm1.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p[, 1]","object_name_linter" -"tests/testthat/test_classif_adaboostm1.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(binaryclass.class.levs[ifelse(p[, 2] > 0.5, 2, 1)])","object_name_linter" -"tests/testthat/test_classif_adaboostm1.R",44,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_adaboostm1.R",45,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_bartMachine.R",33,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_bartMachine.R",34,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_binomial.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p.class","object_name_linter" -"tests/testthat/test_classif_binomial.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_boost.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(p$class)","object_name_linter" -"tests/testthat/test_classif_boost.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = setColNames(p$prob, levels(multiclass.df[, multiclass.target]))","object_name_linter" -"tests/testthat/test_classif_bst.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = ifelse(p > 0, binaryclass.class.levs[2], binaryclass.class.levs[1])","object_name_linter" -"tests/testthat/test_classif_C50.R",31,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_C50.R",32,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_cforest.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, newdata = binaryclass.test)","object_name_linter" -"tests/testthat/test_classif_cforest.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = sapply(p, ""["", 1)","object_name_linter" -"tests/testthat/test_classif_clusterSVM.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, data.matrix(binaryclass.test[, -61]))$predictions","object_name_linter" -"tests/testthat/test_classif_ctree.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_ctree.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_cvglmnet.R",34,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_cvglmnet.R",35,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = 1 - p2","object_name_linter" -"tests/testthat/test_classif_dbnDNN.R",37,7,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(colnames(p)[max.col(p)])","object_name_linter" -"tests/testthat/test_classif_earth.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = 1 - p","object_name_linter" -"tests/testthat/test_classif_earth.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(binaryclass.class.levs[ifelse(p > 0.5, 2, 1)])","object_name_linter" -"tests/testthat/test_classif_earth.R",61,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_earth.R",62,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(predict(m,","object_name_linter" -"tests/testthat/test_classif_evtree.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, newdata = binaryclass.test)","object_name_linter" -"tests/testthat/test_classif_evtree.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p[, 1]","object_name_linter" -"tests/testthat/test_classif_extraTrees.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, x.test)","object_name_linter" -"tests/testthat/test_classif_extraTrees.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = predict(m, x.test, probability = TRUE)[, 1L]","object_name_linter" -"tests/testthat/test_classif_FDboost.R",17,9,"style","Variable and function name style should be snake_case or CamelCase."," names(fd.grids) = fdns","object_name_linter" -"tests/testthat/test_classif_fnn.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list1[[i]] = do.call(FNN::knn, pars)","object_name_linter" -"tests/testthat/test_classif_fnn.R",28,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list2[[i]] = do.call(FNN::knn, pars)","object_name_linter" -"tests/testthat/test_classif_gamboost.R",30,7,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] <- predict(m, newdata = binaryclass.test, type = ""class"")","object_name_linter" -"tests/testthat/test_classif_gamboost.R",33,7,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] <- 1 - predict(m, newdata = binaryclass.test, type = ""response"")[, 1]","object_name_linter" -"tests/testthat/test_classif_gausspr.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_gausspr.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_gbm.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_gbm.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_glmboost.R",28,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, newdata = binaryclass.test, type = ""class"")","object_name_linter" -"tests/testthat/test_classif_glmboost.R",29,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = 1 - predict(m, newdata = binaryclass.test, type = ""response"")[, 1]","object_name_linter" -"tests/testthat/test_classif_glmnet.R",39,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_glmnet.R",40,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = 1 - p2","object_name_linter" -"tests/testthat/test_classif_h2odeeplearning.R",15,3,"style","Variable and function name style should be snake_case or CamelCase."," debug.seed = getOption(""mlr.debug.seed"")","object_name_linter" -"tests/testthat/test_classif_h2odeeplearning.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = as.data.frame(p)[, 2L]","object_name_linter" -"tests/testthat/test_classif_h2ogbm.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = as.data.frame(p)[, 2L]","object_name_linter" -"tests/testthat/test_classif_h2oglm.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = as.data.frame(p)[, 2]","object_name_linter" -"tests/testthat/test_classif_h2oglm.R",55,9,"style","Variable and function name style should be snake_case or CamelCase."," names(feat.imp) = names(feat.imp.h2o)","object_name_linter" -"tests/testthat/test_classif_h2orandomForest.R",14,3,"style","Variable and function name style should be snake_case or CamelCase."," debug.seed = getOption(""mlr.debug.seed"")","object_name_linter" -"tests/testthat/test_classif_h2orandomForest.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = as.data.frame(p)[, 2L]","object_name_linter" -"tests/testthat/test_classif_h2orandomForest.R",56,9,"style","Variable and function name style should be snake_case or CamelCase."," names(feat.imp) = names(feat.imp.h2o)","object_name_linter" -"tests/testthat/test_classif_IBk.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_IBk.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_J48.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_J48.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_JRip.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_JRip.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_kknn.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_kknn.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = m$prob","object_name_linter" -"tests/testthat/test_classif_knn.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_ksvm.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = kernlab::predict(m, newdata = multiclass.test)","object_name_linter" -"tests/testthat/test_classif_ksvm.R",31,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = kernlab::predict(m, newdata = multiclass.test, type = ""prob"")","object_name_linter" -"tests/testthat/test_classif_ksvm.R",55,51,"style","Use TRUE instead of the symbol T."," B = factor(sample(c(""A"", ""B""), 10, replace = T))","T_and_F_symbol_linter" -"tests/testthat/test_classif_ksvm.R",59,56,"style","Use TRUE instead of the symbol T."," B = factor(sample(c(""A"", ""B"", ""C""), 10, replace = T))","T_and_F_symbol_linter" -"tests/testthat/test_classif_LiblineaRL1L2SVC.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(p$predictions)","object_name_linter" -"tests/testthat/test_classif_LiblineaRL1LogReg.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(p$predictions)","object_name_linter" -"tests/testthat/test_classif_LiblineaRL1LogReg.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p$probabilities[, 2L]","object_name_linter" -"tests/testthat/test_classif_LiblineaRL2L1SVC.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(p$predictions)","object_name_linter" -"tests/testthat/test_classif_LiblineaRL2LogReg.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(p$predictions)","object_name_linter" -"tests/testthat/test_classif_LiblineaRL2LogReg.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p$probabilities[, 2L]","object_name_linter" -"tests/testthat/test_classif_LiblineaRL2SVC.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(p$predictions)","object_name_linter" -"tests/testthat/test_classif_LibLineaRMultiClassSVC.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.factor(p$predictions)","object_name_linter" -"tests/testthat/test_classif_lssvm.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = suppressMessages(kernlab::predict(m, newdata = multiclass.test))","object_name_linter" -"tests/testthat/test_classif_mda.R",28,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_mda.R",29,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_nodeHarvest.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = ifelse(p > 0.5, binaryclass.class.levs[1],","object_name_linter" -"tests/testthat/test_classif_nodeHarvest.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_OneR.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_OneR.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_pamr.R",28,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = pamr::pamr.predict(m, newdata,","object_name_linter" -"tests/testthat/test_classif_pamr.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = pamr::pamr.predict(m, newdata,","object_name_linter" -"tests/testthat/test_classif_PART.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_PART.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_penalized.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = 1 - penalized::predict(m, data = binaryclass.test)","object_name_linter" -"tests/testthat/test_classif_plr.R",34,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_plr.R",35,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_plsdaCaret.R",28,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_plsdaCaret.R",29,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_plsdaCaret.R",63,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_plsdaCaret.R",64,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_randomForest.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_randomForest.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_randomForestSRC.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p$class","object_name_linter" -"tests/testthat/test_classif_randomForestSRC.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p$predicted[, 1]","object_name_linter" -"tests/testthat/test_classif_ranger.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p$predictions[, 1]","object_name_linter" -"tests/testthat/test_classif_rda.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p$class","object_name_linter" -"tests/testthat/test_classif_rda.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p$posterior","object_name_linter" -"tests/testthat/test_classif_rFerns.R",18,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = factor(predict(m, binaryclass.test))","object_name_linter" -"tests/testthat/test_classif_rknn.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_rotationForest.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," binaryclass.test[, binaryclass.target] = NULL","object_name_linter" -"tests/testthat/test_classif_rotationForest.R",29,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_rotationForest.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_rpart.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_rpart.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_RRF.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_classif_RRF.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = p2","object_name_linter" -"tests/testthat/test_classif_sparseLDA.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = sparseLDA:::predict.sda(m,","object_name_linter" -"tests/testthat/test_classif_sparseLDA.R",28,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = sparseLDA:::predict.sda(m,","object_name_linter" -"tests/testthat/test_classif_svm.R",32,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m1, newdata = multiclass.test)","object_name_linter" -"tests/testthat/test_classif_svm.R",33,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = predict(m2, newdata = multiclass.test,","object_name_linter" -"tests/testthat/test_classif_xgboost.R",29,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = factor(as.numeric(pred > 0.5),","object_name_linter" -"tests/testthat/test_classif_xgboost.R",49,7,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = y[, 1]","object_name_linter" -"tests/testthat/test_classif_xgboost.R",51,7,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = 1 - pred","object_name_linter" -"tests/testthat/test_cluster_cmeans.R",19,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_cluster_Cobweb.R",16,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_cluster_dbscan.R",15,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_cluster_EM.R",18,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_cluster_FarthestFirst.R",17,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_cluster_kkmeans.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_cluster_kmeans.R",19,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_cluster_MiniBatchKmeans.R",31,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_cluster_SimpleKMeans.R",17,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_cluster_XMeans.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_featsel_generateFilterValuesData.R",16,3,"style","Variable and function name style should be snake_case or CamelCase."," binaryclass.task.cp$env = NULL","object_name_linter" -"tests/testthat/test_learners_all_classif.R",90,3,"style","Variable and function name style should be snake_case or CamelCase."," min.task = makeClassifTask(""oneCol"", data.frame(","object_name_linter" -"tests/testthat/test_learners_all_regr.R",71,3,"style","Variable and function name style should be snake_case or CamelCase."," min.task = makeRegrTask(""oneCol"", data.frame(x = 1:10, y = 1:10),","object_name_linter" -"tests/testthat/test_learners_all_surv.R",12,3,"style","Variable and function name style should be snake_case or CamelCase."," sub.task = subsetTask(surv.task, subset = c(1:70),","object_name_linter" -"tests/testthat/test_multilabel_cforest.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = data.frame(p2)","object_name_linter" -"tests/testthat/test_multilabel_randomForestSRC.R",19,7,"style","Variable and function name style should be snake_case or CamelCase."," multilabel.train[j] = factor(multilabel.train[[j]],","object_name_linter" -"tests/testthat/test_multilabel_randomForestSRC.R",21,7,"style","Variable and function name style should be snake_case or CamelCase."," multilabel.test[j] = factor(multilabel.test[[j]],","object_name_linter" -"tests/testthat/test_multilabel_randomForestSRC.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.data.frame(lapply(p$classOutput,","object_name_linter" -"tests/testthat/test_multilabel_randomForestSRC.R",32,5,"style","Variable and function name style should be snake_case or CamelCase."," old.probs.list[[i]] = as.data.frame(lapply(p$classOutput,","object_name_linter" -"tests/testthat/test_regr_bartMachine.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, new_data = regr.test[, xind])","object_name_linter" -"tests/testthat/test_regr_bcart.R",15,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(df, function(x) class(x))","object_name_linter" -"tests/testthat/test_regr_bcart.R",16,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" -"tests/testthat/test_regr_bcart.R",33,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, XX = test, pred.n = FALSE)$ZZ.km","object_name_linter" -"tests/testthat/test_regr_bgp.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m,","object_name_linter" -"tests/testthat/test_regr_bgpllm.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m,","object_name_linter" -"tests/testthat/test_regr_blm.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m,","object_name_linter" -"tests/testthat/test_regr_brnn.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_bst.R",29,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, regr.num.test[, xind])","object_name_linter" -"tests/testthat/test_regr_btgp.R",13,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(df, function(x) class(x))","object_name_linter" -"tests/testthat/test_regr_btgp.R",14,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" -"tests/testthat/test_regr_btgp.R",31,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, XX = test, pred.n = FALSE)$ZZ.km","object_name_linter" -"tests/testthat/test_regr_btgpllm.R",12,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(df, function(x) class(x))","object_name_linter" -"tests/testthat/test_regr_btgpllm.R",13,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" -"tests/testthat/test_regr_btgpllm.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, XX = test, pred.n = FALSE)$ZZ.km","object_name_linter" -"tests/testthat/test_regr_btlm.R",16,3,"style","Variable and function name style should be snake_case or CamelCase."," col.types = vcapply(df, function(x) class(x))","object_name_linter" -"tests/testthat/test_regr_btlm.R",17,3,"style","Variable and function name style should be snake_case or CamelCase."," factor.ind = (col.types == ""factor"")","object_name_linter" -"tests/testthat/test_regr_btlm.R",34,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, XX = test, pred.n = FALSE)$ZZ.km","object_name_linter" -"tests/testthat/test_regr_cforest.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.vector(predict(m, newdata = regr.test))","object_name_linter" -"tests/testthat/test_regr_crs.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = pred","object_name_linter" -"tests/testthat/test_regr_ctree.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_cubist.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_cvglmnet.R",35,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_earth.R",18,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, newdata = regr.test)[, 1]","object_name_linter" -"tests/testthat/test_regr_evtree.R",18,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.vector(predict(m, newdata = regr.test))","object_name_linter" -"tests/testthat/test_regr_extraTrees.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, x.test)","object_name_linter" -"tests/testthat/test_regr_FDboost.R",17,9,"style","Variable and function name style should be snake_case or CamelCase."," names(fd.grids) = fdns","object_name_linter" -"tests/testthat/test_regr_fnn.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list1[[i]] = do.call(FNN::knn.reg, pars)$pred","object_name_linter" -"tests/testthat/test_regr_frbs.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_gamboost.R",35,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = suppressWarnings(as.vector(predict(m,","object_name_linter" -"tests/testthat/test_regr_gamboost.R",47,3,"style","Variable and function name style should be snake_case or CamelCase."," new.regr.df[, regr.target] = as.integer(floor(new.regr.df[, regr.target]))","object_name_linter" -"tests/testthat/test_regr_gamboost.R",48,3,"style","Variable and function name style should be snake_case or CamelCase."," new.regr.df[, ""chas""] = NULL","object_name_linter" -"tests/testthat/test_regr_gamboost.R",68,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = suppressWarnings(as.vector(predict(m,","object_name_linter" -"tests/testthat/test_regr_gausspr.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p[, 1]","object_name_linter" -"tests/testthat/test_regr_gbm.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_gbm.R",27,3,"style","Variable and function name style should be snake_case or CamelCase."," parset.list[[4]]$distribution = ""quantile""","object_name_linter" -"tests/testthat/test_regr_gbm.R",28,3,"style","Variable and function name style should be snake_case or CamelCase."," parset.list[[4]]$alpha = 0.2","object_name_linter" -"tests/testthat/test_regr_glm.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_glm.R",25,3,"style","Variable and function name style should be snake_case or CamelCase."," parset.list[[4]]$family = ""Gamma""","object_name_linter" -"tests/testthat/test_regr_glm.R",27,3,"style","Variable and function name style should be snake_case or CamelCase."," parset.list[[5]]$family = ""gaussian""","object_name_linter" -"tests/testthat/test_regr_glmboost.R",31,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.vector(predict(m, newdata = regr.test))","object_name_linter" -"tests/testthat/test_regr_glmboost.R",40,3,"style","Variable and function name style should be snake_case or CamelCase."," new.regr.df[, regr.target] = as.integer(floor(new.regr.df[, regr.target]))","object_name_linter" -"tests/testthat/test_regr_glmboost.R",59,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.vector(predict(m, newdata = new.regr.test))","object_name_linter" -"tests/testthat/test_regr_glmnet.R",35,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, as.matrix(newx), s = s)[, 1]","object_name_linter" -"tests/testthat/test_regr_glmnet.R",38,3,"style","Variable and function name style should be snake_case or CamelCase."," test.dat$chas = as.numeric(test.dat$chas)","object_name_linter" -"tests/testthat/test_regr_GPfit.R",11,12,"style","Variable and function name style should be snake_case or CamelCase."," colnames(gpfit.test.df) = c(""x1"", ""x2"", ""y"")","object_name_linter" -"tests/testthat/test_regr_h2odeeplearning.R",15,3,"style","Variable and function name style should be snake_case or CamelCase."," debug.seed = getOption(""mlr.debug.seed"")","object_name_linter" -"tests/testthat/test_regr_h2odeeplearning.R",30,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.data.frame(p)[, 1L]","object_name_linter" -"tests/testthat/test_regr_h2ogbm.R",46,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.data.frame(p)[, 1L]","object_name_linter" -"tests/testthat/test_regr_h2oglm.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.data.frame(p)[, 1L]","object_name_linter" -"tests/testthat/test_regr_h2orandomForest.R",13,3,"style","Variable and function name style should be snake_case or CamelCase."," debug.seed = getOption(""mlr.debug.seed"")","object_name_linter" -"tests/testthat/test_regr_h2orandomForest.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.data.frame(p)[, 1L]","object_name_linter" -"tests/testthat/test_regr_IBk.R",19,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_kknn.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_km.R",23,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = DiceKriging::predict(m, newdata = des2,","object_name_linter" -"tests/testthat/test_regr_ksvm.R",27,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p[, 1]","object_name_linter" -"tests/testthat/test_regr_laGP.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = do.call(laGP::aGP, pars)$mean","object_name_linter" -"tests/testthat/test_regr_LiblineaRL2L1SVR.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p$predictions","object_name_linter" -"tests/testthat/test_regr_LiblineaRL2L2SVR.R",33,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p$predictions","object_name_linter" -"tests/testthat/test_regr_mob.R",38,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_nodeHarvest.R",19,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(m, regr.df[-regr.train.inds, ])","object_name_linter" -"tests/testthat/test_regr_penalized.R",35,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p[, ""mu""]","object_name_linter" -"tests/testthat/test_regr_plsr.R",18,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = pls:::predict.mvr(m, newdata = regr.test,","object_name_linter" -"tests/testthat/test_regr_randomForest.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_randomForestSRC.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_ranger.R",19,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p$predictions","object_name_linter" -"tests/testthat/test_regr_ranger.R",42,5,"style","Variable and function name style should be snake_case or CamelCase."," parset.list[[i]] = c(parset, predict.type = ""se"")","object_name_linter" -"tests/testthat/test_regr_ranger.R",53,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = cbind(p$predictions, p$se)","object_name_linter" -"tests/testthat/test_regr_rknn.R",26,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_rknn.R",32,3,"style","Variable and function name style should be snake_case or CamelCase."," parset.list[[9]] = NULL","object_name_linter" -"tests/testthat/test_regr_rpart.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_RRF.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_svm.R",21,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_regr_xgboost.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = predict(model,","object_name_linter" -"tests/testthat/test_surv_cforest.R",24,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = -1 * predict(m, newdata = surv.test)","object_name_linter" -"tests/testthat/test_surv_coxph.R",20,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_surv_cvglmnet.R",31,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.numeric(p)","object_name_linter" -"tests/testthat/test_surv_gamboost.R",36,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = drop(p)","object_name_linter" -"tests/testthat/test_surv_gbm.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_surv_glmboost.R",33,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = drop(p)","object_name_linter" -"tests/testthat/test_surv_glmnet.R",32,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = as.numeric(p)","object_name_linter" -"tests/testthat/test_surv_randomForestSRC.R",25,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = drop(p)","object_name_linter" -"tests/testthat/test_surv_ranger.R",28,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = rowMeans(p$chf)","object_name_linter" -"tests/testthat/test_surv_rpart.R",22,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"tests/testthat/test_tune_tuneGrid.R",30,3,"style","Variable and function name style should be snake_case or CamelCase."," op1.2$C = as.numeric(as.character(op1.2$C))","object_name_linter" -"tests/testthat/test_tune_tuneGrid.R",31,3,"style","Variable and function name style should be snake_case or CamelCase."," op1.2$sigma = as.numeric(as.character(op1.2$sigma))","object_name_linter" -"vignettes/tutorial/_mlr-tutorial_intro.Rmd",42,1,"style","Variable and function name style should be snake_case or CamelCase.","train.set = sample(n, size = 2 / 3 * n)","object_name_linter" -"vignettes/tutorial/_mlr-tutorial_intro.Rmd",43,1,"style","Variable and function name style should be snake_case or CamelCase.","test.set = setdiff(1:n, train.set)","object_name_linter" -"vignettes/tutorial/advanced_tune.Rmd",52,1,"style","Variable and function name style should be snake_case or CamelCase.","base.learners = list(","object_name_linter" -"vignettes/tutorial/bagging.Rmd",38,1,"style","Variable and function name style should be snake_case or CamelCase.","bag.lrn = makeBaggingWrapper(lrn, bw.iters = 50, bw.replace = TRUE,","object_name_linter" -"vignettes/tutorial/bagging.Rmd",69,1,"style","Variable and function name style should be snake_case or CamelCase.","bag.lrn = setPredictType(bag.lrn, predict.type = ""prob"")","object_name_linter" -"vignettes/tutorial/bagging.Rmd",80,1,"style","Variable and function name style should be snake_case or CamelCase.","train.inds = seq(1, n, 3)","object_name_linter" -"vignettes/tutorial/bagging.Rmd",81,1,"style","Variable and function name style should be snake_case or CamelCase.","test.inds = setdiff(1:n, train.inds)","object_name_linter" -"vignettes/tutorial/bagging.Rmd",83,1,"style","Variable and function name style should be snake_case or CamelCase.","bag.lrn = makeBaggingWrapper(lrn)","object_name_linter" -"vignettes/tutorial/bagging.Rmd",84,1,"style","Variable and function name style should be snake_case or CamelCase.","bag.lrn = setPredictType(bag.lrn, predict.type = ""se"")","object_name_linter" -"vignettes/tutorial/benchmark_experiments.Rmd",316,1,"style","Variable and function name style should be snake_case or CamelCase.","ring.task = convertMLBenchObjToTask(""mlbench.ringnorm"", n = 600)","object_name_linter" -"vignettes/tutorial/benchmark_experiments.Rmd",317,1,"style","Variable and function name style should be snake_case or CamelCase.","wave.task = convertMLBenchObjToTask(""mlbench.waveform"", n = 600)","object_name_linter" -"vignettes/tutorial/benchmark_experiments.Rmd",334,1,"style","Variable and function name style should be snake_case or CamelCase.","ring.task = convertMLBenchObjToTask(""mlbench.ringnorm"", n = 600)","object_name_linter" -"vignettes/tutorial/benchmark_experiments.Rmd",335,1,"style","Variable and function name style should be snake_case or CamelCase.","wave.task = convertMLBenchObjToTask(""mlbench.waveform"", n = 600)","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",92,1,"style","Variable and function name style should be snake_case or CamelCase.","credit.task = makeClassifTask(data = GermanCredit, target = ""Class"")","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",93,1,"style","Variable and function name style should be snake_case or CamelCase.","credit.task = removeConstantFeatures(credit.task)","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",157,1,"style","Variable and function name style should be snake_case or CamelCase.","pred.th = setThreshold(pred, th)","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",166,1,"style","Variable and function name style should be snake_case or CamelCase.","credit.costs = makeCostMeasure(id = ""credit.costs"", name = ""Credit costs"", costs = costs,","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",249,1,"style","Variable and function name style should be snake_case or CamelCase.","tune.res = tuneThreshold(pred = r$pred, measure = credit.costs)","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",267,1,"style","Variable and function name style should be snake_case or CamelCase.","tune.res = tuneThreshold(pred = r$pred, measure = credit.costs)","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",396,1,"style","Variable and function name style should be snake_case or CamelCase.","tune.res = tuneParams(lrn, credit.task, resampling = rin, par.set = ps,","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",411,1,"style","Variable and function name style should be snake_case or CamelCase.","credit.task.over = oversample(credit.task, rate = w, cl = ""Bad"")","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",467,1,"style","Variable and function name style should be snake_case or CamelCase.","tune.res = tuneParams(lrn, credit.task, rin, par.set = ps, measures = list(credit.costs, mmce),","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",488,1,"style","Variable and function name style should be snake_case or CamelCase.","wf.task = makeClassifTask(id = ""waveform"", data = as.data.frame(df), target = ""classes"")","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",495,1,"style","Variable and function name style should be snake_case or CamelCase.","wf.costs = makeCostMeasure(id = ""wf.costs"", name = ""Waveform costs"", costs = costs,","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",523,1,"style","Variable and function name style should be snake_case or CamelCase.","pred.th = setThreshold(r$pred, threshold = th)","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",547,1,"style","Variable and function name style should be snake_case or CamelCase.","pred.th = setThreshold(r$pred, threshold = th)","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",565,1,"style","Variable and function name style should be snake_case or CamelCase.","tune.res = tuneThreshold(pred = r$pred, measure = wf.costs)","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",589,1,"style","Variable and function name style should be snake_case or CamelCase.","tune.res = tuneParams(lrn, wf.task, resampling = rin, par.set = ps,","object_name_linter" -"vignettes/tutorial/cost_sensitive_classif.Rmd",610,1,"style","Variable and function name style should be snake_case or CamelCase.","costsens.task = makeCostSensTask(id = ""iris"", data = df, cost = cost)","object_name_linter" -"vignettes/tutorial/create_filter.Rmd",125,1,"style","Variable and function name style should be snake_case or CamelCase.","iris.task.filtered = filterFeatures(iris.task, method = ""nonsense.filter"", abs = 2)","object_name_linter" -"vignettes/tutorial/create_imputation.Rmd",32,1,"style","Variable and function name style should be snake_case or CamelCase.","showFunctionDef = function(fun, name = sub(""^[^:]*:+"", """", deparse(substitute(fun)))) {","object_name_linter" -"vignettes/tutorial/create_imputation.Rmd",63,1,"style","Variable and function name style should be snake_case or CamelCase.","imputeLOCF = function() {","object_name_linter" -"vignettes/tutorial/create_imputation.Rmd",69,7,"style","Variable and function name style should be snake_case or CamelCase."," lastValue = which(dind == 1) # position of the last observed value previous to NA","object_name_linter" -"vignettes/tutorial/create_imputation.Rmd",70,7,"style","Variable and function name style should be snake_case or CamelCase."," lastNA = which(dind == -1) # position of the last of potentially several consecutive NA's","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",121,1,"style","Variable and function name style should be snake_case or CamelCase.","showFunctionDef = function(fun, name = gsub(""^[^:]*:+"", """", deparse(substitute(fun)))) {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",129,1,"style","Variable and function name style should be snake_case or CamelCase.","makeRLearner.classif.lda = function() {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",159,58,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","function(.learner, .task, .subset, .weights = NULL, ...) { }","brace_linter" -"vignettes/tutorial/create_learner.Rmd",159,60,"style","Closing curly-braces should always be on their own line, unless they are followed by an else.","function(.learner, .task, .subset, .weights = NULL, ...) { }","brace_linter" -"vignettes/tutorial/create_learner.Rmd",173,1,"style","Variable and function name style should be snake_case or CamelCase.","trainLearner.classif.lda = function(.learner, .task, .subset, .weights = NULL, ...) {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",186,43,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","function(.learner, .model, .newdata, ...) { }","brace_linter" -"vignettes/tutorial/create_learner.Rmd",186,45,"style","Closing curly-braces should always be on their own line, unless they are followed by an else.","function(.learner, .model, .newdata, ...) { }","brace_linter" -"vignettes/tutorial/create_learner.Rmd",199,1,"style","Variable and function name style should be snake_case or CamelCase.","predictLearner.classif.lda = function(.learner, .model, .newdata, predict.method = ""plug-in"", ...) {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",218,1,"style","Variable and function name style should be snake_case or CamelCase.","makeRLearner.regr.earth = function() {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",247,1,"style","Variable and function name style should be snake_case or CamelCase.","trainLearner.regr.earth = function(.learner, .task, .subset, .weights = NULL, ...) {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",254,1,"style","Variable and function name style should be snake_case or CamelCase.","predictLearner.regr.earth = function(.learner, .model, .newdata, ...) {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",273,1,"style","Variable and function name style should be snake_case or CamelCase.","makeRLearner.surv.coxph = function() {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",301,1,"style","Variable and function name style should be snake_case or CamelCase.","trainLearner.surv.coxph = function(.learner, .task, .subset, .weights = NULL, ...) {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",317,1,"style","Variable and function name style should be snake_case or CamelCase.","predictLearner.surv.coxph = function(.learner, .model, .newdata, ...) {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",321,5,"style","Variable and function name style should be snake_case or CamelCase."," surv.range = getTrainingInfo(.model$learner.model)$surv.range","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",342,1,"style","Variable and function names should not be longer than 30 characters.","makeRLearner.cluster.FarthestFirst = function() {","object_length_linter" -"vignettes/tutorial/create_learner.Rmd",342,1,"style","Variable and function name style should be snake_case or CamelCase.","makeRLearner.cluster.FarthestFirst = function() {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",360,1,"style","Variable and function names should not be longer than 30 characters.","trainLearner.cluster.FarthestFirst = function(.learner, .task, .subset, .weights = NULL, ...) {","object_length_linter" -"vignettes/tutorial/create_learner.Rmd",360,1,"style","Variable and function name style should be snake_case or CamelCase.","trainLearner.cluster.FarthestFirst = function(.learner, .task, .subset, .weights = NULL, ...) {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",367,1,"style","Variable and function names should not be longer than 30 characters.","predictLearner.cluster.FarthestFirst = function(.learner, .model, .newdata, ...) {","object_length_linter" -"vignettes/tutorial/create_learner.Rmd",367,1,"style","Variable and function name style should be snake_case or CamelCase.","predictLearner.cluster.FarthestFirst = function(.learner, .model, .newdata, ...) {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",390,1,"style","Variable and function name style should be snake_case or CamelCase.","makeRLearner.multilabel.rFerns = function() {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",407,1,"style","Variable and function name style should be snake_case or CamelCase.","trainLearner.multilabel.rFerns = function(.learner, .task, .subset, .weights = NULL, ...) {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",414,1,"style","Variable and function names should not be longer than 30 characters.","predictLearner.multilabel.rFerns = function(.learner, .model, .newdata, ...) {","object_length_linter" -"vignettes/tutorial/create_learner.Rmd",414,1,"style","Variable and function name style should be snake_case or CamelCase.","predictLearner.multilabel.rFerns = function(.learner, .model, .newdata, ...) {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",435,1,"style","Variable and function names should not be longer than 30 characters.","getFeatureImportanceLearner.classif.rpart = function(.learner, .model, ...) {","object_length_linter" -"vignettes/tutorial/create_learner.Rmd",435,1,"style","Variable and function name style should be snake_case or CamelCase.","getFeatureImportanceLearner.classif.rpart = function(.learner, .model, ...) {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",444,1,"style","Variable and function names should not be longer than 30 characters.","getFeatureImportanceLearner.classif.randomForestSRC = function(.learner, .model, ...) {","object_length_linter" -"vignettes/tutorial/create_learner.Rmd",444,1,"style","Variable and function name style should be snake_case or CamelCase.","getFeatureImportanceLearner.classif.randomForestSRC = function(.learner, .model, ...) {","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",560,3,"style","Variable and function name style should be snake_case or CamelCase."," parset.list = list(","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",568,3,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list = list()","object_name_linter" -"vignettes/tutorial/create_learner.Rmd",570,13,"warning","1:length(...) is likely to be wrong in the empty edge case. Use seq_along() instead."," for (i in 1:length(parset.list)) {","seq_linter" -"vignettes/tutorial/create_learner.Rmd",578,5,"style","Variable and function name style should be snake_case or CamelCase."," old.predicts.list[[i]] = p","object_name_linter" -"vignettes/tutorial/create_measure.Rmd",141,1,"style","Variable and function name style should be snake_case or CamelCase.","my.mmce.fun = function(task, model, pred, feats, extra.args) {","object_name_linter" -"vignettes/tutorial/create_measure.Rmd",141,50,"style","Variable and function name style should be snake_case or CamelCase.","my.mmce.fun = function(task, model, pred, feats, extra.args) {","object_name_linter" -"vignettes/tutorial/create_measure.Rmd",147,1,"style","Variable and function name style should be snake_case or CamelCase.","my.mmce = makeMeasure(","object_name_linter" -"vignettes/tutorial/create_measure.Rmd",182,1,"style","Variable and function name style should be snake_case or CamelCase.","my.costs = makeCostMeasure(","object_name_linter" -"vignettes/tutorial/create_measure.Rmd",214,1,"style","Variable and function name style should be snake_case or CamelCase.","my.range.aggr = makeAggregation(id = ""test.range"", name = ""Test Range"",","object_name_linter" -"vignettes/tutorial/create_measure.Rmd",216,24,"style","Variable and function name style should be snake_case or CamelCase."," fun = function(task, perf.test, perf.train, measure, group, pred) {","object_name_linter" -"vignettes/tutorial/create_measure.Rmd",216,35,"style","Variable and function name style should be snake_case or CamelCase."," fun = function(task, perf.test, perf.train, measure, group, pred) {","object_name_linter" -"vignettes/tutorial/create_measure.Rmd",244,1,"style","Variable and function name style should be snake_case or CamelCase.","perf.data = as.data.frame(res$opt.path)","object_name_linter" -"vignettes/tutorial/example_tasks.Rmd",14,1,"style","Variable and function name style should be snake_case or CamelCase.","urlMlrFunctions = ""https://mlr-org.github.io/mlr/reference/""","object_name_linter" -"vignettes/tutorial/example_tasks.Rmd",27,1,"style","Variable and function name style should be snake_case or CamelCase.","linkTask = function(x) {","object_name_linter" -"vignettes/tutorial/example_tasks.Rmd",28,47,"warning","no visible binding for global variable β€˜urlMlrFunctions’"," collapse(sprintf(""[%1$s](%2$s%1$s%3$s)"", x, urlMlrFunctions, ext), sep = ""
"")","object_usage_linter" -"vignettes/tutorial/example_tasks.Rmd",28,64,"warning","no visible binding for global variable β€˜ext’"," collapse(sprintf(""[%1$s](%2$s%1$s%3$s)"", x, urlMlrFunctions, ext), sep = ""
"")","object_usage_linter" -"vignettes/tutorial/feature_selection.Rmd",99,1,"style","Variable and function name style should be snake_case or CamelCase.","filtered.task = filterFeatures(iris.task, method = ""FSelectorRcpp_information.gain"", abs = 2)","object_name_linter" -"vignettes/tutorial/feature_selection.Rmd",102,1,"style","Variable and function name style should be snake_case or CamelCase.","filtered.task = filterFeatures(iris.task, fval = fv, perc = 0.25)","object_name_linter" -"vignettes/tutorial/feature_selection.Rmd",105,1,"style","Variable and function name style should be snake_case or CamelCase.","filtered.task = filterFeatures(iris.task, fval = fv, threshold = 0.5)","object_name_linter" -"vignettes/tutorial/feature_selection.Rmd",325,1,"style","Variable and function name style should be snake_case or CamelCase.","out.rdesc = makeResampleDesc(""CV"", iters = 5)","object_name_linter" -"vignettes/tutorial/filter_methods.Rmd",14,1,"style","Variable and function name style should be snake_case or CamelCase.","urlContribPackages = ""https://cran.r-project.org/package=""","object_name_linter" -"vignettes/tutorial/filter_methods.Rmd",29,1,"style","Variable and function name style should be snake_case or CamelCase.","linkPkg = function(x) {","object_name_linter" -"vignettes/tutorial/filter_methods.Rmd",30,63,"warning","no visible binding for global variable β€˜urlContribPackages’"," ifelse(x == """", """", collapse(sprintf(""[%1$s](%2$s%1$s)"", x, urlContribPackages), sep = ""
""))","object_usage_linter" -"vignettes/tutorial/filter_methods.Rmd",45,121,"style","Lines should not be more than 120 characters.","pandoc.table(dfnd, style = ""rmarkdown"", split.tables = Inf, split.cells = Inf, emphasize.rownames = FALSE, justify = just)","line_length_linter" -"vignettes/tutorial/functional_data.Rmd",118,1,"style","Variable and function name style should be snake_case or CamelCase.","fd.features = list(""UVVIS"" = 3:136, ""NIR"" = 137:367)","object_name_linter" -"vignettes/tutorial/functional_data.Rmd",157,1,"style","Variable and function name style should be snake_case or CamelCase.","knn.lrn = makeLearner(""classif.fdausc.knn"")","object_name_linter" -"vignettes/tutorial/functional_data.Rmd",203,1,"style","Variable and function name style should be snake_case or CamelCase.","rpart.lrn = makeLearner(""regr.rpart"")","object_name_linter" -"vignettes/tutorial/functional_data.Rmd",230,1,"style","Variable and function name style should be snake_case or CamelCase.","feat.methods = list(""UVVIS"" = extractFDAFourier(), ""NIR"" = extractFDAFPCA())","object_name_linter" -"vignettes/tutorial/functional_data.Rmd",250,1,"style","Variable and function name style should be snake_case or CamelCase.","feat.methods = list(""UVVIS"" = extractFDAWavelets(filter = ""haar""))","object_name_linter" -"vignettes/tutorial/functional_data.Rmd",251,1,"style","Variable and function name style should be snake_case or CamelCase.","task.w = extractFDAFeatures(tsk1, feat.methods = feat.methods)","object_name_linter" -"vignettes/tutorial/functional_data.Rmd",254,1,"style","Variable and function name style should be snake_case or CamelCase.","feat.methods = list(""NIR"" = extractFDAWavelets(filter = ""d4""))","object_name_linter" -"vignettes/tutorial/functional_data.Rmd",255,1,"style","Variable and function name style should be snake_case or CamelCase.","task.wd4 = extractFDAFeatures(tsk1, feat.methods = feat.methods)","object_name_linter" -"vignettes/tutorial/functional_data.Rmd",269,1,"style","Variable and function name style should be snake_case or CamelCase.","feat.methods = list(""NIR"" = extractFDAFourier(trafo.coeff = ""amplitude""),","object_name_linter" -"vignettes/tutorial/functional_data.Rmd",271,1,"style","Variable and function name style should be snake_case or CamelCase.","task.fourier = extractFDAFeatures(tsk1, feat.methods = feat.methods)","object_name_linter" -"vignettes/tutorial/functional_data.Rmd",283,1,"style","Variable and function name style should be snake_case or CamelCase.","feat.methods = list(""NIR"" = extractFDAFourier())","object_name_linter" -"vignettes/tutorial/functional_data.Rmd",284,1,"style","Variable and function name style should be snake_case or CamelCase.","wrapped.lrn = makeExtractFDAFeatsWrapper(""regr.rpart"", feat.methods = feat.methods)","object_name_linter" -"vignettes/tutorial/handling_of_spatial_data.Rmd",90,1,"style","Variable and function name style should be snake_case or CamelCase.","learner.rf = makeLearner(""classif.ranger"", predict.type = ""prob"")","object_name_linter" -"vignettes/tutorial/handling_of_spatial_data.Rmd",108,1,"style","Variable and function name style should be snake_case or CamelCase.","learner.rf = makeLearner(""classif.ranger"", predict.type = ""prob"")","object_name_linter" -"vignettes/tutorial/hyperpar_tuning_effects.Rmd",75,43,"style","Use TRUE instead of the symbol T.","generateHyperParsEffectData(res, trafo = T, include.diagnostics = FALSE)","T_and_F_symbol_linter" -"vignettes/tutorial/hyperpar_tuning_effects.Rmd",86,43,"style","Use TRUE instead of the symbol T.","generateHyperParsEffectData(res, trafo = T, include.diagnostics = FALSE)","T_and_F_symbol_linter" -"vignettes/tutorial/hyperpar_tuning_effects.Rmd",114,43,"style","Use TRUE instead of the symbol T.","generateHyperParsEffectData(res, trafo = T, include.diagnostics = FALSE)","T_and_F_symbol_linter" -"vignettes/tutorial/hyperpar_tuning_effects.Rmd",126,43,"style","Use TRUE instead of the symbol T.","generateHyperParsEffectData(res, trafo = T, include.diagnostics = FALSE)","T_and_F_symbol_linter" -"vignettes/tutorial/impute.Rmd",104,1,"style","Variable and function name style should be snake_case or CamelCase.","airq.train = airq[1:100, ]","object_name_linter" -"vignettes/tutorial/impute.Rmd",105,1,"style","Variable and function name style should be snake_case or CamelCase.","airq.test = airq[-c(1:100), ]","object_name_linter" -"vignettes/tutorial/impute.Rmd",134,1,"style","Variable and function name style should be snake_case or CamelCase.","airq.test.imp = reimpute(airq.test, imp$desc)","object_name_linter" -"vignettes/tutorial/integrated_learners.Rmd",14,1,"style","Variable and function name style should be snake_case or CamelCase.","urlContribPackages = urlBasePackages = ""http://www.rdocumentation.org/packages/""","object_name_linter" -"vignettes/tutorial/integrated_learners.Rmd",14,22,"style","Variable and function name style should be snake_case or CamelCase.","urlContribPackages = urlBasePackages = ""http://www.rdocumentation.org/packages/""","object_name_linter" -"vignettes/tutorial/integrated_learners.Rmd",31,1,"style","Variable and function name style should be snake_case or CamelCase.","linkPkg = function(x) {","object_name_linter" -"vignettes/tutorial/integrated_learners.Rmd",34,7,"warning","no visible binding for global variable β€˜urlBasePackages’"," if (urlBasePackages != urlContribPackages) {","object_usage_linter" -"vignettes/tutorial/integrated_learners.Rmd",34,26,"warning","no visible binding for global variable β€˜urlContribPackages’"," if (urlBasePackages != urlContribPackages) {","object_usage_linter" -"vignettes/tutorial/integrated_learners.Rmd",35,18,"warning","no visible binding for global variable β€˜baseR’"," ind = x %in% baseR","object_usage_linter" -"vignettes/tutorial/integrated_learners.Rmd",36,13,"warning","no visible binding for global variable β€˜urlContribPackages’"," url = c(urlContribPackages, urlBasePackages)[ind + 1]","object_usage_linter" -"vignettes/tutorial/integrated_learners.Rmd",36,33,"warning","no visible binding for global variable β€˜urlBasePackages’"," url = c(urlContribPackages, urlBasePackages)[ind + 1]","object_usage_linter" -"vignettes/tutorial/integrated_learners.Rmd",38,11,"warning","no visible binding for global variable β€˜urlContribPackages’"," url = urlContribPackages","object_usage_linter" -"vignettes/tutorial/integrated_learners.Rmd",43,1,"style","Variable and function name style should be snake_case or CamelCase.","getTab = function(type) {","object_name_linter" -"vignettes/tutorial/integrated_learners.Rmd",54,121,"style","Lines should not be more than 120 characters."," cols = c(""class"", ""type"", ""package"", ""short.name"", ""name"", ""numerics"", ""factors"", ""ordered"", ""missings"", ""weights"", ""note"", ""installed"")","line_length_linter" -"vignettes/tutorial/integrated_learners.Rmd",57,3,"style","Variable and function name style should be snake_case or CamelCase."," colNames = c(""Class / Short Name / Name"", ""Packages"", ""Num."", ""Fac."", ""Ord."", ""NAs"", ""Weights"", ""Props"", ""Note"")","object_name_linter" -"vignettes/tutorial/integrated_learners.Rmd",59,121,"style","Lines should not be more than 120 characters."," col.types = c(""character"", ""character"", ""logical"", ""logical"", ""logical"", ""logical"", ""logical"", ""character"", ""character""))","line_length_linter" -"vignettes/tutorial/integrated_learners.Rmd",65,38,"warning","no visible binding for global variable β€˜linkPkg’"," df$Packages = sapply(lrns$package, linkPkg)","object_usage_linter" -"vignettes/tutorial/integrated_learners.Rmd",74,1,"style","Variable and function name style should be snake_case or CamelCase.","makeTab = function(df) {","object_name_linter" -"vignettes/tutorial/learner.Rmd",39,1,"style","Variable and function name style should be snake_case or CamelCase.","classif.lrn = makeLearner(""classif.randomForest"", predict.type = ""prob"", fix.factors.prediction = TRUE)","object_name_linter" -"vignettes/tutorial/learner.Rmd",42,1,"style","Variable and function name style should be snake_case or CamelCase.","regr.lrn = makeLearner(""regr.gbm"", par.vals = list(n.trees = 500, interaction.depth = 3))","object_name_linter" -"vignettes/tutorial/learner.Rmd",45,1,"style","Variable and function name style should be snake_case or CamelCase.","surv.lrn = makeLearner(""surv.coxph"", id = ""cph"")","object_name_linter" -"vignettes/tutorial/learner.Rmd",48,1,"style","Variable and function name style should be snake_case or CamelCase.","cluster.lrn = makeLearner(""cluster.kmeans"", centers = 5)","object_name_linter" -"vignettes/tutorial/learner.Rmd",51,1,"style","Variable and function name style should be snake_case or CamelCase.","multilabel.lrn = makeLearner(""multilabel.rFerns"")","object_name_linter" -"vignettes/tutorial/learner.Rmd",142,1,"style","Variable and function name style should be snake_case or CamelCase.","surv.lrn = setLearnerId(surv.lrn, ""CoxModel"")","object_name_linter" -"vignettes/tutorial/learner.Rmd",146,1,"style","Variable and function name style should be snake_case or CamelCase.","classif.lrn = setPredictType(classif.lrn, ""response"")","object_name_linter" -"vignettes/tutorial/learner.Rmd",149,1,"style","Variable and function name style should be snake_case or CamelCase.","cluster.lrn = setHyperPars(cluster.lrn, centers = 4)","object_name_linter" -"vignettes/tutorial/learner.Rmd",152,1,"style","Variable and function name style should be snake_case or CamelCase.","regr.lrn = removeHyperPars(regr.lrn, c(""n.trees"", ""interaction.depth""))","object_name_linter" -"vignettes/tutorial/measures.Rmd",14,1,"style","Variable and function name style should be snake_case or CamelCase.","urlMlrFunctions = ""https://mlr-org.github.io/mlr/reference/""","object_name_linter" -"vignettes/tutorial/measures.Rmd",46,1,"style","Variable and function name style should be snake_case or CamelCase.","linkFct = function(x, y) {","object_name_linter" -"vignettes/tutorial/measures.Rmd",47,50,"warning","no visible binding for global variable β€˜urlMlrFunctions’"," collapse(sprintf(""[%1$s](%3$s%2$s%4$s)"", x, y, urlMlrFunctions, ext), sep = ""
"")","object_usage_linter" -"vignettes/tutorial/measures.Rmd",47,67,"warning","no visible binding for global variable β€˜ext’"," collapse(sprintf(""[%1$s](%3$s%2$s%4$s)"", x, y, urlMlrFunctions, ext), sep = ""
"")","object_usage_linter" -"vignettes/tutorial/measures.Rmd",54,1,"style","Variable and function name style should be snake_case or CamelCase.","getTab = function(type) {","object_name_linter" -"vignettes/tutorial/measures.Rmd",67,121,"style","Lines should not be more than 120 characters."," cols = c(""ID / Name"", ""Minim."", ""Best"", ""Worst"", ""Multi"", ""Pred."", ""Truth"", ""Probs"", ""Model"", ""Task"", ""Feats"", ""Aggr."", ""Note"")","line_length_linter" -"vignettes/tutorial/measures.Rmd",69,121,"style","Lines should not be more than 120 characters."," col.types = c(""character"", ""logical"", ""numeric"", ""numeric"", ""logical"", ""logical"", ""logical"", ""logical"", ""logical"", ""logical"", ""logical"", ""character"", ""character""))","line_length_linter" -"vignettes/tutorial/measures.Rmd",74,29,"warning","no visible global function definition for β€˜linkFct’"," df[i, 1] = paste0(""**"", linkFct(mea$id, ""measures""), ""**
"", mea$name)","object_usage_linter" -"vignettes/tutorial/measures.Rmd",85,17,"warning","no visible global function definition for β€˜linkFct’"," df[i, 12] = linkFct(mea$aggr$id, ""aggregations"")","object_usage_linter" -"vignettes/tutorial/measures.Rmd",86,17,"warning","no visible global function definition for β€˜urls’"," df[i, 13] = urls(cn(mea$note))","object_usage_linter" -"vignettes/tutorial/measures.Rmd",86,22,"warning","no visible global function definition for β€˜cn’"," df[i, 13] = urls(cn(mea$note))","object_usage_linter" -"vignettes/tutorial/measures.Rmd",89,121,"style","Lines should not be more than 120 characters."," just = c(""left"", ""center"", ""right"", ""right"", ""center"", ""center"", ""center"", ""center"", ""center"", ""center"", ""center"", ""left"", ""left"")","line_length_linter" -"vignettes/tutorial/multilabel.Rmd",37,1,"style","Variable and function name style should be snake_case or CamelCase.","yeast.task = makeMultilabelTask(id = ""multi"", data = yeast, target = labels)","object_name_linter" -"vignettes/tutorial/multilabel.Rmd",55,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.rfsrc = makeLearner(""multilabel.randomForestSRC"")","object_name_linter" -"vignettes/tutorial/multilabel.Rmd",56,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.rFerns = makeLearner(""multilabel.rFerns"")","object_name_linter" -"vignettes/tutorial/multilabel.Rmd",68,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.br = makeLearner(""classif.rpart"", predict.type = ""prob"")","object_name_linter" -"vignettes/tutorial/multilabel.Rmd",69,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.br = makeMultilabelBinaryRelevanceWrapper(lrn.br)","object_name_linter" -"vignettes/tutorial/multilabel.Rmd",72,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.br2 = makeMultilabelBinaryRelevanceWrapper(""classif.rpart"")","object_name_linter" -"vignettes/tutorial/nested_resampling.Rmd",145,1,"style","Variable and function name style should be snake_case or CamelCase.","opt.paths = getNestedTuneResultsOptPathDf(r)","object_name_linter" -"vignettes/tutorial/nested_resampling.Rmd",150,1,"style","Variable and function name style should be snake_case or CamelCase.","opt.paths = getNestedTuneResultsOptPathDf(r)","object_name_linter" -"vignettes/tutorial/nested_resampling.Rmd",265,1,"style","Variable and function name style should be snake_case or CamelCase.","opt.paths = lapply(r$extract, function(x) as.data.frame(x$opt.path))","object_name_linter" -"vignettes/tutorial/nested_resampling.Rmd",270,1,"style","Variable and function name style should be snake_case or CamelCase.","opt.paths = lapply(r$extract, function(x) as.data.frame(x$opt.path))","object_name_linter" -"vignettes/tutorial/nested_resampling.Rmd",363,1,"style","Variable and function name style should be snake_case or CamelCase.","opt.paths = lapply(res, function(x) as.data.frame(x$opt.path))","object_name_linter" -"vignettes/tutorial/nested_resampling.Rmd",458,1,"style","Variable and function name style should be snake_case or CamelCase.","tune.res = getBMRTuneResults(res,","object_name_linter" -"vignettes/tutorial/nested_resampling.Rmd",514,1,"style","Variable and function name style should be snake_case or CamelCase.","opt.paths = lapply(feats, function(x) as.data.frame(x$opt.path))","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",64,1,"style","Variable and function name style should be snake_case or CamelCase.","data.imbal.train = rbind(","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",69,1,"style","Variable and function name style should be snake_case or CamelCase.","task.over = oversample(task, rate = 8)","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",70,1,"style","Variable and function name style should be snake_case or CamelCase.","task.under = undersample(task, rate = 1 / 8)","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",87,1,"style","Variable and function name style should be snake_case or CamelCase.","mod.over = train(lrn, task.over)","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",88,1,"style","Variable and function name style should be snake_case or CamelCase.","mod.under = train(lrn, task.under)","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",89,1,"style","Variable and function name style should be snake_case or CamelCase.","data.imbal.test = rbind(","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",113,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.over = makeOversampleWrapper(lrn, osw.rate = 8)","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",114,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.under = makeUndersampleWrapper(lrn, usw.rate = 1 / 8)","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",116,1,"style","Variable and function name style should be snake_case or CamelCase.","mod.over = train(lrn.over, task)","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",117,1,"style","Variable and function name style should be snake_case or CamelCase.","mod.under = train(lrn.under, task)","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",140,1,"style","Variable and function name style should be snake_case or CamelCase.","task.smote = smote(task, rate = 8, nn = 5)","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",149,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.smote = makeSMOTEWrapper(lrn, sw.rate = 8, sw.nn = 5)","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",150,1,"style","Variable and function name style should be snake_case or CamelCase.","mod.smote = train(lrn.smote, task)","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",170,1,"style","Variable and function name style should be snake_case or CamelCase.","obw.lrn = makeOverBaggingWrapper(lrn, obw.rate = 8, obw.iters = 3)","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",186,1,"style","Variable and function name style should be snake_case or CamelCase.","obw.lrn = setPredictType(obw.lrn, ""prob"")","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",196,1,"style","Variable and function name style should be snake_case or CamelCase.","obw.lrn = makeOverBaggingWrapper(lrn, obw.rate = 8, obw.iters = 3)","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",203,1,"style","Variable and function name style should be snake_case or CamelCase.","obw.lrn = setPredictType(obw.lrn, ""prob"")","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",317,1,"style","Variable and function name style should be snake_case or CamelCase.","wcw.lrn = makeWeightedClassesWrapper(lrn, wcw.weight = 0.01)","object_name_linter" -"vignettes/tutorial/over_and_undersampling.Rmd",328,1,"style","Variable and function name style should be snake_case or CamelCase.","wcw.lrn = makeWeightedClassesWrapper(lrn, wcw.weight = 0.01)","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",66,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.classif = makeLearner(""classif.ksvm"", predict.type = ""prob"")","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",67,1,"style","Variable and function name style should be snake_case or CamelCase.","fit.classif = train(lrn.classif, iris.task)","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",80,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.lst = generatePartialDependenceData(fit.classif, iris.task, c(""Petal.Width"", ""Petal.Length""), FALSE)","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",87,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.int = generatePartialDependenceData(fit.classif, iris.task, c(""Petal.Width"", ""Petal.Length""), TRUE)","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",104,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.regr = makeLearner(""regr.ksvm"")","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",105,1,"style","Variable and function name style should be snake_case or CamelCase.","fit.regr = train(lrn.regr, bh.task)","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",106,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.regr = generatePartialDependenceData(fit.regr, bh.task, ""lstat"", fun = median)","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",111,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.ci = generatePartialDependenceData(fit.regr, bh.task, ""lstat"",","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",117,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.classif = generatePartialDependenceData(fit.classif, iris.task, ""Petal.Length"", fun = median)","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",126,1,"style","Variable and function name style should be snake_case or CamelCase.","fit.se = train(makeLearner(""regr.randomForest"", predict.type = ""se""), bh.task)","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",127,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.se = generatePartialDependenceData(fit.se, bh.task, c(""lstat"", ""crim""))","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",137,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.ind.regr = generatePartialDependenceData(fit.regr, bh.task, ""lstat"", individual = TRUE)","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",146,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.ind.classif = generatePartialDependenceData(fit.classif, iris.task, ""Petal.Length"", individual = TRUE)","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",155,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.regr.der = generatePartialDependenceData(fit.regr, bh.task, ""lstat"", derivative = TRUE)","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",160,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.regr.der.ind = generatePartialDependenceData(fit.regr, bh.task, ""lstat"", derivative = TRUE,","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",166,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.classif.der = generatePartialDependenceData(fit.classif, iris.task, ""Petal.Width"", derivative = TRUE)","object_name_linter" -"vignettes/tutorial/partial_dependence.Rmd",171,1,"style","Variable and function name style should be snake_case or CamelCase.","pd.classif.der.ind = generatePartialDependenceData(fit.classif, iris.task, ""Petal.Width"", derivative = TRUE,","object_name_linter" -"vignettes/tutorial/predict.Rmd",36,1,"style","Variable and function name style should be snake_case or CamelCase.","train.set = seq(1, n, by = 2)","object_name_linter" -"vignettes/tutorial/predict.Rmd",37,1,"style","Variable and function name style should be snake_case or CamelCase.","test.set = seq(2, n, by = 2)","object_name_linter" -"vignettes/tutorial/predict.Rmd",41,1,"style","Variable and function name style should be snake_case or CamelCase.","task.pred = predict(mod, task = bh.task, subset = test.set)","object_name_linter" -"vignettes/tutorial/predict.Rmd",47,1,"style","Variable and function name style should be snake_case or CamelCase.","train.set = seq(1, n, by = 2)","object_name_linter" -"vignettes/tutorial/predict.Rmd",48,1,"style","Variable and function name style should be snake_case or CamelCase.","test.set = seq(2, n, by = 2)","object_name_linter" -"vignettes/tutorial/predict.Rmd",52,1,"style","Variable and function name style should be snake_case or CamelCase.","task.pred = predict(mod, task = bh.task, subset = test.set)","object_name_linter" -"vignettes/tutorial/predict.Rmd",77,1,"style","Variable and function name style should be snake_case or CamelCase.","iris.train = iris[seq(1, n, by = 2), -5]","object_name_linter" -"vignettes/tutorial/predict.Rmd",78,1,"style","Variable and function name style should be snake_case or CamelCase.","iris.test = iris[seq(2, n, by = 2), -5]","object_name_linter" -"vignettes/tutorial/predict.Rmd",82,1,"style","Variable and function name style should be snake_case or CamelCase.","newdata.pred = predict(mod, newdata = iris.test)","object_name_linter" -"vignettes/tutorial/predict.Rmd",88,1,"style","Variable and function name style should be snake_case or CamelCase.","iris.train = iris[seq(1, n, by = 2), -5]","object_name_linter" -"vignettes/tutorial/predict.Rmd",89,1,"style","Variable and function name style should be snake_case or CamelCase.","iris.test = iris[seq(2, n, by = 2), -5]","object_name_linter" -"vignettes/tutorial/predict.Rmd",93,1,"style","Variable and function name style should be snake_case or CamelCase.","newdata.pred = predict(mod, newdata = iris.test)","object_name_linter" -"vignettes/tutorial/predict.Rmd",156,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.lm = makeLearner(""regr.lm"", predict.type = ""se"")","object_name_linter" -"vignettes/tutorial/predict.Rmd",157,1,"style","Variable and function name style should be snake_case or CamelCase.","mod.lm = train(lrn.lm, bh.task, subset = train.set)","object_name_linter" -"vignettes/tutorial/predict.Rmd",158,1,"style","Variable and function name style should be snake_case or CamelCase.","task.pred.lm = predict(mod.lm, task = bh.task, subset = test.set)","object_name_linter" -"vignettes/tutorial/predict.Rmd",163,1,"style","Variable and function name style should be snake_case or CamelCase.","lrn.lm = makeLearner(""regr.lm"", predict.type = ""se"")","object_name_linter" -"vignettes/tutorial/predict.Rmd",164,1,"style","Variable and function name style should be snake_case or CamelCase.","mod.lm = train(lrn.lm, bh.task, subset = train.set)","object_name_linter" -"vignettes/tutorial/predict.Rmd",165,1,"style","Variable and function name style should be snake_case or CamelCase.","task.pred.lm = predict(mod.lm, task = bh.task, subset = test.set)","object_name_linter" -"vignettes/tutorial/predict.Rmd",246,1,"style","Variable and function name style should be snake_case or CamelCase.","conf.matrix = calculateConfusionMatrix(pred, relative = TRUE)","object_name_linter" -"vignettes/tutorial/preproc.Rmd",376,1,"style","Variable and function name style should be snake_case or CamelCase.","makePreprocWrapperScale = function(learner, center = TRUE, scale = TRUE) {","object_name_linter" -"vignettes/tutorial/resample.Rmd",182,121,"style","Lines should not be more than 120 characters.","## Aggregated Result: mmce.test.mean=0.2904762,fpr.test.mean=0.2932609,fnr.test.mean=0.2615067,timetrain.test.mean=0.0128000","line_length_linter" -"vignettes/tutorial/resample.Rmd",207,121,"style","Lines should not be more than 120 characters.","## Aggr perf: mmce.test.mean=0.2904762,fpr.test.mean=0.2932609,fnr.test.mean=0.2615067,timetrain.test.mean=0.0128000,ber.test.mean=0.2773838,timepredict.test.mean=0.0032000","line_length_linter" -"vignettes/tutorial/resample.Rmd",346,1,"style","Variable and function name style should be snake_case or CamelCase.","predList = getRRPredictionList(r)","object_name_linter" -"vignettes/tutorial/resample.Rmd",351,1,"style","Variable and function name style should be snake_case or CamelCase.","predList = getRRPredictionList(r)","object_name_linter" -"vignettes/tutorial/resample.Rmd",635,1,"style","Variable and function name style should be snake_case or CamelCase.","r.lda = resample(""classif.lda"", iris.task, rin, show.info = FALSE)","object_name_linter" -"vignettes/tutorial/resample.Rmd",636,1,"style","Variable and function name style should be snake_case or CamelCase.","r.rpart = resample(""classif.rpart"", iris.task, rin, show.info = FALSE)","object_name_linter" -"vignettes/tutorial/resample.Rmd",693,1,"style","Variable and function name style should be snake_case or CamelCase.","mseTestMedian = setAggregation(mse, test.median)","object_name_linter" -"vignettes/tutorial/resample.Rmd",694,1,"style","Variable and function name style should be snake_case or CamelCase.","mseTestMin = setAggregation(mse, test.min)","object_name_linter" -"vignettes/tutorial/resample.Rmd",695,1,"style","Variable and function name style should be snake_case or CamelCase.","mseTestMax = setAggregation(mse, test.max)","object_name_linter" -"vignettes/tutorial/resample.Rmd",704,1,"style","Variable and function name style should be snake_case or CamelCase.","mseTestMedian = setAggregation(mse, test.median)","object_name_linter" -"vignettes/tutorial/resample.Rmd",705,1,"style","Variable and function name style should be snake_case or CamelCase.","mseTestMin = setAggregation(mse, test.min)","object_name_linter" -"vignettes/tutorial/resample.Rmd",706,1,"style","Variable and function name style should be snake_case or CamelCase.","mseTestMax = setAggregation(mse, test.max)","object_name_linter" -"vignettes/tutorial/resample.Rmd",726,121,"style","Lines should not be more than 120 characters.","## Aggregated Result: mse.test.mean=24.0886607,mse.test.median=24.0782026,mse.test.min=18.6894718,mse.test.max=29.4983077","line_length_linter" -"vignettes/tutorial/resample.Rmd",748,1,"style","Variable and function name style should be snake_case or CamelCase.","mmceTrainMean = setAggregation(mmce, train.mean)","object_name_linter" -"vignettes/tutorial/resample.Rmd",777,1,"style","Variable and function name style should be snake_case or CamelCase.","mmceB632 = setAggregation(mmce, b632)","object_name_linter" -"vignettes/tutorial/resample.Rmd",778,1,"style","Variable and function name style should be snake_case or CamelCase.","mmceB632plus = setAggregation(mmce, b632plus)","object_name_linter" -"vignettes/tutorial/roc_analysis.Rmd",65,1,"style","Variable and function name style should be snake_case or CamelCase.","train.set = sample(n, size = round(2 / 3 * n))","object_name_linter" -"vignettes/tutorial/roc_analysis.Rmd",66,1,"style","Variable and function name style should be snake_case or CamelCase.","test.set = setdiff(seq_len(n), train.set)","object_name_linter" -"vignettes/tutorial/roc_analysis.Rmd",160,1,"style","Variable and function name style should be snake_case or CamelCase.","rdesc.inner = makeResampleDesc(""Holdout"")","object_name_linter" -"vignettes/tutorial/roc_analysis.Rmd",175,1,"style","Variable and function name style should be snake_case or CamelCase.","rdesc.outer = makeResampleDesc(""CV"", iters = 5)","object_name_linter" -"vignettes/tutorial/roc_analysis.Rmd",247,1,"style","Variable and function name style should be snake_case or CamelCase.","train.set = sample(n, size = round(2 / 3 * n))","object_name_linter" -"vignettes/tutorial/roc_analysis.Rmd",248,1,"style","Variable and function name style should be snake_case or CamelCase.","test.set = setdiff(seq_len(n), train.set)","object_name_linter" -"vignettes/tutorial/task.Rmd",46,1,"style","Variable and function name style should be snake_case or CamelCase.","regr.task = makeRegrTask(id = ""bh"", data = BostonHousing, target = ""medv"")","object_name_linter" -"vignettes/tutorial/task.Rmd",65,1,"style","Variable and function name style should be snake_case or CamelCase.","classif.task = makeClassifTask(id = ""BreastCancer"", data = df, target = ""Class"")","object_name_linter" -"vignettes/tutorial/task.Rmd",77,1,"style","Variable and function name style should be snake_case or CamelCase.","classif.task = makeClassifTask(id = ""BreastCancer"", data = df, target = ""Class"", positive = ""malignant"")","object_name_linter" -"vignettes/tutorial/task.Rmd",89,1,"style","Variable and function name style should be snake_case or CamelCase.","surv.task = makeSurvTask(data = lung, target = c(""time"", ""status""))","object_name_linter" -"vignettes/tutorial/task.Rmd",109,1,"style","Variable and function name style should be snake_case or CamelCase.","yeast.task = makeMultilabelTask(id = ""multi"", data = yeast, target = labels)","object_name_linter" -"vignettes/tutorial/task.Rmd",122,1,"style","Variable and function name style should be snake_case or CamelCase.","cluster.task = makeClusterTask(data = mtcars)","object_name_linter" -"vignettes/tutorial/task.Rmd",147,1,"style","Variable and function name style should be snake_case or CamelCase.","costsens.task = makeCostSensTask(data = df, cost = cost)","object_name_linter" -"vignettes/tutorial/task.Rmd",227,1,"style","Variable and function name style should be snake_case or CamelCase.","cluster.task = subsetTask(cluster.task, subset = 4:17)","object_name_linter" -"vignettes/tutorial/train.Rmd",74,1,"style","Variable and function name style should be snake_case or CamelCase.","ruspini.task = makeClusterTask(data = ruspini)","object_name_linter" -"vignettes/tutorial/train.Rmd",106,1,"style","Variable and function name style should be snake_case or CamelCase.","train.set = sample(n, size = n / 3)","object_name_linter" -"vignettes/tutorial/usecase_regression.Rmd",44,1,"style","Variable and function name style should be snake_case or CamelCase.","regr.task = makeRegrTask(data = BostonHousing, target = ""medv"")","object_name_linter" -"vignettes/tutorial/usecase_regression.Rmd",92,1,"style","Variable and function name style should be snake_case or CamelCase.","tuned.ksvm = makeTuneWrapper(learner = ""regr.ksvm"", resampling = rdesc, measures = meas,","object_name_linter" -"vignettes/tutorial/usecase_regression.Rmd",94,1,"style","Variable and function name style should be snake_case or CamelCase.","tuned.rf = makeTuneWrapper(learner = ""regr.ranger"", resampling = rdesc, measures = meas,","object_name_linter" -"vignettes/tutorial/wrapper.Rmd",56,1,"style","Variable and function name style should be snake_case or CamelCase.","base.lrn = makeLearner(""classif.rpart"")","object_name_linter" -"vignettes/tutorial/wrapper.Rmd",57,1,"style","Variable and function name style should be snake_case or CamelCase.","wrapped.lrn = makeBaggingWrapper(base.lrn, bw.iters = 100, bw.feats = 0.5)","object_name_linter" -"vignettes/tutorial/wrapper.Rmd",81,1,"style","Variable and function name style should be snake_case or CamelCase.","par.set = makeParamSet(","object_name_linter" -"vignettes/tutorial/wrapper.Rmd",85,1,"style","Variable and function name style should be snake_case or CamelCase.","tuned.lrn = makeTuneWrapper(wrapped.lrn, rdesc, mmce, par.set, ctrl)","object_name_linter" diff --git a/.dev/revdep_emails/mlr/attachments/mlr.warnings b/.dev/revdep_emails/mlr/attachments/mlr.warnings deleted file mode 100644 index be09e01a7..000000000 --- a/.dev/revdep_emails/mlr/attachments/mlr.warnings +++ /dev/null @@ -1,2 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Trying to remove β€˜todo_comment_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/mlr/email-body b/.dev/revdep_emails/mlr/email-body deleted file mode 100644 index b3ee6d900..000000000 --- a/.dev/revdep_emails/mlr/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Patrick Schratz! Thank you for using {lintr} in your package {mlr}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/mlr-org/mlr (hash: 3f70ac162d764eca87a6a2c122fb7989a1bd2d4a) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 356s on CRAN vs. 213s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/mlrCPO/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/mlrCPO/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 914c55203..000000000 --- a/.dev/revdep_emails/mlrCPO/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,4 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/makeCPO.R",110,28,"style","Variable and function name style should be snake_case."," predict.type.map = c(response = ""response""),","object_name_linter" -"R/makeCPO.R",140,28,"style","Variable and function name style should be snake_case."," predict.type.map = c(response = ""response""),","object_name_linter" -"tests/testthat/test_core_datasplit.R",400,11,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" diff --git a/.dev/revdep_emails/mlrCPO/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/mlrCPO/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 62b9ad28a..000000000 --- a/.dev/revdep_emails/mlrCPO/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,441 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/doc/toc/vignettetoc.Rmd",16,3,"style","Commented code should be removed.","# path = names(knitr::opts_knit$get(""encoding""))[1]","commented_code_linter" -"inst/doc/toc/vignettetoc.Rmd",16,3,"style","Commented code should be removed.","# path = names(knitr::opts_knit$get(""encoding""))[1]","commented_code_linter" -"inst/doc/toc/vignettetoc.Rmd",17,6,"style","Use <-, not =, for assignment.","base = knitr::opts_knit$get(""output.dir"")","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",17,6,"style","Use <-, not =, for assignment.","base = knitr::opts_knit$get(""output.dir"")","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",18,6,"style","Use <-, not =, for assignment.","file = sys.frame(min(grep(""^knitr::knit$|^knit$"", sapply(sys.calls(), function(x) as.character(x)[1]))))$input","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",18,6,"style","Use <-, not =, for assignment.","file = sys.frame(min(grep(""^knitr::knit$|^knit$"", sapply(sys.calls(), function(x) as.character(x)[1]))))$input","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",18,81,"style","Lines should not be more than 80 characters.","file = sys.frame(min(grep(""^knitr::knit$|^knit$"", sapply(sys.calls(), function(x) as.character(x)[1]))))$input","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",18,81,"style","Lines should not be more than 80 characters.","file = sys.frame(min(grep(""^knitr::knit$|^knit$"", sapply(sys.calls(), function(x) as.character(x)[1]))))$input","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",19,6,"style","Use <-, not =, for assignment.","file = basename(file)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",19,6,"style","Use <-, not =, for assignment.","file = basename(file)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",20,6,"style","Use <-, not =, for assignment.","path = file.path(base, file)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",20,6,"style","Use <-, not =, for assignment.","path = file.path(base, file)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",21,7,"style","Use <-, not =, for assignment.","rpath = gsub(""\\.[^.]*$"", "".R"", path)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",21,7,"style","Use <-, not =, for assignment.","rpath = gsub(""\\.[^.]*$"", "".R"", path)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",26,11,"style","Use <-, not =, for assignment."," lines = readLines(rpath)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",26,11,"style","Use <-, not =, for assignment."," lines = readLines(rpath)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",27,11,"style","Use <-, not =, for assignment."," lines = gsub("" *(\n|$)"", ""\\1"", lines)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",27,11,"style","Use <-, not =, for assignment."," lines = gsub("" *(\n|$)"", ""\\1"", lines)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",36,10,"style","Use <-, not =, for assignment.","fullfile = file","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",36,10,"style","Use <-, not =, for assignment.","fullfile = file","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",38,10,"style","Use <-, not =, for assignment.","allfiles = list.files(path = base, pattern = "".*\\.Rmd$"")","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",38,10,"style","Use <-, not =, for assignment.","allfiles = list.files(path = base, pattern = "".*\\.Rmd$"")","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",42,14,"style","Use <-, not =, for assignment.","fileinfolist = list()","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",42,14,"style","Use <-, not =, for assignment.","fileinfolist = list()","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",44,10,"style","Use <-, not =, for assignment."," ismain = TRUE","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",44,10,"style","Use <-, not =, for assignment."," ismain = TRUE","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",46,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""^z_"", """", cf)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",46,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""^z_"", """", cf)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",47,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""_terse\\.Rmd$"", """", infoslot)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",47,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""_terse\\.Rmd$"", """", infoslot)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",48,13,"style","Use <-, not =, for assignment."," subslot = ""compact""","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",48,13,"style","Use <-, not =, for assignment."," subslot = ""compact""","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",50,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""^a_"", """", cf)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",50,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""^a_"", """", cf)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",51,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""\\.Rmd$"", """", infoslot)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",51,14,"style","Use <-, not =, for assignment."," infoslot = gsub(""\\.Rmd$"", """", infoslot)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",52,13,"style","Use <-, not =, for assignment."," subslot = ""main""","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",52,13,"style","Use <-, not =, for assignment."," subslot = ""main""","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",55,11,"style","Use <-, not =, for assignment."," content = scan(paste(base, cf, sep = ""/""), what = ""character"", quiet = TRUE)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",55,11,"style","Use <-, not =, for assignment."," content = scan(paste(base, cf, sep = ""/""), what = ""character"", quiet = TRUE)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",56,7,"style","Use <-, not =, for assignment."," pos = min(c(which(content == ""title:""), Inf))","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",56,7,"style","Use <-, not =, for assignment."," pos = min(c(which(content == ""title:""), Inf))","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",60,12,"style","Use <-, not =, for assignment."," infolist = list(title = content[pos + 1], url = cf, iscurrent = cf == file)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",60,12,"style","Use <-, not =, for assignment."," infolist = list(title = content[pos + 1], url = cf, iscurrent = cf == file)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",62,11,"style","Use <-, not =, for assignment."," applist = list(infolist)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",62,11,"style","Use <-, not =, for assignment."," applist = list(infolist)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",63,18,"style","Use <-, not =, for assignment."," names(applist) = subslot","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",63,18,"style","Use <-, not =, for assignment."," names(applist) = subslot","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",64,28,"style","Use <-, not =, for assignment."," fileinfolist[[infoslot]] = c(fileinfolist[[infoslot]], applist)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",64,28,"style","Use <-, not =, for assignment."," fileinfolist[[infoslot]] = c(fileinfolist[[infoslot]], applist)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",68,9,"style","Use <-, not =, for assignment.","linkify = function(info, title) {","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",68,9,"style","Use <-, not =, for assignment.","linkify = function(info, title) {","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",78,11,"style","Use <-, not =, for assignment."," content = fileinfolist[[sort(names(fileinfolist))[idx]]]","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",78,11,"style","Use <-, not =, for assignment."," content = fileinfolist[[sort(names(fileinfolist))[idx]]]","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",80,81,"style","Lines should not be more than 80 characters."," if (paste(sub(""[0-9]\\. "", """", content$main$title), ""(No Output)"") != sub(""^z "", """", content$compact$title)) {","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",80,81,"style","Lines should not be more than 80 characters."," if (paste(sub(""[0-9]\\. "", """", content$main$title), ""(No Output)"") != sub(""^z "", """", content$compact$title)) {","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",81,81,"style","Lines should not be more than 80 characters."," stop(sprintf(""File %s and its compact version %s have incompatible titles\nThe compact version must be paste(main_title, \""(No Output)\""). Is: '%s', expected: '%s'"",","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",81,81,"style","Lines should not be more than 80 characters."," stop(sprintf(""File %s and its compact version %s have incompatible titles\nThe compact version must be paste(main_title, \""(No Output)\""). Is: '%s', expected: '%s'"",","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",82,81,"style","Lines should not be more than 80 characters."," content$main$url, content$compact$url, content$compact$title, paste(content$main$title, ""(No Output)"")))","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",82,81,"style","Lines should not be more than 80 characters."," content$main$url, content$compact$url, content$compact$title, paste(content$main$title, ""(No Output)"")))","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",84,10,"style","Use <-, not =, for assignment."," line = sprintf(""%s (%s)"", linkify(content$main, content$main$title), linkify(content$compact, ""compact version""))","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",84,10,"style","Use <-, not =, for assignment."," line = sprintf(""%s (%s)"", linkify(content$main, content$main$title), linkify(content$compact, ""compact version""))","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",84,81,"style","Lines should not be more than 80 characters."," line = sprintf(""%s (%s)"", linkify(content$main, content$main$title), linkify(content$compact, ""compact version""))","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",84,81,"style","Lines should not be more than 80 characters."," line = sprintf(""%s (%s)"", linkify(content$main, content$main$title), linkify(content$compact, ""compact version""))","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",86,10,"style","Use <-, not =, for assignment."," line = linkify(content$main, content$main$title)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",86,10,"style","Use <-, not =, for assignment."," line = linkify(content$main, content$main$title)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",90,14,"style","Use <-, not =, for assignment."," fullfile = content$main$url","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",90,14,"style","Use <-, not =, for assignment."," fullfile = content$main$url","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",94,10,"style","Use <-, not =, for assignment.","fullpath = file.path(base, fullfile)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",94,10,"style","Use <-, not =, for assignment.","fullpath = file.path(base, fullfile)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",102,1,"style","Variable and function name style should be snake_case or symbols.","printToc = function(print.level = 3) {","object_name_linter" -"inst/doc/toc/vignettetoc.Rmd",102,1,"style","Variable and function name style should be snake_case or symbols.","printToc = function(print.level = 3) {","object_name_linter" -"inst/doc/toc/vignettetoc.Rmd",102,10,"style","Use <-, not =, for assignment.","printToc = function(print.level = 3) {","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",102,10,"style","Use <-, not =, for assignment.","printToc = function(print.level = 3) {","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",103,14,"style","Use <-, not =, for assignment."," owncontent = readLines(fullpath)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",103,14,"style","Use <-, not =, for assignment."," owncontent = readLines(fullpath)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",103,26,"warning","no visible binding for global variable β€˜fullpath’"," owncontent = readLines(fullpath)","object_usage_linter" -"inst/doc/toc/vignettetoc.Rmd",103,26,"warning","no visible binding for global variable β€˜fullpath’"," owncontent = readLines(fullpath)","object_usage_linter" -"inst/doc/toc/vignettetoc.Rmd",104,13,"style","Use <-, not =, for assignment."," tripletic = grepl(""^```"", owncontent)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",104,13,"style","Use <-, not =, for assignment."," tripletic = grepl(""^```"", owncontent)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",105,14,"style","Use <-, not =, for assignment."," owncontent = owncontent[cumsum(tripletic) %% 2 == 0] # exclude ```-delimited code","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",105,14,"style","Use <-, not =, for assignment."," owncontent = owncontent[cumsum(tripletic) %% 2 == 0] # exclude ```-delimited code","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",105,81,"style","Lines should not be more than 80 characters."," owncontent = owncontent[cumsum(tripletic) %% 2 == 0] # exclude ```-delimited code","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",105,81,"style","Lines should not be more than 80 characters."," owncontent = owncontent[cumsum(tripletic) %% 2 == 0] # exclude ```-delimited code","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",106,13,"style","Use <-, not =, for assignment."," headlines = grep(""^#+ +"", owncontent, value = TRUE)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",106,13,"style","Use <-, not =, for assignment."," headlines = grep(""^#+ +"", owncontent, value = TRUE)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",107,14,"style","Use <-, not =, for assignment."," headlevels = nchar(gsub("" .*"", """", headlines))","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",107,14,"style","Use <-, not =, for assignment."," headlevels = nchar(gsub("" .*"", """", headlines))","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",108,13,"style","Use <-, not =, for assignment."," headlines = gsub(""^[#]+ +"", """", headlines)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",108,13,"style","Use <-, not =, for assignment."," headlines = gsub(""^[#]+ +"", """", headlines)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",109,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"inst/doc/toc/vignettetoc.Rmd",109,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"inst/doc/toc/vignettetoc.Rmd",110,9,"style","Use <-, not =, for assignment."," links = gsub(""[^-a-z. ]"", """", tolower(headlines))","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",110,9,"style","Use <-, not =, for assignment."," links = gsub(""[^-a-z. ]"", """", tolower(headlines))","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",111,9,"style","Use <-, not =, for assignment."," links = gsub("" +"", ""-"", links)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",111,9,"style","Use <-, not =, for assignment."," links = gsub("" +"", ""-"", links)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",112,9,"style","Use <-, not =, for assignment."," links = gsub(""-$"", """", links)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",112,9,"style","Use <-, not =, for assignment."," links = gsub(""-$"", """", links)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",117,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"inst/doc/toc/vignettetoc.Rmd",117,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"inst/doc/toc/vignettetoc.Rmd",118,81,"style","Lines should not be more than 80 characters."," cat(""Table of Contents\n
\n"", sep = """")","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",118,81,"style","Lines should not be more than 80 characters."," cat(""Table of Contents\n
\n"", sep = """")","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",120,13,"style","Use <-, not =, for assignment."," lastlevel = headlevels[1] - 1","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",120,13,"style","Use <-, not =, for assignment."," lastlevel = headlevels[1] - 1","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",122,10,"style","Use <-, not =, for assignment."," line = headlines[idx]","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",122,10,"style","Use <-, not =, for assignment."," line = headlines[idx]","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",123,11,"style","Use <-, not =, for assignment."," level = headlevels[idx]","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",123,11,"style","Use <-, not =, for assignment."," level = headlevels[idx]","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",124,10,"style","Use <-, not =, for assignment."," link = links[idx]","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",124,10,"style","Use <-, not =, for assignment."," link = links[idx]","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",129,81,"style","Lines should not be more than 80 characters."," stop(""First headline level must be the lowest one used, but '"", line, ""' is lower."")","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",129,81,"style","Lines should not be more than 80 characters."," stop(""First headline level must be the lowest one used, but '"", line, ""' is lower."")","line_length_linter" -"inst/doc/toc/vignettetoc.Rmd",131,13,"style","Use <-, not =, for assignment."," lvldiff = level - lastlevel","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",131,13,"style","Use <-, not =, for assignment."," lvldiff = level - lastlevel","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",148,15,"style","Use <-, not =, for assignment."," lastlevel = level","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",148,15,"style","Use <-, not =, for assignment."," lastlevel = level","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",151,11,"style","Use <-, not =, for assignment."," lvldiff = lastlevel - headlevels[1]","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",151,11,"style","Use <-, not =, for assignment."," lvldiff = lastlevel - headlevels[1]","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",165,14,"style","Use <-, not =, for assignment.","replaceprint = function(ofunc) {","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",165,14,"style","Use <-, not =, for assignment.","replaceprint = function(ofunc) {","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",168,8,"style","Use <-, not =, for assignment."," cu = capture.output({ret = ofunc(x, ...)})","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",168,8,"style","Use <-, not =, for assignment."," cu = capture.output({ret = ofunc(x, ...)})","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",168,25,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," cu = capture.output({ret = ofunc(x, ...)})","brace_linter" -"inst/doc/toc/vignettetoc.Rmd",168,25,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," cu = capture.output({ret = ofunc(x, ...)})","brace_linter" -"inst/doc/toc/vignettetoc.Rmd",168,30,"style","Use <-, not =, for assignment."," cu = capture.output({ret = ofunc(x, ...)})","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",168,30,"style","Use <-, not =, for assignment."," cu = capture.output({ret = ofunc(x, ...)})","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",169,8,"style","Use <-, not =, for assignment."," cu = grep(""time: [-+e0-9.]{1,6}"", cu, value = TRUE, invert = TRUE)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",169,8,"style","Use <-, not =, for assignment."," cu = grep(""time: [-+e0-9.]{1,6}"", cu, value = TRUE, invert = TRUE)","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",179,9,"style","Use <-, not =, for assignment."," ofunc = get(pfunc, asNamespace(""mlr""))","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",179,9,"style","Use <-, not =, for assignment."," ofunc = get(pfunc, asNamespace(""mlr""))","assignment_linter" -"inst/doc/toc/vignettetoc.Rmd",182,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" -"inst/doc/toc/vignettetoc.Rmd",182,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" -"inst/doc/toc/vignettetoc.Rmd",183,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" -"inst/doc/toc/vignettetoc.Rmd",183,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" -"R/CPO_encode.R",25,18,"style","Any function spanning multiple lines should use curly braces."," lapply(data, function(col)","brace_linter" -"R/CPO_encode.R",26,35,"style","Any function spanning multiple lines should use curly braces."," sapply(levels(target[[1]]), function(tl)","brace_linter" -"R/CPO_encode.R",27,37,"style","Any function spanning multiple lines should use curly braces."," vnapply(c(levels(col), NA), function(cl)","brace_linter" -"R/CPO_encode.R",79,18,"style","Any function spanning multiple lines should use curly braces."," lapply(data, function(col)","brace_linter" -"R/CPO_encode.R",137,18,"style","Any function spanning multiple lines should use curly braces."," lapply(data, function(col)","brace_linter" -"R/CPO_quantileBinNumerics.R",17,18,"style","Any function spanning multiple lines should use curly braces."," lapply(data, function(d)","brace_linter" -"tests/testthat/helper_cpo.R",408,5,"warning","no visible global function definition for β€˜pss’"," pss(numrows: integer[0, ],","object_usage_linter" -"tests/testthat/helper_cpo.R",408,9,"warning","no visible binding for global variable β€˜numrows’"," pss(numrows: integer[0, ],","object_usage_linter" -"tests/testthat/helper_cpo.R",409,7,"warning","no visible binding for global variable β€˜numtarget’"," numtarget: integer[0, ],","object_usage_linter" -"tests/testthat/helper_cpo.R",410,7,"warning","no visible binding for global variable β€˜numnumeric’"," numnumeric: integer[0, ] [[requires = quote(!isdf && !istask)]],","object_usage_linter" -"tests/testthat/helper_cpo.R",411,7,"warning","no visible binding for global variable β€˜numfactor’"," numfactor: integer[0, ] [[requires = quote(!isdf && !istask)]],","object_usage_linter" -"tests/testthat/helper_cpo.R",412,7,"warning","no visible binding for global variable β€˜numother’"," numother: integer[0, ] [[requires = quote(!isdf && !istask)]],","object_usage_linter" -"tests/testthat/helper_makecpo.R",333,57,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, target = target, param = param,","object_usage_linter" -"tests/testthat/helper_makecpo.R",333,57,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, target = target, param = param,","object_usage_linter" -"tests/testthat/helper_makecpo.R",342,44,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, param = param,","object_usage_linter" -"tests/testthat/helper_makecpo.R",342,44,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, param = param,","object_usage_linter" -"tests/testthat/helper_makecpo.R",350,46,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, param = param, control = control)","object_usage_linter" -"tests/testthat/helper_makecpo.R",356,59,"warning","no visible binding for global variable β€˜param’"," train(data = data, target = target, param = param)","object_usage_linter" -"tests/testthat/helper_makecpo.R",359,44,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, param = param, control = control)","object_usage_linter" -"tests/testthat/helper_makecpo.R",369,46,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, param = param, control = control)","object_usage_linter" -"tests/testthat/helper_makecpo.R",381,44,"warning","no visible binding for global variable β€˜param’"," retrafo(data = data, param = param, control = control)","object_usage_linter" -"tests/testthat/helper_makecpo.R",410,61,"warning","no visible binding for global variable β€˜param’"," train(data = data, target = target, param = param)","object_usage_linter" -"tests/testthat/helper_makecpo.R",449,73,"warning","no visible binding for global variable β€˜param’"," traininvert(data = data, control = control, param = param)","object_usage_linter" -"tests/testthat/helper_makecpo.R",492,63,"warning","no visible binding for global variable β€˜param’"," train(data = data, target = target, param = param)","object_usage_linter" -"tests/testthat/helper_makecpo.R",495,71,"warning","no visible binding for global variable β€˜param’"," traininvert(data = data, control = control, param = param)","object_usage_linter" -"tests/testthat/helper_makecpo.R",642,33,"warning","no visible binding for global variable β€˜allowedGMC’"," for (lineno in seq_len(nrow(allowedGMC))) {","object_usage_linter" -"tests/testthat/test_core_properties.R",34,33,"style","Any function spanning multiple lines should use curly braces."," lapply(getCPOProperties(x), function(y)","brace_linter" -"tests/testthat/test_meta_multiplex.R",158,38,"style","Variable and function name style should be snake_case or symbols."," cpo.build = function(data, target, logical.param, a, b) {","object_name_linter" -"vignettes/a_1_getting_started.Rmd",55,81,"style","Lines should not be more than 80 characters.","cpoScale(center = FALSE) # create a CPO object that scales, but does not center, data","line_length_linter" -"vignettes/a_1_getting_started.Rmd",66,1,"style","Variable and function name style should be snake_case or symbols.","iris.demo = iris[c(1, 2, 3, 51, 52, 102, 103), ]","object_name_linter" -"vignettes/a_1_getting_started.Rmd",66,11,"style","Use <-, not =, for assignment.","iris.demo = iris[c(1, 2, 3, 51, 52, 102, 103), ]","assignment_linter" -"vignettes/a_1_getting_started.Rmd",67,81,"style","Lines should not be more than 80 characters.","tail(iris.demo %>>% cpoQuantileBinNumerics()) # bin the data in below & above median","line_length_linter" -"vignettes/a_1_getting_started.Rmd",78,13,"style","Use <-, not =, for assignment.","quantilenum = cpoQuantileBinNumerics(numsplits = 3) %>>% cpoAsNumeric()","assignment_linter" -"vignettes/a_1_getting_started.Rmd",88,1,"style","Variable and function name style should be snake_case or symbols.","quantilenum.restricted = cpoQuantileBinNumerics(numsplits = 3) %>>%","object_name_linter" -"vignettes/a_1_getting_started.Rmd",88,24,"style","Use <-, not =, for assignment.","quantilenum.restricted = cpoQuantileBinNumerics(numsplits = 3) %>>%","assignment_linter" -"vignettes/a_1_getting_started.Rmd",97,1,"style","Variable and function name style should be snake_case or symbols.","demo.task = makeClassifTask(data = iris.demo, target = ""Species"")","object_name_linter" -"vignettes/a_1_getting_started.Rmd",97,11,"style","Use <-, not =, for assignment.","demo.task = makeClassifTask(data = iris.demo, target = ""Species"")","assignment_linter" -"vignettes/a_1_getting_started.Rmd",98,8,"style","Use <-, not =, for assignment.","result = demo.task %>>% quantilenum","assignment_linter" -"vignettes/a_1_getting_started.Rmd",114,5,"style","Use <-, not =, for assignment.","cpo = cpoScale()","assignment_linter" -"vignettes/a_1_getting_started.Rmd",129,6,"style","Use <-, not =, for assignment.","cpo2 = setHyperPars(cpo, scale.scale = FALSE)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",147,5,"style","Use <-, not =, for assignment.","cpo = cpoScale(id = ""a"") %>>% cpoScale(id = ""b"") # not very useful example","assignment_linter" -"vignettes/a_1_getting_started.Rmd",160,5,"style","Use <-, not =, for assignment.","cpo = cpoPca(export = c(""center"", ""rank""))","assignment_linter" -"vignettes/a_1_getting_started.Rmd",176,13,"style","Use <-, not =, for assignment.","transformed = iris.demo %>>% cpoPca(rank = 3)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",180,5,"style","Use <-, not =, for assignment.","ret = retrafo(transformed)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",198,4,"style","Use <-, not =, for assignment.","t2 = transformed %>>% cpoScale()","assignment_linter" -"vignettes/a_1_getting_started.Rmd",202,4,"style","Use <-, not =, for assignment.","t3 = clearRI(transformed) %>>% cpoScale()","assignment_linter" -"vignettes/a_1_getting_started.Rmd",222,1,"style","Variable and function name style should be snake_case or symbols.","iris.regr = makeRegrTask(data = iris.demo, target = ""Petal.Width"")","object_name_linter" -"vignettes/a_1_getting_started.Rmd",222,11,"style","Use <-, not =, for assignment.","iris.regr = makeRegrTask(data = iris.demo, target = ""Petal.Width"")","assignment_linter" -"vignettes/a_1_getting_started.Rmd",223,1,"style","Variable and function name style should be snake_case or symbols.","iris.logd = iris.regr %>>% cpoLogTrafoRegr()","object_name_linter" -"vignettes/a_1_getting_started.Rmd",223,11,"style","Use <-, not =, for assignment.","iris.logd = iris.regr %>>% cpoLogTrafoRegr()","assignment_linter" -"vignettes/a_1_getting_started.Rmd",229,5,"style","Use <-, not =, for assignment.","inv = inverter(iris.logd) # inverter object","assignment_linter" -"vignettes/a_1_getting_started.Rmd",235,10,"style","Use <-, not =, for assignment.","logmodel = train(""regr.lm"", iris.logd)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",236,6,"style","Use <-, not =, for assignment.","pred = predict(logmodel, iris.logd) # prediction on the task itself","assignment_linter" -"vignettes/a_1_getting_started.Rmd",246,9,"style","Use <-, not =, for assignment.","newdata = makeRegrTask(""newiris"", iris[7:9, ], target = ""Petal.Width"",","assignment_linter" -"vignettes/a_1_getting_started.Rmd",253,1,"style","Variable and function name style should be snake_case or symbols.","newdata.transformed = newdata %>>% retrafo(iris.logd)","object_name_linter" -"vignettes/a_1_getting_started.Rmd",253,21,"style","Use <-, not =, for assignment.","newdata.transformed = newdata %>>% retrafo(iris.logd)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",257,6,"style","Use <-, not =, for assignment.","pred = predict(logmodel, newdata.transformed)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",264,1,"style","Variable and function name style should be snake_case or symbols.","inv.newdata = inverter(newdata.transformed)","object_name_linter" -"vignettes/a_1_getting_started.Rmd",264,13,"style","Use <-, not =, for assignment.","inv.newdata = inverter(newdata.transformed)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",290,1,"style","Variable and function name style should be snake_case or symbols.","iris.resid = iris.regr %>>% cpoRegrResiduals(""regr.lm"")","object_name_linter" -"vignettes/a_1_getting_started.Rmd",290,12,"style","Use <-, not =, for assignment.","iris.resid = iris.regr %>>% cpoRegrResiduals(""regr.lm"")","assignment_linter" -"vignettes/a_1_getting_started.Rmd",295,1,"style","Variable and function name style should be snake_case or symbols.","model.resid = train(""regr.randomForest"", iris.resid)","object_name_linter" -"vignettes/a_1_getting_started.Rmd",295,13,"style","Use <-, not =, for assignment.","model.resid = train(""regr.randomForest"", iris.resid)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",297,1,"style","Variable and function name style should be snake_case or symbols.","newdata.resid = newdata %>>% retrafo(iris.resid)","object_name_linter" -"vignettes/a_1_getting_started.Rmd",297,15,"style","Use <-, not =, for assignment.","newdata.resid = newdata %>>% retrafo(iris.resid)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",298,81,"style","Lines should not be more than 80 characters.","getTaskData(newdata.resid) # Petal.Width are now the residuals of lm model predictions","line_length_linter" -"vignettes/a_1_getting_started.Rmd",302,6,"style","Use <-, not =, for assignment.","pred = predict(model.resid, newdata.resid)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",308,1,"style","Variable and function name style should be snake_case or symbols.","inv.newdata = inverter(newdata.resid)","object_name_linter" -"vignettes/a_1_getting_started.Rmd",308,13,"style","Use <-, not =, for assignment.","inv.newdata = inverter(newdata.resid)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",317,9,"style","Use <-, not =, for assignment.","sampled = iris %>>% cpoSample(size = 3)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",334,5,"style","Use <-, not =, for assignment.","lrn = cpoRegrResiduals(""regr.lm"") %>>% makeLearner(""regr.randomForest"")","assignment_linter" -"vignettes/a_1_getting_started.Rmd",338,7,"style","Use <-, not =, for assignment.","model = train(lrn, iris.regr)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",340,6,"style","Use <-, not =, for assignment.","pred = predict(model, newdata)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",353,8,"style","Use <-, not =, for assignment.","icalrn = cpoIca() %>>% makeLearner(""classif.logreg"")","assignment_linter" -"vignettes/a_1_getting_started.Rmd",358,4,"style","Use <-, not =, for assignment.","ps = makeParamSet(","assignment_linter" -"vignettes/a_1_getting_started.Rmd",362,3,"style","Commented code should be removed.","# ps = pSS(ica.n.comp: integer[1, 8], ica.alg.typ: discrete[parallel, deflation])","commented_code_linter" -"vignettes/a_1_getting_started.Rmd",362,81,"style","Lines should not be more than 80 characters.","# ps = pSS(ica.n.comp: integer[1, 8], ica.alg.typ: discrete[parallel, deflation])","line_length_linter" -"vignettes/a_1_getting_started.Rmd",405,7,"style","Use <-, not =, for assignment.","repca = retrafo(iris.demo %>>% cpoPca())","assignment_linter" -"vignettes/a_1_getting_started.Rmd",406,7,"style","Use <-, not =, for assignment.","state = getCPOTrainedState(repca)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",412,22,"style","Use <-, not =, for assignment.","state$control$center = FALSE","assignment_linter" -"vignettes/a_1_getting_started.Rmd",413,21,"style","Use <-, not =, for assignment.","state$control$scale = FALSE","assignment_linter" -"vignettes/a_1_getting_started.Rmd",414,1,"style","Variable and function name style should be snake_case or symbols.","nosc.repca = makeCPOTrainedFromState(cpoPca, state)","object_name_linter" -"vignettes/a_1_getting_started.Rmd",414,12,"style","Use <-, not =, for assignment.","nosc.repca = makeCPOTrainedFromState(cpoPca, state)","assignment_linter" -"vignettes/a_1_getting_started.Rmd",442,5,"style","Use <-, not =, for assignment.","cpm = cpoMultiplex(list(cpoIca, cpoPca(export = ""export.all"")))","assignment_linter" -"vignettes/a_1_getting_started.Rmd",456,5,"style","Use <-, not =, for assignment.","cpa = cpoWrap()","assignment_linter" -"vignettes/a_1_getting_started.Rmd",474,7,"style","Use <-, not =, for assignment.","scale = cpoSelect(pattern = ""Sepal"", id = ""first"") %>>% cpoScale(id = ""scale"")","assignment_linter" -"vignettes/a_1_getting_started.Rmd",475,11,"style","Use <-, not =, for assignment.","scale.pca = scale %>>% cpoPca()","assignment_linter" -"vignettes/a_1_getting_started.Rmd",476,9,"style","Use <-, not =, for assignment.","cbinder = cpoCbind(scale, scale.pca, cpoSelect(pattern = ""Petal"", id = ""second""))","assignment_linter" -"vignettes/a_1_getting_started.Rmd",476,81,"style","Lines should not be more than 80 characters.","cbinder = cpoCbind(scale, scale.pca, cpoSelect(pattern = ""Petal"", id = ""second""))","line_length_linter" -"vignettes/a_2_mlrCPO_core.Rmd",41,40,"style","Commented code should be removed.","print(cpoAsNumeric, verbose = TRUE) # alternative: !cpoAsNumeric","commented_code_linter" -"vignettes/a_2_mlrCPO_core.Rmd",61,6,"style","Use <-, not =, for assignment.","(cpo = cpoScale()) # construct CPO with default Hyperparameter values","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",107,6,"style","Use <-, not =, for assignment.","task = applyCPO(cpoPca(), iris.task)","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",118,7,"style","Use <-, not =, for assignment.","scale = cpoScale()","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",119,5,"style","Use <-, not =, for assignment.","pca = cpoPca()","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",122,10,"style","Use <-, not =, for assignment.","compound = scale %>>% pca","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",157,5,"style","Use <-, not =, for assignment.","lrn = makeLearner(""classif.logreg"")","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",158,9,"style","Use <-, not =, for assignment.","(cpolrn = cpo %>>% lrn) # the new learner has the CPO hyperparameters","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",168,5,"style","Use <-, not =, for assignment.","lrn = cpoLogTrafoRegr() %>>% makeLearner(""regr.lm"")","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",169,7,"style","Use <-, not =, for assignment.","model = train(lrn, subsetTask(bh.task, 1:300))","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",174,7,"style","Use <-, not =, for assignment.","trafo = subsetTask(bh.task, 1:300) %>>% cpoLogTrafoRegr()","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",175,7,"style","Use <-, not =, for assignment.","model = train(""regr.lm"", trafo)","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",177,9,"style","Use <-, not =, for assignment.","newdata = subsetTask(bh.task, 301:500) %>>% retrafo(trafo)","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",178,6,"style","Use <-, not =, for assignment.","pred = predict(model, newdata)","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",198,13,"style","Use <-, not =, for assignment.","transformed = iris %>>% cpoScale()","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",200,6,"style","Use <-, not =, for assignment.","(ret = retrafo(transformed))","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",205,13,"style","Use <-, not =, for assignment.","transformed = bh.task %>>% cpoLogTrafoRegr()","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",207,6,"style","Use <-, not =, for assignment.","(inv = inverter(transformed))","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",219,5,"style","Use <-, not =, for assignment.","bh2 = bh.task","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",220,14,"style","Use <-, not =, for assignment.","retrafo(bh2) = ret","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",224,14,"style","Use <-, not =, for assignment.","retrafo(bh2) = NULLCPO","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",226,3,"style","Commented code should be removed.","# retrafo(bh2) = NULL","commented_code_linter" -"vignettes/a_2_mlrCPO_core.Rmd",232,5,"style","Use <-, not =, for assignment.","bh3 = clearRI(transformed)","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",275,8,"style","Use <-, not =, for assignment.","(state = getCPOTrainedState(retrafo(iris %>>% cpoScale())))","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",276,25,"style","Use <-, not =, for assignment.","state$control$center[1] = 1000 # will now subtract 1000 from the first column","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",277,1,"style","Variable and function name style should be snake_case or symbols.","new.retrafo = makeCPOTrainedFromState(cpoScale, state)","object_name_linter" -"vignettes/a_2_mlrCPO_core.Rmd",277,13,"style","Use <-, not =, for assignment.","new.retrafo = makeCPOTrainedFromState(cpoScale, state)","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",286,6,"style","Use <-, not =, for assignment.","data = head(iris) %>>% cpoPca()","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",288,7,"style","Use <-, not =, for assignment.","data2 = data %>>% cpoScale()","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",296,6,"style","Use <-, not =, for assignment.","data = clearRI(data)","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",297,7,"style","Use <-, not =, for assignment.","data2 = data %>>% cpoScale()","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",302,15,"style","Use <-, not =, for assignment.","retrafo(data) = NULL","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",303,16,"style","Use <-, not =, for assignment.","inverter(data) = NULL","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",304,7,"style","Use <-, not =, for assignment.","data3 = data %>>% cpoScale()","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",312,1,"style","Variable and function name style should be snake_case or symbols.","compound.retrafo = retrafo(head(iris) %>>% compound)","object_name_linter" -"vignettes/a_2_mlrCPO_core.Rmd",312,18,"style","Use <-, not =, for assignment.","compound.retrafo = retrafo(head(iris) %>>% compound)","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",316,14,"style","Use <-, not =, for assignment.","(retrafolist = as.list(compound.retrafo))","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",328,13,"style","Use <-, not =, for assignment.","transformed = iris %>>% cpoScale()","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",346,13,"style","Use <-, not =, for assignment.","transformed = bh.task %>>% cpoLogTrafoRegr()","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",347,12,"style","Use <-, not =, for assignment.","prediction = predict(train(""regr.lm"", transformed), transformed)","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",348,5,"style","Use <-, not =, for assignment.","inv = inverter(transformed)","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",352,5,"style","Use <-, not =, for assignment.","ret = retrafo(transformed)","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",381,81,"style","Lines should not be more than 80 characters.","# applying NULLCPO leads to a retrafo() of NULLCPO, so it is its own CPOTrainedCPO","line_length_linter" -"vignettes/a_2_mlrCPO_core.Rmd",401,5,"style","Use <-, not =, for assignment.","cpo = cpoPca()","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",436,81,"style","Lines should not be more than 80 characters.","train(cpoDummyEncode(reference.cat = TRUE) %>>% makeLearner(""classif.geoDA""), bc.task)","line_length_linter" -"vignettes/a_2_mlrCPO_core.Rmd",469,5,"style","Use <-, not =, for assignment.","cpo = cpoPca(affect.pattern = "".Length"")","assignment_linter" -"vignettes/a_2_mlrCPO_core.Rmd",473,8,"style","Use <-, not =, for assignment.","triris = iris %>>% cpo","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",27,5,"style","Use <-, not =, for assignment.","tab = listCPO()[, c(""name"", ""category"", ""subcategory"")]","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",28,12,"style","Use <-, not =, for assignment.","owncontent = readLines(path)","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",29,11,"style","Use <-, not =, for assignment.","headlines = grep(""^#+ +"", owncontent, value = TRUE)","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",30,11,"style","Use <-, not =, for assignment.","headlines = gsub(""^#+ +"", """", headlines)","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",31,10,"style","Use <-, not =, for assignment.","tab[[1]] = sapply(tab[[1]], function(x)","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",31,29,"style","Any function spanning multiple lines should use curly braces.","tab[[1]] = sapply(tab[[1]], function(x)","brace_linter" -"vignettes/a_3_all_CPOs.Rmd",54,5,"style","Use <-, not =, for assignment.","cpa = cpoWrap()","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",58,81,"style","Lines should not be more than 80 characters.","# attaching the cpo applicator to a learner gives this learner a ""cpo"" hyperparameter","line_length_linter" -"vignettes/a_3_all_CPOs.Rmd",67,5,"style","Use <-, not =, for assignment.","cpm = cpoMultiplex(list(cpoScale, cpoPca))","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",79,1,"style","Variable and function name style should be snake_case or symbols.","s.and.p = cpoCase(pSS(logical.param: logical),","object_name_linter" -"vignettes/a_3_all_CPOs.Rmd",79,9,"style","Use <-, not =, for assignment.","s.and.p = cpoCase(pSS(logical.param: logical),","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",80,33,"style","Trailing whitespace is superfluous."," export.cpos = list(cpoScale(), ","trailing_whitespace_linter" -"vignettes/a_3_all_CPOs.Rmd",82,38,"style","Variable and function name style should be snake_case or symbols."," cpo.build = function(data, target, logical.param, scale, pca) {","object_name_linter" -"vignettes/a_3_all_CPOs.Rmd",99,7,"style","Use <-, not =, for assignment.","scale = cpoScale(id = ""scale"")","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",100,11,"style","Use <-, not =, for assignment.","scale.pca = scale %>>% cpoPca()","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",101,9,"style","Use <-, not =, for assignment.","cbinder = cpoCbind(scaled = scale, pcad = scale.pca, original = NULLCPO)","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",104,81,"style","Lines should not be more than 80 characters.","# cpoCbind recognises that ""scale.scale"" happens before ""pca.pca"" but is also fed to the","line_length_linter" -"vignettes/a_3_all_CPOs.Rmd",110,81,"style","Lines should not be more than 80 characters.","# the unnecessary copies of ""Species"" are unfortunate. Remove them with cpoSelect:","line_length_linter" -"vignettes/a_3_all_CPOs.Rmd",111,10,"style","Use <-, not =, for assignment.","selector = cpoSelect(type = ""numeric"")","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",112,1,"style","Variable and function name style should be snake_case or symbols.","cbinder.select = cpoCbind(scaled = selector %>>% scale, pcad = selector %>>% scale.pca, original = NULLCPO)","object_name_linter" -"vignettes/a_3_all_CPOs.Rmd",112,16,"style","Use <-, not =, for assignment.","cbinder.select = cpoCbind(scaled = selector %>>% scale, pcad = selector %>>% scale.pca, original = NULLCPO)","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",112,81,"style","Lines should not be more than 80 characters.","cbinder.select = cpoCbind(scaled = selector %>>% scale, pcad = selector %>>% scale.pca, original = NULLCPO)","line_length_linter" -"vignettes/a_3_all_CPOs.Rmd",126,5,"style","Use <-, not =, for assignment.","cpo = cpoTransformParams(cpoPca(), alist(pca.scale = pca.center))","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",127,6,"style","Use <-, not =, for assignment.","retr = pid.task %>|% setHyperPars(cpo, pca.center = FALSE)","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",132,6,"style","Use <-, not =, for assignment.","mplx = cpoMultiplex(list(cpoIca(export = ""n.comp""), cpoPca(export = ""rank"")))","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",134,5,"style","Use <-, not =, for assignment.","mtx = cpoTransformParams(mplx, alist(ica.n.comp = comp, pca.rank = comp),","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",146,4,"style","Use <-, not =, for assignment.","df = data.frame(a = 1:3, b = -(1:3) * 10)","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",148,36,"style","Commented code should be removed.","df %>>% cpoScale(scale = FALSE) # center = TRUE","commented_code_linter" -"vignettes/a_3_all_CPOs.Rmd",190,9,"style","Use <-, not =, for assignment.","irisfix = head(iris) %>>% cpoFixFactors() # Species only has level 'setosa' in train","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",190,81,"style","Lines should not be more than 80 characters.","irisfix = head(iris) %>>% cpoFixFactors() # Species only has level 'setosa' in train","line_length_linter" -"vignettes/a_3_all_CPOs.Rmd",194,4,"style","Use <-, not =, for assignment.","rf = retrafo(irisfix)","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",203,9,"style","Use <-, not =, for assignment.","impdata = df","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",204,17,"style","Use <-, not =, for assignment.","impdata[[1]][1] = NA","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",233,7,"style","Use <-, not =, for assignment.","iris2 = iris","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",234,15,"style","Use <-, not =, for assignment.","iris2$Species = factor(c(""a"", ""b"", ""c"", ""b"", ""b"", ""c"", ""b"", ""c"",","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",281,81,"style","Lines should not be more than 80 characters.","impdata %>>% cpoImputeAll(cols = list(b = imputeMedian())) # error, since NAs remain","line_length_linter" -"vignettes/a_3_all_CPOs.Rmd",285,1,"style","Variable and function name style should be snake_case or symbols.","missing.task = makeRegrTask(""missing.task"", impdata, target = ""b"")","object_name_linter" -"vignettes/a_3_all_CPOs.Rmd",285,14,"style","Use <-, not =, for assignment.","missing.task = makeRegrTask(""missing.task"", impdata, target = ""b"")","assignment_linter" -"vignettes/a_3_all_CPOs.Rmd",286,81,"style","Lines should not be more than 80 characters.","# the following gives an error, since 'cpoImpute' does not make sure all missings are removed","line_length_linter" -"vignettes/a_3_all_CPOs.Rmd",288,81,"style","Lines should not be more than 80 characters.","train(cpoImpute(cols = list(a = imputeMedian())) %>>% makeLearner(""regr.lm""), missing.task)","line_length_linter" -"vignettes/a_3_all_CPOs.Rmd",292,81,"style","Lines should not be more than 80 characters.","train(cpoImputeAll(cols = list(a = imputeMedian())) %>>% makeLearner(""regr.lm""), missing.task)","line_length_linter" -"vignettes/a_3_all_CPOs.Rmd",302,81,"style","Lines should not be more than 80 characters.","listCPO()[listCPO()$category == ""imputation"" & listCPO()$subcategory == ""specialised"",","line_length_linter" -"vignettes/a_3_all_CPOs.Rmd",315,81,"style","Lines should not be more than 80 characters.","head(getTaskData(iris.task %>>% cpoFilterFeatures(method = ""variance"", perc = 0.5)))","line_length_linter" -"vignettes/a_3_all_CPOs.Rmd",318,81,"style","Lines should not be more than 80 characters.","listCPO()[listCPO()$category == ""featurefilter"" & listCPO()$subcategory == ""specialised"",","line_length_linter" -"vignettes/a_4_custom_CPOs.Rmd",109,13,"style","Use <-, not =, for assignment."," newsize = round(nrow(data) * fraction)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",110,5,"style","Variable and function name style should be snake_case or symbols."," row.indices = sample(nrow(data), newsize)","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",110,17,"style","Use <-, not =, for assignment."," row.indices = sample(nrow(data), newsize)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",114,5,"style","Use <-, not =, for assignment.","cpo = xmpSample(0.01)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",126,13,"style","Use <-, not =, for assignment."," newsize = round(nrow(data) * fraction)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",127,5,"style","Variable and function name style should be snake_case or symbols."," row.indices = sample(nrow(data), newsize)","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",127,17,"style","Use <-, not =, for assignment."," row.indices = sample(nrow(data), newsize)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",153,38,"style","Variable and function name style should be snake_case or symbols."," cpo.train = function(data, target, n.col) {","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",157,41,"style","Variable and function name style should be snake_case or symbols."," cpo.retrafo = function(data, control, n.col) {","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",162,14,"style","Use <-, not =, for assignment."," greatest = order(-control) # columns, ordered greatest to smallest var","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",166,5,"style","Use <-, not =, for assignment.","cpo = xmpFilterVar(2)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",172,8,"style","Use <-, not =, for assignment.","(trafd = head(iris) %>>% cpo)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",201,38,"style","Variable and function name style should be snake_case or symbols."," cpo.train = function(data, target, n.col) {","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",203,10,"style","Use <-, not =, for assignment."," ctrl = sapply(data, var, na.rm = TRUE)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",212,16,"style","Use <-, not =, for assignment."," greatest = order(-ctrl) # columns, ordered greatest to smallest var","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",217,5,"style","Use <-, not =, for assignment.","cpo = xmpFilterVarFunc(2)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",222,8,"style","Use <-, not =, for assignment.","(trafd = head(iris) %>>% cpo)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",241,5,"style","Use <-, not =, for assignment.","cpo = xmpAsNum()","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",246,8,"style","Use <-, not =, for assignment.","(trafd = head(iris) %>>% cpo)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",264,38,"style","Variable and function name style should be snake_case or symbols."," cpo.trafo = function(data, target, n.col) {","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",266,9,"style","Use <-, not =, for assignment."," pcr = prcomp(as.matrix(data), center = FALSE, scale. = FALSE, rank = n.col)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",268,13,"style","Use <-, not =, for assignment."," control = pcr$rotation","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",271,41,"style","Variable and function name style should be snake_case or symbols."," cpo.retrafo = function(data, control, n.col) {","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",277,5,"style","Use <-, not =, for assignment.","cpo = xmpPca(2)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",282,8,"style","Use <-, not =, for assignment.","(trafd = head(iris) %>>% cpo)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",302,38,"style","Variable and function name style should be snake_case or symbols."," cpo.trafo = function(data, target, n.col) {","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",304,9,"style","Use <-, not =, for assignment."," pcr = prcomp(as.matrix(data), center = FALSE, scale. = FALSE, rank = n.col)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",306,5,"style","Variable and function name style should be snake_case or symbols."," cpo.retrafo = function(data) {","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",306,17,"style","Use <-, not =, for assignment."," cpo.retrafo = function(data) {","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",314,5,"style","Use <-, not =, for assignment.","cpo = xmpPcaFunc(2)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",318,8,"style","Use <-, not =, for assignment.","(trafd = head(iris) %>>% cpo)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",368,9,"style","Use <-, not =, for assignment."," lrn = setPredictType(lrn, ""prob"")","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",373,16,"style","Use <-, not =, for assignment."," prediction = predict(control, target)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",374,11,"style","Use <-, not =, for assignment."," tname = getTaskTargetNames(target)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",375,11,"style","Use <-, not =, for assignment."," tdata = getTaskData(target)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",376,20,"style","Use <-, not =, for assignment."," tdata[[tname]] = factor(prediction$data$response == prediction$data$truth)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",384,33,"style","Variable and function name style should be snake_case or symbols."," cpo.invert = function(target, control.invert, predict.type, lrn) {","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",387,14,"style","Use <-, not =, for assignment."," outmat = as.matrix(control.invert[grep(""^prob\\."", names(control.invert))])","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",387,81,"style","Lines should not be more than 80 characters."," outmat = as.matrix(control.invert[grep(""^prob\\."", names(control.invert))])","line_length_linter" -"vignettes/a_4_custom_CPOs.Rmd",388,14,"style","Use <-, not =, for assignment."," revmat = outmat[, c(2, 1)]","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",393,7,"style","Variable and function name style should be snake_case or symbols."," numeric.prediction = as.numeric(control.invert$response)","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",393,26,"style","Use <-, not =, for assignment."," numeric.prediction = as.numeric(control.invert$response)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",394,7,"style","Variable and function name style should be snake_case or symbols."," numeric.res = ifelse(target == ""TRUE"",","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",394,19,"style","Use <-, not =, for assignment."," numeric.res = ifelse(target == ""TRUE"",","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",402,5,"style","Use <-, not =, for assignment.","cpo = xmpMetaLearn(makeLearner(""classif.logreg""))","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",409,7,"style","Use <-, not =, for assignment.","split = makeResampleInstance(hout, pid.task)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",410,1,"style","Variable and function name style should be snake_case or symbols.","train.task = subsetTask(pid.task, split$train.inds[[1]])","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",410,12,"style","Use <-, not =, for assignment.","train.task = subsetTask(pid.task, split$train.inds[[1]])","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",411,1,"style","Variable and function name style should be snake_case or symbols.","test.task = subsetTask(pid.task, split$predict.inds[[1]])","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",411,11,"style","Use <-, not =, for assignment.","test.task = subsetTask(pid.task, split$predict.inds[[1]])","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",417,7,"style","Use <-, not =, for assignment.","trafd = train.task %>>% cpo","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",426,7,"style","Use <-, not =, for assignment.","model = train(makeLearner(""classif.logreg"", predict.type = ""prob""), train.task)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",433,6,"style","Use <-, not =, for assignment.","retr = test.task %>>% retrafo(trafd)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",439,1,"style","Variable and function name style should be snake_case or symbols.","retr.df = getTaskData(test.task, target.extra = TRUE)$data %>>% retrafo(trafd)","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",439,9,"style","Use <-, not =, for assignment.","retr.df = getTaskData(test.task, target.extra = TRUE)$data %>>% retrafo(trafd)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",446,1,"style","Variable and function name style should be snake_case or symbols.","ext.model = train(""classif.svm"", trafd)","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",446,11,"style","Use <-, not =, for assignment.","ext.model = train(""classif.svm"", trafd)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",447,1,"style","Variable and function name style should be snake_case or symbols.","ext.pred = predict(ext.model, retr)","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",447,10,"style","Use <-, not =, for assignment.","ext.pred = predict(ext.model, retr)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",448,9,"style","Use <-, not =, for assignment.","newpred = invert(inverter(retr), ext.pred)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",455,1,"style","Variable and function name style should be snake_case or symbols.","cpo.learner = cpo %>>% makeLearner(""classif.svm"")","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",455,13,"style","Use <-, not =, for assignment.","cpo.learner = cpo %>>% makeLearner(""classif.svm"")","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",456,1,"style","Variable and function name style should be snake_case or symbols.","cpo.model = train(cpo.learner, train.task)","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",456,11,"style","Use <-, not =, for assignment.","cpo.model = train(cpo.learner, train.task)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",459,9,"style","Use <-, not =, for assignment.","lrnpred = predict(cpo.model, test.task)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",488,9,"style","Use <-, not =, for assignment."," lrn = setPredictType(lrn, ""prob"")","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",489,11,"style","Use <-, not =, for assignment."," model = train(lrn, data)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",490,5,"style","Variable and function name style should be snake_case or symbols."," cpo.retrafo = function(data, target) {","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",490,17,"style","Use <-, not =, for assignment."," cpo.retrafo = function(data, target) {","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",492,18,"style","Use <-, not =, for assignment."," prediction = predict(model, target)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",493,13,"style","Use <-, not =, for assignment."," tname = getTaskTargetNames(target)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",494,13,"style","Use <-, not =, for assignment."," tdata = getTaskData(target)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",495,22,"style","Use <-, not =, for assignment."," tdata[[tname]] = factor(prediction$data$response == prediction$data$truth)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",499,5,"style","Variable and function name style should be snake_case or symbols."," cpo.train.invert = function(data) {","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",499,22,"style","Use <-, not =, for assignment."," cpo.train.invert = function(data) {","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",501,18,"style","Use <-, not =, for assignment."," prediction = predict(model, newdata = data)$data","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",505,18,"style","Use <-, not =, for assignment."," outmat = as.matrix(prediction[grep(""^prob\\."", names(prediction))])","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",506,18,"style","Use <-, not =, for assignment."," revmat = outmat[, c(2, 1)]","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",511,11,"style","Variable and function name style should be snake_case or symbols."," numeric.prediction = as.numeric(prediction$response)","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",511,30,"style","Use <-, not =, for assignment."," numeric.prediction = as.numeric(prediction$response)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",512,11,"style","Variable and function name style should be snake_case or symbols."," numeric.res = ifelse(target == ""TRUE"",","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",512,23,"style","Use <-, not =, for assignment."," numeric.res = ifelse(target == ""TRUE"",","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",517,10,"style","Trailing whitespace is superfluous."," } ","trailing_whitespace_linter" -"vignettes/a_4_custom_CPOs.Rmd",543,17,"style","Use <-, not =, for assignment."," target[[1]] = target[[1]] - control","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",546,47,"style","Variable and function name style should be snake_case or symbols."," cpo.invert = function(target, predict.type, control.invert) {","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",550,5,"style","Use <-, not =, for assignment.","cpo = xmpRegCenter()","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",555,1,"style","Variable and function name style should be snake_case or symbols.","train.task = subsetTask(bh.task, 150:155)","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",555,12,"style","Use <-, not =, for assignment.","train.task = subsetTask(bh.task, 150:155)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",559,14,"style","Use <-, not =, for assignment.","predict.task = subsetTask(bh.task, 156:160)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",565,7,"style","Use <-, not =, for assignment.","trafd = train.task %>>% cpo","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",574,6,"style","Use <-, not =, for assignment.","retr = retrafo(trafd)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",575,14,"style","Use <-, not =, for assignment.","predict.traf = predict.task %>>% retr","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",581,7,"style","Use <-, not =, for assignment.","model = train(""regr.lm"", trafd)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",582,6,"style","Use <-, not =, for assignment.","pred = predict(model, predict.traf)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",591,7,"style","Use <-, not =, for assignment.","model = train(""regr.lm"", train.task)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",618,17,"style","Use <-, not =, for assignment."," target[[1]] = log(target[[1]])","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",625,5,"style","Use <-, not =, for assignment.","cpo = xmpLogRegr()","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",630,7,"style","Use <-, not =, for assignment.","trafd = train.task %>>% cpo","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",635,6,"style","Use <-, not =, for assignment.","retr = retrafo(trafd)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",636,14,"style","Use <-, not =, for assignment.","predict.traf = predict.task %>>% retr","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",641,7,"style","Use <-, not =, for assignment.","model = train(""regr.lm"", trafd)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",642,6,"style","Use <-, not =, for assignment.","pred = predict(model, predict.traf)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",670,17,"style","Use <-, not =, for assignment."," target[[1]] = target[[1]] + 1","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",671,13,"style","Use <-, not =, for assignment."," control = ""control created in cpo.trafo""","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",672,5,"style","Variable and function name style should be snake_case or symbols."," control.invert = ""control.invert created in cpo.trafo""","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",672,20,"style","Use <-, not =, for assignment."," control.invert = ""control.invert created in cpo.trafo""","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",677,5,"style","Variable and function name style should be snake_case or symbols."," control.invert = ""control.invert created in cpo.retrafo""","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",677,20,"style","Use <-, not =, for assignment."," control.invert = ""control.invert created in cpo.retrafo""","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",680,19,"style","Use <-, not =, for assignment."," target[[1]] = target[[1]] - 1","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",683,81,"style","Lines should not be more than 80 characters."," cat(""target is NULL, no transformation (but control.invert was created)\n"")","line_length_linter" -"vignettes/a_4_custom_CPOs.Rmd",687,33,"style","Variable and function name style should be snake_case or symbols."," cpo.invert = function(target, control.invert, predict.type) {","object_name_linter" -"vignettes/a_4_custom_CPOs.Rmd",693,5,"style","Use <-, not =, for assignment.","cpo = xmpSynCPO()","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",698,7,"style","Use <-, not =, for assignment.","trafd = train.task %>>% cpo","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",703,9,"style","Use <-, not =, for assignment.","retrafd = train.task %>>% retrafo(trafd)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",711,9,"style","Use <-, not =, for assignment.","retrafd = getTaskData(train.task, target.extra = TRUE)$data %>>% retrafo(trafd)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",717,5,"style","Use <-, not =, for assignment.","inv = invert(inverter(trafd), 1:6)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",720,5,"style","Use <-, not =, for assignment.","inv = invert(inverter(retrafd), 1:6)","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",727,9,"style","Use <-, not =, for assignment.","oscipen = options(""scipen"")","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",731,10,"style","Use <-, not =, for assignment.","learners = list(","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",741,7,"style","Use <-, not =, for assignment.","perfs = sapply(learners, function(lrn) {","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",753,7,"style","Use <-, not =, for assignment.","pvals = c(","assignment_linter" -"vignettes/a_4_custom_CPOs.Rmd",754,75,"style","Trailing whitespace is superfluous."," logreg = t.test(perfs[, ""logreg""], perfs[, ""cpo""], ""greater"")$p.value, ","trailing_whitespace_linter" -"vignettes/z_1_getting_started_terse.Rmd",13,81,"style","Lines should not be more than 80 characters.","cat(knitr::knit_child(""a_1_getting_started.Rmd"", options = list(eval = FALSE)), sep = ""\n"")","line_length_linter" -"vignettes/z_2_mlrCPO_core_terse.Rmd",13,81,"style","Lines should not be more than 80 characters.","cat(knitr::knit_child(""a_2_mlrCPO_core.Rmd"", options = list(eval = FALSE)), sep = ""\n"")","line_length_linter" -"vignettes/z_3_all_CPOs_terse.Rmd",13,81,"style","Lines should not be more than 80 characters.","cat(knitr::knit_child(""a_3_all_CPOs.Rmd"", options = list(eval = FALSE)), sep = ""\n"")","line_length_linter" -"vignettes/z_4_custom_CPOs_terse.Rmd",13,81,"style","Lines should not be more than 80 characters.","cat(knitr::knit_child(""a_4_custom_CPOs.Rmd"", options = list(eval = FALSE)), sep = ""\n"")","line_length_linter" diff --git a/.dev/revdep_emails/mlrCPO/email-body b/.dev/revdep_emails/mlrCPO/email-body deleted file mode 100644 index ff82ad381..000000000 --- a/.dev/revdep_emails/mlrCPO/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Martin Binder! Thank you for using {lintr} in your package {mlrCPO}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/mlr-org/mlrCPO (hash: b7736cb7a8dc1b31c3a65fb574053aec37bd4810) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 234s on CRAN vs. 111s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/modules/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/modules/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index f1e08b6de..000000000 --- a/.dev/revdep_emails/modules/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,12 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/module-helper.R",49,5,"style","Either both or neither branch in `if`/`else` should use curly braces."," else {","brace_linter" -"vignettes/modulesAsObjects.Rmd",63,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/modulesAsObjects.Rmd",83,5,"warning","local variable β€˜fun’ assigned but may not be used"," fun <- function() param","object_usage_linter" -"vignettes/modulesAsObjects.Rmd",95,5,"warning","local variable β€˜fun’ assigned but may not be used"," fun <- function() param","object_usage_linter" -"vignettes/modulesAsObjects.Rmd",122,1,"style","Variable and function name style should be camelCase.","B <- function(a) {","object_name_linter" -"vignettes/modulesAsObjects.Rmd",124,5,"warning","local variable β€˜foo’ assigned but may not be used"," foo <- function() a$foo()","object_usage_linter" -"vignettes/modulesAsObjects.Rmd",194,1,"style","Variable and function name style should be camelCase.","A <- function() {","object_name_linter" -"vignettes/modulesAsObjects.Rmd",196,5,"warning","local variable β€˜foo’ assigned but may not be used"," foo <- function() ""foo""","object_usage_linter" -"vignettes/modulesAsObjects.Rmd",200,1,"style","Variable and function name style should be camelCase.","B <- function(a) {","object_name_linter" -"vignettes/modulesAsObjects.Rmd",203,5,"warning","local variable β€˜bar’ assigned but may not be used"," bar <- function() ""bar""","object_usage_linter" -"vignettes/modulesInR.Rmd",12,91,"style","Lines should not be more than 90 characters.","cat(gsub(""\\n "", """", packageDescription(""modules"", fields = ""Description"", encoding = NA)))","line_length_linter" diff --git a/.dev/revdep_emails/modules/attachments/modules.warnings b/.dev/revdep_emails/modules/attachments/modules.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/modules/attachments/modules.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/modules/email-body b/.dev/revdep_emails/modules/email-body deleted file mode 100644 index fcd0f2dd0..000000000 --- a/.dev/revdep_emails/modules/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Sebastian Warnholz! Thank you for using {lintr} in your package {modules}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/wahani/modules (hash: 911b43715690bde8edf5a614932689b4a5aa9bc1) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 17s on CRAN vs. 10s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/nLTT/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/nLTT/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index cb4447ed8..000000000 --- a/.dev/revdep_emails/nLTT/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,2 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"vignettes/nltt_diff.Rmd",84,45,"style","Compound semicolons are discouraged. Replace them by a newline.","nLTT::nltt_plot(phylogeny_1, ylim = c(0, 1)); nLTT::nltt_lines(phylogeny_2)","semicolon_linter" diff --git a/.dev/revdep_emails/nLTT/email-body b/.dev/revdep_emails/nLTT/email-body deleted file mode 100644 index 90ec2b2d2..000000000 --- a/.dev/revdep_emails/nLTT/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Thijs Janzen! Thank you for using {lintr} in your package {nLTT}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/thijsjanzen/nLTT (hash: 5b66bdb4384fa7deed4100c6fac5b049a972ff37) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 22s on CRAN vs. 14s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/newsmd/email-body b/.dev/revdep_emails/newsmd/email-body deleted file mode 100644 index 17db4eff0..000000000 --- a/.dev/revdep_emails/newsmd/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Jakob Gepp! Thank you for using {lintr} in your package {newsmd}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/Dschaykib/newsmd (hash: a5683da1d49acd6a4720bf5d01579a99657b4b62) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 3s on CRAN vs. 2s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/openbankeR/attachments/openbankeR.warnings b/.dev/revdep_emails/openbankeR/attachments/openbankeR.warnings deleted file mode 100644 index 5602e2ffd..000000000 --- a/.dev/revdep_emails/openbankeR/attachments/openbankeR.warnings +++ /dev/null @@ -1,68 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Linter closed_curly_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. -Trying to remove β€˜open_curly_linter’, β€˜undesirable_function_linter’, β€˜undesirable_operator_linter’ and β€˜todo_comment_linter’, which are not in `defaults`. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. -Linter paren_brace_linter was deprecated in lintr version 2.0.1.9001. Use brace_linter instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. - Passing linters as variables was deprecated in lintr version 2.0.1.9001. Use a call to the linters (see ?linters) instead. diff --git a/.dev/revdep_emails/openbankeR/email-body b/.dev/revdep_emails/openbankeR/email-body deleted file mode 100644 index d8e520dd7..000000000 --- a/.dev/revdep_emails/openbankeR/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Nik Lilovski! Thank you for using {lintr} in your package {openbankeR}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/nik01010/openbankeR (hash: 4cb40cffd95dd984130ffa1cd8fe0ecd52e1252e) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 2s on CRAN vs. 2s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/osfr/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/osfr/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 56b534d6a..000000000 --- a/.dev/revdep_emails/osfr/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,8 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"data-raw/create-test-project.R",40,1,"style","Variable and function name style should be snake_case or symbols.","dev.null <- mapply(","object_name_linter" -"R/osf_tbl-compat.R",9,32,"style","Variable and function name style should be snake_case or symbols.","rbind.osf_tbl <- function(..., deparse.level = 1) {","object_name_linter" -"R/osf_tbl.R",77,23,"style","Any function spanning multiple lines should use curly braces.","as_osf_tbl.default <- function(x, subclass = NULL)","brace_linter" -"R/osf_tbl.R",92,3,"warning","local variable β€˜name_field’ assigned but may not be used"," name_field <- switch(subclass,","object_usage_linter" -"R/utils-file-operations.R",34,15,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (verbose & action == ""move"") message(sprintf(""Moved '%s' to '%s'."", x$name, to$name))","vector_logic_linter" -"R/utils-file-operations.R",35,15,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (verbose & action == ""copy"") message(sprintf(""Copied '%s' to '%s'."", x$name, to$name))","vector_logic_linter" -"R/utils-uploads.R",21,3,"warning","local variable β€˜msg’ assigned but may not be used"," msg <- bullet_msg(","object_usage_linter" diff --git a/.dev/revdep_emails/osfr/attachments/osfr.warnings b/.dev/revdep_emails/osfr/attachments/osfr.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/osfr/attachments/osfr.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/osfr/email-body b/.dev/revdep_emails/osfr/email-body deleted file mode 100644 index 6df95963a..000000000 --- a/.dev/revdep_emails/osfr/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Aaron Wolen! Thank you for using {lintr} in your package {osfr}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/ropensci/osfr (hash: 7d38bed19c0ed0259ce3fc8d8c0b6b4f5ef96bce) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 38s on CRAN vs. 23s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/packager/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/packager/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index cda5a9cc8..000000000 --- a/.dev/revdep_emails/packager/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,5 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/templates/zzz.R",1,1,"style","Variable and function name style should be snake_case.",".onLoad <- function(libname, pkgname) {","object_name_linter" -"R/devtools.R",395,7,"style","Variable and function name style should be snake_case."," pkg$Rmd <- TRUE","object_name_linter" -"R/remotes_modified.R",2,1,"style","Variable and function name style should be snake_case.","`%::%` <- function(p, f) get(f, envir = asNamespace(p))","object_name_linter" -"R/zzz.R",1,1,"style","Variable and function name style should be snake_case.",".onLoad <- function(libname, pkgname) {","object_name_linter" diff --git a/.dev/revdep_emails/packager/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/packager/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 5c0411512..000000000 --- a/.dev/revdep_emails/packager/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,29 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/files/An_Introduction_to_packager.Rmd",69,72,"style","Trailing whitespace is superfluous.","if (""myFirstPackage"" %in% .packages()) detach(""package:myFirstPackage"", ","trailing_whitespace_linter" -"inst/files/An_Introduction_to_packager.Rmd",80,76,"style","Trailing whitespace is superfluous.","a <- utils::person(given = ""Your"", family = ""Name"", email = ""some@whe.re"", ","trailing_whitespace_linter" -"inst/files/An_Introduction_to_packager.Rmd",99,71,"style","Trailing whitespace is superfluous.","help_file <- system.file(""man"", paste0(package_title, ""-package.Rd""), ","trailing_whitespace_linter" -"inst/files/An_Introduction_to_packager.Rmd",101,18,"style","Only use double-quotes.","captured <- gsub('_\b', '', capture.output(tools:::Rd2txt(help_file) ))","single_quotes_linter" -"inst/files/An_Introduction_to_packager.Rmd",101,25,"style","Only use double-quotes.","captured <- gsub('_\b', '', capture.output(tools:::Rd2txt(help_file) ))","single_quotes_linter" -"inst/files/An_Introduction_to_packager.Rmd",101,70,"style","Do not place spaces before parentheses.","captured <- gsub('_\b', '', capture.output(tools:::Rd2txt(help_file) ))","spaces_inside_linter" -"inst/files/An_Introduction_to_packager.Rmd",143,39,"style","Trailing whitespace is superfluous.","suppressMessages(withr::with_dir(path, ","trailing_whitespace_linter" -"inst/files/An_Introduction_to_packager.Rmd",144,68,"style","Trailing whitespace is superfluous."," print(fakemake::make(""build"", ml, ","trailing_whitespace_linter" -"inst/files/An_Introduction_to_packager.Rmd",171,39,"style","Trailing whitespace is superfluous.","suppressMessages(withr::with_dir(path, ","trailing_whitespace_linter" -"inst/files/An_Introduction_to_packager.Rmd",172,67,"style","Trailing whitespace is superfluous."," print(fakemake::make(""check"", ml, ","trailing_whitespace_linter" -"inst/files/An_Introduction_to_packager.Rmd",199,81,"style","Lines should not be more than 80 characters.","system.time(withr::with_dir(path, print(fakemake::make(""check"", ml, verbose = FALSE))))","line_length_linter" -"inst/files/An_Introduction_to_packager.Rmd",210,81,"style","Lines should not be more than 80 characters.","withr::with_dir(path, print(fakemake::make(""cran_comments"", ml, verbose = FALSE)))","line_length_linter" -"inst/files/An_Introduction_to_packager.Rmd",223,56,"style","Trailing whitespace is superfluous.","packager::git_add_commit(path = path, untracked = TRUE, ","trailing_whitespace_linter" -"inst/files/An_Introduction_to_packager.Rmd",246,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" -"inst/runit_tests/test_internal.R",51,23,"style","Any function spanning multiple lines should use curly braces.","test_warn_and_stop <- function()","brace_linter" -"inst/templates/README.Rmd",37,20,"style","Only use double-quotes."," captured <- gsub('_\b', '', capture.output(tools:::Rd2txt(help_file) ))","single_quotes_linter" -"inst/templates/README.Rmd",37,27,"style","Only use double-quotes."," captured <- gsub('_\b', '', capture.output(tools:::Rd2txt(help_file) ))","single_quotes_linter" -"inst/templates/README.Rmd",37,72,"style","Do not place spaces before parentheses."," captured <- gsub('_\b', '', capture.output(tools:::Rd2txt(help_file) ))","spaces_inside_linter" -"R/convert_vignette.R",76,24,"style","Any function spanning multiple lines should use curly braces.","convert_code_blocks <- function(lines)","brace_linter" -"R/devtools.R",478,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/devtools.R",532,7,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/devtools.R",536,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/git.R",55,20,"style","Any function spanning multiple lines should use curly braces."," function(x)","brace_linter" -"R/internal.R",110,16,"style","Variable and function name style should be snake_case or symbols."," substr(Rdep, start, stop) <- paste(numeric_version, collapse = ""."")","object_name_linter" -"R/remotes_modified.R",8,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/upload_cran.R",24,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/usethis.R",92,5,"style","`else` should come on the same line as the previous `}`."," else if (delta == 0 && !is.null(min_version)) {","brace_linter" -"R/usethis.R",101,5,"style","`else` should come on the same line as the previous `}`."," else if (delta > 0) {","brace_linter" diff --git a/.dev/revdep_emails/packager/attachments/packager.warnings b/.dev/revdep_emails/packager/attachments/packager.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/packager/attachments/packager.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/packager/email-body b/.dev/revdep_emails/packager/email-body deleted file mode 100644 index 1422622dd..000000000 --- a/.dev/revdep_emails/packager/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Andreas Dominik Cullmann! Thank you for using {lintr} in your package {packager}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://gitlab.com/fvafrCU/packager (hash: 6d347e64d33669689d0022577f32beeb91241951) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 43s on CRAN vs. 23s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/physiology/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/physiology/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index e58e63851..000000000 --- a/.dev/revdep_emails/physiology/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,58 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/JOSS/paper.Rmd",14,33,"style","Trailing whitespace is superfluous.","egfr(creatinine_mgdl_to_uM(1.4), ","trailing_whitespace_linter" -"inst/JOSS/paper.Rmd",17,19,"style","Trailing whitespace is superfluous."," male = FALSE, ","trailing_whitespace_linter" -"inst/JOSS/paper.Rmd",25,54,"style","Trailing whitespace is superfluous."," #Height = c(seq.default(1.2, 1.8, by = 0.2)), ","trailing_whitespace_linter" -"inst/JOSS/paper.Rmd",33,57,"style","Trailing whitespace is superfluous."," height_m = as.integer(x[""Height""]), ","trailing_whitespace_linter" -"inst/JOSS/paper.Rmd",35,49,"style","Trailing whitespace is superfluous."," male = x[""Male""] == ""Male"", ","trailing_whitespace_linter" -"inst/JOSS/paper.Rmd",36,52,"style","Closing curly-braces should always be on their own line, unless they are followed by an else."," black = x[""Black""] == ""Black"")}","brace_linter" -"inst/JOSS/paper.Rmd",40,38,"style","Trailing whitespace is superfluous.","ggplot(plt, aes(x = Age, y = eGFR)) + ","trailing_whitespace_linter" -"inst/JOSS/paper.Rmd",41,21,"style","Trailing whitespace is superfluous."," geom_col() + ","trailing_whitespace_linter" -"R/bmi.R",30,23,"style","Any function spanning multiple lines should use curly braces.","ideal_weight_adult <- function(height_m, male, ...)","brace_linter" -"R/bmi.R",35,23,"style","Any function spanning multiple lines should use curly braces.","ideal_weight_child <- function(height_m, age_y = NULL, ...)","brace_linter" -"R/bmi.R",79,24,"style","Any function spanning multiple lines should use curly braces.","ideal_weight_Devine <- function(height_m, male, ...)","brace_linter" -"R/bmi.R",89,26,"style","Any function spanning multiple lines should use curly braces.","ideal_weight_Robinson <- function(height_m, male, ...)","brace_linter" -"R/bmi.R",99,24,"style","Any function spanning multiple lines should use curly braces.","ideal_weight_Miller <- function(height_m, male, ...)","brace_linter" -"R/bmi.R",108,23,"style","Any function spanning multiple lines should use curly braces.","ideal_weight_Broca <- function(height_m, male, ...)","brace_linter" -"R/deadspace.R",87,31,"style","Any function spanning multiple lines should use curly braces.","deadspace_intrathoracic_ml <- function(ideal_weight_kg)","brace_linter" -"R/eGFR.R",208,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (any(ret > 60) & warn_ckdepi_preferred)","vector_logic_linter" -"R/eGFR.R",248,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (any(ret < 60) & warn_mdrd_preferred) {","vector_logic_linter" -"R/physics.R",5,16,"style","Any function spanning multiple lines should use curly braces.","temp_c_to_k <- function(temp_c)","brace_linter" -"R/physics.R",12,18,"style","Any function spanning multiple lines should use curly braces.","svp_sea_level <- function(temp_k)","brace_linter" -"R/valid.R",86,20,"style","Any function spanning multiple lines should use curly braces.","valid_age_adult <- function(age_y, age_min = 18, age_max = 150,","brace_linter" -"R/valid.R",106,42,"style","Put spaces around all infix operators."," scr_min_hard=0, scr_max_hard = 4000,","infix_spaces_linter" -"tests/testthat/test-bmi.R",25,54,"style","Use FALSE instead of the symbol F."," expect_equal(ideal_weight_adult(60 / inch, male = F), 45.5)","T_and_F_symbol_linter" -"tests/testthat/test-bmi.R",207,42,"style","Use TRUE instead of the symbol T."," expect_error(do.call(f, list(male = T)), info = f)","T_and_F_symbol_linter" -"tests/testthat/test-bmi.R",213,64,"style","Use TRUE instead of the symbol T."," expect_error(do.call(f, list(height_m = c(1.5, 2), male = T)), info = f)","T_and_F_symbol_linter" -"tests/testthat/test-bmi.R",214,58,"style","Use TRUE instead of the symbol T."," expect_error(do.call(f, list(height_m = 2, male = c(T, F))), info = f)","T_and_F_symbol_linter" -"tests/testthat/test-bmi.R",214,61,"style","Use FALSE instead of the symbol F."," expect_error(do.call(f, list(height_m = 2, male = c(T, F))), info = f)","T_and_F_symbol_linter" -"tests/testthat/test-bmi.R",216,61,"style","Use TRUE instead of the symbol T."," expect_error(do.call(f, list(height_m = NULL, male = c(T, F))), info = f)","T_and_F_symbol_linter" -"tests/testthat/test-bmi.R",216,64,"style","Use FALSE instead of the symbol F."," expect_error(do.call(f, list(height_m = NULL, male = c(T, F))), info = f)","T_and_F_symbol_linter" -"tests/testthat/test-bmi.R",217,65,"style","Use TRUE instead of the symbol T."," expect_error(do.call(f, list(height_m = c(1.5, NA), male = T)), info = f)","T_and_F_symbol_linter" -"tests/testthat/test-bmi.R",218,62,"style","Use TRUE instead of the symbol T."," expect_error(do.call(f, list(height_m = 2, male = c(NA, T))), info = f)","T_and_F_symbol_linter" -"tests/testthat/test-bmi.R",219,59,"style","Use FALSE instead of the symbol F."," expect_error(do.call(f, list(height_m = NULL, male = F)), info = f)","T_and_F_symbol_linter" -"tests/testthat/test-bmi.R",226,46,"style","Use TRUE instead of the symbol T."," do.call(f, list(height_m = -1, male = T, do.stop = TRUE)), info = f)","T_and_F_symbol_linter" -"tests/testthat/test-bmi.R",228,46,"style","Use TRUE instead of the symbol T."," do.call(f, list(height_m = 0, male = T, do.stop = TRUE)), info = f)","T_and_F_symbol_linter" -"tests/testthat/test-bmi.R",236,45,"style","Use TRUE instead of the symbol T."," do.call(f, list(height_m = 8, male = T, do.stop = TRUE)), info = f)","T_and_F_symbol_linter" -"vignettes/Everest.Rmd",37,8,"style","Use <-, not =, for assignment.","temp_k = temp_c_to_k(37)","assignment_linter" -"vignettes/Everest.Rmd",45,18,"style","Use <-, not =, for assignment.","pres_atm_everest = 760 * pres_atm_frac(8850)","assignment_linter" -"vignettes/Everest.Rmd",51,19,"style","Trailing whitespace is superfluous."," PACO2_mmHg = 40, ","trailing_whitespace_linter" -"vignettes/Everest.Rmd",63,35,"style","Trailing whitespace is superfluous."," PACO2_mmHg = PACO2_mmHg_Grocott, ","trailing_whitespace_linter" -"vignettes/Everest.Rmd",76,35,"style","Trailing whitespace is superfluous."," PACO2_mmHg = PACO2_mmHg_Grocott, ","trailing_whitespace_linter" -"vignettes/Everest.Rmd",81,35,"style","Trailing whitespace is superfluous."," PACO2_mmHg = PACO2_mmHg_Grocott, ","trailing_whitespace_linter" -"vignettes/Everest.Rmd",92,43,"style","Trailing whitespace is superfluous.","results <- c(""sea\nlevel"" = PAO2_sealevel, ","trailing_whitespace_linter" -"vignettes/Everest.Rmd",93,54,"style","Trailing whitespace is superfluous."," ""summit\nresting"" = PAO2_summit_resting, ","trailing_whitespace_linter" -"vignettes/Everest.Rmd",94,55,"style","Trailing whitespace is superfluous."," ""summit\nexertion"" = PAO2_summit_exerted, ","trailing_whitespace_linter" -"vignettes/Everest.Rmd",95,56,"style","Trailing whitespace is superfluous."," ""summit\nfatty diet"" = PAO2_summit_lipids, ","trailing_whitespace_linter" -"vignettes/Everest.Rmd",98,17,"style","Trailing whitespace is superfluous.","barplot(results, ","trailing_whitespace_linter" -"vignettes/IdealWeightComparison.Rmd",19,14,"style","Use TRUE instead of the symbol T.","male <- rep(T, times = length(hts))","T_and_F_symbol_linter" -"vignettes/NeonatalVentilation.Rmd",36,23,"style","Trailing whitespace is superfluous."," childsds::who.ref, ","trailing_whitespace_linter" -"vignettes/NeonatalVentilation.Rmd",39,18,"style","Trailing whitespace is superfluous."," stack = TRUE, ","trailing_whitespace_linter" -"vignettes/NeonatalVentilation.Rmd",42,36,"style","Trailing whitespace is superfluous."," dplyr::rename(weight = value) %>% ","trailing_whitespace_linter" -"vignettes/NeonatalVentilation.Rmd",50,40,"style","Trailing whitespace is superfluous."," mutate(tidal_volume = 7 * weight) %>% ","trailing_whitespace_linter" -"vignettes/NeonatalVentilation.Rmd",53,41,"style","Trailing whitespace is superfluous.","plot(dat[c(""weight"", ""error_fraction"")], ","trailing_whitespace_linter" -"vignettes/NeonatalVentilation.Rmd",64,26,"style","Trailing whitespace is superfluous.","cleft_repair_deadspace <- ","trailing_whitespace_linter" -"vignettes/NeonatalVentilation.Rmd",66,40,"style","Trailing whitespace is superfluous."," elbow = FALSE, ","trailing_whitespace_linter" -"vignettes/NeonatalVentilation.Rmd",68,27,"style","Trailing whitespace is superfluous.","cleft_repair_deadspace2 <- ","trailing_whitespace_linter" -"vignettes/NeonatalVentilation.Rmd",70,40,"style","Trailing whitespace is superfluous."," elbow = FALSE, ","trailing_whitespace_linter" -"vignettes/NeonatalVentilation.Rmd",80,37,"style","Trailing whitespace is superfluous.","plot(dat$months, dat$equip_err_frac, ","trailing_whitespace_linter" -"vignettes/NeonatalVentilation.Rmd",93,27,"style","Put spaces around all infix operators.","axis(1, at = seq(0, 12, 12/6), labels = wts, line = 2)","infix_spaces_linter" diff --git a/.dev/revdep_emails/physiology/attachments/physiology.warnings b/.dev/revdep_emails/physiology/attachments/physiology.warnings deleted file mode 100644 index 182961f94..000000000 --- a/.dev/revdep_emails/physiology/attachments/physiology.warnings +++ /dev/null @@ -1,2 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. -Trying to remove β€˜camel_case_linter’, which is not in `defaults`. diff --git a/.dev/revdep_emails/physiology/email-body b/.dev/revdep_emails/physiology/email-body deleted file mode 100644 index b87e626f9..000000000 --- a/.dev/revdep_emails/physiology/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Jack O. Wasey! Thank you for using {lintr} in your package {physiology}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/jackwasey/physiology (hash: 2a2d8daff08e9fcf4f6aecf1559a665ff0b8aeee) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 21s on CRAN vs. 13s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/precommit/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/precommit/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 858073cfe..000000000 --- a/.dev/revdep_emails/precommit/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,8 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/hooks/exported/style-files.R",77,3,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" -"R/exec.R",207,5,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" -"R/release.R",46,3,"warning","local variable β€˜last_release’ assigned but may not be used"," last_release <- call_and_capture(""git"", ""tag -l --sort=-taggerdate"")$stdout[1]","object_usage_linter" -"R/release.R",49,3,"warning","local variable β€˜msg1’ assigned but may not be used"," msg1 <- glue::glue(""Release {new_version}, see NEWS.md for details."")","object_usage_linter" -"R/setup.R",193,7,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" -"R/zzz.R",1,1,"style","Variable and function name style should be snake_case.",".onLoad <- function(libname, pkgname) {","object_name_linter" -"tests/testthat/test-conda.R",157,7,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" diff --git a/.dev/revdep_emails/precommit/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/precommit/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index f79a2fb4a..000000000 --- a/.dev/revdep_emails/precommit/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,17 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/hooks/exported/deps-in-desc.R",9,3,"style","Use <-, not ->, for assignment.",""" -> doc","assignment_linter" -"inst/hooks/exported/lintr.R",11,3,"style","Use <-, not ->, for assignment.",""" -> doc","assignment_linter" -"inst/hooks/exported/readme-rmd-rendered.R",2,31,"warning","Conditional expressions require scalar logical operators (&& and ||)","if (file.exists(""README.Rmd"") & file.exists(""README.md"")) {","vector_logic_linter" -"inst/hooks/exported/roxygenize.R",22,3,"style","Use <-, not ->, for assignment.",""" -> doc","assignment_linter" -"inst/hooks/exported/spell-check.R",10,3,"style","Use <-, not ->, for assignment.",""" -> doc","assignment_linter" -"inst/hooks/exported/style-files.R",13,3,"style","Use <-, not ->, for assignment.","' -> doc","assignment_linter" -"inst/hooks/local/consistent-release-tag.R",8,3,"style","Use <-, not ->, for assignment.",""" -> doc","assignment_linter" -"R/call.R",13,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(command) != 1 | !inherits(command, ""character"")) {","vector_logic_linter" -"R/config.R",43,49,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!file_exists(fs::path(root, name_target)) | force) {","vector_logic_linter" -"R/install.R",3,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is_installed() | force) {","vector_logic_linter" -"tests/testthat/in/parsable-R-fail.Rmd",7,3,"error","unexpected numeric constant","1 1j1j ΓΆj1 ",NA -"tests/testthat/in/parsable-R-fail.Rmd",7,11,"style","Trailing whitespace is superfluous.","1 1j1j ΓΆj1 ","trailing_whitespace_linter" -"tests/testthat/in/parsable-R-success.Rmd",16,11,"error","unexpected numeric constant"," fas / fk 12 -",NA -"tests/testthat/in/parsable-R-success.Rmd",21,8,"style","Trailing whitespace is superfluous.","this is ","trailing_whitespace_linter" -"tests/testthat/in/parsable-R-success.Rmd",25,8,"style","Trailing whitespace is superfluous.","this is ","trailing_whitespace_linter" -"tests/testthat/in/parsable-R-success.Rmd",29,8,"style","Trailing whitespace is superfluous.","this is ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/precommit/email-body b/.dev/revdep_emails/precommit/email-body deleted file mode 100644 index 9a429ca21..000000000 --- a/.dev/revdep_emails/precommit/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Lorenz Walthert! Thank you for using {lintr} in your package {precommit}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/lorenzwalthert/precommit (hash: 5466ad513d4ca1f0f439cc49e4935870f5179488) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 32s on CRAN vs. 17s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/prettyB/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/prettyB/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 7bb0db986..000000000 --- a/.dev/revdep_emails/prettyB/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,23 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/barplot.R",33,23,"style","Compound semicolons are discouraged. Replace them by a newline."," args$height = height; args$width = width; args$space = space","semicolon_linter" -"R/barplot.R",33,43,"style","Compound semicolons are discouraged. Replace them by a newline."," args$height = height; args$width = width; args$space = space","semicolon_linter" -"R/barplot.R",34,29,"style","Compound semicolons are discouraged. Replace them by a newline."," args$names.arg = names.arg; args$legend.text = legend.text","semicolon_linter" -"R/barplot.R",35,23,"style","Compound semicolons are discouraged. Replace them by a newline."," args$beside = beside; args$horiz = horiz","semicolon_linter" -"R/barplot.R",36,25,"style","Compound semicolons are discouraged. Replace them by a newline."," args$density = density; args$angle = angle","semicolon_linter" -"R/barplot.R",41,17,"style","Compound semicolons are discouraged. Replace them by a newline."," args$xpd = xpd; args$log = log","semicolon_linter" -"R/barplot.R",42,29,"style","Compound semicolons are discouraged. Replace them by a newline."," args$axisnames = axisnames; args$cex.axis = cex.axis","semicolon_linter" -"R/boxplot.R",44,13,"style","Compound semicolons are discouraged. Replace them by a newline."," args$x = x; args$range = range; args$width = width","semicolon_linter" -"R/boxplot.R",44,33,"style","Compound semicolons are discouraged. Replace them by a newline."," args$x = x; args$range = range; args$width = width","semicolon_linter" -"R/boxplot.R",45,27,"style","Compound semicolons are discouraged. Replace them by a newline."," args$varwidth = varwidth; args$notch = notch; args$outline = outline","semicolon_linter" -"R/boxplot.R",45,47,"style","Compound semicolons are discouraged. Replace them by a newline."," args$varwidth = varwidth; args$notch = notch; args$outline = outline","semicolon_linter" -"R/boxplot.R",47,19,"style","Compound semicolons are discouraged. Replace them by a newline."," args$plot = plot; args$border = border; args$log = log","semicolon_linter" -"R/boxplot.R",47,41,"style","Compound semicolons are discouraged. Replace them by a newline."," args$plot = plot; args$border = border; args$log = log","semicolon_linter" -"R/boxplot.R",48,19,"style","Compound semicolons are discouraged. Replace them by a newline."," args$pars = pars; args$horizontal = horizontal; args$add = add","semicolon_linter" -"R/boxplot.R",48,49,"style","Compound semicolons are discouraged. Replace them by a newline."," args$pars = pars; args$horizontal = horizontal; args$add = add","semicolon_linter" -"R/boxplot.R",52,19,"style","Compound semicolons are discouraged. Replace them by a newline."," main = args$main; sub = args$sub","semicolon_linter" -"R/boxplot.R",97,29,"style","Compound semicolons are discouraged. Replace them by a newline."," args$xlim = name_axis$lim; args$ylim = number_axis$lim","semicolon_linter" -"R/boxplot.R",98,32,"style","Compound semicolons are discouraged. Replace them by a newline."," ticks_names = name_axis$ticks; ticks_numbers = number_axis$ticks","semicolon_linter" -"R/boxplot.R",114,19,"style","Compound semicolons are discouraged. Replace them by a newline."," args$yaxt = NULL; args$add = TRUE","semicolon_linter" -"vignettes/introduction.Rmd",10,52,"style","Do not place spaces before parentheses.","knitr::opts_chunk$set(results = ""hide"", echo = TRUE )","spaces_inside_linter" -"vignettes/introduction.Rmd",51,53,"style","Trailing whitespace is superfluous.","hist(y, main = ""Base Graphics"", sub = ""Sub heading"", ","trailing_whitespace_linter" -"vignettes/introduction.Rmd",121,41,"style","Trailing whitespace is superfluous.","boxplot_p(rnorm(100), horizontal = TRUE, ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/prettyB/attachments/prettyB.warnings b/.dev/revdep_emails/prettyB/attachments/prettyB.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/prettyB/attachments/prettyB.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/prettyB/email-body b/.dev/revdep_emails/prettyB/email-body deleted file mode 100644 index abf598063..000000000 --- a/.dev/revdep_emails/prettyB/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Colin Gillespie! Thank you for using {lintr} in your package {prettyB}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/jumpingrivers/prettyB (hash: 881a63a22e5010f35f43f48333550ec2d634bbff) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 6s on CRAN vs. 3s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/rBiasCorrection/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/rBiasCorrection/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 165042a71..000000000 --- a/.dev/revdep_emails/rBiasCorrection/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,110 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"data-raw/devstuffs.R",11,79,"style","Only use double-quotes."," person(""Lorenz A."", ""Kapsner"", email = ""lorenz.kapsner@gmail.com"", role = c('cre', 'aut', 'cph'),","single_quotes_linter" -"data-raw/devstuffs.R",11,81,"style","Lines should not be more than 80 characters."," person(""Lorenz A."", ""Kapsner"", email = ""lorenz.kapsner@gmail.com"", role = c('cre', 'aut', 'cph'),","line_length_linter" -"data-raw/devstuffs.R",11,86,"style","Only use double-quotes."," person(""Lorenz A."", ""Kapsner"", email = ""lorenz.kapsner@gmail.com"", role = c('cre', 'aut', 'cph'),","single_quotes_linter" -"data-raw/devstuffs.R",11,93,"style","Only use double-quotes."," person(""Lorenz A."", ""Kapsner"", email = ""lorenz.kapsner@gmail.com"", role = c('cre', 'aut', 'cph'),","single_quotes_linter" -"data-raw/devstuffs.R",43,2,"style","Commented code should be removed.","#usethis::use_gpl3_license(name=""Lorenz Kapsner"")","commented_code_linter" -"data-raw/devstuffs.R",46,53,"style","Put spaces around all infix operators.","usethis::use_package(""R"", min_version = ""2.10"", type=""Depends"")","infix_spaces_linter" -"data-raw/devstuffs.R",49,81,"style","Lines should not be more than 80 characters.","# https://cran.r-project.org/web/packages/data.table/vignettes/datatable-importing.html","line_length_linter" -"data-raw/devstuffs.R",50,40,"style","Put spaces around all infix operators.","usethis::use_package(""data.table"", type=""Imports"")","infix_spaces_linter" -"data-raw/devstuffs.R",51,37,"style","Put spaces around all infix operators.","usethis::use_package(""ggplot2"", type=""Imports"")","infix_spaces_linter" -"data-raw/devstuffs.R",52,38,"style","Put spaces around all infix operators.","usethis::use_package(""magrittr"", type=""Imports"")","infix_spaces_linter" -"data-raw/devstuffs.R",53,37,"style","Put spaces around all infix operators.","usethis::use_package(""polynom"", type=""Imports"")","infix_spaces_linter" -"data-raw/devstuffs.R",54,34,"style","Put spaces around all infix operators.","usethis::use_package(""nls2"", type=""Imports"")","infix_spaces_linter" -"data-raw/devstuffs.R",55,35,"style","Put spaces around all infix operators.","usethis::use_package(""stats"", type=""Imports"")","infix_spaces_linter" -"data-raw/devstuffs.R",56,42,"style","Put spaces around all infix operators.","usethis::use_package(""future.apply"", type=""Imports"")","infix_spaces_linter" -"data-raw/devstuffs.R",66,36,"style","Put spaces around all infix operators.","usethis::use_package(""ggpubr"", type=""Suggests"")","infix_spaces_linter" -"data-raw/devstuffs.R",70,3,"style","Commented code should be removed.","# tag <- ""master""","commented_code_linter" -"data-raw/devstuffs.R",71,3,"style","Commented code should be removed.","# devtools::install_github(repo = ""r-lib/testthat"", ref = tag, upgrade = ""always"")","commented_code_linter" -"data-raw/devstuffs.R",71,81,"style","Lines should not be more than 80 characters.","# devtools::install_github(repo = ""r-lib/testthat"", ref = tag, upgrade = ""always"")","line_length_linter" -"data-raw/devstuffs.R",72,3,"style","Commented code should be removed.","# # https://cran.r-project.org/web/packages/devtools/vignettes/dependencies.html","commented_code_linter" -"data-raw/devstuffs.R",73,3,"style","Commented code should be removed.","# desc::desc_set_remotes(paste0(""github::r-lib/testthat@"", tag), file = usethis::proj_get())","commented_code_linter" -"data-raw/devstuffs.R",73,81,"style","Lines should not be more than 80 characters.","# desc::desc_set_remotes(paste0(""github::r-lib/testthat@"", tag), file = usethis::proj_get())","line_length_linter" -"data-raw/devstuffs.R",133,3,"style","Commented code should be removed.","# experimental = ""../19_PCR-bias/data/example_data/type1/example_data_type1_experimentaldata.csv""","commented_code_linter" -"data-raw/devstuffs.R",133,81,"style","Lines should not be more than 80 characters.","# experimental = ""../19_PCR-bias/data/example_data/type1/example_data_type1_experimentaldata.csv""","line_length_linter" -"data-raw/devstuffs.R",134,3,"style","Commented code should be removed.","# calibration = ""../19_PCR-bias/data/example_data/type1/example_data_type1_calibrationdata.csv""","commented_code_linter" -"data-raw/devstuffs.R",134,81,"style","Lines should not be more than 80 characters.","# calibration = ""../19_PCR-bias/data/example_data/type1/example_data_type1_calibrationdata.csv""","line_length_linter" -"data-raw/devstuffs.R",136,1,"style","Variable and function name style should be snake_case or symbols.","example.data_experimental <- data.table::fread(""./tests/testthat/testdata/exp_type_1.csv"")","object_name_linter" -"data-raw/devstuffs.R",136,81,"style","Lines should not be more than 80 characters.","example.data_experimental <- data.table::fread(""./tests/testthat/testdata/exp_type_1.csv"")","line_length_linter" -"data-raw/devstuffs.R",137,1,"style","Variable and function name style should be snake_case or symbols.","example.data_calibration <- data.table::fread(""./tests/testthat/testdata/cal_type_1.csv"")","object_name_linter" -"data-raw/devstuffs.R",137,81,"style","Lines should not be more than 80 characters.","example.data_calibration <- data.table::fread(""./tests/testthat/testdata/cal_type_1.csv"")","line_length_linter" -"data-raw/devstuffs.R",139,3,"style","Commented code should be removed.","# vec <- colnames(example.data_experimental)","commented_code_linter" -"data-raw/devstuffs.R",140,3,"style","Commented code should be removed.","# vec <- vec[2:length(vec)]","commented_code_linter" -"data-raw/devstuffs.R",142,5,"style","Commented code should be removed.","# as.numeric(gsub(""\\,"", ""."", x))","commented_code_linter" -"data-raw/devstuffs.R",145,3,"style","Commented code should be removed.","# data.table::fwrite(example.data_experimental, ""./tests/testthat/testdata/exp_type_1.csv"")","commented_code_linter" -"data-raw/devstuffs.R",145,81,"style","Lines should not be more than 80 characters.","# data.table::fwrite(example.data_experimental, ""./tests/testthat/testdata/exp_type_1.csv"")","line_length_linter" -"data-raw/devstuffs.R",147,3,"style","Commented code should be removed.","# vec <- colnames(example.data_calibration)","commented_code_linter" -"data-raw/devstuffs.R",149,5,"style","Commented code should be removed.","# as.numeric(gsub(""\\,"", ""."", x))","commented_code_linter" -"data-raw/devstuffs.R",152,3,"style","Commented code should be removed.","# data.table::fwrite(example.data_calibration, ""./tests/testthat/testdata/cal_type_1.csv"")","commented_code_linter" -"data-raw/devstuffs.R",152,81,"style","Lines should not be more than 80 characters.","# data.table::fwrite(example.data_calibration, ""./tests/testthat/testdata/cal_type_1.csv"")","line_length_linter" -"data-raw/devstuffs.R",154,1,"style","Variable and function name style should be snake_case or symbols.","example.data_experimental <- rBiasCorrection::clean_dt(example.data_experimental,","object_name_linter" -"data-raw/devstuffs.R",154,81,"style","Lines should not be more than 80 characters.","example.data_experimental <- rBiasCorrection::clean_dt(example.data_experimental,","line_length_linter" -"data-raw/devstuffs.R",158,1,"style","Variable and function name style should be snake_case or symbols.","example.data_calibration <- rBiasCorrection::clean_dt(example.data_calibration,","object_name_linter" -"data-raw/devstuffs.R",164,1,"style","Variable and function name style should be snake_case or symbols.","example._plot.df_agg <- rBiasCorrection:::create_agg_df(","object_name_linter" -"data-raw/devstuffs.R",171,31,"style","Use FALSE instead of the symbol F."," internal = F,","T_and_F_symbol_linter" -"data-raw/devstuffs.R",172,32,"style","Use FALSE instead of the symbol F."," overwrite = F)","T_and_F_symbol_linter" -"data-raw/devstuffs.R",175,3,"style","Commented code should be removed.","# BiasCorrection(experimental = ""../19_PCR-bias/data/example_data/type1/example_data_type1_experimentaldata.csv"", calibration = ""../19_PCR-bias/data/example_data/type1/example_data_type1_calibrationdata.csv"", samplelocusname = ""Test"")","commented_code_linter" -"data-raw/devstuffs.R",175,81,"style","Lines should not be more than 80 characters.","# BiasCorrection(experimental = ""../19_PCR-bias/data/example_data/type1/example_data_type1_experimentaldata.csv"", calibration = ""../19_PCR-bias/data/example_data/type1/example_data_type1_calibrationdata.csv"", samplelocusname = ""Test"")","line_length_linter" -"data-raw/devstuffs.R",176,2,"style","Commented code should be removed.","#covr::package_coverage()","commented_code_linter" -"data-raw/devstuffs.R",177,2,"style","Commented code should be removed.","#lintr::lint_package()","commented_code_linter" -"data-raw/devstuffs.R",178,2,"style","Commented code should be removed.","#styler::style_pkg()","commented_code_linter" -"R/better_model.R",106,55,"style","Use FALSE instead of the symbol F."," ""SSE_cubic""), with = F]","T_and_F_symbol_linter" -"R/better_model.R",113,80,"style","Use FALSE instead of the symbol F."," x_dat <- statstable_post_hyperbolic[, c(""Name"", ""relative_error""), with = F]","T_and_F_symbol_linter" -"R/better_model.R",115,75,"style","Use FALSE instead of the symbol F."," y_dat <- statstable_post_cubic[, c(""Name"", ""relative_error""), with = F]","T_and_F_symbol_linter" -"R/better_model.R",119,28,"style","Use TRUE instead of the symbol T."," all = T,","T_and_F_symbol_linter" -"R/biascorrection.R",178,49,"style","Use TRUE instead of the symbol T."," data.table::fread(experimental, header = T),","T_and_F_symbol_linter" -"R/biascorrection.R",188,69,"style","Use TRUE instead of the symbol T."," cal_type_1 <- clean_dt(data.table::fread(calibration, header = T),","T_and_F_symbol_linter" -"R/biascorrection.R",278,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" -"R/biascorrection.R",376,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" -"R/biascorrection.R",485,60,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" -"R/biascorrection.R",490,60,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" -"R/clean_dt.R",125,36,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (description == ""calibration"" & type == ""1"") {","vector_logic_linter" -"R/clean_dt.R",153,60,"style","Use TRUE instead of the symbol T."," datatable <- datatable[rowSums(datatable[, -1], na.rm = T) != 0, ]","T_and_F_symbol_linter" -"R/clean_dt.R",161,34,"style","Use FALSE instead of the symbol F."," datatable[, vec_cal, with = F], na.rm = T","T_and_F_symbol_linter" -"R/clean_dt.R",161,46,"style","Use TRUE instead of the symbol T."," datatable[, vec_cal, with = F], na.rm = T","T_and_F_symbol_linter" -"R/clean_dt.R",173,43,"style","Use FALSE instead of the symbol F."," !is.na(datatable[, vec[-1], with = F])","T_and_F_symbol_linter" -"R/clean_dt.R",193,68,"style","Use TRUE instead of the symbol T."," datatable <- datatable[order(get(""CpG_count""), decreasing = T)]","T_and_F_symbol_linter" -"R/create_agg_df.R",20,59,"style","Use FALSE instead of the symbol F."," df <- datatable[, c(""true_methylation"", index), with = F]","T_and_F_symbol_linter" -"R/create_agg_df.R",32,41,"style","Use TRUE instead of the symbol T."," ""CpG"" = mean(get(""CpG""), na.rm = T),","T_and_F_symbol_linter" -"R/create_agg_df.R",33,45,"style","Use TRUE instead of the symbol T."," ""sd"" = stats::sd(get(""CpG""), na.rm = T)","T_and_F_symbol_linter" -"R/create_agg_df.R",50,54,"style","Use FALSE instead of the symbol F."," df <- datatable[, c(""sample_id"", index), with = F]","T_and_F_symbol_linter" -"R/create_agg_df.R",56,43,"style","Use TRUE instead of the symbol T."," ""CpG"" = mean(get(""CpG""), na.rm = T),","T_and_F_symbol_linter" -"R/create_agg_df.R",57,47,"style","Use TRUE instead of the symbol T."," ""sd"" = stats::sd(get(""CpG""), na.rm = T)","T_and_F_symbol_linter" -"R/create_agg_df.R",62,53,"style","Use FALSE instead of the symbol F."," df <- datatable[, c(""locus_id"", index), with = F]","T_and_F_symbol_linter" -"R/create_agg_df.R",67,43,"style","Use TRUE instead of the symbol T."," ""CpG"" = mean(get(""CpG""), na.rm = T),","T_and_F_symbol_linter" -"R/create_agg_df.R",68,47,"style","Use TRUE instead of the symbol T."," ""sd"" = stats::sd(get(""CpG""), na.rm = T)","T_and_F_symbol_linter" -"R/create_exampleplot.R",90,16,"style","Use FALSE instead of the symbol F."," parse = F","T_and_F_symbol_linter" -"R/createbarerrorplots.R",155,70,"style","Use FALSE instead of the symbol F."," stats_pre <- statstable_pre[, c(""Name"", ""relative_error""), with = F]","T_and_F_symbol_linter" -"R/createbarerrorplots.R",156,72,"style","Use FALSE instead of the symbol F."," stats_post <- statstable_post[, c(""Name"", ""relative_error""), with = F]","T_and_F_symbol_linter" -"R/createbarerrorplots.R",170,13,"style","Use FALSE instead of the symbol F."," sort = F,","T_and_F_symbol_linter" -"R/cubic.R",129,7,"warning","local variable β€˜ret’ assigned but may not be used"," ret <- nls2::nls2(CpG ~ cubic_eq_minmax(","object_usage_linter" -"R/cubic.R",171,62,"style","Use TRUE instead of the symbol T."," sse <- as.numeric(dat[, sum(get(""squared_error""), na.rm = T)])","T_and_F_symbol_linter" -"R/cubic.R",177,66,"style","Use TRUE instead of the symbol T."," tss <- as.numeric(dat[, sum(get(""squared_dist_mean""), na.rm = T)])","T_and_F_symbol_linter" -"R/hyperbolic.R",118,7,"warning","local variable β€˜ret’ assigned but may not be used"," ret <- nls2::nls2(CpG ~ hyperbolic_eq(","object_usage_linter" -"R/hyperbolic.R",231,7,"warning","local variable β€˜ret’ assigned but may not be used"," ret <- nls2::nls2(CpG ~ hyperbolic_eq_minmax(","object_usage_linter" -"R/hyperbolic.R",271,62,"style","Use TRUE instead of the symbol T."," sse <- as.numeric(dat[, sum(get(""squared_error""), na.rm = T)])","T_and_F_symbol_linter" -"R/hyperbolic.R",277,66,"style","Use TRUE instead of the symbol T."," tss <- as.numeric(dat[, sum(get(""squared_dist_mean""), na.rm = T)])","T_and_F_symbol_linter" -"R/hyperbolic.R",282,60,"style","Use TRUE instead of the symbol T."," , mean(get(""relative_error""), na.rm = T)],","T_and_F_symbol_linter" -"R/solving_equations.R",208,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (find_x[[k]] >= 0 & find_x[[k]] <= 100) {","vector_logic_linter" -"R/solving_equations.R",377,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (h_solv >= 0 & h_solv <= 100) {","vector_logic_linter" -"R/solving_equations.R",392,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (h_solv < 0 & h_solv > -10) {","vector_logic_linter" -"R/solving_equations.R",402,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (h_solv > 100 & h_solv < 110) {","vector_logic_linter" -"R/utils.R",118,32,"style","Use TRUE instead of the symbol T."," unlink(plotdir, recursive = T)","T_and_F_symbol_linter" -"R/utils.R",120,31,"style","Use TRUE instead of the symbol T."," unlink(csvdir, recursive = T)","T_and_F_symbol_linter" -"R/utils.R",149,52,"style","Use TRUE instead of the symbol T."," write(message_out, file = logfilename, append = T)","T_and_F_symbol_linter" -"R/utils.R",178,42,"style","Use FALSE instead of the symbol F."," row.names = F,","T_and_F_symbol_linter" -"tests/testthat/test-algorithm_minmax_FALSE_re.R",71,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" -"tests/testthat/test-algorithm_minmax_FALSE_re.R",106,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" -"tests/testthat/test-algorithm_minmax_FALSE.R",194,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" -"tests/testthat/test-algorithm_minmax_FALSE.R",276,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" -"tests/testthat/test-algorithm_minmax_TRUE_re.R",71,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" -"tests/testthat/test-algorithm_minmax_TRUE_re.R",106,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" -"tests/testthat/test-algorithm_minmax_TRUE.R",188,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" -"tests/testthat/test-algorithm_minmax_TRUE.R",265,58,"style","Use FALSE instead of the symbol F."," rv$choices_list <- rv$reg_stats[, c(""Name""), with = F","T_and_F_symbol_linter" -"tests/testthat/test-clean_dt.R",27,74,"style","Use TRUE instead of the symbol T."," exp_type_1 <- fread(""./testdata/exp_type_1_empty_col.csv"", header = T)","T_and_F_symbol_linter" -"tests/testthat/test-clean_dt.R",75,74,"style","Use TRUE instead of the symbol T."," exp_type_2 <- fread(""./testdata/exp_type_2_empty_col.csv"", header = T)","T_and_F_symbol_linter" -"vignettes/rBiasCorrection_howto.Rmd",55,77,"style","Use FALSE instead of the symbol F.","temp_file <- rBiasCorrection::example.data_experimental$dat[, cols, with = F]","T_and_F_symbol_linter" -"vignettes/rBiasCorrection_howto.Rmd",58,76,"style","Use FALSE instead of the symbol F.","temp_file <- rBiasCorrection::example.data_calibration$dat[, cols, with = F]","T_and_F_symbol_linter" -"vignettes/rBiasCorrection_howto.Rmd",165,81,"style","Lines should not be more than 80 characters.","filename <- list.files(csvdir)[grepl(""regression_stats_[[:digit:]]"", list.files(csvdir))]","line_length_linter" -"vignettes/rBiasCorrection_howto.Rmd",167,25,"style","Commas should always have a space after.","knitr::kable(reg_stats[,1:9])","commas_linter" -"vignettes/rBiasCorrection_howto.Rmd",168,25,"style","Commas should always have a space after.","knitr::kable(reg_stats[,11:16])","commas_linter" diff --git a/.dev/revdep_emails/rBiasCorrection/attachments/rBiasCorrection.warnings b/.dev/revdep_emails/rBiasCorrection/attachments/rBiasCorrection.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/rBiasCorrection/attachments/rBiasCorrection.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/rBiasCorrection/email-body b/.dev/revdep_emails/rBiasCorrection/email-body deleted file mode 100644 index 347a1ffc6..000000000 --- a/.dev/revdep_emails/rBiasCorrection/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Lorenz A. Kapsner! Thank you for using {lintr} in your package {rBiasCorrection}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/kapsner/rBiasCorrection (hash: 5dc394c787399e7c0963b7e93435c5ad610fab3e) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 29s on CRAN vs. 12s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/rasterpdf/email-body b/.dev/revdep_emails/rasterpdf/email-body deleted file mode 100644 index 5347568fe..000000000 --- a/.dev/revdep_emails/rasterpdf/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Ilari Scheinin! Thank you for using {lintr} in your package {rasterpdf}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/ilarischeinin/rasterpdf (hash: defbefa078648608ae9310167fe07c29d39640c3) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 4s on CRAN vs. 2s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/rbokeh/email-body b/.dev/revdep_emails/rbokeh/email-body deleted file mode 100644 index 69aa7b888..000000000 --- a/.dev/revdep_emails/rbokeh/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Ryan Hafen! Thank you for using {lintr} in your package {rbokeh}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/bokeh/rbokeh (hash: f577cc16fb205ef12d2cf31d031fe6a1bb25e5e3) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 0s on CRAN vs. 0s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/rde/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/rde/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 04fab8175..000000000 --- a/.dev/revdep_emails/rde/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,12 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/load.R",65,26,"style","Variable and function name style should be snake_case or symbols."," load.fcn,","object_name_linter" -"R/save.R",100,5,"style","`else` should come on the same line as the previous `}`."," else if (length(r1) == 0 && length(r2) == 0) {","brace_linter" -"R/save.R",106,5,"style","`else` should come on the same line as the previous `}`."," else if (length(r2) == 0) {","brace_linter" -"vignettes/rde_tutorial.Rmd",48,1,"style","Variable and function name style should be snake_case or symbols.","pop.data <- read.csv(fname, stringsAsFactors = FALSE)","object_name_linter" -"vignettes/rde_tutorial.Rmd",74,1,"style","Variable and function name style should be snake_case or symbols.","pop.data <- load_rde_var(","object_name_linter" -"vignettes/rde_tutorial.Rmd",109,1,"style","Variable and function name style should be snake_case or symbols.","pop.data <- load_rde_var(","object_name_linter" -"vignettes/rde_tutorial.Rmd",116,81,"style","Lines should not be more than 80 characters."," rde1QlpoOTFBWSZTWQy+/kYAAIB3/v//6EJABRg/WlQv797wYkAAAMQiABBAACAAAZGwANk0RTKejU9T","line_length_linter" -"vignettes/rde_tutorial.Rmd",117,81,"style","Lines should not be more than 80 characters."," RoBoGgGjTRoBoGgaGymE0Kp+qemmkDNQ0YmJk0AA0xNADQNPUaA0JRhDTJoANAAAAAAAAEJx2Eja7QBK","line_length_linter" -"vignettes/rde_tutorial.Rmd",118,81,"style","Lines should not be more than 80 characters."," MKPPkRAx63wSAWt31AABs1zauhwHifs5WlltyIyQKAAAZEAZGQYMIZEA6ZAPHVMEB71jSCqdlsiR/eSY","line_length_linter" -"vignettes/rde_tutorial.Rmd",119,81,"style","Lines should not be more than 80 characters."," kzQkRq5RoXgvNNZnB5RSOvKaTGFtc/SXc74AhzqhMEJvdisEGVfo7UYngc0AwGqTvTHx8CBZTzE9OQZZ","line_length_linter" -"vignettes/rde_tutorial.Rmd",120,81,"style","Lines should not be more than 80 characters."," VY8KAhHAhrG4RCeilM0rXKkdpjGqyNgJwAkmnPQOMYrLlQ4YTIv0WyxfYdkd9WSWUsvggC/i7kinChIB","line_length_linter" diff --git a/.dev/revdep_emails/rde/email-body b/.dev/revdep_emails/rde/email-body deleted file mode 100644 index b4bd2adca..000000000 --- a/.dev/revdep_emails/rde/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Stefan Kloppenborg! Thank you for using {lintr} in your package {rde}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/kloppen/rde (hash: 6e25e635b0b152358065573a876e10620f0c82ac) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 5s on CRAN vs. 3s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/rdomains/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/rdomains/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 624736350..000000000 --- a/.dev/revdep_emails/rdomains/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,13 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"inst/doc/rdomains.Rmd",19,2,"style","Commented code should be removed.","#library(devtools)","commented_code_linter" -"inst/doc/rdomains.Rmd",120,17,"style","Put spaces around all infix operators.","alexa_cat(domain=""http://www.google.com"")[1,]","infix_spaces_linter" -"inst/doc/rdomains.Rmd",120,45,"style","Commas should always have a space after.","alexa_cat(domain=""http://www.google.com"")[1,]","commas_linter" -"R/alexa_cat.R",23,54,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (identical(Sys.getenv(""AWS_ACCESS_KEY_ID""), """") |","vector_logic_linter" -"R/get_alexa_data.R",16,34,"style","Put spaces around all infix operators.","get_alexa_data <- function(outdir=""."", overwrite=FALSE) {","infix_spaces_linter" -"R/get_alexa_data.R",16,49,"style","Put spaces around all infix operators.","get_alexa_data <- function(outdir=""."", overwrite=FALSE) {","infix_spaces_linter" -"R/get_alexa_data.R",20,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (file.exists(alexa_file) & overwrite == FALSE) {","vector_logic_linter" -"R/get_dmoz_data.R",22,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (file.exists(dmoz_file) & overwrite == FALSE) {","vector_logic_linter" -"R/get_shalla_data.R",23,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (overwrite == FALSE & file.exists(output_file)) {","vector_logic_linter" -"vignettes/rdomains.Rmd",19,2,"style","Commented code should be removed.","#library(devtools)","commented_code_linter" -"vignettes/rdomains.Rmd",120,17,"style","Put spaces around all infix operators.","alexa_cat(domain=""http://www.google.com"")[1,]","infix_spaces_linter" -"vignettes/rdomains.Rmd",120,45,"style","Commas should always have a space after.","alexa_cat(domain=""http://www.google.com"")[1,]","commas_linter" diff --git a/.dev/revdep_emails/rdomains/email-body b/.dev/revdep_emails/rdomains/email-body deleted file mode 100644 index 3247d8a27..000000000 --- a/.dev/revdep_emails/rdomains/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Gaurav Sood! Thank you for using {lintr} in your package {rdomains}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cran/rdomains (hash: 68724a883ad441abef0c95c0755144c643a09e51) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 8s on CRAN vs. 10s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/requiRements/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/requiRements/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index a278adbd1..000000000 --- a/.dev/revdep_emails/requiRements/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,20 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"data-raw/devstuffs.R",63,3,"style","Commented code should be removed.","# my_desc$set(""VignetteBuilder"" = ""knitr"")","commented_code_linter" -"data-raw/devstuffs.R",76,2,"style","Commented code should be removed.","#usethis::use_gpl3_license(name = ""UniversitΓ€tsklinikum Erlangen"")","commented_code_linter" -"data-raw/devstuffs.R",80,81,"style","Lines should not be more than 80 characters.","# Listing a package in either Depends or Imports ensures that it’s installed when needed","line_length_linter" -"data-raw/devstuffs.R",82,81,"style","Lines should not be more than 80 characters.","# Loading will load code, data and any DLLs; register S3 and S4 methods; and run the .onLoad() function.","line_length_linter" -"data-raw/devstuffs.R",83,81,"style","Lines should not be more than 80 characters.","## After loading, the package is available in memory, but because it’s not in the search path,","line_length_linter" -"data-raw/devstuffs.R",85,81,"style","Lines should not be more than 80 characters.","## Confusingly, :: will also load a package automatically if it isn’t already loaded.","line_length_linter" -"data-raw/devstuffs.R",86,81,"style","Lines should not be more than 80 characters.","## It’s rare to load a package explicitly, but you can do so with requireNamespace() or loadNamespace().","line_length_linter" -"data-raw/devstuffs.R",87,81,"style","Lines should not be more than 80 characters.","# Attaching puts the package in the search path. You can’t attach a package without first loading it,","line_length_linter" -"data-raw/devstuffs.R",95,3,"style","Commented code should be removed.","# usethis::use_package(""utils"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",97,3,"style","Commented code should be removed.","# usethis::use_package(""httr"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",98,3,"style","Commented code should be removed.","# usethis::use_package(""jsonlite"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",99,3,"style","Commented code should be removed.","# usethis::use_package(""rapportools"", type = ""Imports"")","commented_code_linter" -"data-raw/devstuffs.R",117,3,"style","Commented code should be removed.","# usethis::use_build_ignore(""NEWS.md"")","commented_code_linter" -"data-raw/devstuffs.R",147,3,"style","Commented code should be removed.","# covr::package_coverage()","commented_code_linter" -"data-raw/devstuffs.R",150,3,"style","Commented code should be removed.","# lintr::lint_package()","commented_code_linter" -"data-raw/devstuffs.R",153,3,"style","Commented code should be removed.","# devtools::test()","commented_code_linter" -"data-raw/devstuffs.R",156,3,"style","Commented code should be removed.","# rcmdcheck::rcmdcheck()","commented_code_linter" -"data-raw/devstuffs.R",157,3,"style","Commented code should be removed.","# rcmdcheck::rcmdcheck(args = ""--no-vignettes"", build_args = ""--no-build-vignettes"")","commented_code_linter" -"data-raw/devstuffs.R",157,81,"style","Lines should not be more than 80 characters.","# rcmdcheck::rcmdcheck(args = ""--no-vignettes"", build_args = ""--no-build-vignettes"")","line_length_linter" diff --git a/.dev/revdep_emails/requiRements/attachments/requiRements.warnings b/.dev/revdep_emails/requiRements/attachments/requiRements.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/requiRements/attachments/requiRements.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/requiRements/email-body b/.dev/revdep_emails/requiRements/email-body deleted file mode 100644 index 5f7437c97..000000000 --- a/.dev/revdep_emails/requiRements/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Jonathan M. Mang! Thank you for using {lintr} in your package {requiRements}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/joundso/requirements (hash: 35992b870e7656608dd20e4eb16dcb13ec61473a) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 1s on CRAN vs. 1s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/rhino/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/rhino/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index f7daa711e..000000000 --- a/.dev/revdep_emails/rhino/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,2 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/config.R",17,21,"style","Any function spanning multiple lines should use curly braces.","option_validator <- function(...) list(","brace_linter" diff --git a/.dev/revdep_emails/rhino/attachments/rhino.warnings b/.dev/revdep_emails/rhino/attachments/rhino.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/rhino/attachments/rhino.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/rhino/email-body b/.dev/revdep_emails/rhino/email-body deleted file mode 100644 index d8c7abea0..000000000 --- a/.dev/revdep_emails/rhino/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Kamil Zyla! Thank you for using {lintr} in your package {rhino}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/Appsilon/rhino (hash: 95b7260060ce069b8dfdb09c15047dc54ad27b06) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 9s on CRAN vs. 6s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/rnrfa/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/rnrfa/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 24aa9c6d7..000000000 --- a/.dev/revdep_emails/rnrfa/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,65 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/catalogue.R",84,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(column_name) & !is.null(column_value)) {","vector_logic_linter" -"R/catalogue.R",87,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(column_name) & is.null(column_value)) {","vector_logic_linter" -"R/catalogue.R",90,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(column_name) & !is.null(column_value)) {","vector_logic_linter" -"R/catalogue.R",99,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (condition_2 | condition_3 | condition_4) {","vector_logic_linter" -"R/catalogue.R",99,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (condition_2 | condition_3 | condition_4) {","vector_logic_linter" -"R/catalogue.R",101,11,"warning","local variable β€˜threshold’ assigned but may not be used"," threshold <- as.numeric(as.character(substr(column_value, 3,","object_usage_linter" -"R/catalogue.R",108,14,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/catalogue.R",118,12,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/catalogue.R",123,10,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/get_ts.R",71,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/get_ts.R",78,12,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/get_ts.R",79,77,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (type %in% c(""pot-stage"", ""pot-flow"", ""amax-stage"", ""amax-flow"") &","vector_logic_linter" -"R/get_ts.R",83,14,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/get_ts.R",89,10,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/get_ts.R",94,42,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (""SOCKcluster"" %in% class(cl) | ""cluster"" %in% class(cl)) {","vector_logic_linter" -"R/get_ts.R",103,14,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/get_ts.R",107,12,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/internals.R",90,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/internals.R",100,73,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (type %in% c(""pot-stage"", ""pot-flow"", ""amax-stage"", ""amax-flow"") &","vector_logic_linter" -"R/internals.R",143,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"R/osg_parse.R",67,26,"style","Put spaces around all infix operators."," padz <- function(x, n=max(nchar(x))) gsub("" "", ""0"", formatC(x, width = -n))","infix_spaces_linter" -"R/plot_rain_flow.R",44,55,"style","Use TRUE instead of the symbol T."," proportion <- ceiling((max(converted_flow, na.rm = T) -","T_and_F_symbol_linter" -"R/plot_rain_flow.R",45,57,"style","Use TRUE instead of the symbol T."," min(converted_flow, na.rm = T)) / 3)","T_and_F_symbol_linter" -"R/plot_rain_flow.R",54,35,"style","Use TRUE instead of the symbol T."," graphics::par(bty = ""n"", new = T)","T_and_F_symbol_linter" -"R/plot_rain_flow.R",57,49,"style","Use FALSE instead of the symbol F."," yaxt = ""n"", xaxt = ""n"", ann = F, # do not plot x and y axis","T_and_F_symbol_linter" -"R/plot_rain_flow.R",69,35,"style","Use FALSE instead of the symbol F."," graphics::par(bty = ""o"", new = F)","T_and_F_symbol_linter" -"R/seasonal_averages.R",28,8,"style","There should be a space before an opening curly brace."," }else{","brace_linter" -"tests/testthat.R",7,6,"style","There should be a space before an opening curly brace.","}else{","brace_linter" -"vignettes/rnrfa-vignette.Rmd",32,81,"style","Lines should not be more than 80 characters.","install.packages(c(""cowplot"", ""httr"", ""xts"", ""ggmap"", ""ggplot2"", ""sp"", ""rgdal"", ""parallel"", ""tibble""))","line_length_linter" -"vignettes/rnrfa-vignette.Rmd",70,1,"style","Variable and function name style should be snake_case or symbols.","allIDs <- station_ids()","object_name_linter" -"vignettes/rnrfa-vignette.Rmd",79,1,"style","Variable and function name style should be snake_case or symbols.","allStations <- catalogue()","object_name_linter" -"vignettes/rnrfa-vignette.Rmd",142,22,"style","Put spaces around all infix operators.","catalogue(column_name=""river"", column_value=""Wye"")","infix_spaces_linter" -"vignettes/rnrfa-vignette.Rmd",142,44,"style","Put spaces around all infix operators.","catalogue(column_name=""river"", column_value=""Wye"")","infix_spaces_linter" -"vignettes/rnrfa-vignette.Rmd",145,28,"style","Put spaces around all infix operators.","catalogue(bbox, column_name=""river"", column_value=""Wye"")","infix_spaces_linter" -"vignettes/rnrfa-vignette.Rmd",145,50,"style","Put spaces around all infix operators.","catalogue(bbox, column_name=""river"", column_value=""Wye"")","infix_spaces_linter" -"vignettes/rnrfa-vignette.Rmd",148,28,"style","Put spaces around all infix operators.","catalogue(bbox, column_name=""catchment-area"", column_value="">1"")","infix_spaces_linter" -"vignettes/rnrfa-vignette.Rmd",148,59,"style","Put spaces around all infix operators.","catalogue(bbox, column_name=""catchment-area"", column_value="">1"")","infix_spaces_linter" -"vignettes/rnrfa-vignette.Rmd",154,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/rnrfa-vignette.Rmd",156,22,"style","Put spaces around all infix operators.","catalogue(column_name=""id"", column_value=c(3001,3002,3003))","infix_spaces_linter" -"vignettes/rnrfa-vignette.Rmd",156,41,"style","Put spaces around all infix operators.","catalogue(column_name=""id"", column_value=c(3001,3002,3003))","infix_spaces_linter" -"vignettes/rnrfa-vignette.Rmd",156,49,"style","Commas should always have a space after.","catalogue(column_name=""id"", column_value=c(3001,3002,3003))","commas_linter" -"vignettes/rnrfa-vignette.Rmd",156,54,"style","Commas should always have a space after.","catalogue(column_name=""id"", column_value=c(3001,3002,3003))","commas_linter" -"vignettes/rnrfa-vignette.Rmd",161,1,"style","Variable and function name style should be snake_case or symbols.","someStations <- catalogue(bbox,","object_name_linter" -"vignettes/rnrfa-vignette.Rmd",163,50,"style","Commas should always have a space after."," column_value = c(54022,54090,54091,54092,54097),","commas_linter" -"vignettes/rnrfa-vignette.Rmd",163,56,"style","Commas should always have a space after."," column_value = c(54022,54090,54091,54092,54097),","commas_linter" -"vignettes/rnrfa-vignette.Rmd",163,62,"style","Commas should always have a space after."," column_value = c(54022,54090,54091,54092,54097),","commas_linter" -"vignettes/rnrfa-vignette.Rmd",163,68,"style","Commas should always have a space after."," column_value = c(54022,54090,54091,54092,54097),","commas_linter" -"vignettes/rnrfa-vignette.Rmd",214,21,"style","Put spaces around all infix operators.","plot(info$data, main=paste(""Monthly rainfall data for the"",","infix_spaces_linter" -"vignettes/rnrfa-vignette.Rmd",215,50,"style","Commas should always have a space after."," info$meta$stationName,""catchment""), ","commas_linter" -"vignettes/rnrfa-vignette.Rmd",215,63,"style","Trailing whitespace is superfluous."," info$meta$stationName,""catchment""), ","trailing_whitespace_linter" -"vignettes/rnrfa-vignette.Rmd",216,10,"style","Put spaces around all infix operators."," xlab="""", ylab=info$meta$units)","infix_spaces_linter" -"vignettes/rnrfa-vignette.Rmd",216,19,"style","Put spaces around all infix operators."," xlab="""", ylab=info$meta$units)","infix_spaces_linter" -"vignettes/rnrfa-vignette.Rmd",228,21,"style","Put spaces around all infix operators.","plot(info$data, main=paste0(""Daily flow data for the "",","infix_spaces_linter" -"vignettes/rnrfa-vignette.Rmd",239,17,"style","Commas should always have a space after.","s <- cmr(c(3002,3003), metadata = TRUE)","commas_linter" -"vignettes/rnrfa-vignette.Rmd",242,18,"style","Trailing whitespace is superfluous.","plot(s[[1]]$data, ","trailing_whitespace_linter" -"vignettes/rnrfa-vignette.Rmd",244,23,"style","Put spaces around all infix operators.","lines(s[[2]]$data, col=""green"")","infix_spaces_linter" -"vignettes/rnrfa-vignette.Rmd",261,45,"style","`%>%` should always have a space before it and a new line after it, unless the full pipeline fits on one line.","leaflet(data = someStations) %>% addTiles() %>%","pipe_continuation_linter" -"vignettes/rnrfa-vignette.Rmd",262,68,"style","Commas should always have a space after."," addMarkers(~longitude, ~latitude, popup = ~as.character(paste(id,name)))","commas_linter" -"vignettes/rnrfa-vignette.Rmd",279,1,"style","Variable and function name style should be snake_case or symbols.","someStations <- catalogue(bbox)","object_name_linter" -"vignettes/rnrfa-vignette.Rmd",294,1,"style","Variable and function name style should be snake_case or symbols.","someStations$meangdf <- unlist(lapply(s2, mean))","object_name_linter" -"vignettes/rnrfa-vignette.Rmd",301,49,"style","Commas should always have a space after."," xlab(expression(paste(""Catchment area [Km^2]"",sep=""""))) +","commas_linter" -"vignettes/rnrfa-vignette.Rmd",301,52,"style","Put spaces around all infix operators."," xlab(expression(paste(""Catchment area [Km^2]"",sep=""""))) +","infix_spaces_linter" -"vignettes/rnrfa-vignette.Rmd",302,45,"style","Commas should always have a space after."," ylab(expression(paste(""Mean flow [m^3/s]"",sep="""")))","commas_linter" -"vignettes/rnrfa-vignette.Rmd",302,48,"style","Put spaces around all infix operators."," ylab(expression(paste(""Mean flow [m^3/s]"",sep="""")))","infix_spaces_linter" diff --git a/.dev/revdep_emails/rnrfa/email-body b/.dev/revdep_emails/rnrfa/email-body deleted file mode 100644 index 1e88a7898..000000000 --- a/.dev/revdep_emails/rnrfa/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Claudia Vitolo! Thank you for using {lintr} in your package {rnrfa}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cvitolo/rnrfa (hash: d79d53d614549cc93942ec1bb75e51811d37c0c6) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 11s on CRAN vs. 15s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/roadoi/email-body b/.dev/revdep_emails/roadoi/email-body deleted file mode 100644 index da06b5246..000000000 --- a/.dev/revdep_emails/roadoi/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Najko Jahn! Thank you for using {lintr} in your package {roadoi}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/ropensci/roadoi (hash: 531ec3c43bbae6858be976c8ef8e756d8f9cf2b8) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 3s on CRAN vs. 2s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/scriptexec/attachments/scriptexec.warnings b/.dev/revdep_emails/scriptexec/attachments/scriptexec.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/scriptexec/attachments/scriptexec.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/scriptexec/email-body b/.dev/revdep_emails/scriptexec/email-body deleted file mode 100644 index 26264e0a1..000000000 --- a/.dev/revdep_emails/scriptexec/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Sagie Gur-Ari! Thank you for using {lintr} in your package {scriptexec}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/sagiegurari/scriptexec (hash: b6d4d97c5472e1f70587c3d44ba8d0547c48f042) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 7s on CRAN vs. 4s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/secuTrialR/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/secuTrialR/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 632ca0212..000000000 --- a/.dev/revdep_emails/secuTrialR/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,17 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/completeness.R",28,1,"style","Variable and function names should not be longer than 30 characters.","form_status_counts.secuTrialdata <- function(object, ...) {","object_length_linter" -"R/completeness.R",105,25,"style","Variable and function name style should be snake_case."," spread_summary0$""partly filled"" <- NA","object_name_linter" -"R/completeness.R",108,25,"style","Variable and function name style should be snake_case."," spread_summary0$""completely filled"" <- NA","object_name_linter" -"R/completeness.R",114,25,"style","Variable and function name style should be snake_case."," spread_summary1$""with errors"" <- NA","object_name_linter" -"R/completeness.R",120,25,"style","Variable and function name style should be snake_case."," spread_summary2$""with warnings"" <- NA","object_name_linter" -"R/completeness.R",170,1,"style","Variable and function names should not be longer than 30 characters.","form_status_summary.secuTrialdata <- function(object, ...) {","object_length_linter" -"R/factorize.R",28,1,"style","Variable and function names should not be longer than 30 characters.","factorize_secuTrial.secuTrialdata <- function(object, ...) {","object_length_linter" -"R/factorize.R",68,1,"style","Variable and function name style should be snake_case.","factorize_secuTrial.data.frame <- function(data, cl, form, items, short_names) {","object_name_linter" -"R/labels_secuTrial.R",151,1,"style","Variable and function name style should be snake_case.","label_secuTrial.data.frame <- function(data, it) {","object_name_linter" -"R/labels_secuTrial.R",181,1,"style","Variable and function name style should be snake_case.","""label<-"" <- function(x, value) {","object_name_linter" -"R/labels_secuTrial.R",190,1,"style","Variable and function name style should be snake_case.","""units<-"" <- function(x, value) {","object_name_linter" -"R/read_export_options.R",33,11,"style","Variable and function name style should be snake_case."," files$Name <- as.character(files$Name)","object_name_linter" -"R/visit_structure.R",64,39,"style","Place a space before left parenthesis, except in a function call."," z_input <- !is.na(as.matrix(ro[, -(1:2)]))","spaces_left_parentheses_linter" -"R/visit_structure.R",82,30,"style","Place a space before left parenthesis, except in a function call."," z <- !is.na(as.matrix(x[, -(1:2)]))","spaces_left_parentheses_linter" -"tests/testthat/test-visit_structure.R",73,23,"style","Place a space before left parenthesis, except in a function call."," cs <- colSums(vs[, -(1:2)], na.rm = TRUE)","spaces_left_parentheses_linter" -"tests/testthat/test-visit_structure.R",75,23,"style","Place a space before left parenthesis, except in a function call."," rs <- rowSums(vs[, -(1:2)], na.rm = TRUE)","spaces_left_parentheses_linter" diff --git a/.dev/revdep_emails/secuTrialR/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/secuTrialR/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 335a9f069..000000000 --- a/.dev/revdep_emails/secuTrialR/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,41 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/asdataframe.R",56,13,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!meta & is.null(data.frames)) {","vector_logic_linter" -"R/assess_form_variable_completeness.R",74,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (occ_in_vp > 1 & completeness == ""savedforms"") {","vector_logic_linter" -"R/assess_form_variable_completeness.R",84,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (any(""position"" %in% names(form)) & completeness == ""allforms"") {","vector_logic_linter" -"R/build_secuTrial_url.R",74,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (!is.na(projid) & (is.na(customer) | is.na(instance))) {","vector_logic_linter" -"R/build_secuTrial_url.R",74,48,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (!is.na(projid) & (is.na(customer) | is.na(instance))) {","vector_logic_linter" -"R/build_secuTrial_url.R",76,31,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (!is.na(customer) & is.na(instance)) {","vector_logic_linter" -"R/diff_secuTrial.R",34,35,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (class(x) == ""secuTrialdata"" & class(y) == ""secuTrialdata"") {","vector_logic_linter" -"R/diff_secuTrial.R",37,39,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (! x$export_options$proj_setup & y$export_options$proj_setup) {","vector_logic_linter" -"R/factorize.R",92,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (""mnpsubdocid"" %in% names(data) & short_names) {","vector_logic_linter" -"R/factorize.R",140,44,"warning","Conditional expressions require scalar logical operators (&& and ||)"," length(which(is.na(data[, name]))) &","vector_logic_linter" -"R/factorize.R",145,34,"warning","Conditional expressions require scalar logical operators (&& and ||)"," ! (grepl(""^mnpfs"", name) | grepl(""^at"", form))) {","vector_logic_linter" -"R/internals.R",15,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(language) & any(grep(""lang"", names(dict)))) {","vector_logic_linter" -"R/internals.R",77,3,"style","`else` should come on the same line as the previous `}`."," else if (new_col_idx == ncol(df)) {","brace_linter" -"R/internals.R",95,43,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (! (col_name_after %in% names(df)) & col_name_after != ""first"") {","vector_logic_linter" -"R/internals.R",246,12,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (warn & length(datevars) == 0) {","vector_logic_linter" -"R/internals.R",249,12,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (warn & length(meta_datevars) == 0) {","vector_logic_linter" -"R/internals.R",252,12,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (warn & length(timevars) == 0) {","vector_logic_linter" -"R/internals.R",255,12,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (warn & length(meta_timevars) == 0) {","vector_logic_linter" -"R/plot_recruitment.R",48,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (return_data & (! show_centres)) {","vector_logic_linter" -"R/read_export_options.R",147,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (rectangular_table & short_names) {","vector_logic_linter" -"R/read_export_table.R",82,37,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (curr_encoding == ""ISO-8859-1"" | curr_encoding == ""ISO-8859-15"") {","vector_logic_linter" -"R/read_export_table.R",119,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (add_pat_id & (""mnppid"" %in% names(loaded_table))) {","vector_logic_linter" -"R/return_random_participants.R",63,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (percent <= 0 | percent >= 1) {","vector_logic_linter" -"R/subset.R",53,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(participant) & !dat$export_options$add_id) {","vector_logic_linter" -"R/subset.R",56,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(centre) & !dat$export_options$centre_info) {","vector_logic_linter" -"R/subset.R",59,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(centre) & is.null(participant)) {","vector_logic_linter" -"R/subset.R",101,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.null(centre) & ""centre"" %in% names(new_dat[[tab]])) {","vector_logic_linter" -"tests/testthat/test-subset.R",40,46,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (any(names(dat[[tab]]) %in% ""pat_id"") & nrow(dat[[tab]]) > 0) {","vector_logic_linter" -"tests/testthat/test-subset.R",42,53,"warning","Conditional expressions require scalar logical operators (&& and ||)"," } else if (any(names(dat[[tab]]) %in% ""mnpaid"") & nrow(dat[[tab]]) > 0) {","vector_logic_linter" -"tests/testthat/test-subset.R",44,11,"style","There should be a space before an opening curly brace."," } else{","brace_linter" -"vignettes/secuTrialR-package-vignette.Rmd",44,2,"style","Commented code should be removed.","#rm(list = ls()) # removed this at the request of the CRAN submission","commented_code_linter" -"vignettes/secuTrialR-package-vignette.Rmd",419,81,"style","Lines should not be more than 80 characters.","# randomly retrieve at least 25 percent of participants recorded after March 18th 2019","line_length_linter" -"vignettes/secuTrialR-package-vignette.Rmd",485,81,"style","Lines should not be more than 80 characters.","ctu06_v1 <- read_secuTrial(system.file(""extdata"", ""sT_exports"", ""change_tracking"",","line_length_linter" -"vignettes/secuTrialR-package-vignette.Rmd",489,81,"style","Lines should not be more than 80 characters.","ctu06_v2 <- read_secuTrial(system.file(""extdata"", ""sT_exports"", ""change_tracking"",","line_length_linter" -"vignettes/secuTrialR-package-vignette.Rmd",538,81,"style","Lines should not be more than 80 characters.","ctu05_data_berlin <- subset_secuTrial(ctu05_data, centre = centres, exclude = TRUE)","line_length_linter" -"vignettes/secuTrialR-package-vignette.Rmd",570,81,"style","Lines should not be more than 80 characters.","ctu05_data_bern <- subset_secuTrial(ctu05_data, centre = ""Inselspital Bern (RPACK)"")","line_length_linter" -"vignettes/secuTrialR-package-vignette.Rmd",581,81,"style","Lines should not be more than 80 characters."," centre = c(""Inselspital Bern (RPACK)"",","line_length_linter" -"vignettes/secuTrialR-package-vignette.Rmd",724,81,"style","Lines should not be more than 80 characters.","Likely the label was changed from its original state in the secuTrial project setup.","line_length_linter" -"vignettes/secuTrialR-package-vignette.Rmd",761,81,"style","Lines should not be more than 80 characters.","bl_surg <- merge(x = ctu05_data$baseline, y = ctu05_data$esurgeries, by = ""mnpdocid"")","line_length_linter" -"vignettes/secuTrialR-package-vignette.Rmd",816,81,"style","Lines should not be more than 80 characters.","surg_wide <- pivot_wider(surg, names_from = surgery_organ.factor, values_from = count)","line_length_linter" diff --git a/.dev/revdep_emails/secuTrialR/email-body b/.dev/revdep_emails/secuTrialR/email-body deleted file mode 100644 index a29080e4e..000000000 --- a/.dev/revdep_emails/secuTrialR/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Alan G. Haynes! Thank you for using {lintr} in your package {secuTrialR}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/SwissClinicalTrialOrganisation/secuTrialR (hash: 3761b90ee799a5a4ec72e3cc086eb1ebed26c61e) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 57s on CRAN vs. 34s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/semantic.dashboard/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/semantic.dashboard/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index c987dd1b3..000000000 --- a/.dev/revdep_emails/semantic.dashboard/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,5 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/box.R",44,3,"warning","local variable β€˜icon_selector’ assigned but may not be used"," icon_selector <- glue::glue(""'#{title_id} > .label > .icon'"")","object_usage_linter" -"R/semantic_dashboard.R",135,20,"style","There should be a space between right parenthesis and an opening curly brace.","#' if(interactive()){","paren_brace_linter" -"R/semantic_dashboard.R",202,20,"style","There should be a space between right parenthesis and an opening curly brace.","#' if(interactive()){","paren_brace_linter" -"R/semantic_dashboard.R",249,20,"style","There should be a space between right parenthesis and an opening curly brace.","#' if(interactive()){","paren_brace_linter" diff --git a/.dev/revdep_emails/semantic.dashboard/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/semantic.dashboard/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 2a77caad3..000000000 --- a/.dev/revdep_emails/semantic.dashboard/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,8 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/menu_item.R",51,3,"style","`else` should come on the same line as the previous `}`."," else if (is.null(href)) {","brace_linter" -"R/menu_item.R",54,3,"style","`else` should come on the same line as the previous `}`."," else if (newtab) {","brace_linter" -"vignettes/intro.Rmd",52,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/intro.Rmd",73,81,"style","Lines should not be more than 80 characters."," taskItem(""Project progress..."", 50.777, color = ""red"")))","line_length_linter" -"vignettes/intro.Rmd",128,81,"style","Lines should not be more than 80 characters."," taskItem(""Project progress..."", 50.777, color = ""red""))),","line_length_linter" -"vignettes/intro.Rmd",151,44,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","server <- function(input, output, session) {}","brace_linter" -"vignettes/intro.Rmd",151,45,"style","Closing curly-braces should always be on their own line, unless they are followed by an else.","server <- function(input, output, session) {}","brace_linter" diff --git a/.dev/revdep_emails/semantic.dashboard/email-body b/.dev/revdep_emails/semantic.dashboard/email-body deleted file mode 100644 index b1d84f930..000000000 --- a/.dev/revdep_emails/semantic.dashboard/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Developers Appsilon! Thank you for using {lintr} in your package {semantic.dashboard}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/Appsilon/semantic.dashboard (hash: 308829f467855c66b3e63b7cabb40dddab6fff3a) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 14s on CRAN vs. 10s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/shiny.info/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/shiny.info/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 75d413ea2..000000000 --- a/.dev/revdep_emails/shiny.info/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,3 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/display.R",14,3,"warning","local variable β€˜fixed_layout’ assigned but may not be used"," fixed_layout <- ""fixed""","object_usage_linter" -"R/hide.R",73,3,"warning","local variable β€˜shortcut_condition’ assigned but may not be used"," shortcut_condition <- .shortcut_condition(shortcut)","object_usage_linter" diff --git a/.dev/revdep_emails/shiny.info/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/shiny.info/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index e3bd822ee..000000000 --- a/.dev/revdep_emails/shiny.info/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,3 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/display.R",74,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(company_name) & is.null(logo)) {","vector_logic_linter" -"tests/testthat/test_powered_by.R",10,3,"style","Missing terminal newline.","})","trailing_blank_lines_linter" diff --git a/.dev/revdep_emails/shiny.info/email-body b/.dev/revdep_emails/shiny.info/email-body deleted file mode 100644 index 806daaba6..000000000 --- a/.dev/revdep_emails/shiny.info/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Jakub Nowicki! Thank you for using {lintr} in your package {shiny.info}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/Appsilon/shiny.info (hash: 48b8d81f3268aeaee5b57df2e88c90bbe974d149) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 7s on CRAN vs. 4s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/shiny.react/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/shiny.react/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 1178e62c1..000000000 --- a/.dev/revdep_emails/shiny.react/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,6 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/experimental.R",2,3,"style","Any function spanning multiple lines should use curly braces."," function(...) reactElement(","brace_linter" -"R/reactData.R",14,24,"style","Any function spanning multiple lines should use curly braces.","asReactData.default <- function(x) ReactData(","brace_linter" -"R/reactData.R",21,32,"style","Any function spanning multiple lines should use curly braces.","asReactData.html_dependency <- function(x) ReactData(","brace_linter" -"R/reactData.R",28,24,"style","Any function spanning multiple lines should use curly braces.","asReactData.JS_EVAL <- function(x) ReactData(","brace_linter" -"R/reactData.R",69,3,"style","Either both or neither branch in `if`/`else` should use curly braces."," if (is.null(data)) {","brace_linter" diff --git a/.dev/revdep_emails/shiny.react/email-body b/.dev/revdep_emails/shiny.react/email-body deleted file mode 100644 index a49db97f8..000000000 --- a/.dev/revdep_emails/shiny.react/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Kamil Zyla! Thank you for using {lintr} in your package {shiny.react}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cran/shiny.react (hash: 3fa603b37258f097de4ebcda9a5baec53ae1bd2e) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 5s on CRAN vs. 5s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/shiny.semantic/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/shiny.semantic/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 7a8116241..000000000 --- a/.dev/revdep_emails/shiny.semantic/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,30 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/button.R",11,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/button.R",42,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/button.R",82,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/button.R",155,3,"warning","local variable β€˜big_mark_regex’ assigned but may not be used"," big_mark_regex <- if (big_mark == "" "") ""\\s"" else big_mark","object_usage_linter" -"R/checkbox.R",17,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/dsl.R",12,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/dsl.R",80,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/dsl.R",153,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/dsl.R",206,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/dsl.R",248,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/dsl.R",280,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/dsl.R",323,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/dsl.R",356,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/dsl.R",391,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/dsl.R",443,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/dsl.R",480,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/dsl.R",528,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/dsl.R",673,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/dsl.R",794,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/grid.R",79,7,"warning","local variable β€˜mustache_id’ assigned but may not be used"," mustache_id <- ""{{ grid_id }}""","object_usage_linter" -"R/grid.R",80,7,"warning","local variable β€˜mustache_css’ assigned but may not be used"," mustache_css <- paste0(""{{ "", name, ""_custom_css }}"")","object_usage_linter" -"R/grid.R",81,7,"warning","local variable β€˜mustache_area’ assigned but may not be used"," mustache_area <- paste(""{{"", name, ""}}"")","object_usage_linter" -"R/grid.R",224,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/layouts.R",45,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/layouts.R",86,3,"warning","local variable β€˜sidebar_width’ assigned but may not be used"," sidebar_width <- sidebar_panel$width","object_usage_linter" -"R/layouts.R",87,3,"warning","local variable β€˜main_width’ assigned but may not be used"," main_width <- main_panel$width","object_usage_linter" -"R/menu.R",65,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/tables.R",9,21,"style","There should be a space between right parenthesis and an opening curly brace.","#' if (interactive()){","paren_brace_linter" -"R/toast.R",163,14,"style","Variable and function name style should be snake_case."," toast_tags$closeIcon <- closeButton","object_name_linter" diff --git a/.dev/revdep_emails/shiny.semantic/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/shiny.semantic/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 178637a22..000000000 --- a/.dev/revdep_emails/shiny.semantic/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,24 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/grid.R",290,5,"style","Any function spanning multiple lines should use curly braces."," function(color) glue::glue(","brace_linter" -"R/grid.R",310,23,"style","Use TRUE instead of the symbol T."," launch.browser = T","T_and_F_symbol_linter" -"R/menu.R",14,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/menu.R",80,3,"style","Either both or neither branch in `if`/`else` should use curly braces."," else {","brace_linter" -"R/semanticPage.R",154,3,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"tests/testthat/test_layouts.R",104,53,"style","Use FALSE instead of the symbol F."," v1 <- vertical_layout(p(""a""), adjusted_to_page = F)","T_and_F_symbol_linter" -"vignettes/basics.Rmd",79,12,"style","Put spaces around all infix operators."," a(class=""ui green ribbon label"", ""Link""),","infix_spaces_linter" -"vignettes/basics.Rmd",90,14,"style","Put spaces around all infix operators."," a(class=""ui green ribbon label"", ""Link""),","infix_spaces_linter" -"vignettes/intro.Rmd",31,81,"style","Lines should not be more than 80 characters."," list(header = ""Item 1"", description = ""My text for item 1"", icon = ""cat""),","line_length_linter" -"vignettes/intro.Rmd",32,81,"style","Lines should not be more than 80 characters."," list(header = ""Item 2"", description = ""My text for item 2"", icon = ""tree""),","line_length_linter" -"vignettes/intro.Rmd",33,81,"style","Lines should not be more than 80 characters."," list(header = ""Item 3"", description = ""My text for item 3"", icon = ""dog"")","line_length_linter" -"vignettes/intro.Rmd",51,44,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","server <- function(input, output, session) {}","brace_linter" -"vignettes/intro.Rmd",51,45,"style","Closing curly-braces should always be on their own line, unless they are followed by an else.","server <- function(input, output, session) {}","brace_linter" -"vignettes/intro.Rmd",73,44,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","server <- function(input, output, session) {}","brace_linter" -"vignettes/intro.Rmd",73,45,"style","Closing curly-braces should always be on their own line, unless they are followed by an else.","server <- function(input, output, session) {}","brace_linter" -"vignettes/intro.Rmd",112,44,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","server <- function(input, output, session) {}","brace_linter" -"vignettes/intro.Rmd",112,45,"style","Closing curly-braces should always be on their own line, unless they are followed by an else.","server <- function(input, output, session) {}","brace_linter" -"vignettes/intro.Rmd",127,81,"style","Lines should not be more than 80 characters."," dropdown_input(""mtcars_dropdown"", c(""mpg"", ""cyl"", ""disp"", ""hp""), value = ""mpg""),","line_length_linter" -"vignettes/intro.Rmd",172,81,"style","Lines should not be more than 80 characters."," dropdown_input(""mtcars_dropdown"", c(""mpg"", ""cyl"", ""disp"", ""hp""), value = ""mpg"")","line_length_linter" -"vignettes/intro.Rmd",237,81,"style","Lines should not be more than 80 characters."," dropdown_input(""mtcars_dropdown"", c(""mpg"", ""cyl"", ""disp"", ""hp""), value = ""mpg"")","line_length_linter" -"vignettes/semantic_integration.Rmd",37,12,"style","Put spaces around all infix operators."," a(class=""ui green ribbon label"", ""Plotly demo""),","infix_spaces_linter" -"vignettes/semantic_integration.Rmd",45,13,"warning","no visible binding for global variable β€˜economics’"," plot_ly(economics, x = ~date, color = I(""black"")) %>%","object_usage_linter" -"vignettes/semantic_integration.Rmd",67,12,"style","Put spaces around all infix operators."," a(class=""ui blue ribbon label"", ""Leaflet demo""),","infix_spaces_linter" diff --git a/.dev/revdep_emails/shiny.semantic/email-body b/.dev/revdep_emails/shiny.semantic/email-body deleted file mode 100644 index 179ff47b0..000000000 --- a/.dev/revdep_emails/shiny.semantic/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Developers Appsilon! Thank you for using {lintr} in your package {shiny.semantic}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/Appsilon/shiny.semantic (hash: 64eef81ec206304de819c2b181388f8e5c3d92a0) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 66s on CRAN vs. 46s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/smerc/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/smerc/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index a55157e94..000000000 --- a/.dev/revdep_emails/smerc/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,93 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/arg_check_functions.R",6,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!(is.matrix(coords) | is.data.frame(coords))) {","vector_logic_linter" -"R/arg_check_functions.R",195,23,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (min(pvalue) < 0 | max(pvalue) > 1) {","vector_logic_linter" -"R/arg_check_functions.R",204,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nrow(d) != N | ncol(d) != N) {","vector_logic_linter" -"R/arg_check_functions.R",280,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (min(angle_all) < 0 | max(angle_all) >= 360) {","vector_logic_linter" -"R/arg_check_functions.R",312,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.matrix(w) & !is.data.frame(w)) {","vector_logic_linter" -"R/arg_check_functions.R",315,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nrow(w) != N | ncol(w) != N) {","vector_logic_linter" -"R/arg_check_functions.R",530,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.matrix(w) & !is.data.frame(w)) {","vector_logic_linter" -"R/arg_check_functions.R",533,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nrow(w) != N | ncol(w) != N) {","vector_logic_linter" -"R/arg_check_functions.R",606,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(ein) | is.null(eout)) {","vector_logic_linter" -"R/arg_check_functions.R",630,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(popin) | is.null(popout) | is.null(tpop)) {","vector_logic_linter" -"R/arg_check_functions.R",630,40,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(popin) | is.null(popout) | is.null(tpop)) {","vector_logic_linter" -"R/arg_check_functions.R",669,16,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (ubd <= 0 | ubd > 1) {","vector_logic_linter" -"R/clusters-smerc_cluster.R",4,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (min(idx) < 1 | max(idx) > length(x$clusters)) {","vector_logic_linter" -"R/color.clusters.R",36,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (class(x) != ""scan"" & class(x) != ""smerc_cluster"") {","vector_logic_linter" -"R/color.clusters.R",39,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (min(idx) < 1 | max(idx) > length(x$clusters)) {","vector_logic_linter" -"R/combine.zones.R",18,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.list(z1) | !is.list(z2)) {","vector_logic_linter" -"R/dist.ellipse.R",61,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (angle < 00 | angle >= 360) {","vector_logic_linter" -"R/dmst.zones.R",102,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(progress) != 1 | !is.logical(progress)) {","vector_logic_linter" -"R/elliptic.nn.R",31,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(ubpop) != 1 | ubpop <= 0 | ubpop > 1) {","vector_logic_linter" -"R/elliptic.nn.R",31,39,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(ubpop) != 1 | ubpop <= 0 | ubpop > 1) {","vector_logic_linter" -"R/elliptic.sim.R",50,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(nsim) != 1 | !is.numeric(nsim) | nsim < 1) {","vector_logic_linter" -"R/elliptic.sim.R",50,45,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(nsim) != 1 | !is.numeric(nsim) | nsim < 1) {","vector_logic_linter" -"R/elliptic.test.R",57,22,"style","Variable and function name style should be snake_case or symbols."," min.cases = 2) {","object_name_linter" -"R/fast.zones.R",41,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(ubpop) != 1 | !is.numeric(ubpop)) {","vector_logic_linter" -"R/fast.zones.R",44,18,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (ubpop <= 0 | ubpop > 1) {","vector_logic_linter" -"R/fast.zones.R",47,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(simple) != 1 | !is.logical(simple)) {","vector_logic_linter" -"R/flex.sim.R",57,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(nsim) != 1 | !is.numeric(nsim) | nsim < 1) {","vector_logic_linter" -"R/flex.sim.R",57,45,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(nsim) != 1 | !is.numeric(nsim) | nsim < 1) {","vector_logic_linter" -"R/flex.sim.R",63,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(type) != 1 | !is.element(type, c(""poisson"", ""binomial""))) {","vector_logic_linter" -"R/flex.sim.R",67,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(ein) | is.null(eout)) {","vector_logic_linter" -"R/flex.sim.R",78,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(popin) | is.null(popout) | is.null(tpop)) {","vector_logic_linter" -"R/flex.sim.R",78,42,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(popin) | is.null(popout) | is.null(tpop)) {","vector_logic_linter" -"R/knn.R",33,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(longlat) != 1 | !is.logical(longlat)) {","vector_logic_linter" -"R/knn.R",37,13,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (k < 1 | k > n) {","vector_logic_linter" -"R/knn.R",41,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nrow(d) != n | ncol(d) != n) {","vector_logic_linter" -"R/morancr.stat.R",62,21,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.matrix(w) & !is.data.frame(w)) {","vector_logic_linter" -"R/morancr.stat.R",65,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (nrow(w) != N | ncol(w) != N) {","vector_logic_linter" -"R/mst.seq.R",120,16,"warning","Conditional expressions require scalar logical operators (&& and ||)"," while (!stop & i < length(neighbors)) {","vector_logic_linter" -"R/mst.seq.R",133,16,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (i == 1 | nlinks == ""one"") {","vector_logic_linter" -"R/mst.seq.R",164,17,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (early & (stat_cand[max_idx] <= loglikrat[i])) {","vector_logic_linter" -"R/nndist.R",29,24,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(ubd) != 1 | !is.numeric(ubd) | ubd <= 0) {","vector_logic_linter" -"R/nndist.R",29,43,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(ubd) != 1 | !is.numeric(ubd) | ubd <= 0) {","vector_logic_linter" -"R/noz.R",40,5,"style","`else` should come on the same line as the previous `}`."," else {","brace_linter" -"R/optimal_ubpop.R",43,22,"style","Variable and function name style should be snake_case or symbols."," min.cases = 0,","object_name_linter" -"R/optimal_ubpop.R",195,36,"style","Variable and function name style should be snake_case or symbols."," min.cases) {","object_name_linter" -"R/rflex_zones.R",142,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(alpha1) != 1 | alpha1 <= 0) {","vector_logic_linter" -"R/rflex_zones.R",153,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(loop) != 1 | !is.logical(loop)) {","vector_logic_linter" -"R/rflex_zones.R",156,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(pfreq) != 1 | pfreq < 1) {","vector_logic_linter" -"R/rflex_zones.R",159,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(verbose) != 1 | !is.logical(verbose)) {","vector_logic_linter" -"R/rflex.midp.R",43,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (!is.numeric(cases) | !is.numeric(ex)) {","vector_logic_linter" -"R/rflex.midp.R",46,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(type) != 1 |","vector_logic_linter" -"R/rflex.midp.R",50,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (type == ""binomial"" & is.null(pop)) {","vector_logic_linter" -"R/rflex.sim.R",32,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(nsim) != 1 | !is.numeric(nsim) | nsim < 1) {","vector_logic_linter" -"R/rflex.sim.R",32,45,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(nsim) != 1 | !is.numeric(nsim) | nsim < 1) {","vector_logic_linter" -"R/rflex.zones.R",149,27,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(alpha1) != 1 | alpha1 <= 0) {","vector_logic_linter" -"R/rflex.zones.R",160,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(loop) != 1 | !is.logical(loop)) {","vector_logic_linter" -"R/rflex.zones.R",163,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(pfreq) != 1 | pfreq < 1) {","vector_logic_linter" -"R/rflex.zones.R",166,28,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(verbose) != 1 | !is.logical(verbose)) {","vector_logic_linter" -"R/scan_stat.R",90,15,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (a > 0 & length(shape) == 1) {","vector_logic_linter" -"R/scan_stat.R",120,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(ein) & is.null(popin)) {","vector_logic_linter" -"R/scan_stat.R",133,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(type) != 1 | !is.element(type, c(""poisson"", ""binomial""))) {","vector_logic_linter" -"R/scan_stat.R",136,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(a) != 1 | a < 0 | a > 1) {","vector_logic_linter" -"R/scan_stat.R",136,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(a) != 1 | a < 0 | a > 1) {","vector_logic_linter" -"R/scan_stat.R",139,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(shape) != 1 & length(shape) != length(yin)) {","vector_logic_linter" -"R/scan_stat.R",142,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (type == ""binomial"" & is.null(tpop)) {","vector_logic_linter" -"R/scan.sim.R",121,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (simdist == ""binomial"" & is.null(pop)) {","vector_logic_linter" -"R/scan.stat.R",140,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (is.null(ein) & is.null(popin)) {","vector_logic_linter" -"R/scan.stat.R",153,25,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(type) != 1 | !is.element(type, c(""poisson"", ""binomial""))) {","vector_logic_linter" -"R/scan.stat.R",156,22,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(a) != 1 | a < 0 | a > 1) {","vector_logic_linter" -"R/scan.stat.R",156,30,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(a) != 1 | a < 0 | a > 1) {","vector_logic_linter" -"R/scan.stat.R",159,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(shape) != 1 & length(shape) != length(yin)) {","vector_logic_linter" -"R/scan.stat.R",162,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (type == ""binomial"" & is.null(tpop)) {","vector_logic_linter" -"R/scan.test.R",96,22,"style","Variable and function name style should be snake_case or symbols."," min.cases = 2,","object_name_linter" -"R/scan.test.R",215,28,"style","Variable and function name style should be snake_case or symbols."," simdist = NULL, min.cases = NULL) {","object_name_linter" -"R/seq_scan_sim.R",25,21,"style","Variable and function name style should be snake_case or symbols."," min.cases = 0,","object_name_linter" -"R/seq_scan_sim.R",132,29,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (simdist == ""binomial"" & is.null(pop)) {","vector_logic_linter" -"R/seq_scan_test.R",21,22,"style","Variable and function name style should be snake_case or symbols."," min.cases = 0,","object_name_linter" -"R/seq_scan_test.R",140,36,"style","Variable and function name style should be snake_case or symbols."," min.cases) {","object_name_linter" -"R/smerc_cluster-plot.R",53,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (min(idx) < 1 | max(idx) > length(x$clusters)) {","vector_logic_linter" -"R/smerc_cluster-print.R",19,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (length(extra) != 1 | !is.logical(extra)) {","vector_logic_linter" -"R/smerc_cluster-summary.R",37,20,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (min(idx) < 1 | max(idx) > length(object$clusters)) {","vector_logic_linter" -"R/tango.weights.R",83,26,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (type == ""rogerson"" & is.null(pop)) {","vector_logic_linter" -"vignettes/smerc_demo.Rmd",43,8,"style","Use <-, not =, for assignment.","coords = nydf[,c(""x"", ""y"")] # extract coordinates","assignment_linter" -"vignettes/smerc_demo.Rmd",43,16,"style","Commas should always have a space after.","coords = nydf[,c(""x"", ""y"")] # extract coordinates","commas_linter" -"vignettes/smerc_demo.Rmd",44,7,"style","Use <-, not =, for assignment.","cases = nydf$cases # extract cases","assignment_linter" -"vignettes/smerc_demo.Rmd",45,5,"style","Use <-, not =, for assignment.","pop = nydf$population # extract population","assignment_linter" -"vignettes/smerc_demo.Rmd",46,10,"style","Use <-, not =, for assignment.","scan_out = scan.test(coords, cases, pop, nsim = 99) # perform scan test","assignment_linter" -"vignettes/smerc_demo.Rmd",106,8,"style","Use <-, not =, for assignment.","bn_out = bn.test(coords = coords, cases = cases, pop = pop, cstar = 20,","assignment_linter" -"vignettes/smerc_demo.Rmd",117,10,"style","Use <-, not =, for assignment.","cepp_out = cepp.test(coords = coords, cases = cases, pop = pop,","assignment_linter" -"vignettes/smerc_demo.Rmd",129,3,"style","Use <-, not =, for assignment.","w = dweights(coords, kappa = 1) # construct weights matrix","assignment_linter" -"vignettes/smerc_demo.Rmd",130,11,"style","Use <-, not =, for assignment.","tango_out = tango.test(cases, pop, w, nsim = 49) # perform tango's test","assignment_linter" -"vignettes/smerc_demo.Rmd",143,8,"style","Use <-, not =, for assignment.","ezones = elliptic.zones(coords, pop, ubpop = 0.1)","assignment_linter" diff --git a/.dev/revdep_emails/smerc/email-body b/.dev/revdep_emails/smerc/email-body deleted file mode 100644 index cef4bbad2..000000000 --- a/.dev/revdep_emails/smerc/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Joshua French! Thank you for using {lintr} in your package {smerc}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/jfrench/smerc (hash: 69a744182b10a265c34b6ecbcf133bfd981695de) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 112s on CRAN vs. 68s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/stencilaschema/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/stencilaschema/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 4fdc22035..000000000 --- a/.dev/revdep_emails/stencilaschema/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,3 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/typing.R",196,3,"style","`else` should come on the same line as the previous `}`."," else if (is_class(type, ""Array"")) {","brace_linter" -"R/typing.R",205,5,"style","`else` should come on the same line as the previous `}`."," else if (","brace_linter" diff --git a/.dev/revdep_emails/stencilaschema/attachments/stencilaschema.warnings b/.dev/revdep_emails/stencilaschema/attachments/stencilaschema.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/stencilaschema/attachments/stencilaschema.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/stencilaschema/email-body b/.dev/revdep_emails/stencilaschema/email-body deleted file mode 100644 index c6a19f0b2..000000000 --- a/.dev/revdep_emails/stencilaschema/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Nokome Bentley! Thank you for using {lintr} in your package {stencilaschema}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/stencila/schema (hash: cf9fb90cca6af101a2f00799098cbe0687fbce79) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 3s on CRAN vs. 2s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/supernova/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/supernova/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 0faf4ad8c..000000000 --- a/.dev/revdep_emails/supernova/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,4 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"data-raw/class_data.R",18,3,"warning","local variable β€˜number_of_teachers’ assigned but may not be used"," number_of_teachers <- 3","object_usage_linter" -"R/equation.R",9,3,"warning","local variable β€˜format_term’ assigned but may not be used"," format_term <- function(value, name, digits) {","object_usage_linter" -"R/supernova.R",436,33,"warning","Conditional expressions require scalar logical operators (&& and ||)"," bar_col <- if (!is_lmer_model & is_verbose) ""description"" else ""term""","vector_logic_linter" diff --git a/.dev/revdep_emails/supernova/attachments/supernova.warnings b/.dev/revdep_emails/supernova/attachments/supernova.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/supernova/attachments/supernova.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/supernova/email-body b/.dev/revdep_emails/supernova/email-body deleted file mode 100644 index eb4cfaabb..000000000 --- a/.dev/revdep_emails/supernova/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Adam Blake! Thank you for using {lintr} in your package {supernova}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/UCLATALL/supernova (hash: 8b93f1d3b3eb5284df63abd357528d53353ec56c) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 31s on CRAN vs. 16s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/tsviz/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/tsviz/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index 7c641185a..000000000 --- a/.dev/revdep_emails/tsviz/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,2 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/tsviz.R",12,20,"style","There should be a space between right parenthesis and an opening curly brace.","#' if(interactive()){","paren_brace_linter" diff --git a/.dev/revdep_emails/tsviz/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/tsviz/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index a4bc7c8e8..000000000 --- a/.dev/revdep_emails/tsviz/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,2 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"data-raw/rhub_check.R",3,3,"style","Commented code should be removed.","# validate_email()","commented_code_linter" diff --git a/.dev/revdep_emails/tsviz/attachments/tsviz.warnings b/.dev/revdep_emails/tsviz/attachments/tsviz.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/tsviz/attachments/tsviz.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/tsviz/email-body b/.dev/revdep_emails/tsviz/email-body deleted file mode 100644 index 7ce1801b9..000000000 --- a/.dev/revdep_emails/tsviz/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Emanuele Fabbiani! Thank you for using {lintr} in your package {tsviz}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/donlelef/tsviz (hash: 040deb3846da10a4a595c7e75ada8f9b0136b76a) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 4s on CRAN vs. 2s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/tuber/attachments/tuber.failure b/.dev/revdep_emails/tuber/attachments/tuber.failure deleted file mode 100644 index 08edf6748..000000000 --- a/.dev/revdep_emails/tuber/attachments/tuber.failure +++ /dev/null @@ -1 +0,0 @@ -`defaults` must be a named list. diff --git a/.dev/revdep_emails/tuber/attachments/tuber.warnings b/.dev/revdep_emails/tuber/attachments/tuber.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/tuber/attachments/tuber.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/tuber/email-body b/.dev/revdep_emails/tuber/email-body deleted file mode 100644 index e2c788a5f..000000000 --- a/.dev/revdep_emails/tuber/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Gaurav Sood! Thank you for using {lintr} in your package {tuber}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at http://github.com/soodoku/tuber (hash: 0cb96e9d1bbf3cd7faa25837eedada7e4453b499) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 3s on CRAN vs. 0s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/unifir/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/unifir/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index c3a23e34e..000000000 --- a/.dev/revdep_emails/unifir/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,5 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/associate_coordinates.R",52,33,"style","Place a space before left parenthesis, except in a function call."," stopifnot(side_length %in% (2^(5:12) + 1))","spaces_left_parentheses_linter" -"R/associate_coordinates.R",68,10,"style","Variable and function name style should be snake_case."," coords$X <- (side_length *","object_name_linter" -"R/associate_coordinates.R",71,10,"style","Variable and function name style should be snake_case."," coords$Y <- bounds[[4]] - coords$Y","object_name_linter" -"tests/testthat/test-find_unity.R",68,5,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," {","open_curly_linter" diff --git a/.dev/revdep_emails/unifir/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/unifir/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 69b35ea5c..000000000 --- a/.dev/revdep_emails/unifir/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,8 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"vignettes/unifir-asset-guide.Rmd",108,63,"style","Trailing whitespace is superfluous."," prefab_path = file.path(""Assets"", ","trailing_whitespace_linter" -"vignettes/unifir-dev-guide.Rmd",127,41,"style","Opening curly braces should never go on their own line and should always be followed by a new line."," build = function(script, prop, debug) {},","brace_linter" -"vignettes/unifir-user-guide.Rmd",232,45,"style","Trailing whitespace is superfluous."," terrainr::transform_elevation(raster_file, ","trailing_whitespace_linter" -"vignettes/unifir-user-guide.Rmd",247,59,"style","Trailing whitespace is superfluous."," # Where should the ""top-left"" corner of the terrain sit? ","trailing_whitespace_linter" -"vignettes/unifir-user-guide.Rmd",248,62,"style","Trailing whitespace is superfluous."," # Note that Unity uses a left-handed Y-up coordinate system ","trailing_whitespace_linter" -"vignettes/unifir-user-guide.Rmd",256,81,"style","Lines should not be more than 80 characters."," height = as.numeric(terra::global(r, max)), # Max height of the terrain (Y axis)","line_length_linter" -"vignettes/unifir-user-guide.Rmd",258,38,"style","Trailing whitespace is superfluous."," heightmap_resolution = terrain_size ","trailing_whitespace_linter" diff --git a/.dev/revdep_emails/unifir/email-body b/.dev/revdep_emails/unifir/email-body deleted file mode 100644 index ddefbd72c..000000000 --- a/.dev/revdep_emails/unifir/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Michael Mahoney! Thank you for using {lintr} in your package {unifir}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/ropensci/unifir (hash: 6c827a33c88d90c1c639fe4f4f8ce223be05aa00) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 25s on CRAN vs. 17s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/upsetjs/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/upsetjs/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index e486bd5b6..000000000 --- a/.dev/revdep_emails/upsetjs/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,189 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/data.R",179,3,"warning","local variable β€˜degrees’ assigned but may not be used"," degrees <- sapply(names(value), function(x) {","object_usage_linter" -"vignettes/colors.Rmd",28,26,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/colors.Rmd",28,31,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/colors.Rmd",28,36,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/colors.Rmd",28,41,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/colors.Rmd",28,46,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/colors.Rmd",28,51,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/colors.Rmd",28,56,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/colors.Rmd",28,61,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/colors.Rmd",28,66,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/colors.Rmd",28,79,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/colors.Rmd",28,84,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/colors.Rmd",28,89,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/colors.Rmd",28,94,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/colors.Rmd",28,99,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/colors.Rmd",28,112,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/colors.Rmd",28,117,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/colors.Rmd",28,122,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/colors.Rmd",28,127,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/colors.Rmd",28,132,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/colors.Rmd",28,137,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/colors.Rmd",28,142,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/colors.Rmd",28,147,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/colors.Rmd",28,152,"style","Only use double-quotes.","listInput <- list(s1 = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), s2 = c('a', 'b', 'd', 'e', 'j'), s3 = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/colors.Rmd",29,21,"style","Only use double-quotes.","colors <- list(s1 = '#1f77b4', s2 = '#2ca02c', s3 = '#d62728', `s1&s2` = '#9467bd', `s1&s3` = '#8c564b', `s2&s3` = '#e377c2', `s1&s2&s3` = '#bcbd22')","single_quotes_linter" -"vignettes/colors.Rmd",29,37,"style","Only use double-quotes.","colors <- list(s1 = '#1f77b4', s2 = '#2ca02c', s3 = '#d62728', `s1&s2` = '#9467bd', `s1&s3` = '#8c564b', `s2&s3` = '#e377c2', `s1&s2&s3` = '#bcbd22')","single_quotes_linter" -"vignettes/colors.Rmd",29,53,"style","Only use double-quotes.","colors <- list(s1 = '#1f77b4', s2 = '#2ca02c', s3 = '#d62728', `s1&s2` = '#9467bd', `s1&s3` = '#8c564b', `s2&s3` = '#e377c2', `s1&s2&s3` = '#bcbd22')","single_quotes_linter" -"vignettes/colors.Rmd",29,74,"style","Only use double-quotes.","colors <- list(s1 = '#1f77b4', s2 = '#2ca02c', s3 = '#d62728', `s1&s2` = '#9467bd', `s1&s3` = '#8c564b', `s2&s3` = '#e377c2', `s1&s2&s3` = '#bcbd22')","single_quotes_linter" -"vignettes/colors.Rmd",29,95,"style","Only use double-quotes.","colors <- list(s1 = '#1f77b4', s2 = '#2ca02c', s3 = '#d62728', `s1&s2` = '#9467bd', `s1&s3` = '#8c564b', `s2&s3` = '#e377c2', `s1&s2&s3` = '#bcbd22')","single_quotes_linter" -"vignettes/colors.Rmd",29,116,"style","Only use double-quotes.","colors <- list(s1 = '#1f77b4', s2 = '#2ca02c', s3 = '#d62728', `s1&s2` = '#9467bd', `s1&s3` = '#8c564b', `s2&s3` = '#e377c2', `s1&s2&s3` = '#bcbd22')","single_quotes_linter" -"vignettes/colors.Rmd",29,140,"style","Only use double-quotes.","colors <- list(s1 = '#1f77b4', s2 = '#2ca02c', s3 = '#d62728', `s1&s2` = '#9467bd', `s1&s3` = '#8c564b', `s2&s3` = '#e377c2', `s1&s2&s3` = '#bcbd22')","single_quotes_linter" -"vignettes/colors.Rmd",32,41,"style","Put spaces around all infix operators."," upsetjs %>% fromList(listInput, colors=colors) %>% chartTheme(selection.color="""", has.selection.opacity=0.3) %>% interactiveChart()","infix_spaces_linter" -"vignettes/colors.Rmd",32,80,"style","Put spaces around all infix operators."," upsetjs %>% fromList(listInput, colors=colors) %>% chartTheme(selection.color="""", has.selection.opacity=0.3) %>% interactiveChart()","infix_spaces_linter" -"vignettes/colors.Rmd",32,106,"style","Put spaces around all infix operators."," upsetjs %>% fromList(listInput, colors=colors) %>% chartTheme(selection.color="""", has.selection.opacity=0.3) %>% interactiveChart()","infix_spaces_linter" -"vignettes/kmap.Rmd",28,27,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/kmap.Rmd",28,32,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/kmap.Rmd",28,37,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/kmap.Rmd",28,42,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/kmap.Rmd",28,47,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/kmap.Rmd",28,52,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/kmap.Rmd",28,57,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/kmap.Rmd",28,62,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/kmap.Rmd",28,67,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/kmap.Rmd",28,81,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/kmap.Rmd",28,86,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/kmap.Rmd",28,91,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/kmap.Rmd",28,96,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/kmap.Rmd",28,101,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/kmap.Rmd",28,117,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/kmap.Rmd",28,122,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/kmap.Rmd",28,127,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/kmap.Rmd",28,132,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/kmap.Rmd",28,137,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/kmap.Rmd",28,142,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/kmap.Rmd",28,147,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/kmap.Rmd",28,152,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/kmap.Rmd",28,157,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",38,27,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",38,32,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",38,37,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",38,42,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",38,47,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",38,52,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",38,57,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",38,62,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",38,67,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",38,81,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",38,86,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",38,91,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",38,96,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",38,101,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",38,117,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",38,122,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",38,127,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",38,132,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",38,137,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",38,142,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",38,147,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",38,152,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",38,157,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",62,37,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" -"vignettes/upsetjs.Rmd",62,42,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" -"vignettes/upsetjs.Rmd",62,47,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" -"vignettes/upsetjs.Rmd",62,52,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" -"vignettes/upsetjs.Rmd",62,57,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" -"vignettes/upsetjs.Rmd",62,62,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" -"vignettes/upsetjs.Rmd",62,67,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" -"vignettes/upsetjs.Rmd",62,72,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" -"vignettes/upsetjs.Rmd",62,77,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" -"vignettes/upsetjs.Rmd",62,91,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" -"vignettes/upsetjs.Rmd",62,96,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" -"vignettes/upsetjs.Rmd",62,101,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" -"vignettes/upsetjs.Rmd",62,106,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" -"vignettes/upsetjs.Rmd",62,111,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" -"vignettes/upsetjs.Rmd",62,127,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" -"vignettes/upsetjs.Rmd",62,132,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" -"vignettes/upsetjs.Rmd",62,137,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" -"vignettes/upsetjs.Rmd",62,142,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" -"vignettes/upsetjs.Rmd",62,147,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" -"vignettes/upsetjs.Rmd",62,152,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" -"vignettes/upsetjs.Rmd",62,157,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" -"vignettes/upsetjs.Rmd",62,162,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" -"vignettes/upsetjs.Rmd",62,167,"style","Only use double-quotes.","upsetjs() %>% fromList(list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm')))","single_quotes_linter" -"vignettes/upsetjs.Rmd",89,6,"style","Put spaces around all infix operators."," one=c(1, 1, 1, 0, 1, 0, 1, 1, 0, 0, 1, 1, 1),","infix_spaces_linter" -"vignettes/upsetjs.Rmd",90,6,"style","Put spaces around all infix operators."," two=c(1, 1, 0, 1, 1, 0, 0, 0, 0, 1, 0, 0, 0),","infix_spaces_linter" -"vignettes/upsetjs.Rmd",91,8,"style","Put spaces around all infix operators."," three=c(1, 0, 0, 0, 1, 1, 1, 1, 1, 1, 0, 1, 1)),","infix_spaces_linter" -"vignettes/upsetjs.Rmd",92,12,"style","Put spaces around all infix operators."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","infix_spaces_linter" -"vignettes/upsetjs.Rmd",92,15,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",92,20,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",92,25,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",92,30,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",92,35,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",92,40,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",92,45,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",92,50,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",92,55,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",92,60,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",92,65,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",92,70,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",92,75,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",113,35,"style","`%>%` should always have a space before it and a new line after it, unless the full pipeline fits on one line.","upsetjs() %>% fromList(listInput) %>%","pipe_continuation_linter" -"vignettes/upsetjs.Rmd",119,35,"style","`%>%` should always have a space before it and a new line after it, unless the full pipeline fits on one line.","upsetjs() %>% fromList(listInput) %>%","pipe_continuation_linter" -"vignettes/upsetjs.Rmd",120,28,"style","Put spaces around all infix operators."," generateIntersections(min=2, max=NULL, empty=T, order.by='cardinality', limit=NULL)","infix_spaces_linter" -"vignettes/upsetjs.Rmd",120,35,"style","Put spaces around all infix operators."," generateIntersections(min=2, max=NULL, empty=T, order.by='cardinality', limit=NULL)","infix_spaces_linter" -"vignettes/upsetjs.Rmd",120,47,"style","Put spaces around all infix operators."," generateIntersections(min=2, max=NULL, empty=T, order.by='cardinality', limit=NULL)","infix_spaces_linter" -"vignettes/upsetjs.Rmd",120,49,"style","Use TRUE instead of the symbol T."," generateIntersections(min=2, max=NULL, empty=T, order.by='cardinality', limit=NULL)","T_and_F_symbol_linter" -"vignettes/upsetjs.Rmd",120,59,"style","Put spaces around all infix operators."," generateIntersections(min=2, max=NULL, empty=T, order.by='cardinality', limit=NULL)","infix_spaces_linter" -"vignettes/upsetjs.Rmd",120,60,"style","Only use double-quotes."," generateIntersections(min=2, max=NULL, empty=T, order.by='cardinality', limit=NULL)","single_quotes_linter" -"vignettes/upsetjs.Rmd",120,80,"style","Put spaces around all infix operators."," generateIntersections(min=2, max=NULL, empty=T, order.by='cardinality', limit=NULL)","infix_spaces_linter" -"vignettes/upsetjs.Rmd",125,35,"style","`%>%` should always have a space before it and a new line after it, unless the full pipeline fits on one line.","upsetjs() %>% fromList(listInput) %>%","pipe_continuation_linter" -"vignettes/upsetjs.Rmd",126,21,"style","Put spaces around all infix operators."," generateUnions(min=0, max=2, empty=T, order.by='degree', limit=NULL)","infix_spaces_linter" -"vignettes/upsetjs.Rmd",126,28,"style","Put spaces around all infix operators."," generateUnions(min=0, max=2, empty=T, order.by='degree', limit=NULL)","infix_spaces_linter" -"vignettes/upsetjs.Rmd",126,37,"style","Put spaces around all infix operators."," generateUnions(min=0, max=2, empty=T, order.by='degree', limit=NULL)","infix_spaces_linter" -"vignettes/upsetjs.Rmd",126,39,"style","Use TRUE instead of the symbol T."," generateUnions(min=0, max=2, empty=T, order.by='degree', limit=NULL)","T_and_F_symbol_linter" -"vignettes/upsetjs.Rmd",126,49,"style","Put spaces around all infix operators."," generateUnions(min=0, max=2, empty=T, order.by='degree', limit=NULL)","infix_spaces_linter" -"vignettes/upsetjs.Rmd",126,50,"style","Only use double-quotes."," generateUnions(min=0, max=2, empty=T, order.by='degree', limit=NULL)","single_quotes_linter" -"vignettes/upsetjs.Rmd",126,65,"style","Put spaces around all infix operators."," generateUnions(min=0, max=2, empty=T, order.by='degree', limit=NULL)","infix_spaces_linter" -"vignettes/upsetjs.Rmd",176,23,"style","Put spaces around all infix operators."," addQuery(""Q1"", color=""red"", elems=c('a', 'b', 'c')) %>%","infix_spaces_linter" -"vignettes/upsetjs.Rmd",176,36,"style","Put spaces around all infix operators."," addQuery(""Q1"", color=""red"", elems=c('a', 'b', 'c')) %>%","infix_spaces_linter" -"vignettes/upsetjs.Rmd",176,39,"style","Only use double-quotes."," addQuery(""Q1"", color=""red"", elems=c('a', 'b', 'c')) %>%","single_quotes_linter" -"vignettes/upsetjs.Rmd",176,44,"style","Only use double-quotes."," addQuery(""Q1"", color=""red"", elems=c('a', 'b', 'c')) %>%","single_quotes_linter" -"vignettes/upsetjs.Rmd",176,49,"style","Only use double-quotes."," addQuery(""Q1"", color=""red"", elems=c('a', 'b', 'c')) %>%","single_quotes_linter" -"vignettes/upsetjs.Rmd",177,23,"style","Put spaces around all infix operators."," addQuery(""Q2"", color=""blue"", set='two')","infix_spaces_linter" -"vignettes/upsetjs.Rmd",177,35,"style","Put spaces around all infix operators."," addQuery(""Q2"", color=""blue"", set='two')","infix_spaces_linter" -"vignettes/upsetjs.Rmd",177,36,"style","Only use double-quotes."," addQuery(""Q2"", color=""blue"", set='two')","single_quotes_linter" -"vignettes/upsetjs.Rmd",189,6,"style","Put spaces around all infix operators."," one=c(1, 1, 1, 0, 1, 0, 1, 1, 0, 0, 1, 1, 1),","infix_spaces_linter" -"vignettes/upsetjs.Rmd",190,6,"style","Put spaces around all infix operators."," two=c(1, 1, 0, 1, 1, 0, 0, 0, 0, 1, 0, 0, 0),","infix_spaces_linter" -"vignettes/upsetjs.Rmd",191,8,"style","Put spaces around all infix operators."," three=c(1, 0, 0, 0, 1, 1, 1, 1, 1, 1, 0, 1, 1)),","infix_spaces_linter" -"vignettes/upsetjs.Rmd",192,12,"style","Put spaces around all infix operators."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","infix_spaces_linter" -"vignettes/upsetjs.Rmd",192,15,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",192,20,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",192,25,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",192,30,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",192,35,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",192,40,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",192,45,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",192,50,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",192,55,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",192,60,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",192,65,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",192,70,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",192,75,"style","Only use double-quotes."," row.names=c('a', 'b', 'c', 'd', 'e', 'f', 'g', 'h', 'i', 'j', 'k', 'l', 'm'))","single_quotes_linter" -"vignettes/upsetjs.Rmd",195,50,"style","Put spaces around all infix operators."," fromDataFrame(dataFrame, attributes = list(attr=runif(nrow(dataFrame))))","infix_spaces_linter" -"vignettes/upsetjs.Rmd",208,14,"style","Only use double-quotes."," chartTheme('dark')","single_quotes_linter" -"vignettes/upsetjs.Rmd",234,33,"style","Only use double-quotes."," chartLayout(numerical.scale = 'log')","single_quotes_linter" -"vignettes/venn.Rmd",28,27,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/venn.Rmd",28,32,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/venn.Rmd",28,37,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/venn.Rmd",28,42,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/venn.Rmd",28,47,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/venn.Rmd",28,52,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/venn.Rmd",28,57,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/venn.Rmd",28,62,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/venn.Rmd",28,67,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/venn.Rmd",28,81,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/venn.Rmd",28,86,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/venn.Rmd",28,91,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/venn.Rmd",28,96,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/venn.Rmd",28,101,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/venn.Rmd",28,117,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/venn.Rmd",28,122,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/venn.Rmd",28,127,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/venn.Rmd",28,132,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/venn.Rmd",28,137,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/venn.Rmd",28,142,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/venn.Rmd",28,147,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/venn.Rmd",28,152,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" -"vignettes/venn.Rmd",28,157,"style","Only use double-quotes.","listInput <- list(one = c('a', 'b', 'c', 'e', 'g', 'h', 'k', 'l', 'm'), two = c('a', 'b', 'd', 'e', 'j'), three = c('a', 'e', 'f', 'g', 'h', 'i', 'j', 'l', 'm'))","single_quotes_linter" diff --git a/.dev/revdep_emails/upsetjs/attachments/upsetjs.warnings b/.dev/revdep_emails/upsetjs/attachments/upsetjs.warnings deleted file mode 100644 index 959c4ba83..000000000 --- a/.dev/revdep_emails/upsetjs/attachments/upsetjs.warnings +++ /dev/null @@ -1 +0,0 @@ -Function with_defaults was deprecated in lintr version 2.0.9001. Use linters_with_defaults instead. diff --git a/.dev/revdep_emails/upsetjs/email-body b/.dev/revdep_emails/upsetjs/email-body deleted file mode 100644 index 6fae125c5..000000000 --- a/.dev/revdep_emails/upsetjs/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Samuel Gratzl! Thank you for using {lintr} in your package {upsetjs}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/upsetjs/upsetjs_r (hash: 4b375a8e0ba7e28cee3c8b68df3562c2d435bca3) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 13s on CRAN vs. 6s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/urlshorteneR/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/urlshorteneR/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index ac084e486..000000000 --- a/.dev/revdep_emails/urlshorteneR/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,2 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/zzz.R",1,1,"style","Variable and function name style should be snake_case.",".onAttach <- function(libname, pkgname) {","object_name_linter" diff --git a/.dev/revdep_emails/urlshorteneR/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/urlshorteneR/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index 59b081a93..000000000 --- a/.dev/revdep_emails/urlshorteneR/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,23 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/ApiKey.R",90,3,"style","Variable and function name style should be snake_case or symbols."," .urlshorteneREnv$access_token <- token$credentials$access_token","object_name_linter" -"R/ApiKey.R",91,3,"style","Variable and function name style should be snake_case or symbols."," .urlshorteneREnv$token <- token","object_name_linter" -"R/ApiKey.R",108,5,"style","Variable and function name style should be snake_case or symbols."," .urlshorteneREnv$token <- bitly_auth()","object_name_linter" -"R/ApiKey.R",112,5,"style","Variable and function name style should be snake_case or symbols."," .urlshorteneREnv$token <- readRDS(""../bitly_local_token.rds"")","object_name_linter" -"R/ApiKey.R",114,3,"style","Variable and function name style should be snake_case or symbols."," .urlshorteneREnv$acc_token <- .urlshorteneREnv$token$credentials$access_token","object_name_linter" -"R/bitly_links.R",80,67,"style","Use TRUE instead of the symbol T."," body_req_query_cleaned <- toJSON(body_req_query, auto_unbox = T)","T_and_F_symbol_linter" -"R/bitly_links.R",325,61,"style","Use TRUE instead of the symbol T."," body_req_query_cleaned <- toJSON(body_upd, auto_unbox = T)","T_and_F_symbol_linter" -"R/bitly_links.R",366,80,"style","Use FALSE instead of the symbol F."," df_bitlink <- data.frame(t(do.call(rbind, df_bitlink)), stringsAsFactors = F)","T_and_F_symbol_linter" -"tests/testthat/test-Links.R",13,78,"style","Use TRUE instead of the symbol T."," tags = list(""msft"", ""apple""), showRequestURL = T)","T_and_F_symbol_linter" -"vignettes/Tutorial.R",5,3,"style","Place a space before left parenthesis, except in a function call.","if(interactive()) {","spaces_left_parentheses_linter" -"vignettes/Tutorial.R",10,3,"style","Commented code should be removed.","# bitly_token <- bitly_auth(key = ""xxx"", secret = ""xxx"")","commented_code_linter" -"vignettes/Tutorial.R",11,3,"style","Commented code should be removed.","# bitly_token <- bitly_auth()","commented_code_linter" -"vignettes/Tutorial.R",46,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/Tutorial.R",47,7,"style","Use <-, not =, for assignment."," fin = NULL","assignment_linter" -"vignettes/Tutorial.R",48,13,"warning","1:length(...) is likely to be wrong in the empty edge case. Use seq_along() instead."," for (p in 1:length(df$link)) {","seq_linter" -"vignettes/Tutorial.R",58,1,"style","Trailing blank lines are superfluous.","","trailing_blank_lines_linter" -"vignettes/Tutorial.Rmd",29,3,"style","Place a space before left parenthesis, except in a function call.","if(interactive()) {","spaces_left_parentheses_linter" -"vignettes/Tutorial.Rmd",34,3,"style","Commented code should be removed.","# bitly_token <- bitly_auth(key = ""xxx"", secret = ""xxx"")","commented_code_linter" -"vignettes/Tutorial.Rmd",35,3,"style","Commented code should be removed.","# bitly_token <- bitly_auth()","commented_code_linter" -"vignettes/Tutorial.Rmd",93,1,"style","Trailing whitespace is superfluous."," ","trailing_whitespace_linter" -"vignettes/Tutorial.Rmd",94,7,"style","Use <-, not =, for assignment."," fin = NULL","assignment_linter" -"vignettes/Tutorial.Rmd",95,13,"warning","1:length(...) is likely to be wrong in the empty edge case. Use seq_along() instead."," for (p in 1:length(df$link)) {","seq_linter" diff --git a/.dev/revdep_emails/urlshorteneR/email-body b/.dev/revdep_emails/urlshorteneR/email-body deleted file mode 100644 index 98fa829c9..000000000 --- a/.dev/revdep_emails/urlshorteneR/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello John Malc! Thank you for using {lintr} in your package {urlshorteneR}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/dmpe/urlshorteneR (hash: 635c75c0129528eb27a65c9e952d5a3ba5fe3744) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 28s on CRAN vs. 17s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/virustotal/email-body b/.dev/revdep_emails/virustotal/email-body deleted file mode 100644 index e79633489..000000000 --- a/.dev/revdep_emails/virustotal/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Gaurav Sood! Thank you for using {lintr} in your package {virustotal}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/themains/virustotal (hash: 408832811b28ad6b27575042476ae82c4fb388ea) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 0s on CRAN vs. 0s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/wavefunction/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/wavefunction/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index ce06f167c..000000000 --- a/.dev/revdep_emails/wavefunction/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,4 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/wavefunction.R",23,3,"style","Variable and function name style should be snake_case or symbols."," H[, 1] <- 1.0","object_name_linter" -"R/wavefunction.R",27,3,"style","Variable and function name style should be snake_case or symbols."," H[, 2] <- 2.0 * x","object_name_linter" -"R/wavefunction.R",32,5,"style","Variable and function name style should be snake_case or symbols."," H[, d + 1] <- 2 * x * H[, d] - 2 * (d - 1) * H[, d - 1]","object_name_linter" diff --git a/.dev/revdep_emails/wavefunction/email-body b/.dev/revdep_emails/wavefunction/email-body deleted file mode 100644 index 93787dc17..000000000 --- a/.dev/revdep_emails/wavefunction/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Madeleine B. Thompson! Thank you for using {lintr} in your package {wavefunction}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/cran/wavefunction (hash: b11132bdf71195fc312424cb38739a5ce0961958) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 2s on CRAN vs. 2s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - diff --git a/.dev/revdep_emails/xgboost/attachments/lints_in_cran_not_devel.csv b/.dev/revdep_emails/xgboost/attachments/lints_in_cran_not_devel.csv deleted file mode 100644 index f4e629123..000000000 --- a/.dev/revdep_emails/xgboost/attachments/lints_in_cran_not_devel.csv +++ /dev/null @@ -1,29 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"R/callbacks.R",753,1,"style","Variable and function name style should be snake_case.","format.eval.string <- function(iter, eval_res, eval_err = NULL) {","object_name_linter" -"R/xgb.Booster.R",471,1,"style","Variable and function name style should be snake_case.","predict.xgb.Booster.handle <- function(object, ...) {","object_name_linter" -"R/xgb.cv.R",278,1,"style","Variable and function name style should be snake_case.","print.xgb.cv.synchronous <- function(x, verbose = FALSE, ...) {","object_name_linter" -"R/xgb.DMatrix.R",117,1,"style","Variable and function name style should be snake_case.","dim.xgb.DMatrix <- function(x) {","object_name_linter" -"R/xgb.DMatrix.R",146,1,"style","Variable and function name style should be snake_case.","dimnames.xgb.DMatrix <- function(x) {","object_name_linter" -"R/xgb.DMatrix.R",152,1,"style","Variable and function name style should be snake_case.","`dimnames<-.xgb.DMatrix` <- function(x, value) {","object_name_linter" -"R/xgb.DMatrix.R",204,1,"style","Variable and function name style should be snake_case.","getinfo.xgb.DMatrix <- function(object, name, ...) {","object_name_linter" -"R/xgb.DMatrix.R",329,1,"style","Variable and function name style should be snake_case.","slice.xgb.DMatrix <- function(object, idxset, ...) {","object_name_linter" -"R/xgb.DMatrix.R",355,1,"style","Variable and function name style should be snake_case.","`[.xgb.DMatrix` <- function(object, idxset, colset = NULL) {","object_name_linter" -"R/xgb.DMatrix.R",378,1,"style","Variable and function name style should be snake_case.","print.xgb.DMatrix <- function(x, verbose = FALSE, ...) {","object_name_linter" -"R/xgb.ggplot.R",21,23,"style","Variable and function name style should be snake_case."," importance_matrix[, Cluster := as.character(clusters$cluster)]","object_name_linter" -"R/xgb.model.dt.tree.R",101,16,"style","Variable and function name style should be snake_case."," td[position, Tree := 1L]","object_name_linter" -"R/xgb.model.dt.tree.R",102,8,"style","Variable and function name style should be snake_case."," td[, Tree := cumsum(ifelse(is.na(Tree), 0L, Tree)) - 1L]","object_name_linter" -"R/xgb.model.dt.tree.R",111,8,"style","Variable and function name style should be snake_case."," td[, Node := as.integer(sub(""^([0-9]+):.*"", ""\\1"", t))]","object_name_linter" -"R/xgb.model.dt.tree.R",112,25,"style","Variable and function name style should be snake_case."," if (!use_int_id) td[, ID := add.tree.id(Node, Tree)]","object_name_linter" -"R/xgb.model.dt.tree.R",113,8,"style","Variable and function name style should be snake_case."," td[, isLeaf := grepl(""leaf"", t, fixed = TRUE)]","object_name_linter" -"R/xgb.model.dt.tree.R",143,25,"style","Variable and function name style should be snake_case."," td[isLeaf == FALSE, Feature := feature_names[as.numeric(Feature) + 1]]","object_name_linter" -"R/xgb.model.dt.tree.R",171,8,"style","Variable and function name style should be snake_case."," td[, isLeaf := NULL]","object_name_linter" -"R/xgb.plot.deepness.R",130,25,"style","Variable and function name style should be snake_case."," dt_edges[is.na(Leaf), Leaf := FALSE]","object_name_linter" -"R/xgb.plot.importance.R",95,25,"style","Variable and function name style should be snake_case."," importance_matrix[, Importance := Importance / max(abs(Importance))]","object_name_linter" -"R/xgb.plot.multi.trees.R",71,35,"style","Variable and function name style should be snake_case."," tree.matrix[ID %in% root.nodes, abs.node.position := root.nodes]","object_name_linter" -"R/xgb.plot.multi.trees.R",86,28,"style","Variable and function name style should be snake_case."," tree.matrix[!is.na(Yes), Yes := paste0(abs.node.position, ""_0"")]","object_name_linter" -"R/xgb.plot.multi.trees.R",87,27,"style","Variable and function name style should be snake_case."," tree.matrix[!is.na(No), No := paste0(abs.node.position, ""_1"")]","object_name_linter" -"R/xgb.plot.multi.trees.R",116,14,"style","Variable and function name style should be snake_case."," edges.dt[, N := NULL]","object_name_linter" -"tests/testthat/test_callbacks.R",262,11,"style","Variable and function name style should be snake_case."," titanic$Pclass <- as.factor(titanic$Pclass)","object_name_linter" -"tests/testthat/test_helpers.R",17,6,"style","Variable and function name style should be snake_case.","df[, AgeDiscret := as.factor(round(Age / 10, 0))]","object_name_linter" -"tests/testthat/test_helpers.R",18,6,"style","Variable and function name style should be snake_case.","df[, AgeCat := as.factor(ifelse(Age > 30, ""Old"", ""Young""))]","object_name_linter" -"tests/testthat/test_helpers.R",19,6,"style","Variable and function name style should be snake_case.","df[, ID := NULL]","object_name_linter" diff --git a/.dev/revdep_emails/xgboost/attachments/lints_in_devel_not_cran.csv b/.dev/revdep_emails/xgboost/attachments/lints_in_devel_not_cran.csv deleted file mode 100644 index d660a746d..000000000 --- a/.dev/revdep_emails/xgboost/attachments/lints_in_devel_not_cran.csv +++ /dev/null @@ -1,367 +0,0 @@ -"filename","line_number","column_number","type","message","line","linter" -"demo/basic_walkthrough.R",6,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" -"demo/basic_walkthrough.R",7,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" -"demo/basic_walkthrough.R",10,81,"style","Lines should not be more than 80 characters.","# the loaded data is stored in sparseMatrix, and label is a numeric vector in {0,1}","line_length_linter" -"demo/basic_walkthrough.R",16,81,"style","Lines should not be more than 80 characters.","# note: we are putting in sparse matrix here, xgboost naturally handles sparse input","line_length_linter" -"demo/basic_walkthrough.R",17,81,"style","Lines should not be more than 80 characters.","# use sparse matrix when your feature is sparse(e.g. when you are using one-hot encoding vector)","line_length_linter" -"demo/basic_walkthrough.R",19,81,"style","Lines should not be more than 80 characters.","bst <- xgboost(data = train$data, label = train$label, max_depth = 2, eta = 1, nrounds = 2,","line_length_linter" -"demo/basic_walkthrough.R",23,81,"style","Lines should not be more than 80 characters.","bst <- xgboost(data = as.matrix(train$data), label = train$label, max_depth = 2, eta = 1, nrounds = 2,","line_length_linter" -"demo/basic_walkthrough.R",26,81,"style","Lines should not be more than 80 characters.","# you can also put in xgb.DMatrix object, which stores label, data and other meta datas needed for advanced features","line_length_linter" -"demo/basic_walkthrough.R",44,81,"style","Lines should not be more than 80 characters.","# since we do not have this file with us, the following line is just for illustration","line_length_linter" -"demo/basic_walkthrough.R",45,3,"style","Commented code should be removed.","# bst <- xgboost(data = 'agaricus.train.svm', max_depth = 2, eta = 1, nrounds = 2,objective = ""binary:logistic"")","commented_code_linter" -"demo/basic_walkthrough.R",45,81,"style","Lines should not be more than 80 characters.","# bst <- xgboost(data = 'agaricus.train.svm', max_depth = 2, eta = 1, nrounds = 2,objective = ""binary:logistic"")","line_length_linter" -"demo/basic_walkthrough.R",81,81,"style","Lines should not be more than 80 characters.","bst <- xgb.train(data = dtrain, max_depth = 2, eta = 1, nrounds = 2, watchlist = watchlist,","line_length_linter" -"demo/basic_walkthrough.R",85,81,"style","Lines should not be more than 80 characters.","bst <- xgb.train(data = dtrain, max_depth = 2, eta = 1, nrounds = 2, watchlist = watchlist,","line_length_linter" -"demo/basic_walkthrough.R",93,81,"style","Lines should not be more than 80 characters.","bst <- xgb.train(data = dtrain2, max_depth = 2, eta = 1, nrounds = 2, watchlist = watchlist,","line_length_linter" -"demo/basic_walkthrough.R",102,35,"style","Only use double-quotes.","dump_path <- file.path(tempdir(), 'dump.raw.txt')","single_quotes_linter" -"demo/boost_from_prediction.R",3,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" -"demo/boost_from_prediction.R",4,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" -"demo/boost_from_prediction.R",12,7,"style","Only use double-quotes.","print('start running example to start from a initial prediction')","single_quotes_linter" -"demo/boost_from_prediction.R",14,64,"style","Only use double-quotes.","param <- list(max_depth = 2, eta = 1, nthread = 2, objective = 'binary:logistic')","single_quotes_linter" -"demo/boost_from_prediction.R",14,81,"style","Lines should not be more than 80 characters.","param <- list(max_depth = 2, eta = 1, nthread = 2, objective = 'binary:logistic')","line_length_linter" -"demo/boost_from_prediction.R",16,81,"style","Lines should not be more than 80 characters.","# Note: we need the margin value instead of transformed prediction in set_base_margin","line_length_linter" -"demo/boost_from_prediction.R",17,81,"style","Lines should not be more than 80 characters.","# do predict with output_margin=TRUE, will always give you margin values before logistic transformation","line_length_linter" -"demo/boost_from_prediction.R",25,7,"style","Only use double-quotes.","print('this is result of boost from initial prediction')","single_quotes_linter" -"demo/boost_from_prediction.R",26,81,"style","Lines should not be more than 80 characters.","bst <- xgb.train(params = param, data = dtrain, nrounds = 1, watchlist = watchlist)","line_length_linter" -"demo/caret_wrapper.R",11,81,"style","Lines should not be more than 80 characters.","# Create a copy of the dataset with data.table package (data.table is 100% compliant with R dataframe but its syntax is a lot more consistent and its performance are really good).","line_length_linter" -"demo/caret_wrapper.R",14,81,"style","Lines should not be more than 80 characters.","# Let's add some new categorical features to see if it helps. Of course these feature are highly correlated to the Age feature. Usually it's not a good thing in ML, but Tree algorithms (including boosted trees) are able to select the best features, even in case of highly correlated features.","line_length_linter" -"demo/caret_wrapper.R",15,81,"style","Lines should not be more than 80 characters.","# For the first feature we create groups of age by rounding the real age. Note that we transform it to factor (categorical data) so the algorithm treat them as independant values.","line_length_linter" -"demo/caret_wrapper.R",18,81,"style","Lines should not be more than 80 characters.","# Here is an even stronger simplification of the real age with an arbitrary split at 30 years old. I choose this value based on nothing. We will see later if simplifying the information based on arbitrary values is a good strategy (I am sure you already have an idea of how well it will work!).","line_length_linter" -"demo/caret_wrapper.R",21,81,"style","Lines should not be more than 80 characters.","# We remove ID as there is nothing to learn from this feature (it will just add some noise as the dataset is small).","line_length_linter" -"demo/caret_wrapper.R",26,81,"style","Lines should not be more than 80 characters.","# Here we use 10-fold cross-validation, repeating twice, and using random search for tuning hyper-parameters.","line_length_linter" -"demo/caret_wrapper.R",27,1,"style","Variable and function name style should be snake_case or symbols.","fitControl <- trainControl(method = ""repeatedcv"", number = 10, repeats = 2, search = ""random"")","object_name_linter" -"demo/caret_wrapper.R",27,81,"style","Lines should not be more than 80 characters.","fitControl <- trainControl(method = ""repeatedcv"", number = 10, repeats = 2, search = ""random"")","line_length_linter" -"demo/caret_wrapper.R",29,32,"style","Put spaces around all infix operators.","model <- train(factor(Improved)~., data = df, method = ""xgbTree"", trControl = fitControl)","infix_spaces_linter" -"demo/caret_wrapper.R",29,81,"style","Lines should not be more than 80 characters.","model <- train(factor(Improved)~., data = df, method = ""xgbTree"", trControl = fitControl)","line_length_linter" -"demo/caret_wrapper.R",31,81,"style","Lines should not be more than 80 characters.","# Instead of tree for our boosters, you can also fit a linear regression or logistic regression model using xgbLinear","line_length_linter" -"demo/caret_wrapper.R",32,3,"style","Commented code should be removed.","# model <- train(factor(Improved)~., data = df, method = ""xgbLinear"", trControl = fitControl)","commented_code_linter" -"demo/caret_wrapper.R",32,81,"style","Lines should not be more than 80 characters.","# model <- train(factor(Improved)~., data = df, method = ""xgbLinear"", trControl = fitControl)","line_length_linter" -"demo/create_sparse_matrix.R",5,20,"style","Only use double-quotes."," install.packages('vcd') #Available in CRAN. Used for its dataset with categorical values.","single_quotes_linter" -"demo/create_sparse_matrix.R",5,81,"style","Lines should not be more than 80 characters."," install.packages('vcd') #Available in CRAN. Used for its dataset with categorical values.","line_length_linter" -"demo/create_sparse_matrix.R",10,81,"style","Lines should not be more than 80 characters.","# A categorical variable is one which have a fixed number of values. By example, if for each observation a variable called ""Colour"" can have only ""red"", ""blue"" or ""green"" as value, it is a categorical variable.","line_length_linter" -"demo/create_sparse_matrix.R",15,81,"style","Lines should not be more than 80 characters.","# In this demo we will see how to transform a dense dataframe with categorical variables to a sparse matrix before analyzing it in XGBoost.","line_length_linter" -"demo/create_sparse_matrix.R",21,81,"style","Lines should not be more than 80 characters.","# create a copy of the dataset with data.table package (data.table is 100% compliant with R dataframe but its syntax is a lot more consistent and its performance are really good).","line_length_linter" -"demo/create_sparse_matrix.R",28,81,"style","Lines should not be more than 80 characters.","# 2 columns have factor type, one has ordinal type (ordinal variable is a categorical variable with values which can be ordered, here: None > Some > Marked).","line_length_linter" -"demo/create_sparse_matrix.R",32,81,"style","Lines should not be more than 80 characters.","# Let's add some new categorical features to see if it helps. Of course these feature are highly correlated to the Age feature. Usually it's not a good thing in ML, but Tree algorithms (including boosted trees) are able to select the best features, even in case of highly correlated features.","line_length_linter" -"demo/create_sparse_matrix.R",34,81,"style","Lines should not be more than 80 characters.","# For the first feature we create groups of age by rounding the real age. Note that we transform it to factor (categorical data) so the algorithm treat them as independent values.","line_length_linter" -"demo/create_sparse_matrix.R",37,81,"style","Lines should not be more than 80 characters.","# Here is an even stronger simplification of the real age with an arbitrary split at 30 years old. I choose this value based on nothing. We will see later if simplifying the information based on arbitrary values is a good strategy (I am sure you already have an idea of how well it will work!).","line_length_linter" -"demo/create_sparse_matrix.R",40,81,"style","Lines should not be more than 80 characters.","# We remove ID as there is nothing to learn from this feature (it will just add some noise as the dataset is small).","line_length_linter" -"demo/create_sparse_matrix.R",49,81,"style","Lines should not be more than 80 characters.","# The purpose is to transform each value of each categorical feature in one binary feature.","line_length_linter" -"demo/create_sparse_matrix.R",51,81,"style","Lines should not be more than 80 characters.","# Let's take, the column Treatment will be replaced by two columns, Placebo, and Treated. Each of them will be binary. For example an observation which had the value Placebo in column Treatment before the transformation will have, after the transformation, the value 1 in the new column Placebo and the value 0 in the new column Treated.","line_length_linter" -"demo/create_sparse_matrix.R",53,81,"style","Lines should not be more than 80 characters.","# Formulae Improved~.-1 used below means transform all categorical features but column Improved to binary values.","line_length_linter" -"demo/create_sparse_matrix.R",54,81,"style","Lines should not be more than 80 characters.","# Column Improved is excluded because it will be our output column, the one we want to predict.","line_length_linter" -"demo/create_sparse_matrix.R",69,81,"style","Lines should not be more than 80 characters."," eta = 1, nthread = 2, nrounds = 10, objective = ""binary:logistic"")","line_length_linter" -"demo/create_sparse_matrix.R",71,81,"style","Lines should not be more than 80 characters.","importance <- xgb.importance(feature_names = colnames(sparse_matrix), model = bst)","line_length_linter" -"demo/create_sparse_matrix.R",73,81,"style","Lines should not be more than 80 characters.","# According to the matrix below, the most important feature in this dataset to predict if the treatment will work is the Age. The second most important feature is having received a placebo or not. The sex is third. Then we see our generated features (AgeDiscret). We can see that their contribution is very low (Gain column).","line_length_linter" -"demo/create_sparse_matrix.R",85,81,"style","Lines should not be more than 80 characters.","# The perfectly random split I did between young and old at 30 years old have a low correlation of 2. It's a result we may expect as may be in my mind > 30 years is being old (I am 32 and starting feeling old, this may explain that), but for the illness we are studying, the age to be vulnerable is not the same. Don't let your ""gut"" lower the quality of your model. In ""data science"", there is science :-)","line_length_linter" -"demo/create_sparse_matrix.R",87,81,"style","Lines should not be more than 80 characters.","# As you can see, in general destroying information by simplifying it won't improve your model. Chi2 just demonstrates that. But in more complex cases, creating a new feature based on existing one which makes link with the outcome more obvious may help the algorithm and improve the model. The case studied here is not enough complex to show that. Check Kaggle forum for some challenging datasets.","line_length_linter" -"demo/create_sparse_matrix.R",89,81,"style","Lines should not be more than 80 characters.","# Moreover, you can notice that even if we have added some not useful new features highly correlated with other features, the boosting tree algorithm have been able to choose the best one, which in this case is the Age. Linear model may not be that strong in these scenario.","line_length_linter" -"demo/cross_validation.R",3,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" -"demo/cross_validation.R",4,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" -"demo/cross_validation.R",9,64,"style","Only use double-quotes.","param <- list(max_depth = 2, eta = 1, nthread = 2, objective = 'binary:logistic')","single_quotes_linter" -"demo/cross_validation.R",9,81,"style","Lines should not be more than 80 characters.","param <- list(max_depth = 2, eta = 1, nthread = 2, objective = 'binary:logistic')","line_length_linter" -"demo/cross_validation.R",11,5,"style","Only use double-quotes.","cat('running cross validation\n')","single_quotes_linter" -"demo/cross_validation.R",15,53,"style","Opening curly braces should never go on their own line and should always be followed by a new line.","xgb.cv(param, dtrain, nrounds, nfold = 5, metrics = {'error'})","brace_linter" -"demo/cross_validation.R",15,54,"style","Only use double-quotes.","xgb.cv(param, dtrain, nrounds, nfold = 5, metrics = {'error'})","single_quotes_linter" -"demo/cross_validation.R",17,5,"style","Only use double-quotes.","cat('running cross validation, disable standard deviation display\n')","single_quotes_linter" -"demo/cross_validation.R",22,18,"style","Only use double-quotes."," metrics = 'error', showsd = FALSE)","single_quotes_linter" -"demo/cross_validation.R",28,6,"style","Remove spaces before the left parenthesis in a function call.","print ('running cross validation, with customized loss function')","function_left_parentheses_linter" -"demo/cross_validation.R",28,8,"style","Only use double-quotes.","print ('running cross validation, with customized loss function')","single_quotes_linter" -"demo/cross_validation.R",49,81,"style","Lines should not be more than 80 characters.","res <- xgb.cv(params = param, data = dtrain, nrounds = nrounds, nfold = 5, prediction = TRUE)","line_length_linter" -"demo/custom_objective.R",3,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" -"demo/custom_objective.R",4,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" -"demo/custom_objective.R",14,81,"style","Lines should not be more than 80 characters.","# user define objective function, given prediction, return gradient and second order gradient","line_length_linter" -"demo/custom_objective.R",25,81,"style","Lines should not be more than 80 characters.","# NOTE: when you do customized loss function, the default prediction value is margin","line_length_linter" -"demo/custom_objective.R",27,81,"style","Lines should not be more than 80 characters.","# for example, we are doing logistic loss, the prediction is score before logistic transformation","line_length_linter" -"demo/custom_objective.R",29,81,"style","Lines should not be more than 80 characters.","# Take this in mind when you use the customization, and maybe you need write customized evaluation function","line_length_linter" -"demo/custom_objective.R",38,6,"style","Remove spaces before the left parenthesis in a function call.","print ('start training with user customized objective')","function_left_parentheses_linter" -"demo/custom_objective.R",38,8,"style","Only use double-quotes.","print ('start training with user customized objective')","single_quotes_linter" -"demo/custom_objective.R",48,81,"style","Lines should not be more than 80 characters.","# set label attribute of dtrain to be label, we use label as an example, it can be anything","line_length_linter" -"demo/custom_objective.R",49,14,"style","Only use double-quotes.","attr(dtrain, 'label') <- getinfo(dtrain, 'label')","single_quotes_linter" -"demo/custom_objective.R",49,42,"style","Only use double-quotes.","attr(dtrain, 'label') <- getinfo(dtrain, 'label')","single_quotes_linter" -"demo/custom_objective.R",54,26,"style","Only use double-quotes."," labels <- attr(dtrain, 'label')","single_quotes_linter" -"demo/custom_objective.R",62,6,"style","Remove spaces before the left parenthesis in a function call.","print ('start training with user customized objective, with additional attributes in DMatrix')","function_left_parentheses_linter" -"demo/custom_objective.R",62,8,"style","Only use double-quotes.","print ('start training with user customized objective, with additional attributes in DMatrix')","single_quotes_linter" -"demo/custom_objective.R",62,81,"style","Lines should not be more than 80 characters.","print ('start training with user customized objective, with additional attributes in DMatrix')","line_length_linter" -"demo/early_stopping.R",3,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" -"demo/early_stopping.R",4,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" -"demo/early_stopping.R",13,81,"style","Lines should not be more than 80 characters.","# user define objective function, given prediction, return gradient and second order gradient","line_length_linter" -"demo/early_stopping.R",23,81,"style","Lines should not be more than 80 characters.","# NOTE: when you do customized loss function, the default prediction value is margin","line_length_linter" -"demo/early_stopping.R",25,81,"style","Lines should not be more than 80 characters.","# for example, we are doing logistic loss, the prediction is score before logistic transformation","line_length_linter" -"demo/early_stopping.R",27,81,"style","Lines should not be more than 80 characters.","# Take this in mind when you use the customization, and maybe you need write customized evaluation function","line_length_linter" -"demo/early_stopping.R",33,6,"style","Remove spaces before the left parenthesis in a function call.","print ('start training with early Stopping setting')","function_left_parentheses_linter" -"demo/early_stopping.R",33,8,"style","Only use double-quotes.","print ('start training with early Stopping setting')","single_quotes_linter" -"demo/early_stopping.R",36,81,"style","Lines should not be more than 80 characters."," objective = logregobj, eval_metric = evalerror, maximize = FALSE,","line_length_linter" -"demo/generalized_linear_model.R",3,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" -"demo/generalized_linear_model.R",4,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" -"demo/generalized_linear_model.R",32,26,"style","Only use double-quotes.","labels <- getinfo(dtest, 'label')","single_quotes_linter" -"demo/generalized_linear_model.R",33,5,"style","Only use double-quotes.","cat('error of preds=', mean(as.numeric(ypred > 0.5) != labels), '\n')","single_quotes_linter" -"demo/generalized_linear_model.R",33,65,"style","Only use double-quotes.","cat('error of preds=', mean(as.numeric(ypred > 0.5) != labels), '\n')","single_quotes_linter" -"demo/gpu_accelerated.R",10,9,"style","Only use double-quotes.","library('xgboost')","single_quotes_linter" -"demo/gpu_accelerated.R",12,81,"style","Lines should not be more than 80 characters.","# Simulate N x p random matrix with some binomial response dependent on pp columns","line_length_linter" -"demo/gpu_accelerated.R",14,1,"style","Variable and function name style should be snake_case or symbols.","N <- 1000000","object_name_linter" -"demo/gpu_accelerated.R",17,1,"style","Variable and function name style should be snake_case or symbols.","X <- matrix(runif(N * p), ncol = p)","object_name_linter" -"demo/gpu_accelerated.R",35,27,"style","Only use double-quotes.","param <- list(objective = 'reg:logistic', eval_metric = 'auc', subsample = 0.5, nthread = 4,","single_quotes_linter" -"demo/gpu_accelerated.R",35,57,"style","Only use double-quotes.","param <- list(objective = 'reg:logistic', eval_metric = 'auc', subsample = 0.5, nthread = 4,","single_quotes_linter" -"demo/gpu_accelerated.R",35,81,"style","Lines should not be more than 80 characters.","param <- list(objective = 'reg:logistic', eval_metric = 'auc', subsample = 0.5, nthread = 4,","line_length_linter" -"demo/gpu_accelerated.R",36,43,"style","Only use double-quotes."," max_bin = 64, tree_method = 'gpu_hist')","single_quotes_linter" -"demo/gpu_accelerated.R",42,22,"style","Only use double-quotes.","param$tree_method <- 'hist'","single_quotes_linter" -"demo/interaction_constraints.R",6,81,"style","Lines should not be more than 80 characters.","# Function to obtain a list of interactions fitted in trees, requires input of maximum depth","line_length_linter" -"demo/interaction_constraints.R",7,1,"style","Variable and function name style should be snake_case or symbols.","treeInteractions <- function(input_tree, input_max_depth) {","object_name_linter" -"demo/interaction_constraints.R",8,3,"style","Variable and function name style should be snake_case or symbols."," ID_merge <- i.id <- i.feature <- NULL # Suppress warning ""no visible binding for global variable""","object_name_linter" -"demo/interaction_constraints.R",8,15,"style","Variable and function name style should be snake_case or symbols."," ID_merge <- i.id <- i.feature <- NULL # Suppress warning ""no visible binding for global variable""","object_name_linter" -"demo/interaction_constraints.R",8,23,"style","Variable and function name style should be snake_case or symbols."," ID_merge <- i.id <- i.feature <- NULL # Suppress warning ""no visible binding for global variable""","object_name_linter" -"demo/interaction_constraints.R",8,81,"style","Lines should not be more than 80 characters."," ID_merge <- i.id <- i.feature <- NULL # Suppress warning ""no visible binding for global variable""","line_length_linter" -"demo/interaction_constraints.R",10,81,"style","Lines should not be more than 80 characters."," trees <- data.table::copy(input_tree) # copy tree input to prevent overwriting","line_length_linter" -"demo/interaction_constraints.R",16,77,"style","Only use double-quotes."," if (i == 2) trees[, ID_merge := ID] else trees[, ID_merge := get(paste0('parent_', i - 2))]","single_quotes_linter" -"demo/interaction_constraints.R",16,81,"style","Lines should not be more than 80 characters."," if (i == 2) trees[, ID_merge := ID] else trees[, ID_merge := get(paste0('parent_', i - 2))]","line_length_linter" -"demo/interaction_constraints.R",17,81,"style","Lines should not be more than 80 characters."," parents_left <- trees[!is.na(Split), list(i.id = ID, i.feature = Feature, ID_merge = Yes)]","line_length_linter" -"demo/interaction_constraints.R",18,81,"style","Lines should not be more than 80 characters."," parents_right <- trees[!is.na(Split), list(i.id = ID, i.feature = Feature, ID_merge = No)]","line_length_linter" -"demo/interaction_constraints.R",20,34,"style","Only use double-quotes."," data.table::setorderv(trees, 'ID_merge')","single_quotes_linter" -"demo/interaction_constraints.R",21,41,"style","Only use double-quotes."," data.table::setorderv(parents_left, 'ID_merge')","single_quotes_linter" -"demo/interaction_constraints.R",22,42,"style","Only use double-quotes."," data.table::setorderv(parents_right, 'ID_merge')","single_quotes_linter" -"demo/interaction_constraints.R",24,46,"style","Only use double-quotes."," trees <- merge(trees, parents_left, by = 'ID_merge', all.x = TRUE)","single_quotes_linter" -"demo/interaction_constraints.R",25,34,"style","Only use double-quotes."," trees[!is.na(i.id), c(paste0('parent_', i - 1), paste0('parent_feat_', i - 1))","single_quotes_linter" -"demo/interaction_constraints.R",25,60,"style","Only use double-quotes."," trees[!is.na(i.id), c(paste0('parent_', i - 1), paste0('parent_feat_', i - 1))","single_quotes_linter" -"demo/interaction_constraints.R",25,81,"style","Lines should not be more than 80 characters."," trees[!is.na(i.id), c(paste0('parent_', i - 1), paste0('parent_feat_', i - 1))","line_length_linter" -"demo/interaction_constraints.R",27,15,"style","Only use double-quotes."," trees[, c('i.id', 'i.feature') := NULL]","single_quotes_linter" -"demo/interaction_constraints.R",27,23,"style","Only use double-quotes."," trees[, c('i.id', 'i.feature') := NULL]","single_quotes_linter" -"demo/interaction_constraints.R",29,47,"style","Only use double-quotes."," trees <- merge(trees, parents_right, by = 'ID_merge', all.x = TRUE)","single_quotes_linter" -"demo/interaction_constraints.R",30,34,"style","Only use double-quotes."," trees[!is.na(i.id), c(paste0('parent_', i - 1), paste0('parent_feat_', i - 1))","single_quotes_linter" -"demo/interaction_constraints.R",30,60,"style","Only use double-quotes."," trees[!is.na(i.id), c(paste0('parent_', i - 1), paste0('parent_feat_', i - 1))","single_quotes_linter" -"demo/interaction_constraints.R",30,81,"style","Lines should not be more than 80 characters."," trees[!is.na(i.id), c(paste0('parent_', i - 1), paste0('parent_feat_', i - 1))","line_length_linter" -"demo/interaction_constraints.R",32,15,"style","Only use double-quotes."," trees[, c('i.id', 'i.feature') := NULL]","single_quotes_linter" -"demo/interaction_constraints.R",32,23,"style","Only use double-quotes."," trees[, c('i.id', 'i.feature') := NULL]","single_quotes_linter" -"demo/interaction_constraints.R",36,53,"warning","no visible binding for global variable β€˜parent_1’"," interaction_trees <- trees[!is.na(Split) & !is.na(parent_1),","object_usage_linter" -"demo/interaction_constraints.R",37,32,"style","Only use double-quotes."," c('Feature', paste0('parent_feat_', 1:(input_max_depth - 1))),","single_quotes_linter" -"demo/interaction_constraints.R",37,50,"style","Only use double-quotes."," c('Feature', paste0('parent_feat_', 1:(input_max_depth - 1))),","single_quotes_linter" -"demo/interaction_constraints.R",37,81,"style","Lines should not be more than 80 characters."," c('Feature', paste0('parent_feat_', 1:(input_max_depth - 1))),","line_length_linter" -"demo/interaction_constraints.R",39,81,"style","Lines should not be more than 80 characters."," interaction_trees_split <- split(interaction_trees, seq_len(nrow(interaction_trees)))","line_length_linter" -"demo/interaction_constraints.R",60,34,"style","Only use double-quotes.","y <- -1 * x[, rowSums(.SD)] + x[['V1']] * x[['V2']] + x[['V3']] * x[['V4']] * x[['V5']]","single_quotes_linter" -"demo/interaction_constraints.R",60,46,"style","Only use double-quotes.","y <- -1 * x[, rowSums(.SD)] + x[['V1']] * x[['V2']] + x[['V3']] * x[['V4']] * x[['V5']]","single_quotes_linter" -"demo/interaction_constraints.R",60,58,"style","Only use double-quotes.","y <- -1 * x[, rowSums(.SD)] + x[['V1']] * x[['V2']] + x[['V3']] * x[['V4']] * x[['V5']]","single_quotes_linter" -"demo/interaction_constraints.R",60,70,"style","Only use double-quotes.","y <- -1 * x[, rowSums(.SD)] + x[['V1']] * x[['V2']] + x[['V3']] * x[['V4']] * x[['V5']]","single_quotes_linter" -"demo/interaction_constraints.R",60,81,"style","Lines should not be more than 80 characters.","y <- -1 * x[, rowSums(.SD)] + x[['V1']] * x[['V2']] + x[['V3']] * x[['V4']] * x[['V5']]","line_length_linter" -"demo/interaction_constraints.R",60,82,"style","Only use double-quotes.","y <- -1 * x[, rowSums(.SD)] + x[['V1']] * x[['V2']] + x[['V3']] * x[['V4']] * x[['V5']]","single_quotes_linter" -"demo/interaction_constraints.R",61,40,"style","Only use double-quotes."," + rnorm(1000, 0.001) + 3 * sin(x[['V7']])","single_quotes_linter" -"demo/interaction_constraints.R",66,28,"style","Only use double-quotes.","interaction_list <- list(c('V1', 'V2'), c('V3', 'V4', 'V5'))","single_quotes_linter" -"demo/interaction_constraints.R",66,34,"style","Only use double-quotes.","interaction_list <- list(c('V1', 'V2'), c('V3', 'V4', 'V5'))","single_quotes_linter" -"demo/interaction_constraints.R",66,43,"style","Only use double-quotes.","interaction_list <- list(c('V1', 'V2'), c('V3', 'V4', 'V5'))","single_quotes_linter" -"demo/interaction_constraints.R",66,49,"style","Only use double-quotes.","interaction_list <- list(c('V1', 'V2'), c('V3', 'V4', 'V5'))","single_quotes_linter" -"demo/interaction_constraints.R",66,55,"style","Only use double-quotes.","interaction_list <- list(c('V1', 'V2'), c('V3', 'V4', 'V5'))","single_quotes_linter" -"demo/interaction_constraints.R",70,3,"style","Variable and function name style should be snake_case or symbols."," LUT <- seq_along(col_names) - 1","object_name_linter" -"demo/interaction_constraints.R",71,9,"style","Variable and function name style should be snake_case or symbols."," names(LUT) <- col_names","object_name_linter" -"demo/interaction_constraints.R",102,81,"style","Lines should not be more than 80 characters.","# Show monotonic constraints still apply by checking scores after incrementing V1","line_length_linter" -"demo/interaction_constraints.R",103,22,"style","Only use double-quotes.","x1 <- sort(unique(x[['V1']]))","single_quotes_linter" -"demo/interaction_constraints.R",105,27,"style","Only use double-quotes."," testdata <- copy(x[, - ('V1')])","single_quotes_linter" -"demo/interaction_constraints.R",106,13,"style","Only use double-quotes."," testdata[['V1']] <- x1[i]","single_quotes_linter" -"demo/interaction_constraints.R",107,33,"style","Only use double-quotes."," testdata <- testdata[, paste0('V', 1:10), with = FALSE]","single_quotes_linter" -"demo/poisson_regression.R",4,28,"style","Only use double-quotes."," objective = 'count:poisson', nrounds = 5)","single_quotes_linter" -"demo/predict_first_ntree.R",3,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" -"demo/predict_first_ntree.R",4,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" -"demo/predict_first_ntree.R",8,51,"style","Only use double-quotes.","param <- list(max_depth = 2, eta = 1, objective = 'binary:logistic')","single_quotes_linter" -"demo/predict_first_ntree.R",14,5,"style","Only use double-quotes.","cat('start testing prediction from first n trees\n')","single_quotes_linter" -"demo/predict_first_ntree.R",15,26,"style","Only use double-quotes.","labels <- getinfo(dtest, 'label')","single_quotes_linter" -"demo/predict_first_ntree.R",22,5,"style","Only use double-quotes.","cat('error of ypred1=', mean(as.numeric(ypred1 > 0.5) != labels), '\n')","single_quotes_linter" -"demo/predict_first_ntree.R",22,67,"style","Only use double-quotes.","cat('error of ypred1=', mean(as.numeric(ypred1 > 0.5) != labels), '\n')","single_quotes_linter" -"demo/predict_first_ntree.R",23,5,"style","Only use double-quotes.","cat('error of ypred2=', mean(as.numeric(ypred2 > 0.5) != labels), '\n')","single_quotes_linter" -"demo/predict_first_ntree.R",23,67,"style","Only use double-quotes.","cat('error of ypred2=', mean(as.numeric(ypred2 > 0.5) != labels), '\n')","single_quotes_linter" -"demo/predict_leaf_indices.R",8,32,"style","Only use double-quotes.","data(agaricus.train, package = 'xgboost')","single_quotes_linter" -"demo/predict_leaf_indices.R",9,31,"style","Only use double-quotes.","data(agaricus.test, package = 'xgboost')","single_quotes_linter" -"demo/predict_leaf_indices.R",13,51,"style","Only use double-quotes.","param <- list(max_depth = 2, eta = 1, objective = 'binary:logistic')","single_quotes_linter" -"demo/predict_leaf_indices.R",20,1,"style","Variable and function name style should be snake_case or symbols.","accuracy.before <- (sum((predict(bst, agaricus.test$data) >= 0.5) == agaricus.test$label)","object_name_linter" -"demo/predict_leaf_indices.R",20,81,"style","Lines should not be more than 80 characters.","accuracy.before <- (sum((predict(bst, agaricus.test$data) >= 0.5) == agaricus.test$label)","line_length_linter" -"demo/predict_leaf_indices.R",27,1,"style","Variable and function name style should be snake_case or symbols.","create.new.tree.features <- function(model, original.features){","object_name_linter" -"demo/predict_leaf_indices.R",27,45,"style","Variable and function name style should be snake_case or symbols.","create.new.tree.features <- function(model, original.features){","object_name_linter" -"demo/predict_leaf_indices.R",27,63,"style","There should be a space before an opening curly brace.","create.new.tree.features <- function(model, original.features){","brace_linter" -"demo/predict_leaf_indices.R",27,63,"style","There should be a space between a right parenthesis and a body expression.","create.new.tree.features <- function(model, original.features){","paren_body_linter" -"demo/predict_leaf_indices.R",31,81,"style","Lines should not be more than 80 characters."," # max is not the real max but it s not important for the purpose of adding features","line_length_linter" -"demo/predict_leaf_indices.R",32,5,"style","Variable and function name style should be snake_case or symbols."," leaf.id <- sort(unique(pred_with_leaf[, i]))","object_name_linter" -"demo/predict_leaf_indices.R",39,1,"style","Variable and function name style should be snake_case or symbols.","new.features.train <- create.new.tree.features(bst, agaricus.train$data)","object_name_linter" -"demo/predict_leaf_indices.R",40,1,"style","Variable and function name style should be snake_case or symbols.","new.features.test <- create.new.tree.features(bst, agaricus.test$data)","object_name_linter" -"demo/predict_leaf_indices.R",41,10,"style","Variable and function name style should be snake_case or symbols.","colnames(new.features.test) <- colnames(new.features.train)","object_name_linter" -"demo/predict_leaf_indices.R",44,1,"style","Variable and function name style should be snake_case or symbols.","new.dtrain <- xgb.DMatrix(data = new.features.train, label = agaricus.train$label)","object_name_linter" -"demo/predict_leaf_indices.R",44,81,"style","Lines should not be more than 80 characters.","new.dtrain <- xgb.DMatrix(data = new.features.train, label = agaricus.train$label)","line_length_linter" -"demo/predict_leaf_indices.R",45,1,"style","Variable and function name style should be snake_case or symbols.","new.dtest <- xgb.DMatrix(data = new.features.test, label = agaricus.test$label)","object_name_linter" -"demo/predict_leaf_indices.R",47,81,"style","Lines should not be more than 80 characters.","bst <- xgb.train(params = param, data = new.dtrain, nrounds = nrounds, nthread = 2)","line_length_linter" -"demo/predict_leaf_indices.R",50,1,"style","Variable and function name style should be snake_case or symbols.","accuracy.after <- (sum((predict(bst, new.dtest) >= 0.5) == agaricus.test$label)","object_name_linter" -"demo/predict_leaf_indices.R",54,81,"style","Lines should not be more than 80 characters.","cat(paste(""The accuracy was"", accuracy.before, ""before adding leaf features and it is now"",","line_length_linter" -"demo/runall.R",2,35,"style","Only use double-quotes.","demo(basic_walkthrough, package = 'xgboost')","single_quotes_linter" -"demo/runall.R",3,34,"style","Only use double-quotes.","demo(custom_objective, package = 'xgboost')","single_quotes_linter" -"demo/runall.R",4,39,"style","Only use double-quotes.","demo(boost_from_prediction, package = 'xgboost')","single_quotes_linter" -"demo/runall.R",5,37,"style","Only use double-quotes.","demo(predict_first_ntree, package = 'xgboost')","single_quotes_linter" -"demo/runall.R",6,42,"style","Only use double-quotes.","demo(generalized_linear_model, package = 'xgboost')","single_quotes_linter" -"demo/runall.R",7,34,"style","Only use double-quotes.","demo(cross_validation, package = 'xgboost')","single_quotes_linter" -"demo/runall.R",8,38,"style","Only use double-quotes.","demo(create_sparse_matrix, package = 'xgboost')","single_quotes_linter" -"demo/runall.R",9,38,"style","Only use double-quotes.","demo(predict_leaf_indices, package = 'xgboost')","single_quotes_linter" -"demo/runall.R",10,32,"style","Only use double-quotes.","demo(early_stopping, package = 'xgboost')","single_quotes_linter" -"demo/runall.R",11,36,"style","Only use double-quotes.","demo(poisson_regression, package = 'xgboost')","single_quotes_linter" -"demo/runall.R",12,31,"style","Only use double-quotes.","demo(caret_wrapper, package = 'xgboost')","single_quotes_linter" -"demo/runall.R",13,36,"style","Only use double-quotes.","demo(tweedie_regression, package = 'xgboost')","single_quotes_linter" -"demo/runall.R",14,2,"style","Commented code should be removed.","#demo(gpu_accelerated, package = 'xgboost') # can only run when built with GPU support","commented_code_linter" -"demo/runall.R",14,81,"style","Lines should not be more than 80 characters.","#demo(gpu_accelerated, package = 'xgboost') # can only run when built with GPU support","line_length_linter" -"demo/tweedie_regression.R",11,14,"style","Only use double-quotes.","exclude <- c('POLICYNO', 'PLCYDATE', 'CLM_FREQ5', 'CLM_AMT5', 'CLM_FLAG', 'IN_YY')","single_quotes_linter" -"demo/tweedie_regression.R",11,26,"style","Only use double-quotes.","exclude <- c('POLICYNO', 'PLCYDATE', 'CLM_FREQ5', 'CLM_AMT5', 'CLM_FLAG', 'IN_YY')","single_quotes_linter" -"demo/tweedie_regression.R",11,38,"style","Only use double-quotes.","exclude <- c('POLICYNO', 'PLCYDATE', 'CLM_FREQ5', 'CLM_AMT5', 'CLM_FLAG', 'IN_YY')","single_quotes_linter" -"demo/tweedie_regression.R",11,51,"style","Only use double-quotes.","exclude <- c('POLICYNO', 'PLCYDATE', 'CLM_FREQ5', 'CLM_AMT5', 'CLM_FLAG', 'IN_YY')","single_quotes_linter" -"demo/tweedie_regression.R",11,63,"style","Only use double-quotes.","exclude <- c('POLICYNO', 'PLCYDATE', 'CLM_FREQ5', 'CLM_AMT5', 'CLM_FLAG', 'IN_YY')","single_quotes_linter" -"demo/tweedie_regression.R",11,75,"style","Only use double-quotes.","exclude <- c('POLICYNO', 'PLCYDATE', 'CLM_FREQ5', 'CLM_AMT5', 'CLM_FLAG', 'IN_YY')","single_quotes_linter" -"demo/tweedie_regression.R",11,81,"style","Lines should not be more than 80 characters.","exclude <- c('POLICYNO', 'PLCYDATE', 'CLM_FREQ5', 'CLM_AMT5', 'CLM_FLAG', 'IN_YY')","line_length_linter" -"demo/tweedie_regression.R",15,21,"style","Only use double-quotes.","options(na.action = 'na.pass')","single_quotes_linter" -"demo/tweedie_regression.R",17,21,"style","Only use double-quotes.","options(na.action = 'na.omit')","single_quotes_linter" -"demo/tweedie_regression.R",32,15,"style","Only use double-quotes."," objective = 'reg:tweedie',","single_quotes_linter" -"demo/tweedie_regression.R",33,17,"style","Only use double-quotes."," eval_metric = 'rmse',","single_quotes_linter" -"demo/tweedie_regression.R",45,35,"style","Only use double-quotes.","var_imp <- xgb.importance(attr(x, 'Dimnames')[[2]], model = bst)","single_quotes_linter" -"R/callbacks.R",617,12,"style","Either both or neither branch in `if`/`else` should use curly braces."," } else if (!is.null(env$bst_folds)) { # xgb.cv:","brace_linter" -"R/xgb.Booster.R",55,1,"style","Variable and function name style should be snake_case or symbols.","is.null.handle <- function(handle) {","object_name_linter" -"R/xgb.Booster.R",632,43,"style","Trailing semicolons are not needed."," .Call(XGBoosterSaveJsonConfig_R, handle);","semicolon_linter" -"R/xgb.cv.R",121,62,"style","Put spaces around all infix operators."," prediction = FALSE, showsd = TRUE, metrics=list(),","infix_spaces_linter" -"R/xgb.cv.R",123,49,"style","Put spaces around all infix operators."," verbose = TRUE, print_every_n=1L,","infix_spaces_linter" -"R/xgb.DMatrix.R",388,15,"warning","Conditional expressions require scalar logical operators (&& and ||)"," if (verbose & !is.null(cnames)) {","vector_logic_linter" -"R/xgb.plot.multi.trees.R",97,25,"warning","1:min(...) is likely to be wrong in the empty edge case. Use seq_len() instead."," Feature[1:min(length(Feature), features_keep)],","seq_linter" -"R/xgb.plot.shap.R",276,29,"warning","1:min(...) is likely to be wrong in the empty edge case. Use seq_len() instead."," features <- imp$Feature[1:min(top_n, NROW(imp))]","seq_linter" -"tests/testthat/test_basic.R",407,40,"style","Trailing semicolons are not needed."," expect_equal(config, reloaded_config);","semicolon_linter" -"tests/testthat/test_helpers.R",95,12,"style","Variable and function name style should be snake_case or symbols."," colnames(X) <- NULL","object_name_linter" -"tests/testthat/test_helpers.R",173,11,"style","Any function spanning multiple lines should use curly braces."," pr <- function(...)","brace_linter" -"tests/testthat/test_helpers.R",191,3,"style","Variable and function name style should be snake_case or symbols."," list.ch <- list.val[order(names(list.val))]","object_name_linter" -"tests/testthat/test_helpers.R",192,3,"style","Variable and function name style should be snake_case or symbols."," list.ch <- lapply(list.ch, as.character)","object_name_linter" -"tests/testthat/test_helpers.R",194,3,"style","Variable and function name style should be snake_case or symbols."," list.default <- list(niter = as.character(nrounds - 1))","object_name_linter" -"tests/testthat/test_helpers.R",195,3,"style","Variable and function name style should be snake_case or symbols."," list.ch <- c(list.ch, list.default)","object_name_linter" -"tests/testthat/test_helpers.R",202,12,"style","Variable and function name style should be snake_case or symbols."," xgb.attr(bst.Tree, ""my_attr"") <- val","object_name_linter" -"tests/testthat/test_helpers.R",204,18,"style","Variable and function name style should be snake_case or symbols."," xgb.attributes(bst.Tree) <- list.val","object_name_linter" -"tests/testthat/test_helpers.R",235,18,"style","Variable and function name style should be snake_case or symbols."," xgb.attr(bst.Tree, ""x"") <- x","object_name_linter" -"tests/testthat/test_helpers.R",237,24,"style","Variable and function name style should be snake_case or symbols."," xgb.attributes(bst.Tree) <- list(a = ""A"", b = x)","object_name_linter" -"tests/testthat/test_helpers.R",274,3,"style","Variable and function name style should be snake_case or symbols."," bst.Tree.x$feature_names <- NULL","object_name_linter" -"tests/testthat/test_helpers.R",302,3,"style","Variable and function name style should be snake_case or symbols."," bst.Tree.x$feature_names <- NULL","object_name_linter" -"vignettes/discoverYourData.Rmd",31,14,"style","Only use double-quotes.","if (!require('vcd')) install.packages('vcd')","single_quotes_linter" -"vignettes/discoverYourData.Rmd",31,39,"style","Only use double-quotes.","if (!require('vcd')) install.packages('vcd')","single_quotes_linter" -"vignettes/discoverYourData.Rmd",103,10,"style","Commas should always have a space after.","head(df[,AgeDiscret := as.factor(round(Age/10,0))])","commas_linter" -"vignettes/discoverYourData.Rmd",103,43,"style","Put spaces around all infix operators.","head(df[,AgeDiscret := as.factor(round(Age/10,0))])","infix_spaces_linter" -"vignettes/discoverYourData.Rmd",103,47,"style","Commas should always have a space after.","head(df[,AgeDiscret := as.factor(round(Age/10,0))])","commas_linter" -"vignettes/discoverYourData.Rmd",111,10,"style","Commas should always have a space after.","head(df[,AgeCat:= as.factor(ifelse(Age > 30, ""Old"", ""Young""))])","commas_linter" -"vignettes/discoverYourData.Rmd",111,16,"style","Put spaces around all infix operators.","head(df[,AgeCat:= as.factor(ifelse(Age > 30, ""Old"", ""Young""))])","infix_spaces_linter" -"vignettes/discoverYourData.Rmd",127,5,"style","Commas should always have a space after.","df[,ID:=NULL]","commas_linter" -"vignettes/discoverYourData.Rmd",127,7,"style","Put spaces around all infix operators.","df[,ID:=NULL]","infix_spaces_linter" -"vignettes/discoverYourData.Rmd",133,12,"style","Commas should always have a space after.","levels(df[,Treatment])","commas_linter" -"vignettes/discoverYourData.Rmd",150,64,"style","Commas should always have a space after.","sparse_matrix <- sparse.model.matrix(Improved ~ ., data = df)[,-1]","commas_linter" -"vignettes/discoverYourData.Rmd",159,15,"style","Use <-, not =, for assignment.","output_vector = df[,Improved] == ""Marked""","assignment_linter" -"vignettes/discoverYourData.Rmd",159,21,"style","Commas should always have a space after.","output_vector = df[,Improved] == ""Marked""","commas_linter" -"vignettes/discoverYourData.Rmd",173,51,"style","Commas should always have a space after."," eta = 1, nthread = 2, nrounds = 10,objective = ""binary:logistic"")","commas_linter" -"vignettes/discoverYourData.Rmd",196,81,"style","Lines should not be more than 80 characters.","importance <- xgb.importance(feature_names = colnames(sparse_matrix), model = bst)","line_length_linter" -"vignettes/discoverYourData.Rmd",219,1,"style","Variable and function name style should be snake_case or symbols.","importanceRaw <- xgb.importance(feature_names = colnames(sparse_matrix), model = bst, data = sparse_matrix, label = output_vector)","object_name_linter" -"vignettes/discoverYourData.Rmd",219,81,"style","Lines should not be more than 80 characters.","importanceRaw <- xgb.importance(feature_names = colnames(sparse_matrix), model = bst, data = sparse_matrix, label = output_vector)","line_length_linter" -"vignettes/discoverYourData.Rmd",222,1,"style","Variable and function name style should be snake_case or symbols.","importanceClean <- importanceRaw[,`:=`(Cover=NULL, Frequency=NULL)]","object_name_linter" -"vignettes/discoverYourData.Rmd",222,35,"style","Commas should always have a space after.","importanceClean <- importanceRaw[,`:=`(Cover=NULL, Frequency=NULL)]","commas_linter" -"vignettes/discoverYourData.Rmd",222,45,"style","Put spaces around all infix operators.","importanceClean <- importanceRaw[,`:=`(Cover=NULL, Frequency=NULL)]","infix_spaces_linter" -"vignettes/discoverYourData.Rmd",222,61,"style","Put spaces around all infix operators.","importanceClean <- importanceRaw[,`:=`(Cover=NULL, Frequency=NULL)]","infix_spaces_linter" -"vignettes/discoverYourData.Rmd",324,29,"style","Put spaces around all infix operators.","data(agaricus.train, package='xgboost')","infix_spaces_linter" -"vignettes/discoverYourData.Rmd",324,30,"style","Only use double-quotes.","data(agaricus.train, package='xgboost')","single_quotes_linter" -"vignettes/discoverYourData.Rmd",325,28,"style","Put spaces around all infix operators.","data(agaricus.test, package='xgboost')","infix_spaces_linter" -"vignettes/discoverYourData.Rmd",325,29,"style","Only use double-quotes.","data(agaricus.test, package='xgboost')","single_quotes_linter" -"vignettes/discoverYourData.Rmd",330,81,"style","Lines should not be more than 80 characters.","bst <- xgboost(data = train$data, label = train$label, max_depth = 4, num_parallel_tree = 1000, subsample = 0.5, colsample_bytree =0.5, nrounds = 1, objective = ""binary:logistic"")","line_length_linter" -"vignettes/discoverYourData.Rmd",330,131,"style","Put spaces around all infix operators.","bst <- xgboost(data = train$data, label = train$label, max_depth = 4, num_parallel_tree = 1000, subsample = 0.5, colsample_bytree =0.5, nrounds = 1, objective = ""binary:logistic"")","infix_spaces_linter" -"vignettes/discoverYourData.Rmd",333,81,"style","Lines should not be more than 80 characters.","bst <- xgboost(data = train$data, label = train$label, max_depth = 4, nrounds = 3, objective = ""binary:logistic"")","line_length_linter" -"vignettes/xgboost.Rnw",19,13,"style","Only use double-quotes.","if (require('knitr')) opts_chunk$set(fig.width = 5, fig.height = 5, fig.align = 'center', tidy = FALSE, warning = FALSE, cache = TRUE)","single_quotes_linter" -"vignettes/xgboost.Rnw",19,81,"style","Lines should not be more than 80 characters.","if (require('knitr')) opts_chunk$set(fig.width = 5, fig.height = 5, fig.align = 'center', tidy = FALSE, warning = FALSE, cache = TRUE)","line_length_linter" -"vignettes/xgboost.Rnw",19,81,"style","Only use double-quotes.","if (require('knitr')) opts_chunk$set(fig.width = 5, fig.height = 5, fig.align = 'center', tidy = FALSE, warning = FALSE, cache = TRUE)","single_quotes_linter" -"vignettes/xgboost.Rnw",24,1,"style","Variable and function name style should be snake_case or symbols.","xgboost.version <- packageDescription(""xgboost"")$Version","object_name_linter" -"vignettes/xgboost.Rnw",84,29,"style","Put spaces around all infix operators.","data(agaricus.train, package='xgboost')","infix_spaces_linter" -"vignettes/xgboost.Rnw",84,30,"style","Only use double-quotes.","data(agaricus.train, package='xgboost')","single_quotes_linter" -"vignettes/xgboost.Rnw",85,28,"style","Put spaces around all infix operators.","data(agaricus.test, package='xgboost')","infix_spaces_linter" -"vignettes/xgboost.Rnw",85,29,"style","Only use double-quotes.","data(agaricus.test, package='xgboost')","single_quotes_linter" -"vignettes/xgboost.Rnw",90,15,"style","Only use double-quotes.","xgb.save(bst, 'model.save')","single_quotes_linter" -"vignettes/xgboost.Rnw",91,5,"style","Use <-, not =, for assignment.","bst = xgb.load('model.save')","assignment_linter" -"vignettes/xgboost.Rnw",91,16,"style","Only use double-quotes.","bst = xgb.load('model.save')","single_quotes_linter" -"vignettes/xgboost.Rnw",102,15,"style","Only use double-quotes.","xgb.dump(bst, 'model.dump')","single_quotes_linter" -"vignettes/xgboost.Rnw",132,21,"style","Commas should always have a space after.","head(getinfo(dtrain,'label'))","commas_linter" -"vignettes/xgboost.Rnw",132,21,"style","Only use double-quotes.","head(getinfo(dtrain,'label'))","single_quotes_linter" -"vignettes/xgboost.Rnw",138,26,"style","Only use double-quotes.","xgb.DMatrix.save(dtrain, 'xgb.DMatrix')","single_quotes_linter" -"vignettes/xgboost.Rnw",139,8,"style","Use <-, not =, for assignment.","dtrain = xgb.DMatrix('xgb.DMatrix')","assignment_linter" -"vignettes/xgboost.Rnw",139,22,"style","Only use double-quotes.","dtrain = xgb.DMatrix('xgb.DMatrix')","single_quotes_linter" -"vignettes/xgboost.Rnw",152,14,"style","Put spaces around all infix operators."," preds <- 1/(1 + exp(-preds))","infix_spaces_linter" -"vignettes/xgboost.Rnw",152,15,"style","Place a space before left parenthesis, except in a function call."," preds <- 1/(1 + exp(-preds))","spaces_left_parentheses_linter" -"vignettes/xgboost.Rnw",160,26,"style","Put spaces around all infix operators."," err <- sqrt(mean((preds-labels)^2))","infix_spaces_linter" -"vignettes/xgboost.Rnw",168,81,"style","Lines should not be more than 80 characters.","bst <- xgb.train(param, dtrain, nrounds = 2, watchlist, logregobj, evalerror, maximize = FALSE)","line_length_linter" -"vignettes/xgboostfromJSON.Rmd",33,15,"style","Put spaces around all infix operators.","options(digits=22)","infix_spaces_linter" -"vignettes/xgboostfromJSON.Rmd",53,41,"style","Put spaces around all infix operators.","data <- data.frame(dates = dates, labels=labels)","infix_spaces_linter" -"vignettes/xgboostfromJSON.Rmd",56,32,"style","Trailing whitespace is superfluous."," data = as.matrix(data$dates), ","trailing_whitespace_linter" -"vignettes/xgboostfromJSON.Rmd",72,58,"style","Put spaces around all infix operators.","bst_json <- xgb.dump(bst, with_stats = FALSE, dump_format='json')","infix_spaces_linter" -"vignettes/xgboostfromJSON.Rmd",72,59,"style","Only use double-quotes.","bst_json <- xgb.dump(bst, with_stats = FALSE, dump_format='json')","single_quotes_linter" -"vignettes/xgboostfromJSON.Rmd",81,34,"style","Commas should always have a space after.","bst_preds_logodds <- predict(bst,as.matrix(data$dates), outputmargin = TRUE)","commas_linter" -"vignettes/xgboostfromJSON.Rmd",84,43,"style","Put spaces around all infix operators.","bst_from_json_logodds <- ifelse(data$dates 0.5) != label))/length(label)","infix_spaces_linter" -"vignettes/xgboostPresentation.Rmd",399,51,"style","Put spaces around all infix operators.","print(paste(""sum(abs(pred2-pred))="", sum(abs(pred2-pred))))","infix_spaces_linter" -"vignettes/xgboostPresentation.Rmd",413,1,"style","Variable and function name style should be snake_case or symbols.","rawVec <- xgb.serialize(bst)","object_name_linter" -"vignettes/xgboostPresentation.Rmd",423,51,"style","Put spaces around all infix operators.","print(paste(""sum(abs(pred3-pred))="", sum(abs(pred2-pred))))","infix_spaces_linter" diff --git a/.dev/revdep_emails/xgboost/email-body b/.dev/revdep_emails/xgboost/email-body deleted file mode 100644 index 6e8c67969..000000000 --- a/.dev/revdep_emails/xgboost/email-body +++ /dev/null @@ -1,29 +0,0 @@ -Hello Jiaming Yuan! Thank you for using {lintr} in your package {xgboost}! - -{lintr} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. - -We checked the results of running lint_package() on your package as found at https://github.com/dmlc/xgboost (hash: 1ced6381653eed0f259cf11df8ef599274d84174) using -the CRAN version v2.0.1 and the current version in development (commit hash e42b244489cef9f1df8b4e8b44672955a424fcf7). -We do this ourselves because of {lintr}'s position as a developer tool -- -normal CRAN revdep checking is not as helpful for detecting breakages. - -On your package, lint_package() took 72s on CRAN vs. 50s in our latest version. This -includes applying your .lintr config if one is available. - -I am also attaching the following, if they exist: - - * Hard breaking changes (.failure file): - any error generated from lint_package() using the latest version, if none existed using v2.0.1 - * Soft breaking changes (.warnings file): - any warnings generated from lint_package() using the latest version not found using v2.0.1 - * Change in linting state: one or two .csv files containing the lints found using one version of {lintr}, but not the other - -We have given a more-than-cursory glance at these changes and are satisfied they mark an acceptable step forward when -trading off back-compatibility with package quality, as well as improving precision and/or recall of the linters themselves. -Please don't hesitate to reach out if we've missed something, or if you've got other suggestions for further improvements -to {lintr}. - -Thanks again! -{lintr} development team - From 4e5ceb4485aed29ea35fe68243bc0dd6dd332378 Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Fri, 10 Jun 2022 19:13:40 +0000 Subject: [PATCH 46/49] remove temp files --- .dev/revdep-no-repos | 17 --------- .dev/revdep-repos | 91 -------------------------------------------- 2 files changed, 108 deletions(-) delete mode 100644 .dev/revdep-no-repos delete mode 100644 .dev/revdep-repos diff --git a/.dev/revdep-no-repos b/.dev/revdep-no-repos deleted file mode 100644 index 087d97f2e..000000000 --- a/.dev/revdep-no-repos +++ /dev/null @@ -1,17 +0,0 @@ -package,repo -adaptalint,https://github.com/cran/adaptalint -autoharp,https://github.com/cran/autoharp -aws.alexa,https://github.com/cran/aws.alexa -biolink,https://github.com/cran/biolink -ConNEcT,https://github.com/cran/ConNEcT -DataFakeR,https://github.com/cran/DataFakeR -datarobot,https://github.com/cran/datarobot -DominoDataCapture,https://github.com/cran/DominoDataCapture -INSPECTumours,https://github.com/cran/INSPECTumours -NHSRplotthedots,https://github.com/cran/NHSRplotthedots -Plasmidprofiler,https://github.com/cran/Plasmidprofiler -rdomains,https://github.com/cran/rdomains -SamplerCompare,https://github.com/cran/SamplerCompare -shiny.react,https://github.com/cran/shiny.react -TDA,https://github.com/cran/TDA -wavefunction,https://github.com/cran/wavefunction diff --git a/.dev/revdep-repos b/.dev/revdep-repos deleted file mode 100644 index 4f1f348be..000000000 --- a/.dev/revdep-repos +++ /dev/null @@ -1,91 +0,0 @@ -package,repo -abbyyR,http://github.com/soodoku/abbyyR -admiral,https://github.com/pharmaverse/admiral -babette,https://github.com/ropensci/babette -beautier,https://github.com/ropensci/beautier -BiasCorrector,https://github.com/kapsner/BiasCorrector -BTYDplus,https://github.com/mplatzer/BTYDplus -caretEnsemble,https://github.com/zachmayer/caretEnsemble -cattonum,https://github.com/bfgray3/cattonum -cleaR,https://github.com/joundso/cleaR -cloudos,https://github.com/lifebit-ai/cloudos -cmstatr,https://github.com/cmstatr/cmstatr -connectwidgets,https://github.com/rstudio/connectwidgets -crunch,https://github.com/Crunch-io/rcrunch -dampack,https://github.com/DARTH-git/dampack -dashboardthemes,https://github.com/nik01010/dashboardthemes -dat,https://github.com/wahani/dat -datastructures,https://github.com/dirmeier/datastructures -DBItest,https://github.com/r-dbi/DBItest -DepthProc,https://github.com/zzawadz/DepthProc -describer,https://github.com/paulhendricks/describer -devtools,https://github.com/r-lib/devtools -diffusr,https://github.com/dirmeier/diffusr -dittodb,https://github.com/ropensci/dittodb -DIZtools,https://github.com/miracum/misc-diztools -DIZutils,https://github.com/miracum/misc-dizutils -DQAgui,https://github.com/miracum/dqa-dqagui -dupree,https://github.com/russHyde/dupree -dyn.log,https://github.com/bmoretz/dyn.log -edgarWebR,https://github.com/mwaldstein/edgarWebR -emayili,https://github.com/datawookie/emayili -epigraphdb,https://github.com/MRCIEU/epigraphdb-r -fakemake,https://gitlab.com/fvafrcu/fakemake -fixtuRes,https://github.com/jakubnowicki/fixtuRes -FSelectorRcpp,https://github.com/mi2-warsaw/FSelectorRcpp -fst,https://github.com/fstpackage/fst -fstcore,https://github.com/fstpackage/fst -geofacet,https://github.com/hafen/geofacet -geogrid,https://github.com/jbaileyh/geogrid -ggcharts,https://github.com/thomas-neitmann/ggcharts -ggfortify,https://github.com/sinhrks/ggfortify -ggRandomForests,https://github.com/ehrlinger/ggRandomForests -ggthemes,https://github.com/jrnold/ggthemes -healthcareai,https://github.com/HealthCatalyst/healthcareai-r -i18n,https://github.com/rich-iannone/i18n -jpmesh,https://github.com/uribo/jpmesh -languageserver,https://github.com/REditorSupport/languageserver -latrend,https://github.com/philips-software/latrend -lifecycle,https://github.com/r-lib/lifecycle -mlflow,https://github.com/mlflow/mlflow -mlr,https://github.com/mlr-org/mlr -mlrCPO,https://github.com/mlr-org/mlrCPO -modules,https://github.com/wahani/modules -newsmd,https://github.com/Dschaykib/newsmd -nLTT,https://github.com/thijsjanzen/nLTT -openbankeR,https://github.com/nik01010/openbankeR -OpenML,https://github.com/openml/openml-r -osfr,https://github.com/ropensci/osfr -packager,https://gitlab.com/fvafrCU/packager -physiology,https://github.com/jackwasey/physiology -PosteriorBootstrap,https://github.com/alan-turing-institute/PosteriorBootstrap -precommit,https://github.com/lorenzwalthert/precommit -prettyB,https://github.com/jumpingrivers/prettyB -PWFSLSmoke,https://github.com/MazamaScience/PWFSLSmoke -rasterpdf,https://github.com/ilarischeinin/rasterpdf -rBiasCorrection,https://github.com/kapsner/rBiasCorrection -rbokeh,https://github.com/bokeh/rbokeh -rde,https://github.com/kloppen/rde -requiRements,https://github.com/joundso/requirements -RestRserve,https://github.com/rexyai/RestRserve -rhino,https://github.com/Appsilon/rhino -rnrfa,https://github.com/cvitolo/rnrfa -roadoi,https://github.com/ropensci/roadoi -RSQL,https://github.com/rOpenStats/RSQL -scriptexec,https://github.com/sagiegurari/scriptexec -secuTrialR,https://github.com/SwissClinicalTrialOrganisation/secuTrialR -semantic.dashboard,https://github.com/Appsilon/semantic.dashboard -shiny.info,https://github.com/Appsilon/shiny.info -shiny.semantic,https://github.com/Appsilon/shiny.semantic -smerc,https://github.com/jfrench/smerc -stencilaschema,https://github.com/stencila/schema -supernova,https://github.com/UCLATALL/supernova -tsviz,https://github.com/donlelef/tsviz -tuber,http://github.com/soodoku/tuber -unifir,https://github.com/ropensci/unifir -upsetjs,https://github.com/upsetjs/upsetjs_r -urlshorteneR,https://github.com/dmpe/urlshorteneR -virustotal,https://github.com/themains/virustotal -WikidataQueryServiceR,https://github.com/bearloga/WikidataQueryServiceR -WoodburyMatrix,https://github.com/mbertolacci/WoodburyMatrix -xgboost,https://github.com/dmlc/xgboost From 50c41193bf0207cc306a142a33e76cf90f9959a7 Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Fri, 10 Jun 2022 19:15:10 +0000 Subject: [PATCH 47/49] handle gitignore --- .dev/.gitignore | 8 ++++++-- .gitignore | 2 -- 2 files changed, 6 insertions(+), 4 deletions(-) diff --git a/.dev/.gitignore b/.dev/.gitignore index 5b5fcee28..c22fcb08f 100644 --- a/.dev/.gitignore +++ b/.dev/.gitignore @@ -1,4 +1,8 @@ # these are artefacts, so skip storing them on .git. # moreover, revdep-no-repos contains e-mail addresses -#revdep-repos -#revdep-no-repos +*.csv +revdep-repos +revdep-no-repos +revdep_comparison +revdep_emails + diff --git a/.gitignore b/.gitignore index a9cb6b97b..02d96231c 100644 --- a/.gitignore +++ b/.gitignore @@ -15,7 +15,5 @@ script.R lintr_*.tar.gz testthat-problems.rds -.dev/*.csv -.dev/revdep_comparison docs inst/doc From 98a932a7e381b67790ed7bec183e480115d8f5fa Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Mon, 13 Jun 2022 07:38:03 +0000 Subject: [PATCH 48/49] improve e-mail template --- .dev/revdep-email-template | 6 +++--- 1 file changed, 3 insertions(+), 3 deletions(-) diff --git a/.dev/revdep-email-template b/.dev/revdep-email-template index 7452d30bc..498555d46 100644 --- a/.dev/revdep-email-template +++ b/.dev/revdep-email-template @@ -1,17 +1,17 @@ Hello {maintainer}! Thank you for using {{lintr}} in your package {{{package}}}! {{lintr}} will soon be releasing an update to CRAN -- be sure to check the latest NEWS to get an overview -of the upcoming improvements and bug fixes. +of the upcoming improvements and bug fixes: https://lintr.r-lib.org/news/index.html. We checked the results of running lint_package() on your package as found at {repo_url} (hash: {git_hash}) using the CRAN version {old_release} and the current version in development (commit hash {main_hash}). -We do this ourselves because of {{lintr}}'s position as a developer tool -- +We do this ourselves because of {{lintr}}'s role as a developer tool -- normal CRAN revdep checking is not as helpful for detecting breakages. On your package, lint_package() took {old_duration}s on CRAN vs. {main_duration}s in our latest version. This includes applying your .lintr config if one is available. -I am also attaching the following, if they exist: +We are also attaching the following, if they exist: * Hard breaking changes (.failure file): any error generated from lint_package() using the latest version, if none existed using {old_release} From 2549de9d186e6a95f4cd4fa692f1e01e75664151 Mon Sep 17 00:00:00 2001 From: Michael Chirico Date: Mon, 13 Jun 2022 07:45:05 +0000 Subject: [PATCH 49/49] stop if missing file, improve skip= --- .dev/revdep_compare_releases.R | 6 +++++- 1 file changed, 5 insertions(+), 1 deletion(-) diff --git a/.dev/revdep_compare_releases.R b/.dev/revdep_compare_releases.R index 8debf0560..8dfd06f44 100755 --- a/.dev/revdep_compare_releases.R +++ b/.dev/revdep_compare_releases.R @@ -4,9 +4,13 @@ library(pkgload) library(data.table) library(glue) +if (!file.exists("revdep-repos")) { + stop("Please run .dev/revdep_get_repos.R first before running this") +} repo_data <- rbind( data.table::fread("revdep-repos"), - data.table::fread("revdep-extra-repos", skip = 2L), + # land after the initial lines of comments on the header line + data.table::fread("revdep-extra-repos", skip = "package,repo"), data.table::fread("revdep-no-repos") ) setkey(repo_data, repo)